Required Package

library(dplyr)
library(biomaRt)
library(tximport)
library(rhdf5)
library(gplots)
library(org.Hs.eg.db)
library(DESeq2)
library(DT)
library(apeglm)
library(RColorBrewer)
library(IHW)
library(PCAtools)
library(pheatmap)
library(clusterProfiler)
library(EnhancedVolcano)
library(ComplexHeatmap)
library(circlize)
library(ReactomePA)
library(fgsea)
library(tidyverse)
library(ggpubr)
library(vsn)
library(hexbin)
library(ggnewscale)
library(pathview)
setwd("~/Downloads")

Directory

# path where your extracted the tar.gz folder to.
# strip the trailing '/'
quant_dir <- "/Users/aungphyo/Downloads/Kallisto"
list.files(quant_dir)
##  [1] "D_CON1"                             "D_CON2"                            
##  [3] "D_CON3"                             "D_TREAT1"                          
##  [5] "D_TREAT2"                           "D_TREAT3"                          
##  [7] "GRCh38.idx"                         "H_CON1"                            
##  [9] "H_CON2"                             "H_CON3"                            
## [11] "H_CYTKN1"                           "H_CYTKN2"                          
## [13] "H_CYTKN3"                           "H_TREAT1"                          
## [15] "H_TREAT2"                           "H_TREAT3"                          
## [17] "Homo_sapiens.GRCh38.cdna.all.fa.gz" "samples.csv"                       
## [19] "samples.txt"

Metadata

samples <- read.csv(paste0(quant_dir, "/samples.csv"), header=T, row.names = "row", stringsAsFactors = T)
samples
##           X         condition replicate
## D_CON1   NA   disease_control         1
## D_CON2   NA   disease_control         2
## D_CON3   NA   disease_control         3
## D_TREAT1 NA disease_treatment         1
## D_TREAT2 NA disease_treatment         2
## D_TREAT3 NA disease_treatment         3
## H_CON1   NA   healthy_control         1
## H_CON2   NA   healthy_control         2
## H_CON3   NA   healthy_control         3
## H_CYTKN1 NA  healthy_cytokine         1
## H_CYTKN2 NA  healthy_cytokine         2
## H_CYTKN3 NA  healthy_cytokine         3
## H_TREAT1 NA healthy_treatment         1
## H_TREAT2 NA healthy_treatment         2
## H_TREAT3 NA healthy_treatment         3

Convert numeric to factor

samples$replicate <- factor(samples$replicate)

# check its ok:
sapply(samples, is.factor)
##         X condition replicate 
##     FALSE      TRUE      TRUE

Stage Kallisto Files

files <- file.path(quant_dir, rownames(samples), "abundance.h5")
names(files) <- paste0(rownames(samples))
files
##                                                     D_CON1 
##   "/Users/aungphyo/Downloads/Kallisto/D_CON1/abundance.h5" 
##                                                     D_CON2 
##   "/Users/aungphyo/Downloads/Kallisto/D_CON2/abundance.h5" 
##                                                     D_CON3 
##   "/Users/aungphyo/Downloads/Kallisto/D_CON3/abundance.h5" 
##                                                   D_TREAT1 
## "/Users/aungphyo/Downloads/Kallisto/D_TREAT1/abundance.h5" 
##                                                   D_TREAT2 
## "/Users/aungphyo/Downloads/Kallisto/D_TREAT2/abundance.h5" 
##                                                   D_TREAT3 
## "/Users/aungphyo/Downloads/Kallisto/D_TREAT3/abundance.h5" 
##                                                     H_CON1 
##   "/Users/aungphyo/Downloads/Kallisto/H_CON1/abundance.h5" 
##                                                     H_CON2 
##   "/Users/aungphyo/Downloads/Kallisto/H_CON2/abundance.h5" 
##                                                     H_CON3 
##   "/Users/aungphyo/Downloads/Kallisto/H_CON3/abundance.h5" 
##                                                   H_CYTKN1 
## "/Users/aungphyo/Downloads/Kallisto/H_CYTKN1/abundance.h5" 
##                                                   H_CYTKN2 
## "/Users/aungphyo/Downloads/Kallisto/H_CYTKN2/abundance.h5" 
##                                                   H_CYTKN3 
## "/Users/aungphyo/Downloads/Kallisto/H_CYTKN3/abundance.h5" 
##                                                   H_TREAT1 
## "/Users/aungphyo/Downloads/Kallisto/H_TREAT1/abundance.h5" 
##                                                   H_TREAT2 
## "/Users/aungphyo/Downloads/Kallisto/H_TREAT2/abundance.h5" 
##                                                   H_TREAT3 
## "/Users/aungphyo/Downloads/Kallisto/H_TREAT3/abundance.h5"

BiomaRT Ensembl

mart <- useMart(biomart = "ensembl", dataset = "hsapiens_gene_ensembl")

Transcript to gene

## show how to identify attribute type
# $ head /data/github/quant/ctrl_1/abundance.tsv

## show how to query mart
listAttributes(mart)
##                                                               name
## 1                                                  ensembl_gene_id
## 2                                          ensembl_gene_id_version
## 3                                            ensembl_transcript_id
## 4                                    ensembl_transcript_id_version
## 5                                               ensembl_peptide_id
## 6                                       ensembl_peptide_id_version
## 7                                                  ensembl_exon_id
## 8                                                      description
## 9                                                  chromosome_name
## 10                                                  start_position
## 11                                                    end_position
## 12                                                          strand
## 13                                                            band
## 14                                                transcript_start
## 15                                                  transcript_end
## 16                                        transcription_start_site
## 17                                               transcript_length
## 18                                                  transcript_tsl
## 19                                        transcript_gencode_basic
## 20                                               transcript_appris
## 21                                         transcript_is_canonical
## 22                                          transcript_mane_select
## 23                                   transcript_mane_plus_clinical
## 24                                              external_gene_name
## 25                                            external_gene_source
## 26                                        external_transcript_name
## 27                                 external_transcript_source_name
## 28                                                transcript_count
## 29                                      percentage_gene_gc_content
## 30                                                    gene_biotype
## 31                                              transcript_biotype
## 32                                                          source
## 33                                               transcript_source
## 34                                                         version
## 35                                              transcript_version
## 36                                                 peptide_version
## 37                                                external_synonym
## 38                                           phenotype_description
## 39                                                     source_name
## 40                                               study_external_id
## 41                                                     strain_name
## 42                                                   strain_gender
## 43                                                         p_value
## 44                                                           go_id
## 45                                                       name_1006
## 46                                                 definition_1006
## 47                                                 go_linkage_type
## 48                                                  namespace_1003
## 49                                            goslim_goa_accession
## 50                                          goslim_goa_description
## 51                                                         biogrid
## 52                                                            ccds
## 53                                                          chembl
## 54                                                     dbass3_name
## 55                                                       dbass3_id
## 56                                                     dbass5_name
## 57                                                       dbass5_id
## 58                                           entrezgene_trans_name
## 59                                                            embl
## 60                                                    arrayexpress
## 61                                                       genecards
## 62                                                         hgnc_id
## 63                                                     hgnc_symbol
## 64                                                   hpa_accession
## 65                                                          hpa_id
## 66                                                      protein_id
## 67                                                    ens_lrg_gene
## 68                                              ens_lrg_transcript
## 69                                                          merops
## 70                                            mim_gene_description
## 71                                              mim_gene_accession
## 72                                          mim_morbid_description
## 73                                            mim_morbid_accession
## 74                                               mirbase_accession
## 75                                                      mirbase_id
## 76                                              mirbase_trans_name
## 77                                          entrezgene_description
## 78                                            entrezgene_accession
## 79                                                   entrezgene_id
## 80                                                             pdb
## 81                                                        reactome
## 82                                                   reactome_gene
## 83                                             reactome_transcript
## 84                                                     refseq_mrna
## 85                                           refseq_mrna_predicted
## 86                                                    refseq_ncrna
## 87                                          refseq_ncrna_predicted
## 88                                                  refseq_peptide
## 89                                        refseq_peptide_predicted
## 90                                                            rfam
## 91                                                 rfam_trans_name
## 92                                                      rnacentral
## 93                                                 hgnc_trans_name
## 94                                                            ucsc
## 95                                                         uniparc
## 96                                               uniprot_gn_symbol
## 97                                                   uniprot_gn_id
## 98                                                 uniprot_isoform
## 99                                                uniprotswissprot
## 100                                                uniprotsptrembl
## 101                                           wikigene_description
## 102                                                  wikigene_name
## 103                                                    wikigene_id
## 104                                                   affy_hc_g110
## 105                                                  affy_hg_focus
## 106                                                affy_hg_u133a_2
## 107                                                  affy_hg_u133b
## 108                                            affy_hg_u133_plus_2
## 109                                                   affy_hg_u95a
## 110                                                 affy_hg_u95av2
## 111                                                   affy_hg_u95b
## 112                                                   affy_hg_u95c
## 113                                                   affy_hg_u95d
## 114                                                   affy_hg_u95e
## 115                                                   affy_hta_2_0
## 116                                        affy_ht_hg_u133_plus_pm
## 117                                            affy_huex_1_0_st_v2
## 118                                                  affy_hugenefl
## 119                                          affy_hugene_1_0_st_v1
## 120                                          affy_hugene_2_0_st_v1
## 121                                          affy_hugene_2_1_st_v1
## 122                                                 affy_primeview
## 123                                                  affy_u133_x3p
## 124                                                agilent_cgh_44b
## 125                                               agilent_gpl19072
## 126                                               agilent_gpl26966
## 127                                                agilent_gpl6848
## 128                                  agilent_sureprint_g3_ge_8x60k
## 129                               agilent_sureprint_g3_ge_8x60k_v2
## 130                                            agilent_wholegenome
## 131                                   agilent_wholegenome_4x44k_v1
## 132                                   agilent_wholegenome_4x44k_v2
## 133                                              codelink_codelink
## 134                                         illumina_humanref_8_v3
## 135                                          illumina_humanwg_6_v3
## 136                                               phalanx_onearray
## 137                                                            cdd
## 138                                                      cdd_start
## 139                                                        cdd_end
## 140                                                         gene3d
## 141                                                   gene3d_start
## 142                                                     gene3d_end
## 143                                                          hamap
## 144                                                    hamap_start
## 145                                                      hamap_end
## 146                                                     hmmpanther
## 147                                               hmmpanther_start
## 148                                                 hmmpanther_end
## 149                                                           pfam
## 150                                                     pfam_start
## 151                                                       pfam_end
## 152                                                          pirsf
## 153                                                    pirsf_start
## 154                                                      pirsf_end
## 155                                                         prints
## 156                                                   prints_start
## 157                                                     prints_end
## 158                                                    scanprosite
## 159                                              scanprosite_start
## 160                                                scanprosite_end
## 161                                                         pfscan
## 162                                                   pfscan_start
## 163                                                     pfscan_end
## 164                                                           sfld
## 165                                                     sfld_start
## 166                                                       sfld_end
## 167                                                          smart
## 168                                                    smart_start
## 169                                                      smart_end
## 170                                                    superfamily
## 171                                              superfamily_start
## 172                                                superfamily_end
## 173                                                        tigrfam
## 174                                                  tigrfam_start
## 175                                                    tigrfam_end
## 176                                                       interpro
## 177                                     interpro_short_description
## 178                                           interpro_description
## 179                                                 interpro_start
## 180                                                   interpro_end
## 181                                               alphafold_import
## 182                                         alphafold_import_start
## 183                                           alphafold_import_end
## 184                                                     mobidblite
## 185                                               mobidblite_start
## 186                                                 mobidblite_end
## 187                                                         ncoils
## 188                                                   ncoils_start
## 189                                                     ncoils_end
## 190                                                            seg
## 191                                                      seg_start
## 192                                                        seg_end
## 193                                                   sifts_import
## 194                                             sifts_import_start
## 195                                               sifts_import_end
## 196                                                        signalp
## 197                                                  signalp_start
## 198                                                    signalp_end
## 199                                                          tmhmm
## 200                                                    tmhmm_start
## 201                                                      tmhmm_end
## 202                                                ensembl_gene_id
## 203                                        ensembl_gene_id_version
## 204                                                        version
## 205                                          ensembl_transcript_id
## 206                                  ensembl_transcript_id_version
## 207                                             transcript_version
## 208                                             ensembl_peptide_id
## 209                                     ensembl_peptide_id_version
## 210                                                peptide_version
## 211                                                chromosome_name
## 212                                                 start_position
## 213                                                   end_position
## 214                                               transcript_start
## 215                                                 transcript_end
## 216                                       transcription_start_site
## 217                                              transcript_length
## 218                                                         strand
## 219                                             external_gene_name
## 220                                           external_gene_source
## 221                                                    5_utr_start
## 222                                                      5_utr_end
## 223                                                    3_utr_start
## 224                                                      3_utr_end
## 225                                                     cds_length
## 226                                               transcript_count
## 227                                                    description
## 228                                                   gene_biotype
## 229                                               exon_chrom_start
## 230                                                 exon_chrom_end
## 231                                                is_constitutive
## 232                                                           rank
## 233                                                          phase
## 234                                                      end_phase
## 235                                              cdna_coding_start
## 236                                                cdna_coding_end
## 237                                           genomic_coding_start
## 238                                             genomic_coding_end
## 239                                                ensembl_exon_id
## 240                                                      cds_start
## 241                                                        cds_end
## 242                                                ensembl_gene_id
## 243                                        ensembl_gene_id_version
## 244                                                        version
## 245                                          ensembl_transcript_id
## 246                                  ensembl_transcript_id_version
## 247                                             transcript_version
## 248                                             ensembl_peptide_id
## 249                                     ensembl_peptide_id_version
## 250                                                peptide_version
## 251                                                chromosome_name
## 252                                                 start_position
## 253                                                   end_position
## 254                                                         strand
## 255                                                           band
## 256                                             external_gene_name
## 257                                           external_gene_source
## 258                                               transcript_count
## 259                                     percentage_gene_gc_content
## 260                                                    description
## 261                               cabingdonii_homolog_ensembl_gene
## 262                       cabingdonii_homolog_associated_gene_name
## 263                            cabingdonii_homolog_ensembl_peptide
## 264                                 cabingdonii_homolog_chromosome
## 265                                cabingdonii_homolog_chrom_start
## 266                                  cabingdonii_homolog_chrom_end
## 267               cabingdonii_homolog_canonical_transcript_protein
## 268                                    cabingdonii_homolog_subtype
## 269                             cabingdonii_homolog_orthology_type
## 270                                    cabingdonii_homolog_perc_id
## 271                                 cabingdonii_homolog_perc_id_r1
## 272                                  cabingdonii_homolog_goc_score
## 273                               cabingdonii_homolog_wga_coverage
## 274                       cabingdonii_homolog_orthology_confidence
## 275                               scaustralis_homolog_ensembl_gene
## 276                       scaustralis_homolog_associated_gene_name
## 277                            scaustralis_homolog_ensembl_peptide
## 278                                 scaustralis_homolog_chromosome
## 279                                scaustralis_homolog_chrom_start
## 280                                  scaustralis_homolog_chrom_end
## 281               scaustralis_homolog_canonical_transcript_protein
## 282                                    scaustralis_homolog_subtype
## 283                             scaustralis_homolog_orthology_type
## 284                                    scaustralis_homolog_perc_id
## 285                                 scaustralis_homolog_perc_id_r1
## 286                                  scaustralis_homolog_goc_score
## 287                               scaustralis_homolog_wga_coverage
## 288                       scaustralis_homolog_orthology_confidence
## 289                                  mspretus_homolog_ensembl_gene
## 290                          mspretus_homolog_associated_gene_name
## 291                               mspretus_homolog_ensembl_peptide
## 292                                    mspretus_homolog_chromosome
## 293                                   mspretus_homolog_chrom_start
## 294                                     mspretus_homolog_chrom_end
## 295                  mspretus_homolog_canonical_transcript_protein
## 296                                       mspretus_homolog_subtype
## 297                                mspretus_homolog_orthology_type
## 298                                       mspretus_homolog_perc_id
## 299                                    mspretus_homolog_perc_id_r1
## 300                                     mspretus_homolog_goc_score
## 301                                  mspretus_homolog_wga_coverage
## 302                          mspretus_homolog_orthology_confidence
## 303                                    vpacos_homolog_ensembl_gene
## 304                            vpacos_homolog_associated_gene_name
## 305                                 vpacos_homolog_ensembl_peptide
## 306                                      vpacos_homolog_chromosome
## 307                                     vpacos_homolog_chrom_start
## 308                                       vpacos_homolog_chrom_end
## 309                    vpacos_homolog_canonical_transcript_protein
## 310                                         vpacos_homolog_subtype
## 311                                  vpacos_homolog_orthology_type
## 312                                         vpacos_homolog_perc_id
## 313                                      vpacos_homolog_perc_id_r1
## 314                                       vpacos_homolog_goc_score
## 315                                    vpacos_homolog_wga_coverage
## 316                            vpacos_homolog_orthology_confidence
## 317                                 mmmarmota_homolog_ensembl_gene
## 318                         mmmarmota_homolog_associated_gene_name
## 319                              mmmarmota_homolog_ensembl_peptide
## 320                                   mmmarmota_homolog_chromosome
## 321                                  mmmarmota_homolog_chrom_start
## 322                                    mmmarmota_homolog_chrom_end
## 323                 mmmarmota_homolog_canonical_transcript_protein
## 324                                      mmmarmota_homolog_subtype
## 325                               mmmarmota_homolog_orthology_type
## 326                                      mmmarmota_homolog_perc_id
## 327                                   mmmarmota_homolog_perc_id_r1
## 328                                    mmmarmota_homolog_goc_score
## 329                                 mmmarmota_homolog_wga_coverage
## 330                         mmmarmota_homolog_orthology_confidence
## 331                                  pformosa_homolog_ensembl_gene
## 332                          pformosa_homolog_associated_gene_name
## 333                               pformosa_homolog_ensembl_peptide
## 334                                    pformosa_homolog_chromosome
## 335                                   pformosa_homolog_chrom_start
## 336                                     pformosa_homolog_chrom_end
## 337                  pformosa_homolog_canonical_transcript_protein
## 338                                       pformosa_homolog_subtype
## 339                                pformosa_homolog_orthology_type
## 340                                       pformosa_homolog_perc_id
## 341                                    pformosa_homolog_perc_id_r1
## 342                                     pformosa_homolog_goc_score
## 343                                  pformosa_homolog_wga_coverage
## 344                          pformosa_homolog_orthology_confidence
## 345                                   bbbison_homolog_ensembl_gene
## 346                           bbbison_homolog_associated_gene_name
## 347                                bbbison_homolog_ensembl_peptide
## 348                                     bbbison_homolog_chromosome
## 349                                    bbbison_homolog_chrom_start
## 350                                      bbbison_homolog_chrom_end
## 351                   bbbison_homolog_canonical_transcript_protein
## 352                                        bbbison_homolog_subtype
## 353                                 bbbison_homolog_orthology_type
## 354                                        bbbison_homolog_perc_id
## 355                                     bbbison_homolog_perc_id_r1
## 356                                      bbbison_homolog_goc_score
## 357                                   bbbison_homolog_wga_coverage
## 358                           bbbison_homolog_orthology_confidence
## 359                               uamericanus_homolog_ensembl_gene
## 360                       uamericanus_homolog_associated_gene_name
## 361                            uamericanus_homolog_ensembl_peptide
## 362                                 uamericanus_homolog_chromosome
## 363                                uamericanus_homolog_chrom_start
## 364                                  uamericanus_homolog_chrom_end
## 365               uamericanus_homolog_canonical_transcript_protein
## 366                                    uamericanus_homolog_subtype
## 367                             uamericanus_homolog_orthology_type
## 368                                    uamericanus_homolog_perc_id
## 369                                 uamericanus_homolog_perc_id_r1
## 370                                  uamericanus_homolog_goc_score
## 371                               uamericanus_homolog_wga_coverage
## 372                       uamericanus_homolog_orthology_confidence
## 373                                    nvison_homolog_ensembl_gene
## 374                            nvison_homolog_associated_gene_name
## 375                                 nvison_homolog_ensembl_peptide
## 376                                      nvison_homolog_chromosome
## 377                                     nvison_homolog_chrom_start
## 378                                       nvison_homolog_chrom_end
## 379                    nvison_homolog_canonical_transcript_protein
## 380                                         nvison_homolog_subtype
## 381                                  nvison_homolog_orthology_type
## 382                                         nvison_homolog_perc_id
## 383                                      nvison_homolog_perc_id_r1
## 384                                       nvison_homolog_goc_score
## 385                                    nvison_homolog_wga_coverage
## 386                            nvison_homolog_orthology_confidence
## 387                              cdromedarius_homolog_ensembl_gene
## 388                      cdromedarius_homolog_associated_gene_name
## 389                           cdromedarius_homolog_ensembl_peptide
## 390                                cdromedarius_homolog_chromosome
## 391                               cdromedarius_homolog_chrom_start
## 392                                 cdromedarius_homolog_chrom_end
## 393              cdromedarius_homolog_canonical_transcript_protein
## 394                                   cdromedarius_homolog_subtype
## 395                            cdromedarius_homolog_orthology_type
## 396                                   cdromedarius_homolog_perc_id
## 397                                cdromedarius_homolog_perc_id_r1
## 398                                 cdromedarius_homolog_goc_score
## 399                              cdromedarius_homolog_wga_coverage
## 400                      cdromedarius_homolog_orthology_confidence
## 401                                  uparryii_homolog_ensembl_gene
## 402                          uparryii_homolog_associated_gene_name
## 403                               uparryii_homolog_ensembl_peptide
## 404                                    uparryii_homolog_chromosome
## 405                                   uparryii_homolog_chrom_start
## 406                                     uparryii_homolog_chrom_end
## 407                  uparryii_homolog_canonical_transcript_protein
## 408                                       uparryii_homolog_subtype
## 409                                uparryii_homolog_orthology_type
## 410                                       uparryii_homolog_perc_id
## 411                                    uparryii_homolog_perc_id_r1
## 412                                     uparryii_homolog_goc_score
## 413                                  uparryii_homolog_wga_coverage
## 414                          uparryii_homolog_orthology_confidence
## 415                                 smerianae_homolog_ensembl_gene
## 416                         smerianae_homolog_associated_gene_name
## 417                              smerianae_homolog_ensembl_peptide
## 418                                   smerianae_homolog_chromosome
## 419                                  smerianae_homolog_chrom_start
## 420                                    smerianae_homolog_chrom_end
## 421                 smerianae_homolog_canonical_transcript_protein
## 422                                      smerianae_homolog_subtype
## 423                               smerianae_homolog_orthology_type
## 424                                      smerianae_homolog_perc_id
## 425                                   smerianae_homolog_perc_id_r1
## 426                                    smerianae_homolog_goc_score
## 427                                 smerianae_homolog_wga_coverage
## 428                         smerianae_homolog_orthology_confidence
## 429                             dnovemcinctus_homolog_ensembl_gene
## 430                     dnovemcinctus_homolog_associated_gene_name
## 431                          dnovemcinctus_homolog_ensembl_peptide
## 432                               dnovemcinctus_homolog_chromosome
## 433                              dnovemcinctus_homolog_chrom_start
## 434                                dnovemcinctus_homolog_chrom_end
## 435             dnovemcinctus_homolog_canonical_transcript_protein
## 436                                  dnovemcinctus_homolog_subtype
## 437                           dnovemcinctus_homolog_orthology_type
## 438                                  dnovemcinctus_homolog_perc_id
## 439                               dnovemcinctus_homolog_perc_id_r1
## 440                                dnovemcinctus_homolog_goc_score
## 441                             dnovemcinctus_homolog_wga_coverage
## 442                     dnovemcinctus_homolog_orthology_confidence
## 443                                 sformosus_homolog_ensembl_gene
## 444                         sformosus_homolog_associated_gene_name
## 445                              sformosus_homolog_ensembl_peptide
## 446                                   sformosus_homolog_chromosome
## 447                                  sformosus_homolog_chrom_start
## 448                                    sformosus_homolog_chrom_end
## 449                 sformosus_homolog_canonical_transcript_protein
## 450                                      sformosus_homolog_subtype
## 451                               sformosus_homolog_orthology_type
## 452                                      sformosus_homolog_perc_id
## 453                                   sformosus_homolog_perc_id_r1
## 454                                    sformosus_homolog_goc_score
## 455                                 sformosus_homolog_wga_coverage
## 456                         sformosus_homolog_orthology_confidence
## 457                                   gmorhua_homolog_ensembl_gene
## 458                           gmorhua_homolog_associated_gene_name
## 459                                gmorhua_homolog_ensembl_peptide
## 460                                     gmorhua_homolog_chromosome
## 461                                    gmorhua_homolog_chrom_start
## 462                                      gmorhua_homolog_chrom_end
## 463                   gmorhua_homolog_canonical_transcript_protein
## 464                                        gmorhua_homolog_subtype
## 465                                 gmorhua_homolog_orthology_type
## 466                                        gmorhua_homolog_perc_id
## 467                                     gmorhua_homolog_perc_id_r1
## 468                                      gmorhua_homolog_goc_score
## 469                           gmorhua_homolog_orthology_confidence
## 470                                 charengus_homolog_ensembl_gene
## 471                         charengus_homolog_associated_gene_name
## 472                              charengus_homolog_ensembl_peptide
## 473                                   charengus_homolog_chromosome
## 474                                  charengus_homolog_chrom_start
## 475                                    charengus_homolog_chrom_end
## 476                 charengus_homolog_canonical_transcript_protein
## 477                                      charengus_homolog_subtype
## 478                               charengus_homolog_orthology_type
## 479                                      charengus_homolog_perc_id
## 480                                   charengus_homolog_perc_id_r1
## 481                                    charengus_homolog_goc_score
## 482                                 charengus_homolog_wga_coverage
## 483                         charengus_homolog_orthology_confidence
## 484                                    ssalar_homolog_ensembl_gene
## 485                            ssalar_homolog_associated_gene_name
## 486                                 ssalar_homolog_ensembl_peptide
## 487                                      ssalar_homolog_chromosome
## 488                                     ssalar_homolog_chrom_start
## 489                                       ssalar_homolog_chrom_end
## 490                    ssalar_homolog_canonical_transcript_protein
## 491                                         ssalar_homolog_subtype
## 492                                  ssalar_homolog_orthology_type
## 493                                         ssalar_homolog_perc_id
## 494                                      ssalar_homolog_perc_id_r1
## 495                                       ssalar_homolog_goc_score
## 496                            ssalar_homolog_orthology_confidence
## 497                                  cporosus_homolog_ensembl_gene
## 498                          cporosus_homolog_associated_gene_name
## 499                               cporosus_homolog_ensembl_peptide
## 500                                    cporosus_homolog_chromosome
## 501                                   cporosus_homolog_chrom_start
## 502                                     cporosus_homolog_chrom_end
## 503                  cporosus_homolog_canonical_transcript_protein
## 504                                       cporosus_homolog_subtype
## 505                                cporosus_homolog_orthology_type
## 506                                       cporosus_homolog_perc_id
## 507                                    cporosus_homolog_perc_id_r1
## 508                                     cporosus_homolog_goc_score
## 509                                  cporosus_homolog_wga_coverage
## 510                          cporosus_homolog_orthology_confidence
## 511                                 lbergylta_homolog_ensembl_gene
## 512                         lbergylta_homolog_associated_gene_name
## 513                              lbergylta_homolog_ensembl_peptide
## 514                                   lbergylta_homolog_chromosome
## 515                                  lbergylta_homolog_chrom_start
## 516                                    lbergylta_homolog_chrom_end
## 517                 lbergylta_homolog_canonical_transcript_protein
## 518                                      lbergylta_homolog_subtype
## 519                               lbergylta_homolog_orthology_type
## 520                                      lbergylta_homolog_perc_id
## 521                                   lbergylta_homolog_perc_id_r1
## 522                                    lbergylta_homolog_goc_score
## 523                                 lbergylta_homolog_wga_coverage
## 524                         lbergylta_homolog_orthology_confidence
## 525                               lcalcarifer_homolog_ensembl_gene
## 526                       lcalcarifer_homolog_associated_gene_name
## 527                            lcalcarifer_homolog_ensembl_peptide
## 528                                 lcalcarifer_homolog_chromosome
## 529                                lcalcarifer_homolog_chrom_start
## 530                                  lcalcarifer_homolog_chrom_end
## 531               lcalcarifer_homolog_canonical_transcript_protein
## 532                                    lcalcarifer_homolog_subtype
## 533                             lcalcarifer_homolog_orthology_type
## 534                                    lcalcarifer_homolog_perc_id
## 535                                 lcalcarifer_homolog_perc_id_r1
## 536                                  lcalcarifer_homolog_goc_score
## 537                               lcalcarifer_homolog_wga_coverage
## 538                       lcalcarifer_homolog_orthology_confidence
## 539                                   dleucas_homolog_ensembl_gene
## 540                           dleucas_homolog_associated_gene_name
## 541                                dleucas_homolog_ensembl_peptide
## 542                                     dleucas_homolog_chromosome
## 543                                    dleucas_homolog_chrom_start
## 544                                      dleucas_homolog_chrom_end
## 545                   dleucas_homolog_canonical_transcript_protein
## 546                                        dleucas_homolog_subtype
## 547                                 dleucas_homolog_orthology_type
## 548                                        dleucas_homolog_perc_id
## 549                                     dleucas_homolog_perc_id_r1
## 550                                      dleucas_homolog_goc_score
## 551                                   dleucas_homolog_wga_coverage
## 552                           dleucas_homolog_orthology_confidence
## 553                                 spartitus_homolog_ensembl_gene
## 554                         spartitus_homolog_associated_gene_name
## 555                              spartitus_homolog_ensembl_peptide
## 556                                   spartitus_homolog_chromosome
## 557                                  spartitus_homolog_chrom_start
## 558                                    spartitus_homolog_chrom_end
## 559                 spartitus_homolog_canonical_transcript_protein
## 560                                      spartitus_homolog_subtype
## 561                               spartitus_homolog_orthology_type
## 562                                      spartitus_homolog_perc_id
## 563                                   spartitus_homolog_perc_id_r1
## 564                                    spartitus_homolog_goc_score
## 565                                 spartitus_homolog_wga_coverage
## 566                         spartitus_homolog_orthology_confidence
## 567                                    rbieti_homolog_ensembl_gene
## 568                            rbieti_homolog_associated_gene_name
## 569                                 rbieti_homolog_ensembl_peptide
## 570                                      rbieti_homolog_chromosome
## 571                                     rbieti_homolog_chrom_start
## 572                                       rbieti_homolog_chrom_end
## 573                    rbieti_homolog_canonical_transcript_protein
## 574                                         rbieti_homolog_subtype
## 575                                  rbieti_homolog_orthology_type
## 576                                         rbieti_homolog_perc_id
## 577                                      rbieti_homolog_perc_id_r1
## 578                                       rbieti_homolog_goc_score
## 579                                    rbieti_homolog_wga_coverage
## 580                            rbieti_homolog_orthology_confidence
## 581                                 bmusculus_homolog_ensembl_gene
## 582                         bmusculus_homolog_associated_gene_name
## 583                              bmusculus_homolog_ensembl_peptide
## 584                                   bmusculus_homolog_chromosome
## 585                                  bmusculus_homolog_chrom_start
## 586                                    bmusculus_homolog_chrom_end
## 587                 bmusculus_homolog_canonical_transcript_protein
## 588                                      bmusculus_homolog_subtype
## 589                               bmusculus_homolog_orthology_type
## 590                                      bmusculus_homolog_perc_id
## 591                                   bmusculus_homolog_perc_id_r1
## 592                                    bmusculus_homolog_goc_score
## 593                                 bmusculus_homolog_wga_coverage
## 594                         bmusculus_homolog_orthology_confidence
## 595                              llaticaudata_homolog_ensembl_gene
## 596                      llaticaudata_homolog_associated_gene_name
## 597                           llaticaudata_homolog_ensembl_peptide
## 598                                llaticaudata_homolog_chromosome
## 599                               llaticaudata_homolog_chrom_start
## 600                                 llaticaudata_homolog_chrom_end
## 601              llaticaudata_homolog_canonical_transcript_protein
## 602                                   llaticaudata_homolog_subtype
## 603                            llaticaudata_homolog_orthology_type
## 604                                   llaticaudata_homolog_perc_id
## 605                                llaticaudata_homolog_perc_id_r1
## 606                                 llaticaudata_homolog_goc_score
## 607                              llaticaudata_homolog_wga_coverage
## 608                      llaticaudata_homolog_orthology_confidence
## 609                             sbboliviensis_homolog_ensembl_gene
## 610                     sbboliviensis_homolog_associated_gene_name
## 611                          sbboliviensis_homolog_ensembl_peptide
## 612                               sbboliviensis_homolog_chromosome
## 613                              sbboliviensis_homolog_chrom_start
## 614                                sbboliviensis_homolog_chrom_end
## 615             sbboliviensis_homolog_canonical_transcript_protein
## 616                                  sbboliviensis_homolog_subtype
## 617                           sbboliviensis_homolog_orthology_type
## 618                                  sbboliviensis_homolog_perc_id
## 619                               sbboliviensis_homolog_perc_id_r1
## 620                                sbboliviensis_homolog_goc_score
## 621                             sbboliviensis_homolog_wga_coverage
## 622                     sbboliviensis_homolog_orthology_confidence
## 623                                 ppaniscus_homolog_ensembl_gene
## 624                         ppaniscus_homolog_associated_gene_name
## 625                              ppaniscus_homolog_ensembl_peptide
## 626                                   ppaniscus_homolog_chromosome
## 627                                  ppaniscus_homolog_chrom_start
## 628                                    ppaniscus_homolog_chrom_end
## 629                 ppaniscus_homolog_canonical_transcript_protein
## 630                                      ppaniscus_homolog_subtype
## 631                               ppaniscus_homolog_orthology_type
## 632                                      ppaniscus_homolog_perc_id
## 633                                   ppaniscus_homolog_perc_id_r1
## 634                                    ppaniscus_homolog_goc_score
## 635                                 ppaniscus_homolog_wga_coverage
## 636                         ppaniscus_homolog_orthology_confidence
## 637                                   strutta_homolog_ensembl_gene
## 638                           strutta_homolog_associated_gene_name
## 639                                strutta_homolog_ensembl_peptide
## 640                                     strutta_homolog_chromosome
## 641                                    strutta_homolog_chrom_start
## 642                                      strutta_homolog_chrom_end
## 643                   strutta_homolog_canonical_transcript_protein
## 644                                        strutta_homolog_subtype
## 645                                 strutta_homolog_orthology_type
## 646                                        strutta_homolog_perc_id
## 647                                     strutta_homolog_perc_id_r1
## 648                                      strutta_homolog_goc_score
## 649                                   strutta_homolog_wga_coverage
## 650                           strutta_homolog_orthology_confidence
## 651                                  hburtoni_homolog_ensembl_gene
## 652                          hburtoni_homolog_associated_gene_name
## 653                               hburtoni_homolog_ensembl_peptide
## 654                                    hburtoni_homolog_chromosome
## 655                                   hburtoni_homolog_chrom_start
## 656                                     hburtoni_homolog_chrom_end
## 657                  hburtoni_homolog_canonical_transcript_protein
## 658                                       hburtoni_homolog_subtype
## 659                                hburtoni_homolog_orthology_type
## 660                                       hburtoni_homolog_perc_id
## 661                                    hburtoni_homolog_perc_id_r1
## 662                                     hburtoni_homolog_goc_score
## 663                                  hburtoni_homolog_wga_coverage
## 664                          hburtoni_homolog_orthology_confidence
## 665                                ogarnettii_homolog_ensembl_gene
## 666                        ogarnettii_homolog_associated_gene_name
## 667                             ogarnettii_homolog_ensembl_peptide
## 668                                  ogarnettii_homolog_chromosome
## 669                                 ogarnettii_homolog_chrom_start
## 670                                   ogarnettii_homolog_chrom_end
## 671                ogarnettii_homolog_canonical_transcript_protein
## 672                                     ogarnettii_homolog_subtype
## 673                              ogarnettii_homolog_orthology_type
## 674                                     ogarnettii_homolog_perc_id
## 675                                  ogarnettii_homolog_perc_id_r1
## 676                                   ogarnettii_homolog_goc_score
## 677                                ogarnettii_homolog_wga_coverage
## 678                        ogarnettii_homolog_orthology_confidence
## 679                             cintestinalis_homolog_ensembl_gene
## 680                     cintestinalis_homolog_associated_gene_name
## 681                          cintestinalis_homolog_ensembl_peptide
## 682                               cintestinalis_homolog_chromosome
## 683                              cintestinalis_homolog_chrom_start
## 684                                cintestinalis_homolog_chrom_end
## 685             cintestinalis_homolog_canonical_transcript_protein
## 686                                  cintestinalis_homolog_subtype
## 687                           cintestinalis_homolog_orthology_type
## 688                                  cintestinalis_homolog_perc_id
## 689                               cintestinalis_homolog_perc_id_r1
## 690                             cintestinalis_homolog_wga_coverage
## 691                     cintestinalis_homolog_orthology_confidence
## 692                                 csavignyi_homolog_ensembl_gene
## 693                         csavignyi_homolog_associated_gene_name
## 694                              csavignyi_homolog_ensembl_peptide
## 695                                   csavignyi_homolog_chromosome
## 696                                  csavignyi_homolog_chrom_start
## 697                                    csavignyi_homolog_chrom_end
## 698                 csavignyi_homolog_canonical_transcript_protein
## 699                                      csavignyi_homolog_subtype
## 700                               csavignyi_homolog_orthology_type
## 701                                      csavignyi_homolog_perc_id
## 702                                   csavignyi_homolog_perc_id_r1
## 703                                 csavignyi_homolog_wga_coverage
## 704                         csavignyi_homolog_orthology_confidence
## 705                                  celegans_homolog_ensembl_gene
## 706                          celegans_homolog_associated_gene_name
## 707                               celegans_homolog_ensembl_peptide
## 708                                    celegans_homolog_chromosome
## 709                                   celegans_homolog_chrom_start
## 710                                     celegans_homolog_chrom_end
## 711                  celegans_homolog_canonical_transcript_protein
## 712                                       celegans_homolog_subtype
## 713                                celegans_homolog_orthology_type
## 714                                       celegans_homolog_perc_id
## 715                                    celegans_homolog_perc_id_r1
## 716                          celegans_homolog_orthology_confidence
## 717                                    fcatus_homolog_ensembl_gene
## 718                            fcatus_homolog_associated_gene_name
## 719                                 fcatus_homolog_ensembl_peptide
## 720                                      fcatus_homolog_chromosome
## 721                                     fcatus_homolog_chrom_start
## 722                                       fcatus_homolog_chrom_end
## 723                    fcatus_homolog_canonical_transcript_protein
## 724                                         fcatus_homolog_subtype
## 725                                  fcatus_homolog_orthology_type
## 726                                         fcatus_homolog_perc_id
## 727                                      fcatus_homolog_perc_id_r1
## 728                                       fcatus_homolog_goc_score
## 729                                    fcatus_homolog_wga_coverage
## 730                            fcatus_homolog_orthology_confidence
## 731                                  cwagneri_homolog_ensembl_gene
## 732                          cwagneri_homolog_associated_gene_name
## 733                               cwagneri_homolog_ensembl_peptide
## 734                                    cwagneri_homolog_chromosome
## 735                                   cwagneri_homolog_chrom_start
## 736                                     cwagneri_homolog_chrom_end
## 737                  cwagneri_homolog_canonical_transcript_protein
## 738                                       cwagneri_homolog_subtype
## 739                                cwagneri_homolog_orthology_type
## 740                                       cwagneri_homolog_perc_id
## 741                                    cwagneri_homolog_perc_id_r1
## 742                                     cwagneri_homolog_goc_score
## 743                                  cwagneri_homolog_wga_coverage
## 744                          cwagneri_homolog_orthology_confidence
## 745                                    cgobio_homolog_ensembl_gene
## 746                            cgobio_homolog_associated_gene_name
## 747                                 cgobio_homolog_ensembl_peptide
## 748                                      cgobio_homolog_chromosome
## 749                                     cgobio_homolog_chrom_start
## 750                                       cgobio_homolog_chrom_end
## 751                    cgobio_homolog_canonical_transcript_protein
## 752                                         cgobio_homolog_subtype
## 753                                  cgobio_homolog_orthology_type
## 754                                         cgobio_homolog_perc_id
## 755                                      cgobio_homolog_perc_id_r1
## 756                                       cgobio_homolog_goc_score
## 757                                    cgobio_homolog_wga_coverage
## 758                            cgobio_homolog_orthology_confidence
## 759                                ipunctatus_homolog_ensembl_gene
## 760                        ipunctatus_homolog_associated_gene_name
## 761                             ipunctatus_homolog_ensembl_peptide
## 762                                  ipunctatus_homolog_chromosome
## 763                                 ipunctatus_homolog_chrom_start
## 764                                   ipunctatus_homolog_chrom_end
## 765                ipunctatus_homolog_canonical_transcript_protein
## 766                                     ipunctatus_homolog_subtype
## 767                              ipunctatus_homolog_orthology_type
## 768                                     ipunctatus_homolog_perc_id
## 769                                  ipunctatus_homolog_perc_id_r1
## 770                                   ipunctatus_homolog_goc_score
## 771                                ipunctatus_homolog_wga_coverage
## 772                        ipunctatus_homolog_orthology_confidence
## 773                                   ggallus_homolog_ensembl_gene
## 774                           ggallus_homolog_associated_gene_name
## 775                                ggallus_homolog_ensembl_peptide
## 776                                     ggallus_homolog_chromosome
## 777                                    ggallus_homolog_chrom_start
## 778                                      ggallus_homolog_chrom_end
## 779                   ggallus_homolog_canonical_transcript_protein
## 780                                        ggallus_homolog_subtype
## 781                                 ggallus_homolog_orthology_type
## 782                                        ggallus_homolog_perc_id
## 783                                     ggallus_homolog_perc_id_r1
## 784                                      ggallus_homolog_goc_score
## 785                                   ggallus_homolog_wga_coverage
## 786                           ggallus_homolog_orthology_confidence
## 787                              ptroglodytes_homolog_ensembl_gene
## 788                      ptroglodytes_homolog_associated_gene_name
## 789                           ptroglodytes_homolog_ensembl_peptide
## 790                                ptroglodytes_homolog_chromosome
## 791                               ptroglodytes_homolog_chrom_start
## 792                                 ptroglodytes_homolog_chrom_end
## 793              ptroglodytes_homolog_canonical_transcript_protein
## 794                                   ptroglodytes_homolog_subtype
## 795                            ptroglodytes_homolog_orthology_type
## 796                                   ptroglodytes_homolog_perc_id
## 797                                ptroglodytes_homolog_perc_id_r1
## 798                                 ptroglodytes_homolog_goc_score
## 799                              ptroglodytes_homolog_wga_coverage
## 800                      ptroglodytes_homolog_orthology_confidence
## 801                               cgchok1gshd_homolog_ensembl_gene
## 802                       cgchok1gshd_homolog_associated_gene_name
## 803                            cgchok1gshd_homolog_ensembl_peptide
## 804                                 cgchok1gshd_homolog_chromosome
## 805                                cgchok1gshd_homolog_chrom_start
## 806                                  cgchok1gshd_homolog_chrom_end
## 807               cgchok1gshd_homolog_canonical_transcript_protein
## 808                                    cgchok1gshd_homolog_subtype
## 809                             cgchok1gshd_homolog_orthology_type
## 810                                    cgchok1gshd_homolog_perc_id
## 811                                 cgchok1gshd_homolog_perc_id_r1
## 812                                  cgchok1gshd_homolog_goc_score
## 813                               cgchok1gshd_homolog_wga_coverage
## 814                       cgchok1gshd_homolog_orthology_confidence
## 815                                 osinensis_homolog_ensembl_gene
## 816                         osinensis_homolog_associated_gene_name
## 817                              osinensis_homolog_ensembl_peptide
## 818                                   osinensis_homolog_chromosome
## 819                                  osinensis_homolog_chrom_start
## 820                                    osinensis_homolog_chrom_end
## 821                 osinensis_homolog_canonical_transcript_protein
## 822                                      osinensis_homolog_subtype
## 823                               osinensis_homolog_orthology_type
## 824                                      osinensis_homolog_perc_id
## 825                                   osinensis_homolog_perc_id_r1
## 826                                    osinensis_homolog_goc_score
## 827                                 osinensis_homolog_wga_coverage
## 828                         osinensis_homolog_orthology_confidence
## 829                                 psinensis_homolog_ensembl_gene
## 830                         psinensis_homolog_associated_gene_name
## 831                              psinensis_homolog_ensembl_peptide
## 832                                   psinensis_homolog_chromosome
## 833                                  psinensis_homolog_chrom_start
## 834                                    psinensis_homolog_chrom_end
## 835                 psinensis_homolog_canonical_transcript_protein
## 836                                      psinensis_homolog_subtype
## 837                               psinensis_homolog_orthology_type
## 838                                      psinensis_homolog_perc_id
## 839                                   psinensis_homolog_perc_id_r1
## 840                                    psinensis_homolog_goc_score
## 841                                 psinensis_homolog_wga_coverage
## 842                         psinensis_homolog_orthology_confidence
## 843                              otshawytscha_homolog_ensembl_gene
## 844                      otshawytscha_homolog_associated_gene_name
## 845                           otshawytscha_homolog_ensembl_peptide
## 846                                otshawytscha_homolog_chromosome
## 847                               otshawytscha_homolog_chrom_start
## 848                                 otshawytscha_homolog_chrom_end
## 849              otshawytscha_homolog_canonical_transcript_protein
## 850                                   otshawytscha_homolog_subtype
## 851                            otshawytscha_homolog_orthology_type
## 852                                   otshawytscha_homolog_perc_id
## 853                                otshawytscha_homolog_perc_id_r1
## 854                                 otshawytscha_homolog_goc_score
## 855                              otshawytscha_homolog_wga_coverage
## 856                      otshawytscha_homolog_orthology_confidence
## 857                              atestudineus_homolog_ensembl_gene
## 858                      atestudineus_homolog_associated_gene_name
## 859                           atestudineus_homolog_ensembl_peptide
## 860                                atestudineus_homolog_chromosome
## 861                               atestudineus_homolog_chrom_start
## 862                                 atestudineus_homolog_chrom_end
## 863              atestudineus_homolog_canonical_transcript_protein
## 864                                   atestudineus_homolog_subtype
## 865                            atestudineus_homolog_orthology_type
## 866                                   atestudineus_homolog_perc_id
## 867                                atestudineus_homolog_perc_id_r1
## 868                                 atestudineus_homolog_goc_score
## 869                      atestudineus_homolog_orthology_confidence
## 870                                aocellaris_homolog_ensembl_gene
## 871                        aocellaris_homolog_associated_gene_name
## 872                             aocellaris_homolog_ensembl_peptide
## 873                                  aocellaris_homolog_chromosome
## 874                                 aocellaris_homolog_chrom_start
## 875                                   aocellaris_homolog_chrom_end
## 876                aocellaris_homolog_canonical_transcript_protein
## 877                                     aocellaris_homolog_subtype
## 878                              aocellaris_homolog_orthology_type
## 879                                     aocellaris_homolog_perc_id
## 880                                  aocellaris_homolog_perc_id_r1
## 881                                   aocellaris_homolog_goc_score
## 882                                aocellaris_homolog_wga_coverage
## 883                        aocellaris_homolog_orthology_confidence
## 884                                lchalumnae_homolog_ensembl_gene
## 885                        lchalumnae_homolog_associated_gene_name
## 886                             lchalumnae_homolog_ensembl_peptide
## 887                                  lchalumnae_homolog_chromosome
## 888                                 lchalumnae_homolog_chrom_start
## 889                                   lchalumnae_homolog_chrom_end
## 890                lchalumnae_homolog_canonical_transcript_protein
## 891                                     lchalumnae_homolog_subtype
## 892                              lchalumnae_homolog_orthology_type
## 893                                     lchalumnae_homolog_perc_id
## 894                                  lchalumnae_homolog_perc_id_r1
## 895                                   lchalumnae_homolog_goc_score
## 896                                lchalumnae_homolog_wga_coverage
## 897                        lchalumnae_homolog_orthology_confidence
## 898                                  okisutch_homolog_ensembl_gene
## 899                          okisutch_homolog_associated_gene_name
## 900                               okisutch_homolog_ensembl_peptide
## 901                                    okisutch_homolog_chromosome
## 902                                   okisutch_homolog_chrom_start
## 903                                     okisutch_homolog_chrom_end
## 904                  okisutch_homolog_canonical_transcript_protein
## 905                                       okisutch_homolog_subtype
## 906                                okisutch_homolog_orthology_type
## 907                                       okisutch_homolog_perc_id
## 908                                    okisutch_homolog_perc_id_r1
## 909                                     okisutch_homolog_goc_score
## 910                                  okisutch_homolog_wga_coverage
## 911                          okisutch_homolog_orthology_confidence
## 912                               falbicollis_homolog_ensembl_gene
## 913                       falbicollis_homolog_associated_gene_name
## 914                            falbicollis_homolog_ensembl_peptide
## 915                                 falbicollis_homolog_chromosome
## 916                                falbicollis_homolog_chrom_start
## 917                                  falbicollis_homolog_chrom_end
## 918               falbicollis_homolog_canonical_transcript_protein
## 919                                    falbicollis_homolog_subtype
## 920                             falbicollis_homolog_orthology_type
## 921                                    falbicollis_homolog_perc_id
## 922                                 falbicollis_homolog_perc_id_r1
## 923                                  falbicollis_homolog_goc_score
## 924                       falbicollis_homolog_orthology_confidence
## 925                                  scanaria_homolog_ensembl_gene
## 926                          scanaria_homolog_associated_gene_name
## 927                               scanaria_homolog_ensembl_peptide
## 928                                    scanaria_homolog_chromosome
## 929                                   scanaria_homolog_chrom_start
## 930                                     scanaria_homolog_chrom_end
## 931                  scanaria_homolog_canonical_transcript_protein
## 932                                       scanaria_homolog_subtype
## 933                                scanaria_homolog_orthology_type
## 934                                       scanaria_homolog_perc_id
## 935                                    scanaria_homolog_perc_id_r1
## 936                                     scanaria_homolog_goc_score
## 937                                  scanaria_homolog_wga_coverage
## 938                          scanaria_homolog_orthology_confidence
## 939                                  cccarpio_homolog_ensembl_gene
## 940                          cccarpio_homolog_associated_gene_name
## 941                               cccarpio_homolog_ensembl_peptide
## 942                                    cccarpio_homolog_chromosome
## 943                                   cccarpio_homolog_chrom_start
## 944                                     cccarpio_homolog_chrom_end
## 945                  cccarpio_homolog_canonical_transcript_protein
## 946                                       cccarpio_homolog_subtype
## 947                                cccarpio_homolog_orthology_type
## 948                                       cccarpio_homolog_perc_id
## 949                                    cccarpio_homolog_perc_id_r1
## 950                                     cccarpio_homolog_goc_score
## 951                          cccarpio_homolog_orthology_confidence
## 952                                  pmuralis_homolog_ensembl_gene
## 953                          pmuralis_homolog_associated_gene_name
## 954                               pmuralis_homolog_ensembl_peptide
## 955                                    pmuralis_homolog_chromosome
## 956                                   pmuralis_homolog_chrom_start
## 957                                     pmuralis_homolog_chrom_end
## 958                  pmuralis_homolog_canonical_transcript_protein
## 959                                       pmuralis_homolog_subtype
## 960                                pmuralis_homolog_orthology_type
## 961                                       pmuralis_homolog_perc_id
## 962                                    pmuralis_homolog_perc_id_r1
## 963                                     pmuralis_homolog_goc_score
## 964                                  pmuralis_homolog_wga_coverage
## 965                          pmuralis_homolog_orthology_confidence
## 966                                  vursinus_homolog_ensembl_gene
## 967                          vursinus_homolog_associated_gene_name
## 968                               vursinus_homolog_ensembl_peptide
## 969                                    vursinus_homolog_chromosome
## 970                                   vursinus_homolog_chrom_start
## 971                                     vursinus_homolog_chrom_end
## 972                  vursinus_homolog_canonical_transcript_protein
## 973                                       vursinus_homolog_subtype
## 974                                vursinus_homolog_orthology_type
## 975                                       vursinus_homolog_perc_id
## 976                                    vursinus_homolog_perc_id_r1
## 977                                     vursinus_homolog_goc_score
## 978                                  vursinus_homolog_wga_coverage
## 979                          vursinus_homolog_orthology_confidence
## 980                                pcoquereli_homolog_ensembl_gene
## 981                        pcoquereli_homolog_associated_gene_name
## 982                             pcoquereli_homolog_ensembl_peptide
## 983                                  pcoquereli_homolog_chromosome
## 984                                 pcoquereli_homolog_chrom_start
## 985                                   pcoquereli_homolog_chrom_end
## 986                pcoquereli_homolog_canonical_transcript_protein
## 987                                     pcoquereli_homolog_subtype
## 988                              pcoquereli_homolog_orthology_type
## 989                                     pcoquereli_homolog_perc_id
## 990                                  pcoquereli_homolog_perc_id_r1
## 991                                   pcoquereli_homolog_goc_score
## 992                                pcoquereli_homolog_wga_coverage
## 993                        pcoquereli_homolog_orthology_confidence
## 994                                   btaurus_homolog_ensembl_gene
## 995                           btaurus_homolog_associated_gene_name
## 996                                btaurus_homolog_ensembl_peptide
## 997                                     btaurus_homolog_chromosome
## 998                                    btaurus_homolog_chrom_start
## 999                                      btaurus_homolog_chrom_end
## 1000                  btaurus_homolog_canonical_transcript_protein
## 1001                                       btaurus_homolog_subtype
## 1002                                btaurus_homolog_orthology_type
## 1003                                       btaurus_homolog_perc_id
## 1004                                    btaurus_homolog_perc_id_r1
## 1005                                     btaurus_homolog_goc_score
## 1006                                  btaurus_homolog_wga_coverage
## 1007                          btaurus_homolog_orthology_confidence
## 1008                            mfascicularis_homolog_ensembl_gene
## 1009                    mfascicularis_homolog_associated_gene_name
## 1010                         mfascicularis_homolog_ensembl_peptide
## 1011                              mfascicularis_homolog_chromosome
## 1012                             mfascicularis_homolog_chrom_start
## 1013                               mfascicularis_homolog_chrom_end
## 1014            mfascicularis_homolog_canonical_transcript_protein
## 1015                                 mfascicularis_homolog_subtype
## 1016                          mfascicularis_homolog_orthology_type
## 1017                                 mfascicularis_homolog_perc_id
## 1018                              mfascicularis_homolog_perc_id_r1
## 1019                               mfascicularis_homolog_goc_score
## 1020                            mfascicularis_homolog_wga_coverage
## 1021                    mfascicularis_homolog_orthology_confidence
## 1022                                   odegus_homolog_ensembl_gene
## 1023                           odegus_homolog_associated_gene_name
## 1024                                odegus_homolog_ensembl_peptide
## 1025                                     odegus_homolog_chromosome
## 1026                                    odegus_homolog_chrom_start
## 1027                                      odegus_homolog_chrom_end
## 1028                   odegus_homolog_canonical_transcript_protein
## 1029                                        odegus_homolog_subtype
## 1030                                 odegus_homolog_orthology_type
## 1031                                        odegus_homolog_perc_id
## 1032                                     odegus_homolog_perc_id_r1
## 1033                                      odegus_homolog_goc_score
## 1034                                   odegus_homolog_wga_coverage
## 1035                           odegus_homolog_orthology_confidence
## 1036                              dclupeoides_homolog_ensembl_gene
## 1037                      dclupeoides_homolog_associated_gene_name
## 1038                           dclupeoides_homolog_ensembl_peptide
## 1039                                dclupeoides_homolog_chromosome
## 1040                               dclupeoides_homolog_chrom_start
## 1041                                 dclupeoides_homolog_chrom_end
## 1042              dclupeoides_homolog_canonical_transcript_protein
## 1043                                   dclupeoides_homolog_subtype
## 1044                            dclupeoides_homolog_orthology_type
## 1045                                   dclupeoides_homolog_perc_id
## 1046                                dclupeoides_homolog_perc_id_r1
## 1047                                 dclupeoides_homolog_goc_score
## 1048                              dclupeoides_homolog_wga_coverage
## 1049                      dclupeoides_homolog_orthology_confidence
## 1050                                  cldingo_homolog_ensembl_gene
## 1051                          cldingo_homolog_associated_gene_name
## 1052                               cldingo_homolog_ensembl_peptide
## 1053                                    cldingo_homolog_chromosome
## 1054                                   cldingo_homolog_chrom_start
## 1055                                     cldingo_homolog_chrom_end
## 1056                  cldingo_homolog_canonical_transcript_protein
## 1057                                       cldingo_homolog_subtype
## 1058                                cldingo_homolog_orthology_type
## 1059                                       cldingo_homolog_perc_id
## 1060                                    cldingo_homolog_perc_id_r1
## 1061                                     cldingo_homolog_goc_score
## 1062                                  cldingo_homolog_wga_coverage
## 1063                          cldingo_homolog_orthology_confidence
## 1064                             clfamiliaris_homolog_ensembl_gene
## 1065                     clfamiliaris_homolog_associated_gene_name
## 1066                          clfamiliaris_homolog_ensembl_peptide
## 1067                               clfamiliaris_homolog_chromosome
## 1068                              clfamiliaris_homolog_chrom_start
## 1069                                clfamiliaris_homolog_chrom_end
## 1070             clfamiliaris_homolog_canonical_transcript_protein
## 1071                                  clfamiliaris_homolog_subtype
## 1072                           clfamiliaris_homolog_orthology_type
## 1073                                  clfamiliaris_homolog_perc_id
## 1074                               clfamiliaris_homolog_perc_id_r1
## 1075                                clfamiliaris_homolog_goc_score
## 1076                             clfamiliaris_homolog_wga_coverage
## 1077                     clfamiliaris_homolog_orthology_confidence
## 1078                               ttruncatus_homolog_ensembl_gene
## 1079                       ttruncatus_homolog_associated_gene_name
## 1080                            ttruncatus_homolog_ensembl_peptide
## 1081                                 ttruncatus_homolog_chromosome
## 1082                                ttruncatus_homolog_chrom_start
## 1083                                  ttruncatus_homolog_chrom_end
## 1084               ttruncatus_homolog_canonical_transcript_protein
## 1085                                    ttruncatus_homolog_subtype
## 1086                             ttruncatus_homolog_orthology_type
## 1087                                    ttruncatus_homolog_perc_id
## 1088                                 ttruncatus_homolog_perc_id_r1
## 1089                                  ttruncatus_homolog_goc_score
## 1090                               ttruncatus_homolog_wga_coverage
## 1091                       ttruncatus_homolog_orthology_confidence
## 1092                               bgrunniens_homolog_ensembl_gene
## 1093                       bgrunniens_homolog_associated_gene_name
## 1094                            bgrunniens_homolog_ensembl_peptide
## 1095                                 bgrunniens_homolog_chromosome
## 1096                                bgrunniens_homolog_chrom_start
## 1097                                  bgrunniens_homolog_chrom_end
## 1098               bgrunniens_homolog_canonical_transcript_protein
## 1099                                    bgrunniens_homolog_subtype
## 1100                             bgrunniens_homolog_orthology_type
## 1101                                    bgrunniens_homolog_perc_id
## 1102                                 bgrunniens_homolog_perc_id_r1
## 1103                                  bgrunniens_homolog_goc_score
## 1104                               bgrunniens_homolog_wga_coverage
## 1105                       bgrunniens_homolog_orthology_confidence
## 1106                                  easinus_homolog_ensembl_gene
## 1107                          easinus_homolog_associated_gene_name
## 1108                               easinus_homolog_ensembl_peptide
## 1109                                    easinus_homolog_chromosome
## 1110                                   easinus_homolog_chrom_start
## 1111                                     easinus_homolog_chrom_end
## 1112                  easinus_homolog_canonical_transcript_protein
## 1113                                       easinus_homolog_subtype
## 1114                                easinus_homolog_orthology_type
## 1115                                       easinus_homolog_perc_id
## 1116                                    easinus_homolog_perc_id_r1
## 1117                                     easinus_homolog_goc_score
## 1118                          easinus_homolog_orthology_confidence
## 1119                             mleucophaeus_homolog_ensembl_gene
## 1120                     mleucophaeus_homolog_associated_gene_name
## 1121                          mleucophaeus_homolog_ensembl_peptide
## 1122                               mleucophaeus_homolog_chromosome
## 1123                              mleucophaeus_homolog_chrom_start
## 1124                                mleucophaeus_homolog_chrom_end
## 1125             mleucophaeus_homolog_canonical_transcript_protein
## 1126                                  mleucophaeus_homolog_subtype
## 1127                           mleucophaeus_homolog_orthology_type
## 1128                                  mleucophaeus_homolog_perc_id
## 1129                               mleucophaeus_homolog_perc_id_r1
## 1130                                mleucophaeus_homolog_goc_score
## 1131                             mleucophaeus_homolog_wga_coverage
## 1132                     mleucophaeus_homolog_orthology_confidence
## 1133                            dmelanogaster_homolog_ensembl_gene
## 1134                    dmelanogaster_homolog_associated_gene_name
## 1135                         dmelanogaster_homolog_ensembl_peptide
## 1136                              dmelanogaster_homolog_chromosome
## 1137                             dmelanogaster_homolog_chrom_start
## 1138                               dmelanogaster_homolog_chrom_end
## 1139            dmelanogaster_homolog_canonical_transcript_protein
## 1140                                 dmelanogaster_homolog_subtype
## 1141                          dmelanogaster_homolog_orthology_type
## 1142                                 dmelanogaster_homolog_perc_id
## 1143                              dmelanogaster_homolog_perc_id_r1
## 1144                    dmelanogaster_homolog_orthology_confidence
## 1145                          applatyrhynchos_homolog_ensembl_gene
## 1146                  applatyrhynchos_homolog_associated_gene_name
## 1147                       applatyrhynchos_homolog_ensembl_peptide
## 1148                            applatyrhynchos_homolog_chromosome
## 1149                           applatyrhynchos_homolog_chrom_start
## 1150                             applatyrhynchos_homolog_chrom_end
## 1151          applatyrhynchos_homolog_canonical_transcript_protein
## 1152                               applatyrhynchos_homolog_subtype
## 1153                        applatyrhynchos_homolog_orthology_type
## 1154                               applatyrhynchos_homolog_perc_id
## 1155                            applatyrhynchos_homolog_perc_id_r1
## 1156                             applatyrhynchos_homolog_goc_score
## 1157                          applatyrhynchos_homolog_wga_coverage
## 1158                  applatyrhynchos_homolog_orthology_confidence
## 1159                                ptextilis_homolog_ensembl_gene
## 1160                        ptextilis_homolog_associated_gene_name
## 1161                             ptextilis_homolog_ensembl_peptide
## 1162                                  ptextilis_homolog_chromosome
## 1163                                 ptextilis_homolog_chrom_start
## 1164                                   ptextilis_homolog_chrom_end
## 1165                ptextilis_homolog_canonical_transcript_protein
## 1166                                     ptextilis_homolog_subtype
## 1167                              ptextilis_homolog_orthology_type
## 1168                                     ptextilis_homolog_perc_id
## 1169                                  ptextilis_homolog_perc_id_r1
## 1170                                   ptextilis_homolog_goc_score
## 1171                                ptextilis_homolog_wga_coverage
## 1172                        ptextilis_homolog_orthology_confidence
## 1173                              acalliptera_homolog_ensembl_gene
## 1174                      acalliptera_homolog_associated_gene_name
## 1175                           acalliptera_homolog_ensembl_peptide
## 1176                                acalliptera_homolog_chromosome
## 1177                               acalliptera_homolog_chrom_start
## 1178                                 acalliptera_homolog_chrom_end
## 1179              acalliptera_homolog_canonical_transcript_protein
## 1180                                   acalliptera_homolog_subtype
## 1181                            acalliptera_homolog_orthology_type
## 1182                                   acalliptera_homolog_perc_id
## 1183                                acalliptera_homolog_perc_id_r1
## 1184                                 acalliptera_homolog_goc_score
## 1185                              acalliptera_homolog_wga_coverage
## 1186                      acalliptera_homolog_orthology_confidence
## 1187                              eelectricus_homolog_ensembl_gene
## 1188                      eelectricus_homolog_associated_gene_name
## 1189                           eelectricus_homolog_ensembl_peptide
## 1190                                eelectricus_homolog_chromosome
## 1191                               eelectricus_homolog_chrom_start
## 1192                                 eelectricus_homolog_chrom_end
## 1193              eelectricus_homolog_canonical_transcript_protein
## 1194                                   eelectricus_homolog_subtype
## 1195                            eelectricus_homolog_orthology_type
## 1196                                   eelectricus_homolog_perc_id
## 1197                                eelectricus_homolog_perc_id_r1
## 1198                                 eelectricus_homolog_goc_score
## 1199                              eelectricus_homolog_wga_coverage
## 1200                      eelectricus_homolog_orthology_confidence
## 1201                                lafricana_homolog_ensembl_gene
## 1202                        lafricana_homolog_associated_gene_name
## 1203                             lafricana_homolog_ensembl_peptide
## 1204                                  lafricana_homolog_chromosome
## 1205                                 lafricana_homolog_chrom_start
## 1206                                   lafricana_homolog_chrom_end
## 1207                lafricana_homolog_canonical_transcript_protein
## 1208                                     lafricana_homolog_subtype
## 1209                              lafricana_homolog_orthology_type
## 1210                                     lafricana_homolog_perc_id
## 1211                                  lafricana_homolog_perc_id_r1
## 1212                                   lafricana_homolog_goc_score
## 1213                                lafricana_homolog_wga_coverage
## 1214                        lafricana_homolog_orthology_confidence
## 1215                                   cmilii_homolog_ensembl_gene
## 1216                           cmilii_homolog_associated_gene_name
## 1217                                cmilii_homolog_ensembl_peptide
## 1218                                     cmilii_homolog_chromosome
## 1219                                    cmilii_homolog_chrom_start
## 1220                                      cmilii_homolog_chrom_end
## 1221                   cmilii_homolog_canonical_transcript_protein
## 1222                                        cmilii_homolog_subtype
## 1223                                 cmilii_homolog_orthology_type
## 1224                                        cmilii_homolog_perc_id
## 1225                                     cmilii_homolog_perc_id_r1
## 1226                                   cmilii_homolog_wga_coverage
## 1227                           cmilii_homolog_orthology_confidence
## 1228                                svulgaris_homolog_ensembl_gene
## 1229                        svulgaris_homolog_associated_gene_name
## 1230                             svulgaris_homolog_ensembl_peptide
## 1231                                  svulgaris_homolog_chromosome
## 1232                                 svulgaris_homolog_chrom_start
## 1233                                   svulgaris_homolog_chrom_end
## 1234                svulgaris_homolog_canonical_transcript_protein
## 1235                                     svulgaris_homolog_subtype
## 1236                              svulgaris_homolog_orthology_type
## 1237                                     svulgaris_homolog_perc_id
## 1238                                  svulgaris_homolog_perc_id_r1
## 1239                                   svulgaris_homolog_goc_score
## 1240                                svulgaris_homolog_wga_coverage
## 1241                        svulgaris_homolog_orthology_confidence
## 1242                                  dlabrax_homolog_ensembl_gene
## 1243                          dlabrax_homolog_associated_gene_name
## 1244                               dlabrax_homolog_ensembl_peptide
## 1245                                    dlabrax_homolog_chromosome
## 1246                                   dlabrax_homolog_chrom_start
## 1247                                     dlabrax_homolog_chrom_end
## 1248                  dlabrax_homolog_canonical_transcript_protein
## 1249                                       dlabrax_homolog_subtype
## 1250                                dlabrax_homolog_orthology_type
## 1251                                       dlabrax_homolog_perc_id
## 1252                                    dlabrax_homolog_perc_id_r1
## 1253                                     dlabrax_homolog_goc_score
## 1254                          dlabrax_homolog_orthology_confidence
## 1255                                   mpfuro_homolog_ensembl_gene
## 1256                           mpfuro_homolog_associated_gene_name
## 1257                                mpfuro_homolog_ensembl_peptide
## 1258                                     mpfuro_homolog_chromosome
## 1259                                    mpfuro_homolog_chrom_start
## 1260                                      mpfuro_homolog_chrom_end
## 1261                   mpfuro_homolog_canonical_transcript_protein
## 1262                                        mpfuro_homolog_subtype
## 1263                                 mpfuro_homolog_orthology_type
## 1264                                        mpfuro_homolog_perc_id
## 1265                                     mpfuro_homolog_perc_id_r1
## 1266                                      mpfuro_homolog_goc_score
## 1267                                   mpfuro_homolog_wga_coverage
## 1268                           mpfuro_homolog_orthology_confidence
## 1269                                trubripes_homolog_ensembl_gene
## 1270                        trubripes_homolog_associated_gene_name
## 1271                             trubripes_homolog_ensembl_peptide
## 1272                                  trubripes_homolog_chromosome
## 1273                                 trubripes_homolog_chrom_start
## 1274                                   trubripes_homolog_chrom_end
## 1275                trubripes_homolog_canonical_transcript_protein
## 1276                                     trubripes_homolog_subtype
## 1277                              trubripes_homolog_orthology_type
## 1278                                     trubripes_homolog_perc_id
## 1279                                  trubripes_homolog_perc_id_r1
## 1280                                   trubripes_homolog_goc_score
## 1281                                trubripes_homolog_wga_coverage
## 1282                        trubripes_homolog_orthology_confidence
## 1283                             amelanoleuca_homolog_ensembl_gene
## 1284                     amelanoleuca_homolog_associated_gene_name
## 1285                          amelanoleuca_homolog_ensembl_peptide
## 1286                               amelanoleuca_homolog_chromosome
## 1287                              amelanoleuca_homolog_chrom_start
## 1288                                amelanoleuca_homolog_chrom_end
## 1289             amelanoleuca_homolog_canonical_transcript_protein
## 1290                                  amelanoleuca_homolog_subtype
## 1291                           amelanoleuca_homolog_orthology_type
## 1292                                  amelanoleuca_homolog_perc_id
## 1293                               amelanoleuca_homolog_perc_id_r1
## 1294                                amelanoleuca_homolog_goc_score
## 1295                     amelanoleuca_homolog_orthology_confidence
## 1296                              nleucogenys_homolog_ensembl_gene
## 1297                      nleucogenys_homolog_associated_gene_name
## 1298                           nleucogenys_homolog_ensembl_peptide
## 1299                                nleucogenys_homolog_chromosome
## 1300                               nleucogenys_homolog_chrom_start
## 1301                                 nleucogenys_homolog_chrom_end
## 1302              nleucogenys_homolog_canonical_transcript_protein
## 1303                                   nleucogenys_homolog_subtype
## 1304                            nleucogenys_homolog_orthology_type
## 1305                                   nleucogenys_homolog_perc_id
## 1306                                nleucogenys_homolog_perc_id_r1
## 1307                                 nleucogenys_homolog_goc_score
## 1308                              nleucogenys_homolog_wga_coverage
## 1309                      nleucogenys_homolog_orthology_confidence
## 1310                                  saurata_homolog_ensembl_gene
## 1311                          saurata_homolog_associated_gene_name
## 1312                               saurata_homolog_ensembl_peptide
## 1313                                    saurata_homolog_chromosome
## 1314                                   saurata_homolog_chrom_start
## 1315                                     saurata_homolog_chrom_end
## 1316                  saurata_homolog_canonical_transcript_protein
## 1317                                       saurata_homolog_subtype
## 1318                                saurata_homolog_orthology_type
## 1319                                       saurata_homolog_perc_id
## 1320                                    saurata_homolog_perc_id_r1
## 1321                                     saurata_homolog_goc_score
## 1322                                  saurata_homolog_wga_coverage
## 1323                          saurata_homolog_orthology_confidence
## 1324                                  chircus_homolog_ensembl_gene
## 1325                          chircus_homolog_associated_gene_name
## 1326                               chircus_homolog_ensembl_peptide
## 1327                                    chircus_homolog_chromosome
## 1328                                   chircus_homolog_chrom_start
## 1329                                     chircus_homolog_chrom_end
## 1330                  chircus_homolog_canonical_transcript_protein
## 1331                                       chircus_homolog_subtype
## 1332                                chircus_homolog_orthology_type
## 1333                                       chircus_homolog_perc_id
## 1334                                    chircus_homolog_perc_id_r1
## 1335                                     chircus_homolog_goc_score
## 1336                                  chircus_homolog_wga_coverage
## 1337                          chircus_homolog_orthology_confidence
## 1338                                 mauratus_homolog_ensembl_gene
## 1339                         mauratus_homolog_associated_gene_name
## 1340                              mauratus_homolog_ensembl_peptide
## 1341                                   mauratus_homolog_chromosome
## 1342                                  mauratus_homolog_chrom_start
## 1343                                    mauratus_homolog_chrom_end
## 1344                 mauratus_homolog_canonical_transcript_protein
## 1345                                      mauratus_homolog_subtype
## 1346                               mauratus_homolog_orthology_type
## 1347                                      mauratus_homolog_perc_id
## 1348                                   mauratus_homolog_perc_id_r1
## 1349                                    mauratus_homolog_goc_score
## 1350                                 mauratus_homolog_wga_coverage
## 1351                         mauratus_homolog_orthology_confidence
## 1352                             acchrysaetos_homolog_ensembl_gene
## 1353                     acchrysaetos_homolog_associated_gene_name
## 1354                          acchrysaetos_homolog_ensembl_peptide
## 1355                               acchrysaetos_homolog_chromosome
## 1356                              acchrysaetos_homolog_chrom_start
## 1357                                acchrysaetos_homolog_chrom_end
## 1358             acchrysaetos_homolog_canonical_transcript_protein
## 1359                                  acchrysaetos_homolog_subtype
## 1360                           acchrysaetos_homolog_orthology_type
## 1361                                  acchrysaetos_homolog_perc_id
## 1362                               acchrysaetos_homolog_perc_id_r1
## 1363                                acchrysaetos_homolog_goc_score
## 1364                             acchrysaetos_homolog_wga_coverage
## 1365                     acchrysaetos_homolog_orthology_confidence
## 1366                               rroxellana_homolog_ensembl_gene
## 1367                       rroxellana_homolog_associated_gene_name
## 1368                            rroxellana_homolog_ensembl_peptide
## 1369                                 rroxellana_homolog_chromosome
## 1370                                rroxellana_homolog_chrom_start
## 1371                                  rroxellana_homolog_chrom_end
## 1372               rroxellana_homolog_canonical_transcript_protein
## 1373                                    rroxellana_homolog_subtype
## 1374                             rroxellana_homolog_orthology_type
## 1375                                    rroxellana_homolog_perc_id
## 1376                                 rroxellana_homolog_perc_id_r1
## 1377                                  rroxellana_homolog_goc_score
## 1378                               rroxellana_homolog_wga_coverage
## 1379                       rroxellana_homolog_orthology_confidence
## 1380                                 sgrahami_homolog_ensembl_gene
## 1381                         sgrahami_homolog_associated_gene_name
## 1382                              sgrahami_homolog_ensembl_peptide
## 1383                                   sgrahami_homolog_chromosome
## 1384                                  sgrahami_homolog_chrom_start
## 1385                                    sgrahami_homolog_chrom_end
## 1386                 sgrahami_homolog_canonical_transcript_protein
## 1387                                      sgrahami_homolog_subtype
## 1388                               sgrahami_homolog_orthology_type
## 1389                                      sgrahami_homolog_perc_id
## 1390                                   sgrahami_homolog_perc_id_r1
## 1391                                    sgrahami_homolog_goc_score
## 1392                                 sgrahami_homolog_wga_coverage
## 1393                         sgrahami_homolog_orthology_confidence
## 1394                                 cauratus_homolog_ensembl_gene
## 1395                         cauratus_homolog_associated_gene_name
## 1396                              cauratus_homolog_ensembl_peptide
## 1397                                   cauratus_homolog_chromosome
## 1398                                  cauratus_homolog_chrom_start
## 1399                                    cauratus_homolog_chrom_end
## 1400                 cauratus_homolog_canonical_transcript_protein
## 1401                                      cauratus_homolog_subtype
## 1402                               cauratus_homolog_orthology_type
## 1403                                      cauratus_homolog_perc_id
## 1404                                   cauratus_homolog_perc_id_r1
## 1405                                    cauratus_homolog_goc_score
## 1406                                 cauratus_homolog_wga_coverage
## 1407                         cauratus_homolog_orthology_confidence
## 1408                                gevgoodei_homolog_ensembl_gene
## 1409                        gevgoodei_homolog_associated_gene_name
## 1410                             gevgoodei_homolog_ensembl_peptide
## 1411                                  gevgoodei_homolog_chromosome
## 1412                                 gevgoodei_homolog_chrom_start
## 1413                                   gevgoodei_homolog_chrom_end
## 1414                gevgoodei_homolog_canonical_transcript_protein
## 1415                                     gevgoodei_homolog_subtype
## 1416                              gevgoodei_homolog_orthology_type
## 1417                                     gevgoodei_homolog_perc_id
## 1418                                  gevgoodei_homolog_perc_id_r1
## 1419                                   gevgoodei_homolog_goc_score
## 1420                                gevgoodei_homolog_wga_coverage
## 1421                        gevgoodei_homolog_orthology_confidence
## 1422                                 ggorilla_homolog_ensembl_gene
## 1423                         ggorilla_homolog_associated_gene_name
## 1424                              ggorilla_homolog_ensembl_peptide
## 1425                                   ggorilla_homolog_chromosome
## 1426                                  ggorilla_homolog_chrom_start
## 1427                                    ggorilla_homolog_chrom_end
## 1428                 ggorilla_homolog_canonical_transcript_protein
## 1429                                      ggorilla_homolog_subtype
## 1430                               ggorilla_homolog_orthology_type
## 1431                                      ggorilla_homolog_perc_id
## 1432                                   ggorilla_homolog_perc_id_r1
## 1433                                    ggorilla_homolog_goc_score
## 1434                                 ggorilla_homolog_wga_coverage
## 1435                         ggorilla_homolog_orthology_confidence
## 1436                                   pmajor_homolog_ensembl_gene
## 1437                           pmajor_homolog_associated_gene_name
## 1438                                pmajor_homolog_ensembl_peptide
## 1439                                     pmajor_homolog_chromosome
## 1440                                    pmajor_homolog_chrom_start
## 1441                                      pmajor_homolog_chrom_end
## 1442                   pmajor_homolog_canonical_transcript_protein
## 1443                                        pmajor_homolog_subtype
## 1444                                 pmajor_homolog_orthology_type
## 1445                                        pmajor_homolog_perc_id
## 1446                                     pmajor_homolog_perc_id_r1
## 1447                                      pmajor_homolog_goc_score
## 1448                                   pmajor_homolog_wga_coverage
## 1449                           pmajor_homolog_orthology_confidence
## 1450                                sdumerili_homolog_ensembl_gene
## 1451                        sdumerili_homolog_associated_gene_name
## 1452                             sdumerili_homolog_ensembl_peptide
## 1453                                  sdumerili_homolog_chromosome
## 1454                                 sdumerili_homolog_chrom_start
## 1455                                   sdumerili_homolog_chrom_end
## 1456                sdumerili_homolog_canonical_transcript_protein
## 1457                                     sdumerili_homolog_subtype
## 1458                              sdumerili_homolog_orthology_type
## 1459                                     sdumerili_homolog_perc_id
## 1460                                  sdumerili_homolog_perc_id_r1
## 1461                                   sdumerili_homolog_goc_score
## 1462                                sdumerili_homolog_wga_coverage
## 1463                        sdumerili_homolog_orthology_confidence
## 1464                                   psimus_homolog_ensembl_gene
## 1465                           psimus_homolog_associated_gene_name
## 1466                                psimus_homolog_ensembl_peptide
## 1467                                     psimus_homolog_chromosome
## 1468                                    psimus_homolog_chrom_start
## 1469                                      psimus_homolog_chrom_end
## 1470                   psimus_homolog_canonical_transcript_protein
## 1471                                        psimus_homolog_subtype
## 1472                                 psimus_homolog_orthology_type
## 1473                                        psimus_homolog_perc_id
## 1474                                     psimus_homolog_perc_id_r1
## 1475                                      psimus_homolog_goc_score
## 1476                                   psimus_homolog_wga_coverage
## 1477                           psimus_homolog_orthology_confidence
## 1478                           rferrumequinum_homolog_ensembl_gene
## 1479                   rferrumequinum_homolog_associated_gene_name
## 1480                        rferrumequinum_homolog_ensembl_peptide
## 1481                             rferrumequinum_homolog_chromosome
## 1482                            rferrumequinum_homolog_chrom_start
## 1483                              rferrumequinum_homolog_chrom_end
## 1484           rferrumequinum_homolog_canonical_transcript_protein
## 1485                                rferrumequinum_homolog_subtype
## 1486                         rferrumequinum_homolog_orthology_type
## 1487                                rferrumequinum_homolog_perc_id
## 1488                             rferrumequinum_homolog_perc_id_r1
## 1489                              rferrumequinum_homolog_goc_score
## 1490                           rferrumequinum_homolog_wga_coverage
## 1491                   rferrumequinum_homolog_orthology_confidence
## 1492                            acarolinensis_homolog_ensembl_gene
## 1493                    acarolinensis_homolog_associated_gene_name
## 1494                         acarolinensis_homolog_ensembl_peptide
## 1495                              acarolinensis_homolog_chromosome
## 1496                             acarolinensis_homolog_chrom_start
## 1497                               acarolinensis_homolog_chrom_end
## 1498            acarolinensis_homolog_canonical_transcript_protein
## 1499                                 acarolinensis_homolog_subtype
## 1500                          acarolinensis_homolog_orthology_type
## 1501                                 acarolinensis_homolog_perc_id
## 1502                              acarolinensis_homolog_perc_id_r1
## 1503                               acarolinensis_homolog_goc_score
## 1504                    acarolinensis_homolog_orthology_confidence
## 1505                               cporcellus_homolog_ensembl_gene
## 1506                       cporcellus_homolog_associated_gene_name
## 1507                            cporcellus_homolog_ensembl_peptide
## 1508                                 cporcellus_homolog_chromosome
## 1509                                cporcellus_homolog_chrom_start
## 1510                                  cporcellus_homolog_chrom_end
## 1511               cporcellus_homolog_canonical_transcript_protein
## 1512                                    cporcellus_homolog_subtype
## 1513                             cporcellus_homolog_orthology_type
## 1514                                    cporcellus_homolog_perc_id
## 1515                                 cporcellus_homolog_perc_id_r1
## 1516                                  cporcellus_homolog_goc_score
## 1517                               cporcellus_homolog_wga_coverage
## 1518                       cporcellus_homolog_orthology_confidence
## 1519                              preticulata_homolog_ensembl_gene
## 1520                      preticulata_homolog_associated_gene_name
## 1521                           preticulata_homolog_ensembl_peptide
## 1522                                preticulata_homolog_chromosome
## 1523                               preticulata_homolog_chrom_start
## 1524                                 preticulata_homolog_chrom_end
## 1525              preticulata_homolog_canonical_transcript_protein
## 1526                                   preticulata_homolog_subtype
## 1527                            preticulata_homolog_orthology_type
## 1528                                   preticulata_homolog_perc_id
## 1529                                preticulata_homolog_perc_id_r1
## 1530                                 preticulata_homolog_goc_score
## 1531                              preticulata_homolog_wga_coverage
## 1532                      preticulata_homolog_orthology_confidence
## 1533                                 eburgeri_homolog_ensembl_gene
## 1534                         eburgeri_homolog_associated_gene_name
## 1535                              eburgeri_homolog_ensembl_peptide
## 1536                                   eburgeri_homolog_chromosome
## 1537                                  eburgeri_homolog_chrom_start
## 1538                                    eburgeri_homolog_chrom_end
## 1539                 eburgeri_homolog_canonical_transcript_protein
## 1540                                      eburgeri_homolog_subtype
## 1541                               eburgeri_homolog_orthology_type
## 1542                                      eburgeri_homolog_perc_id
## 1543                                   eburgeri_homolog_perc_id_r1
## 1544                                 eburgeri_homolog_wga_coverage
## 1545                         eburgeri_homolog_orthology_confidence
## 1546                               eeuropaeus_homolog_ensembl_gene
## 1547                       eeuropaeus_homolog_associated_gene_name
## 1548                            eeuropaeus_homolog_ensembl_peptide
## 1549                                 eeuropaeus_homolog_chromosome
## 1550                                eeuropaeus_homolog_chrom_start
## 1551                                  eeuropaeus_homolog_chrom_end
## 1552               eeuropaeus_homolog_canonical_transcript_protein
## 1553                                    eeuropaeus_homolog_subtype
## 1554                             eeuropaeus_homolog_orthology_type
## 1555                                    eeuropaeus_homolog_perc_id
## 1556                                 eeuropaeus_homolog_perc_id_r1
## 1557                                  eeuropaeus_homolog_goc_score
## 1558                               eeuropaeus_homolog_wga_coverage
## 1559                       eeuropaeus_homolog_orthology_confidence
## 1560                                ecaballus_homolog_ensembl_gene
## 1561                        ecaballus_homolog_associated_gene_name
## 1562                             ecaballus_homolog_ensembl_peptide
## 1563                                  ecaballus_homolog_chromosome
## 1564                                 ecaballus_homolog_chrom_start
## 1565                                   ecaballus_homolog_chrom_end
## 1566                ecaballus_homolog_canonical_transcript_protein
## 1567                                     ecaballus_homolog_subtype
## 1568                              ecaballus_homolog_orthology_type
## 1569                                     ecaballus_homolog_perc_id
## 1570                                  ecaballus_homolog_perc_id_r1
## 1571                                   ecaballus_homolog_goc_score
## 1572                                ecaballus_homolog_wga_coverage
## 1573                        ecaballus_homolog_orthology_confidence
## 1574                                   hhucho_homolog_ensembl_gene
## 1575                           hhucho_homolog_associated_gene_name
## 1576                                hhucho_homolog_ensembl_peptide
## 1577                                     hhucho_homolog_chromosome
## 1578                                    hhucho_homolog_chrom_start
## 1579                                      hhucho_homolog_chrom_end
## 1580                   hhucho_homolog_canonical_transcript_protein
## 1581                                        hhucho_homolog_subtype
## 1582                                 hhucho_homolog_orthology_type
## 1583                                        hhucho_homolog_perc_id
## 1584                                     hhucho_homolog_perc_id_r1
## 1585                                      hhucho_homolog_goc_score
## 1586                                   hhucho_homolog_wga_coverage
## 1587                           hhucho_homolog_orthology_confidence
## 1588                                 bihybrid_homolog_ensembl_gene
## 1589                         bihybrid_homolog_associated_gene_name
## 1590                              bihybrid_homolog_ensembl_peptide
## 1591                                   bihybrid_homolog_chromosome
## 1592                                  bihybrid_homolog_chrom_start
## 1593                                    bihybrid_homolog_chrom_end
## 1594                 bihybrid_homolog_canonical_transcript_protein
## 1595                                      bihybrid_homolog_subtype
## 1596                               bihybrid_homolog_orthology_type
## 1597                                      bihybrid_homolog_perc_id
## 1598                                   bihybrid_homolog_perc_id_r1
## 1599                                    bihybrid_homolog_goc_score
## 1600                                 bihybrid_homolog_wga_coverage
## 1601                         bihybrid_homolog_orthology_confidence
## 1602                                pcapensis_homolog_ensembl_gene
## 1603                        pcapensis_homolog_associated_gene_name
## 1604                             pcapensis_homolog_ensembl_peptide
## 1605                                  pcapensis_homolog_chromosome
## 1606                                 pcapensis_homolog_chrom_start
## 1607                                   pcapensis_homolog_chrom_end
## 1608                pcapensis_homolog_canonical_transcript_protein
## 1609                                     pcapensis_homolog_subtype
## 1610                              pcapensis_homolog_orthology_type
## 1611                                     pcapensis_homolog_perc_id
## 1612                                  pcapensis_homolog_perc_id_r1
## 1613                                   pcapensis_homolog_goc_score
## 1614                                pcapensis_homolog_wga_coverage
## 1615                        pcapensis_homolog_orthology_confidence
## 1616                                    nnaja_homolog_ensembl_gene
## 1617                            nnaja_homolog_associated_gene_name
## 1618                                 nnaja_homolog_ensembl_peptide
## 1619                                      nnaja_homolog_chromosome
## 1620                                     nnaja_homolog_chrom_start
## 1621                                       nnaja_homolog_chrom_end
## 1622                    nnaja_homolog_canonical_transcript_protein
## 1623                                         nnaja_homolog_subtype
## 1624                                  nnaja_homolog_orthology_type
## 1625                                         nnaja_homolog_perc_id
## 1626                                      nnaja_homolog_perc_id_r1
## 1627                                       nnaja_homolog_goc_score
## 1628                                    nnaja_homolog_wga_coverage
## 1629                            nnaja_homolog_orthology_confidence
## 1630                              omelastigma_homolog_ensembl_gene
## 1631                      omelastigma_homolog_associated_gene_name
## 1632                           omelastigma_homolog_ensembl_peptide
## 1633                                omelastigma_homolog_chromosome
## 1634                               omelastigma_homolog_chrom_start
## 1635                                 omelastigma_homolog_chrom_end
## 1636              omelastigma_homolog_canonical_transcript_protein
## 1637                                   omelastigma_homolog_subtype
## 1638                            omelastigma_homolog_orthology_type
## 1639                                   omelastigma_homolog_perc_id
## 1640                                omelastigma_homolog_perc_id_r1
## 1641                                 omelastigma_homolog_goc_score
## 1642                              omelastigma_homolog_wga_coverage
## 1643                      omelastigma_homolog_orthology_confidence
## 1644                                 olatipes_homolog_ensembl_gene
## 1645                         olatipes_homolog_associated_gene_name
## 1646                              olatipes_homolog_ensembl_peptide
## 1647                                   olatipes_homolog_chromosome
## 1648                                  olatipes_homolog_chrom_start
## 1649                                    olatipes_homolog_chrom_end
## 1650                 olatipes_homolog_canonical_transcript_protein
## 1651                                      olatipes_homolog_subtype
## 1652                               olatipes_homolog_orthology_type
## 1653                                      olatipes_homolog_perc_id
## 1654                                   olatipes_homolog_perc_id_r1
## 1655                                    olatipes_homolog_goc_score
## 1656                                 olatipes_homolog_wga_coverage
## 1657                         olatipes_homolog_orthology_confidence
## 1658                                cjaponica_homolog_ensembl_gene
## 1659                        cjaponica_homolog_associated_gene_name
## 1660                             cjaponica_homolog_ensembl_peptide
## 1661                                  cjaponica_homolog_chromosome
## 1662                                 cjaponica_homolog_chrom_start
## 1663                                   cjaponica_homolog_chrom_end
## 1664                cjaponica_homolog_canonical_transcript_protein
## 1665                                     cjaponica_homolog_subtype
## 1666                              cjaponica_homolog_orthology_type
## 1667                                     cjaponica_homolog_perc_id
## 1668                                  cjaponica_homolog_perc_id_r1
## 1669                                   cjaponica_homolog_goc_score
## 1670                                cjaponica_homolog_wga_coverage
## 1671                        cjaponica_homolog_orthology_confidence
## 1672                               ojavanicus_homolog_ensembl_gene
## 1673                       ojavanicus_homolog_associated_gene_name
## 1674                            ojavanicus_homolog_ensembl_peptide
## 1675                                 ojavanicus_homolog_chromosome
## 1676                                ojavanicus_homolog_chrom_start
## 1677                                  ojavanicus_homolog_chrom_end
## 1678               ojavanicus_homolog_canonical_transcript_protein
## 1679                                    ojavanicus_homolog_subtype
## 1680                             ojavanicus_homolog_orthology_type
## 1681                                    ojavanicus_homolog_perc_id
## 1682                                 ojavanicus_homolog_perc_id_r1
## 1683                                  ojavanicus_homolog_goc_score
## 1684                               ojavanicus_homolog_wga_coverage
## 1685                       ojavanicus_homolog_orthology_confidence
## 1686                              shabroptila_homolog_ensembl_gene
## 1687                      shabroptila_homolog_associated_gene_name
## 1688                           shabroptila_homolog_ensembl_peptide
## 1689                                shabroptila_homolog_chromosome
## 1690                               shabroptila_homolog_chrom_start
## 1691                                 shabroptila_homolog_chrom_end
## 1692              shabroptila_homolog_canonical_transcript_protein
## 1693                                   shabroptila_homolog_subtype
## 1694                            shabroptila_homolog_orthology_type
## 1695                                   shabroptila_homolog_perc_id
## 1696                                shabroptila_homolog_perc_id_r1
## 1697                                 shabroptila_homolog_goc_score
## 1698                              shabroptila_homolog_wga_coverage
## 1699                      shabroptila_homolog_orthology_confidence
## 1700                                   dordii_homolog_ensembl_gene
## 1701                           dordii_homolog_associated_gene_name
## 1702                                dordii_homolog_ensembl_peptide
## 1703                                     dordii_homolog_chromosome
## 1704                                    dordii_homolog_chrom_start
## 1705                                      dordii_homolog_chrom_end
## 1706                   dordii_homolog_canonical_transcript_protein
## 1707                                        dordii_homolog_subtype
## 1708                                 dordii_homolog_orthology_type
## 1709                                        dordii_homolog_perc_id
## 1710                                     dordii_homolog_perc_id_r1
## 1711                                      dordii_homolog_goc_score
## 1712                                   dordii_homolog_wga_coverage
## 1713                           dordii_homolog_orthology_confidence
## 1714                                pcinereus_homolog_ensembl_gene
## 1715                        pcinereus_homolog_associated_gene_name
## 1716                             pcinereus_homolog_ensembl_peptide
## 1717                                  pcinereus_homolog_chromosome
## 1718                                 pcinereus_homolog_chrom_start
## 1719                                   pcinereus_homolog_chrom_end
## 1720                pcinereus_homolog_canonical_transcript_protein
## 1721                                     pcinereus_homolog_subtype
## 1722                              pcinereus_homolog_orthology_type
## 1723                                     pcinereus_homolog_perc_id
## 1724                                  pcinereus_homolog_perc_id_r1
## 1725                                   pcinereus_homolog_goc_score
## 1726                                pcinereus_homolog_wga_coverage
## 1727                        pcinereus_homolog_orthology_confidence
## 1728                                 pmarinus_homolog_ensembl_gene
## 1729                         pmarinus_homolog_associated_gene_name
## 1730                              pmarinus_homolog_ensembl_peptide
## 1731                                   pmarinus_homolog_chromosome
## 1732                                  pmarinus_homolog_chrom_start
## 1733                                    pmarinus_homolog_chrom_end
## 1734                 pmarinus_homolog_canonical_transcript_protein
## 1735                                      pmarinus_homolog_subtype
## 1736                               pmarinus_homolog_orthology_type
## 1737                                      pmarinus_homolog_perc_id
## 1738                                   pmarinus_homolog_perc_id_r1
## 1739                                 pmarinus_homolog_wga_coverage
## 1740                         pmarinus_homolog_orthology_confidence
## 1741                                  lcrocea_homolog_ensembl_gene
## 1742                          lcrocea_homolog_associated_gene_name
## 1743                               lcrocea_homolog_ensembl_peptide
## 1744                                    lcrocea_homolog_chromosome
## 1745                                   lcrocea_homolog_chrom_start
## 1746                                     lcrocea_homolog_chrom_end
## 1747                  lcrocea_homolog_canonical_transcript_protein
## 1748                                       lcrocea_homolog_subtype
## 1749                                lcrocea_homolog_orthology_type
## 1750                                       lcrocea_homolog_perc_id
## 1751                                    lcrocea_homolog_perc_id_r1
## 1752                                     lcrocea_homolog_goc_score
## 1753                                  lcrocea_homolog_wga_coverage
## 1754                          lcrocea_homolog_orthology_confidence
## 1755                             lleishanense_homolog_ensembl_gene
## 1756                     lleishanense_homolog_associated_gene_name
## 1757                          lleishanense_homolog_ensembl_peptide
## 1758                               lleishanense_homolog_chromosome
## 1759                              lleishanense_homolog_chrom_start
## 1760                                lleishanense_homolog_chrom_end
## 1761             lleishanense_homolog_canonical_transcript_protein
## 1762                                  lleishanense_homolog_subtype
## 1763                           lleishanense_homolog_orthology_type
## 1764                                  lleishanense_homolog_perc_id
## 1765                               lleishanense_homolog_perc_id_r1
## 1766                                lleishanense_homolog_goc_score
## 1767                             lleishanense_homolog_wga_coverage
## 1768                     lleishanense_homolog_orthology_confidence
## 1769                                  ppardus_homolog_ensembl_gene
## 1770                          ppardus_homolog_associated_gene_name
## 1771                               ppardus_homolog_ensembl_peptide
## 1772                                    ppardus_homolog_chromosome
## 1773                                   ppardus_homolog_chrom_start
## 1774                                     ppardus_homolog_chrom_end
## 1775                  ppardus_homolog_canonical_transcript_protein
## 1776                                       ppardus_homolog_subtype
## 1777                                ppardus_homolog_orthology_type
## 1778                                       ppardus_homolog_perc_id
## 1779                                    ppardus_homolog_perc_id_r1
## 1780                                     ppardus_homolog_goc_score
## 1781                                  ppardus_homolog_wga_coverage
## 1782                          ppardus_homolog_orthology_confidence
## 1783                                 jjaculus_homolog_ensembl_gene
## 1784                         jjaculus_homolog_associated_gene_name
## 1785                              jjaculus_homolog_ensembl_peptide
## 1786                                   jjaculus_homolog_chromosome
## 1787                                  jjaculus_homolog_chrom_start
## 1788                                    jjaculus_homolog_chrom_end
## 1789                 jjaculus_homolog_canonical_transcript_protein
## 1790                                      jjaculus_homolog_subtype
## 1791                               jjaculus_homolog_orthology_type
## 1792                                      jjaculus_homolog_perc_id
## 1793                                   jjaculus_homolog_perc_id_r1
## 1794                                    jjaculus_homolog_goc_score
## 1795                                 jjaculus_homolog_wga_coverage
## 1796                         jjaculus_homolog_orthology_confidence
## 1797                                etelfairi_homolog_ensembl_gene
## 1798                        etelfairi_homolog_associated_gene_name
## 1799                             etelfairi_homolog_ensembl_peptide
## 1800                                  etelfairi_homolog_chromosome
## 1801                                 etelfairi_homolog_chrom_start
## 1802                                   etelfairi_homolog_chrom_end
## 1803                etelfairi_homolog_canonical_transcript_protein
## 1804                                     etelfairi_homolog_subtype
## 1805                              etelfairi_homolog_orthology_type
## 1806                                     etelfairi_homolog_perc_id
## 1807                                  etelfairi_homolog_perc_id_r1
## 1808                                   etelfairi_homolog_goc_score
## 1809                                etelfairi_homolog_wga_coverage
## 1810                        etelfairi_homolog_orthology_confidence
## 1811                                     pleo_homolog_ensembl_gene
## 1812                             pleo_homolog_associated_gene_name
## 1813                                  pleo_homolog_ensembl_peptide
## 1814                                       pleo_homolog_chromosome
## 1815                                      pleo_homolog_chrom_start
## 1816                                        pleo_homolog_chrom_end
## 1817                     pleo_homolog_canonical_transcript_protein
## 1818                                          pleo_homolog_subtype
## 1819                                   pleo_homolog_orthology_type
## 1820                                          pleo_homolog_perc_id
## 1821                                       pleo_homolog_perc_id_r1
## 1822                                        pleo_homolog_goc_score
## 1823                                     pleo_homolog_wga_coverage
## 1824                             pleo_homolog_orthology_confidence
## 1825                                clanigera_homolog_ensembl_gene
## 1826                        clanigera_homolog_associated_gene_name
## 1827                             clanigera_homolog_ensembl_peptide
## 1828                                  clanigera_homolog_chromosome
## 1829                                 clanigera_homolog_chrom_start
## 1830                                   clanigera_homolog_chrom_end
## 1831                clanigera_homolog_canonical_transcript_protein
## 1832                                     clanigera_homolog_subtype
## 1833                              clanigera_homolog_orthology_type
## 1834                                     clanigera_homolog_perc_id
## 1835                                  clanigera_homolog_perc_id_r1
## 1836                                   clanigera_homolog_goc_score
## 1837                                clanigera_homolog_wga_coverage
## 1838                        clanigera_homolog_orthology_confidence
## 1839                                  clumpus_homolog_ensembl_gene
## 1840                          clumpus_homolog_associated_gene_name
## 1841                               clumpus_homolog_ensembl_peptide
## 1842                                    clumpus_homolog_chromosome
## 1843                                   clumpus_homolog_chrom_start
## 1844                                     clumpus_homolog_chrom_end
## 1845                  clumpus_homolog_canonical_transcript_protein
## 1846                                       clumpus_homolog_subtype
## 1847                                clumpus_homolog_orthology_type
## 1848                                       clumpus_homolog_perc_id
## 1849                                    clumpus_homolog_perc_id_r1
## 1850                                     clumpus_homolog_goc_score
## 1851                                  clumpus_homolog_wga_coverage
## 1852                          clumpus_homolog_orthology_confidence
## 1853                               nbrichardi_homolog_ensembl_gene
## 1854                       nbrichardi_homolog_associated_gene_name
## 1855                            nbrichardi_homolog_ensembl_peptide
## 1856                                 nbrichardi_homolog_chromosome
## 1857                                nbrichardi_homolog_chrom_start
## 1858                                  nbrichardi_homolog_chrom_end
## 1859               nbrichardi_homolog_canonical_transcript_protein
## 1860                                    nbrichardi_homolog_subtype
## 1861                             nbrichardi_homolog_orthology_type
## 1862                                    nbrichardi_homolog_perc_id
## 1863                                 nbrichardi_homolog_perc_id_r1
## 1864                                  nbrichardi_homolog_goc_score
## 1865                               nbrichardi_homolog_wga_coverage
## 1866                       nbrichardi_homolog_orthology_confidence
## 1867                               anancymaae_homolog_ensembl_gene
## 1868                       anancymaae_homolog_associated_gene_name
## 1869                            anancymaae_homolog_ensembl_peptide
## 1870                                 anancymaae_homolog_chromosome
## 1871                                anancymaae_homolog_chrom_start
## 1872                                  anancymaae_homolog_chrom_end
## 1873               anancymaae_homolog_canonical_transcript_protein
## 1874                                    anancymaae_homolog_subtype
## 1875                             anancymaae_homolog_orthology_type
## 1876                                    anancymaae_homolog_perc_id
## 1877                                 anancymaae_homolog_perc_id_r1
## 1878                                  anancymaae_homolog_goc_score
## 1879                               anancymaae_homolog_wga_coverage
## 1880                       anancymaae_homolog_orthology_confidence
## 1881                                 mmulatta_homolog_ensembl_gene
## 1882                         mmulatta_homolog_associated_gene_name
## 1883                              mmulatta_homolog_ensembl_peptide
## 1884                                   mmulatta_homolog_chromosome
## 1885                                  mmulatta_homolog_chrom_start
## 1886                                    mmulatta_homolog_chrom_end
## 1887                 mmulatta_homolog_canonical_transcript_protein
## 1888                                      mmulatta_homolog_subtype
## 1889                               mmulatta_homolog_orthology_type
## 1890                                      mmulatta_homolog_perc_id
## 1891                                   mmulatta_homolog_perc_id_r1
## 1892                                    mmulatta_homolog_goc_score
## 1893                                 mmulatta_homolog_wga_coverage
## 1894                         mmulatta_homolog_orthology_confidence
## 1895                                nscutatus_homolog_ensembl_gene
## 1896                        nscutatus_homolog_associated_gene_name
## 1897                             nscutatus_homolog_ensembl_peptide
## 1898                                  nscutatus_homolog_chromosome
## 1899                                 nscutatus_homolog_chrom_start
## 1900                                   nscutatus_homolog_chrom_end
## 1901                nscutatus_homolog_canonical_transcript_protein
## 1902                                     nscutatus_homolog_subtype
## 1903                              nscutatus_homolog_orthology_type
## 1904                                     nscutatus_homolog_perc_id
## 1905                                  nscutatus_homolog_perc_id_r1
## 1906                                   nscutatus_homolog_goc_score
## 1907                                nscutatus_homolog_wga_coverage
## 1908                        nscutatus_homolog_orthology_confidence
## 1909                                pnyererei_homolog_ensembl_gene
## 1910                        pnyererei_homolog_associated_gene_name
## 1911                             pnyererei_homolog_ensembl_peptide
## 1912                                  pnyererei_homolog_chromosome
## 1913                                 pnyererei_homolog_chrom_start
## 1914                                   pnyererei_homolog_chrom_end
## 1915                pnyererei_homolog_canonical_transcript_protein
## 1916                                     pnyererei_homolog_subtype
## 1917                              pnyererei_homolog_orthology_type
## 1918                                     pnyererei_homolog_perc_id
## 1919                                  pnyererei_homolog_perc_id_r1
## 1920                                   pnyererei_homolog_goc_score
## 1921                                pnyererei_homolog_wga_coverage
## 1922                        pnyererei_homolog_orthology_confidence
## 1923                              kmarmoratus_homolog_ensembl_gene
## 1924                      kmarmoratus_homolog_associated_gene_name
## 1925                           kmarmoratus_homolog_ensembl_peptide
## 1926                                kmarmoratus_homolog_chromosome
## 1927                               kmarmoratus_homolog_chrom_start
## 1928                                 kmarmoratus_homolog_chrom_end
## 1929              kmarmoratus_homolog_canonical_transcript_protein
## 1930                                   kmarmoratus_homolog_subtype
## 1931                            kmarmoratus_homolog_orthology_type
## 1932                                   kmarmoratus_homolog_perc_id
## 1933                                kmarmoratus_homolog_perc_id_r1
## 1934                                 kmarmoratus_homolog_goc_score
## 1935                              kmarmoratus_homolog_wga_coverage
## 1936                      kmarmoratus_homolog_orthology_confidence
## 1937                                  gfortis_homolog_ensembl_gene
## 1938                          gfortis_homolog_associated_gene_name
## 1939                               gfortis_homolog_ensembl_peptide
## 1940                                    gfortis_homolog_chromosome
## 1941                                   gfortis_homolog_chrom_start
## 1942                                     gfortis_homolog_chrom_end
## 1943                  gfortis_homolog_canonical_transcript_protein
## 1944                                       gfortis_homolog_subtype
## 1945                                gfortis_homolog_orthology_type
## 1946                                       gfortis_homolog_perc_id
## 1947                                    gfortis_homolog_perc_id_r1
## 1948                                     gfortis_homolog_goc_score
## 1949                                  gfortis_homolog_wga_coverage
## 1950                          gfortis_homolog_orthology_confidence
## 1951                                pvampyrus_homolog_ensembl_gene
## 1952                        pvampyrus_homolog_associated_gene_name
## 1953                             pvampyrus_homolog_ensembl_peptide
## 1954                                  pvampyrus_homolog_chromosome
## 1955                                 pvampyrus_homolog_chrom_start
## 1956                                   pvampyrus_homolog_chrom_end
## 1957                pvampyrus_homolog_canonical_transcript_protein
## 1958                                     pvampyrus_homolog_subtype
## 1959                              pvampyrus_homolog_orthology_type
## 1960                                     pvampyrus_homolog_perc_id
## 1961                                  pvampyrus_homolog_perc_id_r1
## 1962                                   pvampyrus_homolog_goc_score
## 1963                                pvampyrus_homolog_wga_coverage
## 1964                        pvampyrus_homolog_orthology_confidence
## 1965                               amexicanus_homolog_ensembl_gene
## 1966                       amexicanus_homolog_associated_gene_name
## 1967                            amexicanus_homolog_ensembl_peptide
## 1968                                 amexicanus_homolog_chromosome
## 1969                                amexicanus_homolog_chrom_start
## 1970                                  amexicanus_homolog_chrom_end
## 1971               amexicanus_homolog_canonical_transcript_protein
## 1972                                    amexicanus_homolog_subtype
## 1973                             amexicanus_homolog_orthology_type
## 1974                                    amexicanus_homolog_perc_id
## 1975                                 amexicanus_homolog_perc_id_r1
## 1976                                  amexicanus_homolog_goc_score
## 1977                               amexicanus_homolog_wga_coverage
## 1978                       amexicanus_homolog_orthology_confidence
## 1979                               mlucifugus_homolog_ensembl_gene
## 1980                       mlucifugus_homolog_associated_gene_name
## 1981                            mlucifugus_homolog_ensembl_peptide
## 1982                                 mlucifugus_homolog_chromosome
## 1983                                mlucifugus_homolog_chrom_start
## 1984                                  mlucifugus_homolog_chrom_end
## 1985               mlucifugus_homolog_canonical_transcript_protein
## 1986                                    mlucifugus_homolog_subtype
## 1987                             mlucifugus_homolog_orthology_type
## 1988                                    mlucifugus_homolog_perc_id
## 1989                                 mlucifugus_homolog_perc_id_r1
## 1990                                  mlucifugus_homolog_goc_score
## 1991                               mlucifugus_homolog_wga_coverage
## 1992                       mlucifugus_homolog_orthology_confidence
## 1993                             acitrinellus_homolog_ensembl_gene
## 1994                     acitrinellus_homolog_associated_gene_name
## 1995                          acitrinellus_homolog_ensembl_peptide
## 1996                               acitrinellus_homolog_chromosome
## 1997                              acitrinellus_homolog_chrom_start
## 1998                                acitrinellus_homolog_chrom_end
## 1999             acitrinellus_homolog_canonical_transcript_protein
## 2000                                  acitrinellus_homolog_subtype
## 2001                           acitrinellus_homolog_orthology_type
## 2002                                  acitrinellus_homolog_perc_id
## 2003                               acitrinellus_homolog_perc_id_r1
## 2004                                acitrinellus_homolog_goc_score
## 2005                             acitrinellus_homolog_wga_coverage
## 2006                     acitrinellus_homolog_orthology_confidence
## 2007                                mmusculus_homolog_ensembl_gene
## 2008                        mmusculus_homolog_associated_gene_name
## 2009                             mmusculus_homolog_ensembl_peptide
## 2010                                  mmusculus_homolog_chromosome
## 2011                                 mmusculus_homolog_chrom_start
## 2012                                   mmusculus_homolog_chrom_end
## 2013                mmusculus_homolog_canonical_transcript_protein
## 2014                                     mmusculus_homolog_subtype
## 2015                              mmusculus_homolog_orthology_type
## 2016                                     mmusculus_homolog_perc_id
## 2017                                  mmusculus_homolog_perc_id_r1
## 2018                                   mmusculus_homolog_goc_score
## 2019                                mmusculus_homolog_wga_coverage
## 2020                        mmusculus_homolog_orthology_confidence
## 2021                                 mmurinus_homolog_ensembl_gene
## 2022                         mmurinus_homolog_associated_gene_name
## 2023                              mmurinus_homolog_ensembl_peptide
## 2024                                   mmurinus_homolog_chromosome
## 2025                                  mmurinus_homolog_chrom_start
## 2026                                    mmurinus_homolog_chrom_end
## 2027                 mmurinus_homolog_canonical_transcript_protein
## 2028                                      mmurinus_homolog_subtype
## 2029                               mmurinus_homolog_orthology_type
## 2030                                      mmurinus_homolog_perc_id
## 2031                                   mmurinus_homolog_perc_id_r1
## 2032                                    mmurinus_homolog_goc_score
## 2033                                 mmurinus_homolog_wga_coverage
## 2034                         mmurinus_homolog_orthology_confidence
## 2035                            fheteroclitus_homolog_ensembl_gene
## 2036                    fheteroclitus_homolog_associated_gene_name
## 2037                         fheteroclitus_homolog_ensembl_peptide
## 2038                              fheteroclitus_homolog_chromosome
## 2039                             fheteroclitus_homolog_chrom_start
## 2040                               fheteroclitus_homolog_chrom_end
## 2041            fheteroclitus_homolog_canonical_transcript_protein
## 2042                                 fheteroclitus_homolog_subtype
## 2043                          fheteroclitus_homolog_orthology_type
## 2044                                 fheteroclitus_homolog_perc_id
## 2045                              fheteroclitus_homolog_perc_id_r1
## 2046                               fheteroclitus_homolog_goc_score
## 2047                            fheteroclitus_homolog_wga_coverage
## 2048                    fheteroclitus_homolog_orthology_confidence
## 2049                                 hgfemale_homolog_ensembl_gene
## 2050                         hgfemale_homolog_associated_gene_name
## 2051                              hgfemale_homolog_ensembl_peptide
## 2052                                   hgfemale_homolog_chromosome
## 2053                                  hgfemale_homolog_chrom_start
## 2054                                    hgfemale_homolog_chrom_end
## 2055                 hgfemale_homolog_canonical_transcript_protein
## 2056                                      hgfemale_homolog_subtype
## 2057                               hgfemale_homolog_orthology_type
## 2058                                      hgfemale_homolog_perc_id
## 2059                                   hgfemale_homolog_perc_id_r1
## 2060                                    hgfemale_homolog_goc_score
## 2061                                 hgfemale_homolog_wga_coverage
## 2062                         hgfemale_homolog_orthology_confidence
## 2063                               mmonoceros_homolog_ensembl_gene
## 2064                       mmonoceros_homolog_associated_gene_name
## 2065                            mmonoceros_homolog_ensembl_peptide
## 2066                                 mmonoceros_homolog_chromosome
## 2067                                mmonoceros_homolog_chrom_start
## 2068                                  mmonoceros_homolog_chrom_end
## 2069               mmonoceros_homolog_canonical_transcript_protein
## 2070                                    mmonoceros_homolog_subtype
## 2071                             mmonoceros_homolog_orthology_type
## 2072                                    mmonoceros_homolog_perc_id
## 2073                                 mmonoceros_homolog_perc_id_r1
## 2074                                  mmonoceros_homolog_goc_score
## 2075                               mmonoceros_homolog_wga_coverage
## 2076                       mmonoceros_homolog_orthology_confidence
## 2077                               oniloticus_homolog_ensembl_gene
## 2078                       oniloticus_homolog_associated_gene_name
## 2079                            oniloticus_homolog_ensembl_peptide
## 2080                                 oniloticus_homolog_chromosome
## 2081                                oniloticus_homolog_chrom_start
## 2082                                  oniloticus_homolog_chrom_end
## 2083               oniloticus_homolog_canonical_transcript_protein
## 2084                                    oniloticus_homolog_subtype
## 2085                             oniloticus_homolog_orthology_type
## 2086                                    oniloticus_homolog_perc_id
## 2087                                 oniloticus_homolog_perc_id_r1
## 2088                                  oniloticus_homolog_goc_score
## 2089                               oniloticus_homolog_wga_coverage
## 2090                       oniloticus_homolog_orthology_confidence
## 2091                                pmbairdii_homolog_ensembl_gene
## 2092                        pmbairdii_homolog_associated_gene_name
## 2093                             pmbairdii_homolog_ensembl_peptide
## 2094                                  pmbairdii_homolog_chromosome
## 2095                                 pmbairdii_homolog_chrom_start
## 2096                                   pmbairdii_homolog_chrom_end
## 2097                pmbairdii_homolog_canonical_transcript_protein
## 2098                                     pmbairdii_homolog_subtype
## 2099                              pmbairdii_homolog_orthology_type
## 2100                                     pmbairdii_homolog_perc_id
## 2101                                  pmbairdii_homolog_perc_id_r1
## 2102                                   pmbairdii_homolog_goc_score
## 2103                                pmbairdii_homolog_wga_coverage
## 2104                        pmbairdii_homolog_orthology_confidence
## 2105                                  elucius_homolog_ensembl_gene
## 2106                          elucius_homolog_associated_gene_name
## 2107                               elucius_homolog_ensembl_peptide
## 2108                                    elucius_homolog_chromosome
## 2109                                   elucius_homolog_chrom_start
## 2110                                     elucius_homolog_chrom_end
## 2111                  elucius_homolog_canonical_transcript_protein
## 2112                                       elucius_homolog_subtype
## 2113                                elucius_homolog_orthology_type
## 2114                                       elucius_homolog_perc_id
## 2115                                    elucius_homolog_perc_id_r1
## 2116                                     elucius_homolog_goc_score
## 2117                                  elucius_homolog_wga_coverage
## 2118                          elucius_homolog_orthology_confidence
## 2119                                  panubis_homolog_ensembl_gene
## 2120                          panubis_homolog_associated_gene_name
## 2121                               panubis_homolog_ensembl_peptide
## 2122                                    panubis_homolog_chromosome
## 2123                                   panubis_homolog_chrom_start
## 2124                                     panubis_homolog_chrom_end
## 2125                  panubis_homolog_canonical_transcript_protein
## 2126                                       panubis_homolog_subtype
## 2127                                panubis_homolog_orthology_type
## 2128                                       panubis_homolog_perc_id
## 2129                                    panubis_homolog_perc_id_r1
## 2130                                     panubis_homolog_goc_score
## 2131                                  panubis_homolog_wga_coverage
## 2132                          panubis_homolog_orthology_confidence
## 2133                               mdomestica_homolog_ensembl_gene
## 2134                       mdomestica_homolog_associated_gene_name
## 2135                            mdomestica_homolog_ensembl_peptide
## 2136                                 mdomestica_homolog_chromosome
## 2137                                mdomestica_homolog_chrom_start
## 2138                                  mdomestica_homolog_chrom_end
## 2139               mdomestica_homolog_canonical_transcript_protein
## 2140                                    mdomestica_homolog_subtype
## 2141                             mdomestica_homolog_orthology_type
## 2142                                    mdomestica_homolog_perc_id
## 2143                                 mdomestica_homolog_perc_id_r1
## 2144                                  mdomestica_homolog_goc_score
## 2145                               mdomestica_homolog_wga_coverage
## 2146                       mdomestica_homolog_orthology_confidence
## 2147                                 apercula_homolog_ensembl_gene
## 2148                         apercula_homolog_associated_gene_name
## 2149                              apercula_homolog_ensembl_peptide
## 2150                                   apercula_homolog_chromosome
## 2151                                  apercula_homolog_chrom_start
## 2152                                    apercula_homolog_chrom_end
## 2153                 apercula_homolog_canonical_transcript_protein
## 2154                                      apercula_homolog_subtype
## 2155                               apercula_homolog_orthology_type
## 2156                                      apercula_homolog_perc_id
## 2157                                   apercula_homolog_perc_id_r1
## 2158                                    apercula_homolog_goc_score
## 2159                                 apercula_homolog_wga_coverage
## 2160                         apercula_homolog_orthology_confidence
## 2161                                 cpbellii_homolog_ensembl_gene
## 2162                         cpbellii_homolog_associated_gene_name
## 2163                              cpbellii_homolog_ensembl_peptide
## 2164                                   cpbellii_homolog_chromosome
## 2165                                  cpbellii_homolog_chrom_start
## 2166                                    cpbellii_homolog_chrom_end
## 2167                 cpbellii_homolog_canonical_transcript_protein
## 2168                                      cpbellii_homolog_subtype
## 2169                               cpbellii_homolog_orthology_type
## 2170                                      cpbellii_homolog_perc_id
## 2171                                   cpbellii_homolog_perc_id_r1
## 2172                                    cpbellii_homolog_goc_score
## 2173                                 cpbellii_homolog_wga_coverage
## 2174                         cpbellii_homolog_orthology_confidence
## 2175                              pkingsleyae_homolog_ensembl_gene
## 2176                      pkingsleyae_homolog_associated_gene_name
## 2177                           pkingsleyae_homolog_ensembl_peptide
## 2178                                pkingsleyae_homolog_chromosome
## 2179                               pkingsleyae_homolog_chrom_start
## 2180                                 pkingsleyae_homolog_chrom_end
## 2181              pkingsleyae_homolog_canonical_transcript_protein
## 2182                                   pkingsleyae_homolog_subtype
## 2183                            pkingsleyae_homolog_orthology_type
## 2184                                   pkingsleyae_homolog_perc_id
## 2185                                pkingsleyae_homolog_perc_id_r1
## 2186                                 pkingsleyae_homolog_goc_score
## 2187                              pkingsleyae_homolog_wga_coverage
## 2188                      pkingsleyae_homolog_orthology_confidence
## 2189                                  sscrofa_homolog_ensembl_gene
## 2190                          sscrofa_homolog_associated_gene_name
## 2191                               sscrofa_homolog_ensembl_peptide
## 2192                                    sscrofa_homolog_chromosome
## 2193                                   sscrofa_homolog_chrom_start
## 2194                                     sscrofa_homolog_chrom_end
## 2195                  sscrofa_homolog_canonical_transcript_protein
## 2196                                       sscrofa_homolog_subtype
## 2197                                sscrofa_homolog_orthology_type
## 2198                                       sscrofa_homolog_perc_id
## 2199                                    sscrofa_homolog_perc_id_r1
## 2200                                     sscrofa_homolog_goc_score
## 2201                                  sscrofa_homolog_wga_coverage
## 2202                          sscrofa_homolog_orthology_confidence
## 2203                              mnemestrina_homolog_ensembl_gene
## 2204                      mnemestrina_homolog_associated_gene_name
## 2205                           mnemestrina_homolog_ensembl_peptide
## 2206                                mnemestrina_homolog_chromosome
## 2207                               mnemestrina_homolog_chrom_start
## 2208                                 mnemestrina_homolog_chrom_end
## 2209              mnemestrina_homolog_canonical_transcript_protein
## 2210                                   mnemestrina_homolog_subtype
## 2211                            mnemestrina_homolog_orthology_type
## 2212                                   mnemestrina_homolog_perc_id
## 2213                                mnemestrina_homolog_perc_id_r1
## 2214                                 mnemestrina_homolog_goc_score
## 2215                              mnemestrina_homolog_wga_coverage
## 2216                      mnemestrina_homolog_orthology_confidence
## 2217                                oprinceps_homolog_ensembl_gene
## 2218                        oprinceps_homolog_associated_gene_name
## 2219                             oprinceps_homolog_ensembl_peptide
## 2220                                  oprinceps_homolog_chromosome
## 2221                                 oprinceps_homolog_chrom_start
## 2222                                   oprinceps_homolog_chrom_end
## 2223                oprinceps_homolog_canonical_transcript_protein
## 2224                                     oprinceps_homolog_subtype
## 2225                              oprinceps_homolog_orthology_type
## 2226                                     oprinceps_homolog_perc_id
## 2227                                  oprinceps_homolog_perc_id_r1
## 2228                                   oprinceps_homolog_goc_score
## 2229                                oprinceps_homolog_wga_coverage
## 2230                        oprinceps_homolog_orthology_confidence
## 2231                              slucioperca_homolog_ensembl_gene
## 2232                      slucioperca_homolog_associated_gene_name
## 2233                           slucioperca_homolog_ensembl_peptide
## 2234                                slucioperca_homolog_chromosome
## 2235                               slucioperca_homolog_chrom_start
## 2236                                 slucioperca_homolog_chrom_end
## 2237              slucioperca_homolog_canonical_transcript_protein
## 2238                                   slucioperca_homolog_subtype
## 2239                            slucioperca_homolog_orthology_type
## 2240                                   slucioperca_homolog_perc_id
## 2241                                slucioperca_homolog_perc_id_r1
## 2242                                 slucioperca_homolog_goc_score
## 2243                              slucioperca_homolog_wga_coverage
## 2244                      slucioperca_homolog_orthology_confidence
## 2245                                 mmurdjan_homolog_ensembl_gene
## 2246                         mmurdjan_homolog_associated_gene_name
## 2247                              mmurdjan_homolog_ensembl_peptide
## 2248                                   mmurdjan_homolog_chromosome
## 2249                                  mmurdjan_homolog_chrom_start
## 2250                                    mmurdjan_homolog_chrom_end
## 2251                 mmurdjan_homolog_canonical_transcript_protein
## 2252                                      mmurdjan_homolog_subtype
## 2253                               mmurdjan_homolog_orthology_type
## 2254                                      mmurdjan_homolog_perc_id
## 2255                                   mmurdjan_homolog_perc_id_r1
## 2256                                    mmurdjan_homolog_goc_score
## 2257                                 mmurdjan_homolog_wga_coverage
## 2258                         mmurdjan_homolog_orthology_confidence
## 2259                          abrachyrhynchus_homolog_ensembl_gene
## 2260                  abrachyrhynchus_homolog_associated_gene_name
## 2261                       abrachyrhynchus_homolog_ensembl_peptide
## 2262                            abrachyrhynchus_homolog_chromosome
## 2263                           abrachyrhynchus_homolog_chrom_start
## 2264                             abrachyrhynchus_homolog_chrom_end
## 2265          abrachyrhynchus_homolog_canonical_transcript_protein
## 2266                               abrachyrhynchus_homolog_subtype
## 2267                        abrachyrhynchus_homolog_orthology_type
## 2268                               abrachyrhynchus_homolog_perc_id
## 2269                            abrachyrhynchus_homolog_perc_id_r1
## 2270                             abrachyrhynchus_homolog_goc_score
## 2271                          abrachyrhynchus_homolog_wga_coverage
## 2272                  abrachyrhynchus_homolog_orthology_confidence
## 2273                               xmaculatus_homolog_ensembl_gene
## 2274                       xmaculatus_homolog_associated_gene_name
## 2275                            xmaculatus_homolog_ensembl_peptide
## 2276                                 xmaculatus_homolog_chromosome
## 2277                                xmaculatus_homolog_chrom_start
## 2278                                  xmaculatus_homolog_chrom_end
## 2279               xmaculatus_homolog_canonical_transcript_protein
## 2280                                    xmaculatus_homolog_subtype
## 2281                             xmaculatus_homolog_orthology_type
## 2282                                    xmaculatus_homolog_perc_id
## 2283                                 xmaculatus_homolog_perc_id_r1
## 2284                                  xmaculatus_homolog_goc_score
## 2285                               xmaculatus_homolog_wga_coverage
## 2286                       xmaculatus_homolog_orthology_confidence
## 2287                                oanatinus_homolog_ensembl_gene
## 2288                        oanatinus_homolog_associated_gene_name
## 2289                             oanatinus_homolog_ensembl_peptide
## 2290                                  oanatinus_homolog_chromosome
## 2291                                 oanatinus_homolog_chrom_start
## 2292                                   oanatinus_homolog_chrom_end
## 2293                oanatinus_homolog_canonical_transcript_protein
## 2294                                     oanatinus_homolog_subtype
## 2295                              oanatinus_homolog_orthology_type
## 2296                                     oanatinus_homolog_perc_id
## 2297                                  oanatinus_homolog_perc_id_r1
## 2298                                   oanatinus_homolog_goc_score
## 2299                                oanatinus_homolog_wga_coverage
## 2300                        oanatinus_homolog_orthology_confidence
## 2301                               umaritimus_homolog_ensembl_gene
## 2302                       umaritimus_homolog_associated_gene_name
## 2303                            umaritimus_homolog_ensembl_peptide
## 2304                                 umaritimus_homolog_chromosome
## 2305                                umaritimus_homolog_chrom_start
## 2306                                  umaritimus_homolog_chrom_end
## 2307               umaritimus_homolog_canonical_transcript_protein
## 2308                                    umaritimus_homolog_subtype
## 2309                             umaritimus_homolog_orthology_type
## 2310                                    umaritimus_homolog_perc_id
## 2311                                 umaritimus_homolog_perc_id_r1
## 2312                                  umaritimus_homolog_goc_score
## 2313                               umaritimus_homolog_wga_coverage
## 2314                       umaritimus_homolog_orthology_confidence
## 2315                             mochrogaster_homolog_ensembl_gene
## 2316                     mochrogaster_homolog_associated_gene_name
## 2317                          mochrogaster_homolog_ensembl_peptide
## 2318                               mochrogaster_homolog_chromosome
## 2319                              mochrogaster_homolog_chrom_start
## 2320                                mochrogaster_homolog_chrom_end
## 2321             mochrogaster_homolog_canonical_transcript_protein
## 2322                                  mochrogaster_homolog_subtype
## 2323                           mochrogaster_homolog_orthology_type
## 2324                                  mochrogaster_homolog_perc_id
## 2325                               mochrogaster_homolog_perc_id_r1
## 2326                                mochrogaster_homolog_goc_score
## 2327                             mochrogaster_homolog_wga_coverage
## 2328                     mochrogaster_homolog_orthology_confidence
## 2329                               ocuniculus_homolog_ensembl_gene
## 2330                       ocuniculus_homolog_associated_gene_name
## 2331                            ocuniculus_homolog_ensembl_peptide
## 2332                                 ocuniculus_homolog_chromosome
## 2333                                ocuniculus_homolog_chrom_start
## 2334                                  ocuniculus_homolog_chrom_end
## 2335               ocuniculus_homolog_canonical_transcript_protein
## 2336                                    ocuniculus_homolog_subtype
## 2337                             ocuniculus_homolog_orthology_type
## 2338                                    ocuniculus_homolog_perc_id
## 2339                                 ocuniculus_homolog_perc_id_r1
## 2340                                  ocuniculus_homolog_goc_score
## 2341                               ocuniculus_homolog_wga_coverage
## 2342                       ocuniculus_homolog_orthology_confidence
## 2343                                  omykiss_homolog_ensembl_gene
## 2344                          omykiss_homolog_associated_gene_name
## 2345                               omykiss_homolog_ensembl_peptide
## 2346                                    omykiss_homolog_chromosome
## 2347                                   omykiss_homolog_chrom_start
## 2348                                     omykiss_homolog_chrom_end
## 2349                  omykiss_homolog_canonical_transcript_protein
## 2350                                       omykiss_homolog_subtype
## 2351                                omykiss_homolog_orthology_type
## 2352                                       omykiss_homolog_perc_id
## 2353                                    omykiss_homolog_perc_id_r1
## 2354                                     omykiss_homolog_goc_score
## 2355                          omykiss_homolog_orthology_confidence
## 2356                              rnorvegicus_homolog_ensembl_gene
## 2357                      rnorvegicus_homolog_associated_gene_name
## 2358                           rnorvegicus_homolog_ensembl_peptide
## 2359                                rnorvegicus_homolog_chromosome
## 2360                               rnorvegicus_homolog_chrom_start
## 2361                                 rnorvegicus_homolog_chrom_end
## 2362              rnorvegicus_homolog_canonical_transcript_protein
## 2363                                   rnorvegicus_homolog_subtype
## 2364                            rnorvegicus_homolog_orthology_type
## 2365                                   rnorvegicus_homolog_perc_id
## 2366                                rnorvegicus_homolog_perc_id_r1
## 2367                                 rnorvegicus_homolog_goc_score
## 2368                              rnorvegicus_homolog_wga_coverage
## 2369                      rnorvegicus_homolog_orthology_confidence
## 2370                                  vvulpes_homolog_ensembl_gene
## 2371                          vvulpes_homolog_associated_gene_name
## 2372                               vvulpes_homolog_ensembl_peptide
## 2373                                    vvulpes_homolog_chromosome
## 2374                                   vvulpes_homolog_chrom_start
## 2375                                     vvulpes_homolog_chrom_end
## 2376                  vvulpes_homolog_canonical_transcript_protein
## 2377                                       vvulpes_homolog_subtype
## 2378                                vvulpes_homolog_orthology_type
## 2379                                       vvulpes_homolog_perc_id
## 2380                                    vvulpes_homolog_perc_id_r1
## 2381                                     vvulpes_homolog_goc_score
## 2382                                  vvulpes_homolog_wga_coverage
## 2383                          vvulpes_homolog_orthology_confidence
## 2384                               pnattereri_homolog_ensembl_gene
## 2385                       pnattereri_homolog_associated_gene_name
## 2386                            pnattereri_homolog_ensembl_peptide
## 2387                                 pnattereri_homolog_chromosome
## 2388                                pnattereri_homolog_chrom_start
## 2389                                  pnattereri_homolog_chrom_end
## 2390               pnattereri_homolog_canonical_transcript_protein
## 2391                                    pnattereri_homolog_subtype
## 2392                             pnattereri_homolog_orthology_type
## 2393                                    pnattereri_homolog_perc_id
## 2394                                 pnattereri_homolog_perc_id_r1
## 2395                                  pnattereri_homolog_goc_score
## 2396                               pnattereri_homolog_wga_coverage
## 2397                       pnattereri_homolog_orthology_confidence
## 2398                             ecalabaricus_homolog_ensembl_gene
## 2399                     ecalabaricus_homolog_associated_gene_name
## 2400                          ecalabaricus_homolog_ensembl_peptide
## 2401                               ecalabaricus_homolog_chromosome
## 2402                              ecalabaricus_homolog_chrom_start
## 2403                                ecalabaricus_homolog_chrom_end
## 2404             ecalabaricus_homolog_canonical_transcript_protein
## 2405                                  ecalabaricus_homolog_subtype
## 2406                           ecalabaricus_homolog_orthology_type
## 2407                                  ecalabaricus_homolog_perc_id
## 2408                               ecalabaricus_homolog_perc_id_r1
## 2409                                ecalabaricus_homolog_goc_score
## 2410                             ecalabaricus_homolog_wga_coverage
## 2411                     ecalabaricus_homolog_orthology_confidence
## 2412                                  mcaroli_homolog_ensembl_gene
## 2413                          mcaroli_homolog_associated_gene_name
## 2414                               mcaroli_homolog_ensembl_peptide
## 2415                                    mcaroli_homolog_chromosome
## 2416                                   mcaroli_homolog_chrom_start
## 2417                                     mcaroli_homolog_chrom_end
## 2418                  mcaroli_homolog_canonical_transcript_protein
## 2419                                       mcaroli_homolog_subtype
## 2420                                mcaroli_homolog_orthology_type
## 2421                                       mcaroli_homolog_perc_id
## 2422                                    mcaroli_homolog_perc_id_r1
## 2423                                     mcaroli_homolog_goc_score
## 2424                                  mcaroli_homolog_wga_coverage
## 2425                          mcaroli_homolog_orthology_confidence
## 2426                              scerevisiae_homolog_ensembl_gene
## 2427                      scerevisiae_homolog_associated_gene_name
## 2428                           scerevisiae_homolog_ensembl_peptide
## 2429                                scerevisiae_homolog_chromosome
## 2430                               scerevisiae_homolog_chrom_start
## 2431                                 scerevisiae_homolog_chrom_end
## 2432              scerevisiae_homolog_canonical_transcript_protein
## 2433                                   scerevisiae_homolog_subtype
## 2434                            scerevisiae_homolog_orthology_type
## 2435                                   scerevisiae_homolog_perc_id
## 2436                                scerevisiae_homolog_perc_id_r1
## 2437                      scerevisiae_homolog_orthology_confidence
## 2438                               platipinna_homolog_ensembl_gene
## 2439                       platipinna_homolog_associated_gene_name
## 2440                            platipinna_homolog_ensembl_peptide
## 2441                                 platipinna_homolog_chromosome
## 2442                                platipinna_homolog_chrom_start
## 2443                                  platipinna_homolog_chrom_end
## 2444               platipinna_homolog_canonical_transcript_protein
## 2445                                    platipinna_homolog_subtype
## 2446                             platipinna_homolog_orthology_type
## 2447                                    platipinna_homolog_perc_id
## 2448                                 platipinna_homolog_perc_id_r1
## 2449                                  platipinna_homolog_goc_score
## 2450                               platipinna_homolog_wga_coverage
## 2451                       platipinna_homolog_orthology_confidence
## 2452                            oarambouillet_homolog_ensembl_gene
## 2453                    oarambouillet_homolog_associated_gene_name
## 2454                         oarambouillet_homolog_ensembl_peptide
## 2455                              oarambouillet_homolog_chromosome
## 2456                             oarambouillet_homolog_chrom_start
## 2457                               oarambouillet_homolog_chrom_end
## 2458            oarambouillet_homolog_canonical_transcript_protein
## 2459                                 oarambouillet_homolog_subtype
## 2460                          oarambouillet_homolog_orthology_type
## 2461                                 oarambouillet_homolog_perc_id
## 2462                              oarambouillet_homolog_perc_id_r1
## 2463                               oarambouillet_homolog_goc_score
## 2464                            oarambouillet_homolog_wga_coverage
## 2465                    oarambouillet_homolog_orthology_confidence
## 2466                              cvariegatus_homolog_ensembl_gene
## 2467                      cvariegatus_homolog_associated_gene_name
## 2468                           cvariegatus_homolog_ensembl_peptide
## 2469                                cvariegatus_homolog_chromosome
## 2470                               cvariegatus_homolog_chrom_start
## 2471                                 cvariegatus_homolog_chrom_end
## 2472              cvariegatus_homolog_canonical_transcript_protein
## 2473                                   cvariegatus_homolog_subtype
## 2474                            cvariegatus_homolog_orthology_type
## 2475                                   cvariegatus_homolog_perc_id
## 2476                                cvariegatus_homolog_perc_id_r1
## 2477                                 cvariegatus_homolog_goc_score
## 2478                              cvariegatus_homolog_wga_coverage
## 2479                      cvariegatus_homolog_orthology_confidence
## 2480                                 saraneus_homolog_ensembl_gene
## 2481                         saraneus_homolog_associated_gene_name
## 2482                              saraneus_homolog_ensembl_peptide
## 2483                                   saraneus_homolog_chromosome
## 2484                                  saraneus_homolog_chrom_start
## 2485                                    saraneus_homolog_chrom_end
## 2486                 saraneus_homolog_canonical_transcript_protein
## 2487                                      saraneus_homolog_subtype
## 2488                               saraneus_homolog_orthology_type
## 2489                                      saraneus_homolog_perc_id
## 2490                                   saraneus_homolog_perc_id_r1
## 2491                                    saraneus_homolog_goc_score
## 2492                                 saraneus_homolog_wga_coverage
## 2493                         saraneus_homolog_orthology_confidence
## 2494                                  mpahari_homolog_ensembl_gene
## 2495                          mpahari_homolog_associated_gene_name
## 2496                               mpahari_homolog_ensembl_peptide
## 2497                                    mpahari_homolog_chromosome
## 2498                                   mpahari_homolog_chrom_start
## 2499                                     mpahari_homolog_chrom_end
## 2500                  mpahari_homolog_canonical_transcript_protein
## 2501                                       mpahari_homolog_subtype
## 2502                                mpahari_homolog_orthology_type
## 2503                                       mpahari_homolog_perc_id
## 2504                                    mpahari_homolog_perc_id_r1
## 2505                                     mpahari_homolog_goc_score
## 2506                                  mpahari_homolog_wga_coverage
## 2507                          mpahari_homolog_orthology_confidence
## 2508                               bsplendens_homolog_ensembl_gene
## 2509                       bsplendens_homolog_associated_gene_name
## 2510                            bsplendens_homolog_ensembl_peptide
## 2511                                 bsplendens_homolog_chromosome
## 2512                                bsplendens_homolog_chrom_start
## 2513                                  bsplendens_homolog_chrom_end
## 2514               bsplendens_homolog_canonical_transcript_protein
## 2515                                    bsplendens_homolog_subtype
## 2516                             bsplendens_homolog_orthology_type
## 2517                                    bsplendens_homolog_perc_id
## 2518                                 bsplendens_homolog_perc_id_r1
## 2519                                  bsplendens_homolog_goc_score
## 2520                               bsplendens_homolog_wga_coverage
## 2521                       bsplendens_homolog_orthology_confidence
## 2522                             mmoschiferus_homolog_ensembl_gene
## 2523                     mmoschiferus_homolog_associated_gene_name
## 2524                          mmoschiferus_homolog_ensembl_peptide
## 2525                               mmoschiferus_homolog_chromosome
## 2526                              mmoschiferus_homolog_chrom_start
## 2527                                mmoschiferus_homolog_chrom_end
## 2528             mmoschiferus_homolog_canonical_transcript_protein
## 2529                                  mmoschiferus_homolog_subtype
## 2530                           mmoschiferus_homolog_orthology_type
## 2531                                  mmoschiferus_homolog_perc_id
## 2532                               mmoschiferus_homolog_perc_id_r1
## 2533                                mmoschiferus_homolog_goc_score
## 2534                             mmoschiferus_homolog_wga_coverage
## 2535                     mmoschiferus_homolog_orthology_confidence
## 2536                               choffmanni_homolog_ensembl_gene
## 2537                       choffmanni_homolog_associated_gene_name
## 2538                            choffmanni_homolog_ensembl_peptide
## 2539                                 choffmanni_homolog_chromosome
## 2540                                choffmanni_homolog_chrom_start
## 2541                                  choffmanni_homolog_chrom_end
## 2542               choffmanni_homolog_canonical_transcript_protein
## 2543                                    choffmanni_homolog_subtype
## 2544                             choffmanni_homolog_orthology_type
## 2545                                    choffmanni_homolog_perc_id
## 2546                                 choffmanni_homolog_perc_id_r1
## 2547                                  choffmanni_homolog_goc_score
## 2548                               choffmanni_homolog_wga_coverage
## 2549                       choffmanni_homolog_orthology_confidence
## 2550                                    catys_homolog_ensembl_gene
## 2551                            catys_homolog_associated_gene_name
## 2552                                 catys_homolog_ensembl_peptide
## 2553                                      catys_homolog_chromosome
## 2554                                     catys_homolog_chrom_start
## 2555                                       catys_homolog_chrom_end
## 2556                    catys_homolog_canonical_transcript_protein
## 2557                                         catys_homolog_subtype
## 2558                                  catys_homolog_orthology_type
## 2559                                         catys_homolog_perc_id
## 2560                                      catys_homolog_perc_id_r1
## 2561                                       catys_homolog_goc_score
## 2562                                    catys_homolog_wga_coverage
## 2563                            catys_homolog_orthology_confidence
## 2564                                 pcatodon_homolog_ensembl_gene
## 2565                         pcatodon_homolog_associated_gene_name
## 2566                              pcatodon_homolog_ensembl_peptide
## 2567                                   pcatodon_homolog_chromosome
## 2568                                  pcatodon_homolog_chrom_start
## 2569                                    pcatodon_homolog_chrom_end
## 2570                 pcatodon_homolog_canonical_transcript_protein
## 2571                                      pcatodon_homolog_subtype
## 2572                               pcatodon_homolog_orthology_type
## 2573                                      pcatodon_homolog_perc_id
## 2574                                   pcatodon_homolog_perc_id_r1
## 2575                                    pcatodon_homolog_goc_score
## 2576                                 pcatodon_homolog_wga_coverage
## 2577                         pcatodon_homolog_orthology_confidence
## 2578                            apolyacanthus_homolog_ensembl_gene
## 2579                    apolyacanthus_homolog_associated_gene_name
## 2580                         apolyacanthus_homolog_ensembl_peptide
## 2581                              apolyacanthus_homolog_chromosome
## 2582                             apolyacanthus_homolog_chrom_start
## 2583                               apolyacanthus_homolog_chrom_end
## 2584            apolyacanthus_homolog_canonical_transcript_protein
## 2585                                 apolyacanthus_homolog_subtype
## 2586                          apolyacanthus_homolog_orthology_type
## 2587                                 apolyacanthus_homolog_perc_id
## 2588                              apolyacanthus_homolog_perc_id_r1
## 2589                               apolyacanthus_homolog_goc_score
## 2590                            apolyacanthus_homolog_wga_coverage
## 2591                    apolyacanthus_homolog_orthology_confidence
## 2592                                loculatus_homolog_ensembl_gene
## 2593                        loculatus_homolog_associated_gene_name
## 2594                             loculatus_homolog_ensembl_peptide
## 2595                                  loculatus_homolog_chromosome
## 2596                                 loculatus_homolog_chrom_start
## 2597                                   loculatus_homolog_chrom_end
## 2598                loculatus_homolog_canonical_transcript_protein
## 2599                                     loculatus_homolog_subtype
## 2600                              loculatus_homolog_orthology_type
## 2601                                     loculatus_homolog_perc_id
## 2602                                  loculatus_homolog_perc_id_r1
## 2603                                   loculatus_homolog_goc_score
## 2604                                loculatus_homolog_wga_coverage
## 2605                        loculatus_homolog_orthology_confidence
## 2606                        itridecemlineatus_homolog_ensembl_gene
## 2607                itridecemlineatus_homolog_associated_gene_name
## 2608                     itridecemlineatus_homolog_ensembl_peptide
## 2609                          itridecemlineatus_homolog_chromosome
## 2610                         itridecemlineatus_homolog_chrom_start
## 2611                           itridecemlineatus_homolog_chrom_end
## 2612        itridecemlineatus_homolog_canonical_transcript_protein
## 2613                             itridecemlineatus_homolog_subtype
## 2614                      itridecemlineatus_homolog_orthology_type
## 2615                             itridecemlineatus_homolog_perc_id
## 2616                          itridecemlineatus_homolog_perc_id_r1
## 2617                           itridecemlineatus_homolog_goc_score
## 2618                        itridecemlineatus_homolog_wga_coverage
## 2619                itridecemlineatus_homolog_orthology_confidence
## 2620                              mspicilegus_homolog_ensembl_gene
## 2621                      mspicilegus_homolog_associated_gene_name
## 2622                           mspicilegus_homolog_ensembl_peptide
## 2623                                mspicilegus_homolog_chromosome
## 2624                               mspicilegus_homolog_chrom_start
## 2625                                 mspicilegus_homolog_chrom_end
## 2626              mspicilegus_homolog_canonical_transcript_protein
## 2627                                   mspicilegus_homolog_subtype
## 2628                            mspicilegus_homolog_orthology_type
## 2629                                   mspicilegus_homolog_perc_id
## 2630                                mspicilegus_homolog_perc_id_r1
## 2631                                 mspicilegus_homolog_goc_score
## 2632                              mspicilegus_homolog_wga_coverage
## 2633                      mspicilegus_homolog_orthology_confidence
## 2634                               gaculeatus_homolog_ensembl_gene
## 2635                       gaculeatus_homolog_associated_gene_name
## 2636                            gaculeatus_homolog_ensembl_peptide
## 2637                                 gaculeatus_homolog_chromosome
## 2638                                gaculeatus_homolog_chrom_start
## 2639                                  gaculeatus_homolog_chrom_end
## 2640               gaculeatus_homolog_canonical_transcript_protein
## 2641                                    gaculeatus_homolog_subtype
## 2642                             gaculeatus_homolog_orthology_type
## 2643                                    gaculeatus_homolog_perc_id
## 2644                                 gaculeatus_homolog_perc_id_r1
## 2645                                  gaculeatus_homolog_goc_score
## 2646                               gaculeatus_homolog_wga_coverage
## 2647                       gaculeatus_homolog_orthology_confidence
## 2648                                  pabelii_homolog_ensembl_gene
## 2649                          pabelii_homolog_associated_gene_name
## 2650                               pabelii_homolog_ensembl_peptide
## 2651                                    pabelii_homolog_chromosome
## 2652                                   pabelii_homolog_chrom_start
## 2653                                     pabelii_homolog_chrom_end
## 2654                  pabelii_homolog_canonical_transcript_protein
## 2655                                       pabelii_homolog_subtype
## 2656                                pabelii_homolog_orthology_type
## 2657                                       pabelii_homolog_perc_id
## 2658                                    pabelii_homolog_perc_id_r1
## 2659                                     pabelii_homolog_goc_score
## 2660                                  pabelii_homolog_wga_coverage
## 2661                          pabelii_homolog_orthology_confidence
## 2662                                csyrichta_homolog_ensembl_gene
## 2663                        csyrichta_homolog_associated_gene_name
## 2664                             csyrichta_homolog_ensembl_peptide
## 2665                                  csyrichta_homolog_chromosome
## 2666                                 csyrichta_homolog_chrom_start
## 2667                                   csyrichta_homolog_chrom_end
## 2668                csyrichta_homolog_canonical_transcript_protein
## 2669                                     csyrichta_homolog_subtype
## 2670                              csyrichta_homolog_orthology_type
## 2671                                     csyrichta_homolog_perc_id
## 2672                                  csyrichta_homolog_perc_id_r1
## 2673                                   csyrichta_homolog_goc_score
## 2674                                csyrichta_homolog_wga_coverage
## 2675                        csyrichta_homolog_orthology_confidence
## 2676                                sharrisii_homolog_ensembl_gene
## 2677                        sharrisii_homolog_associated_gene_name
## 2678                             sharrisii_homolog_ensembl_peptide
## 2679                                  sharrisii_homolog_chromosome
## 2680                                 sharrisii_homolog_chrom_start
## 2681                                   sharrisii_homolog_chrom_end
## 2682                sharrisii_homolog_canonical_transcript_protein
## 2683                                     sharrisii_homolog_subtype
## 2684                              sharrisii_homolog_orthology_type
## 2685                                     sharrisii_homolog_perc_id
## 2686                                  sharrisii_homolog_perc_id_r1
## 2687                                   sharrisii_homolog_goc_score
## 2688                        sharrisii_homolog_orthology_confidence
## 2689                            tnigroviridis_homolog_ensembl_gene
## 2690                    tnigroviridis_homolog_associated_gene_name
## 2691                         tnigroviridis_homolog_ensembl_peptide
## 2692                              tnigroviridis_homolog_chromosome
## 2693                             tnigroviridis_homolog_chrom_start
## 2694                               tnigroviridis_homolog_chrom_end
## 2695            tnigroviridis_homolog_canonical_transcript_protein
## 2696                                 tnigroviridis_homolog_subtype
## 2697                          tnigroviridis_homolog_orthology_type
## 2698                                 tnigroviridis_homolog_perc_id
## 2699                              tnigroviridis_homolog_perc_id_r1
## 2700                               tnigroviridis_homolog_goc_score
## 2701                            tnigroviridis_homolog_wga_coverage
## 2702                    tnigroviridis_homolog_orthology_confidence
## 2703                              tctriunguis_homolog_ensembl_gene
## 2704                      tctriunguis_homolog_associated_gene_name
## 2705                           tctriunguis_homolog_ensembl_peptide
## 2706                                tctriunguis_homolog_chromosome
## 2707                               tctriunguis_homolog_chrom_start
## 2708                                 tctriunguis_homolog_chrom_end
## 2709              tctriunguis_homolog_canonical_transcript_protein
## 2710                                   tctriunguis_homolog_subtype
## 2711                            tctriunguis_homolog_orthology_type
## 2712                                   tctriunguis_homolog_perc_id
## 2713                                tctriunguis_homolog_perc_id_r1
## 2714                                 tctriunguis_homolog_goc_score
## 2715                              tctriunguis_homolog_wga_coverage
## 2716                      tctriunguis_homolog_orthology_confidence
## 2717                                ptaltaica_homolog_ensembl_gene
## 2718                        ptaltaica_homolog_associated_gene_name
## 2719                             ptaltaica_homolog_ensembl_peptide
## 2720                                  ptaltaica_homolog_chromosome
## 2721                                 ptaltaica_homolog_chrom_start
## 2722                                   ptaltaica_homolog_chrom_end
## 2723                ptaltaica_homolog_canonical_transcript_protein
## 2724                                     ptaltaica_homolog_subtype
## 2725                              ptaltaica_homolog_orthology_type
## 2726                                     ptaltaica_homolog_perc_id
## 2727                                  ptaltaica_homolog_perc_id_r1
## 2728                                   ptaltaica_homolog_goc_score
## 2729                                ptaltaica_homolog_wga_coverage
## 2730                        ptaltaica_homolog_orthology_confidence
## 2731                                   hcomes_homolog_ensembl_gene
## 2732                           hcomes_homolog_associated_gene_name
## 2733                                hcomes_homolog_ensembl_peptide
## 2734                                     hcomes_homolog_chromosome
## 2735                                    hcomes_homolog_chrom_start
## 2736                                      hcomes_homolog_chrom_end
## 2737                   hcomes_homolog_canonical_transcript_protein
## 2738                                        hcomes_homolog_subtype
## 2739                                 hcomes_homolog_orthology_type
## 2740                                        hcomes_homolog_perc_id
## 2741                                     hcomes_homolog_perc_id_r1
## 2742                                      hcomes_homolog_goc_score
## 2743                                   hcomes_homolog_wga_coverage
## 2744                           hcomes_homolog_orthology_confidence
## 2745                              csemilaevis_homolog_ensembl_gene
## 2746                      csemilaevis_homolog_associated_gene_name
## 2747                           csemilaevis_homolog_ensembl_peptide
## 2748                                csemilaevis_homolog_chromosome
## 2749                               csemilaevis_homolog_chrom_start
## 2750                                 csemilaevis_homolog_chrom_end
## 2751              csemilaevis_homolog_canonical_transcript_protein
## 2752                                   csemilaevis_homolog_subtype
## 2753                            csemilaevis_homolog_orthology_type
## 2754                                   csemilaevis_homolog_perc_id
## 2755                                csemilaevis_homolog_perc_id_r1
## 2756                                 csemilaevis_homolog_goc_score
## 2757                              csemilaevis_homolog_wga_coverage
## 2758                      csemilaevis_homolog_orthology_confidence
## 2759                               tbelangeri_homolog_ensembl_gene
## 2760                       tbelangeri_homolog_associated_gene_name
## 2761                            tbelangeri_homolog_ensembl_peptide
## 2762                                 tbelangeri_homolog_chromosome
## 2763                                tbelangeri_homolog_chrom_start
## 2764                                  tbelangeri_homolog_chrom_end
## 2765               tbelangeri_homolog_canonical_transcript_protein
## 2766                                    tbelangeri_homolog_subtype
## 2767                             tbelangeri_homolog_orthology_type
## 2768                                    tbelangeri_homolog_perc_id
## 2769                                 tbelangeri_homolog_perc_id_r1
## 2770                                  tbelangeri_homolog_goc_score
## 2771                               tbelangeri_homolog_wga_coverage
## 2772                       tbelangeri_homolog_orthology_confidence
## 2773                              xtropicalis_homolog_ensembl_gene
## 2774                      xtropicalis_homolog_associated_gene_name
## 2775                           xtropicalis_homolog_ensembl_peptide
## 2776                                xtropicalis_homolog_chromosome
## 2777                               xtropicalis_homolog_chrom_start
## 2778                                 xtropicalis_homolog_chrom_end
## 2779              xtropicalis_homolog_canonical_transcript_protein
## 2780                                   xtropicalis_homolog_subtype
## 2781                            xtropicalis_homolog_orthology_type
## 2782                                   xtropicalis_homolog_perc_id
## 2783                                xtropicalis_homolog_perc_id_r1
## 2784                                 xtropicalis_homolog_goc_score
## 2785                      xtropicalis_homolog_orthology_confidence
## 2786                               spunctatus_homolog_ensembl_gene
## 2787                       spunctatus_homolog_associated_gene_name
## 2788                            spunctatus_homolog_ensembl_peptide
## 2789                                 spunctatus_homolog_chromosome
## 2790                                spunctatus_homolog_chrom_start
## 2791                                  spunctatus_homolog_chrom_end
## 2792               spunctatus_homolog_canonical_transcript_protein
## 2793                                    spunctatus_homolog_subtype
## 2794                             spunctatus_homolog_orthology_type
## 2795                                    spunctatus_homolog_perc_id
## 2796                                 spunctatus_homolog_perc_id_r1
## 2797                                  spunctatus_homolog_goc_score
## 2798                               spunctatus_homolog_wga_coverage
## 2799                       spunctatus_homolog_orthology_confidence
## 2800                                 smaximus_homolog_ensembl_gene
## 2801                         smaximus_homolog_associated_gene_name
## 2802                              smaximus_homolog_ensembl_peptide
## 2803                                   smaximus_homolog_chromosome
## 2804                                  smaximus_homolog_chrom_start
## 2805                                    smaximus_homolog_chrom_end
## 2806                 smaximus_homolog_canonical_transcript_protein
## 2807                                      smaximus_homolog_subtype
## 2808                               smaximus_homolog_orthology_type
## 2809                                      smaximus_homolog_perc_id
## 2810                                   smaximus_homolog_perc_id_r1
## 2811                                    smaximus_homolog_goc_score
## 2812                         smaximus_homolog_orthology_confidence
## 2813                               mgallopavo_homolog_ensembl_gene
## 2814                       mgallopavo_homolog_associated_gene_name
## 2815                            mgallopavo_homolog_ensembl_peptide
## 2816                                 mgallopavo_homolog_chromosome
## 2817                                mgallopavo_homolog_chrom_start
## 2818                                  mgallopavo_homolog_chrom_end
## 2819               mgallopavo_homolog_canonical_transcript_protein
## 2820                                    mgallopavo_homolog_subtype
## 2821                             mgallopavo_homolog_orthology_type
## 2822                                    mgallopavo_homolog_perc_id
## 2823                                 mgallopavo_homolog_perc_id_r1
## 2824                                  mgallopavo_homolog_goc_score
## 2825                       mgallopavo_homolog_orthology_confidence
## 2826                                 nfurzeri_homolog_ensembl_gene
## 2827                         nfurzeri_homolog_associated_gene_name
## 2828                              nfurzeri_homolog_ensembl_peptide
## 2829                                   nfurzeri_homolog_chromosome
## 2830                                  nfurzeri_homolog_chrom_start
## 2831                                    nfurzeri_homolog_chrom_end
## 2832                 nfurzeri_homolog_canonical_transcript_protein
## 2833                                      nfurzeri_homolog_subtype
## 2834                               nfurzeri_homolog_orthology_type
## 2835                                      nfurzeri_homolog_perc_id
## 2836                                   nfurzeri_homolog_perc_id_r1
## 2837                                    nfurzeri_homolog_goc_score
## 2838                                 nfurzeri_homolog_wga_coverage
## 2839                         nfurzeri_homolog_orthology_confidence
## 2840                                  ngalili_homolog_ensembl_gene
## 2841                          ngalili_homolog_associated_gene_name
## 2842                               ngalili_homolog_ensembl_peptide
## 2843                                    ngalili_homolog_chromosome
## 2844                                   ngalili_homolog_chrom_start
## 2845                                     ngalili_homolog_chrom_end
## 2846                  ngalili_homolog_canonical_transcript_protein
## 2847                                       ngalili_homolog_subtype
## 2848                                ngalili_homolog_orthology_type
## 2849                                       ngalili_homolog_perc_id
## 2850                                    ngalili_homolog_perc_id_r1
## 2851                                     ngalili_homolog_goc_score
## 2852                                  ngalili_homolog_wga_coverage
## 2853                          ngalili_homolog_orthology_confidence
## 2854                                   psinus_homolog_ensembl_gene
## 2855                           psinus_homolog_associated_gene_name
## 2856                                psinus_homolog_ensembl_peptide
## 2857                                     psinus_homolog_chromosome
## 2858                                    psinus_homolog_chrom_start
## 2859                                      psinus_homolog_chrom_end
## 2860                   psinus_homolog_canonical_transcript_protein
## 2861                                        psinus_homolog_subtype
## 2862                                 psinus_homolog_orthology_type
## 2863                                        psinus_homolog_perc_id
## 2864                                     psinus_homolog_perc_id_r1
## 2865                                      psinus_homolog_goc_score
## 2866                                   psinus_homolog_wga_coverage
## 2867                           psinus_homolog_orthology_confidence
## 2868                                 csabaeus_homolog_ensembl_gene
## 2869                         csabaeus_homolog_associated_gene_name
## 2870                              csabaeus_homolog_ensembl_peptide
## 2871                                   csabaeus_homolog_chromosome
## 2872                                  csabaeus_homolog_chrom_start
## 2873                                    csabaeus_homolog_chrom_end
## 2874                 csabaeus_homolog_canonical_transcript_protein
## 2875                                      csabaeus_homolog_subtype
## 2876                               csabaeus_homolog_orthology_type
## 2877                                      csabaeus_homolog_perc_id
## 2878                                   csabaeus_homolog_perc_id_r1
## 2879                                    csabaeus_homolog_goc_score
## 2880                                 csabaeus_homolog_wga_coverage
## 2881                         csabaeus_homolog_orthology_confidence
## 2882                                 neugenii_homolog_ensembl_gene
## 2883                         neugenii_homolog_associated_gene_name
## 2884                              neugenii_homolog_ensembl_peptide
## 2885                                   neugenii_homolog_chromosome
## 2886                                  neugenii_homolog_chrom_start
## 2887                                    neugenii_homolog_chrom_end
## 2888                 neugenii_homolog_canonical_transcript_protein
## 2889                                      neugenii_homolog_subtype
## 2890                               neugenii_homolog_orthology_type
## 2891                                      neugenii_homolog_perc_id
## 2892                                   neugenii_homolog_perc_id_r1
## 2893                                    neugenii_homolog_goc_score
## 2894                                 neugenii_homolog_wga_coverage
## 2895                         neugenii_homolog_orthology_confidence
## 2896                                 cjacchus_homolog_ensembl_gene
## 2897                         cjacchus_homolog_associated_gene_name
## 2898                              cjacchus_homolog_ensembl_peptide
## 2899                                   cjacchus_homolog_chromosome
## 2900                                  cjacchus_homolog_chrom_start
## 2901                                    cjacchus_homolog_chrom_end
## 2902                 cjacchus_homolog_canonical_transcript_protein
## 2903                                      cjacchus_homolog_subtype
## 2904                               cjacchus_homolog_orthology_type
## 2905                                      cjacchus_homolog_perc_id
## 2906                                   cjacchus_homolog_perc_id_r1
## 2907                                    cjacchus_homolog_goc_score
## 2908                                 cjacchus_homolog_wga_coverage
## 2909                         cjacchus_homolog_orthology_confidence
## 2910                                   bmutus_homolog_ensembl_gene
## 2911                           bmutus_homolog_associated_gene_name
## 2912                                bmutus_homolog_ensembl_peptide
## 2913                                     bmutus_homolog_chromosome
## 2914                                    bmutus_homolog_chrom_start
## 2915                                      bmutus_homolog_chrom_end
## 2916                   bmutus_homolog_canonical_transcript_protein
## 2917                                        bmutus_homolog_subtype
## 2918                                 bmutus_homolog_orthology_type
## 2919                                        bmutus_homolog_perc_id
## 2920                                     bmutus_homolog_perc_id_r1
## 2921                                      bmutus_homolog_goc_score
## 2922                                   bmutus_homolog_wga_coverage
## 2923                           bmutus_homolog_orthology_confidence
## 2924                           chyarkandensis_homolog_ensembl_gene
## 2925                   chyarkandensis_homolog_associated_gene_name
## 2926                        chyarkandensis_homolog_ensembl_peptide
## 2927                             chyarkandensis_homolog_chromosome
## 2928                            chyarkandensis_homolog_chrom_start
## 2929                              chyarkandensis_homolog_chrom_end
## 2930           chyarkandensis_homolog_canonical_transcript_protein
## 2931                                chyarkandensis_homolog_subtype
## 2932                         chyarkandensis_homolog_orthology_type
## 2933                                chyarkandensis_homolog_perc_id
## 2934                             chyarkandensis_homolog_perc_id_r1
## 2935                              chyarkandensis_homolog_goc_score
## 2936                           chyarkandensis_homolog_wga_coverage
## 2937                   chyarkandensis_homolog_orthology_confidence
## 2938                               sldorsalis_homolog_ensembl_gene
## 2939                       sldorsalis_homolog_associated_gene_name
## 2940                            sldorsalis_homolog_ensembl_peptide
## 2941                                 sldorsalis_homolog_chromosome
## 2942                                sldorsalis_homolog_chrom_start
## 2943                                  sldorsalis_homolog_chrom_end
## 2944               sldorsalis_homolog_canonical_transcript_protein
## 2945                                    sldorsalis_homolog_subtype
## 2946                             sldorsalis_homolog_orthology_type
## 2947                                    sldorsalis_homolog_perc_id
## 2948                                 sldorsalis_homolog_perc_id_r1
## 2949                                  sldorsalis_homolog_goc_score
## 2950                               sldorsalis_homolog_wga_coverage
## 2951                       sldorsalis_homolog_orthology_confidence
## 2952                                 tguttata_homolog_ensembl_gene
## 2953                         tguttata_homolog_associated_gene_name
## 2954                              tguttata_homolog_ensembl_peptide
## 2955                                   tguttata_homolog_chromosome
## 2956                                  tguttata_homolog_chrom_start
## 2957                                    tguttata_homolog_chrom_end
## 2958                 tguttata_homolog_canonical_transcript_protein
## 2959                                      tguttata_homolog_subtype
## 2960                               tguttata_homolog_orthology_type
## 2961                                      tguttata_homolog_perc_id
## 2962                                   tguttata_homolog_perc_id_r1
## 2963                                    tguttata_homolog_goc_score
## 2964                                 tguttata_homolog_wga_coverage
## 2965                         tguttata_homolog_orthology_confidence
## 2966                                   mzebra_homolog_ensembl_gene
## 2967                           mzebra_homolog_associated_gene_name
## 2968                                mzebra_homolog_ensembl_peptide
## 2969                                     mzebra_homolog_chromosome
## 2970                                    mzebra_homolog_chrom_start
## 2971                                      mzebra_homolog_chrom_end
## 2972                   mzebra_homolog_canonical_transcript_protein
## 2973                                        mzebra_homolog_subtype
## 2974                                 mzebra_homolog_orthology_type
## 2975                                        mzebra_homolog_perc_id
## 2976                                     mzebra_homolog_perc_id_r1
## 2977                                      mzebra_homolog_goc_score
## 2978                                   mzebra_homolog_wga_coverage
## 2979                           mzebra_homolog_orthology_confidence
## 2980                                   drerio_homolog_ensembl_gene
## 2981                           drerio_homolog_associated_gene_name
## 2982                                drerio_homolog_ensembl_peptide
## 2983                                     drerio_homolog_chromosome
## 2984                                    drerio_homolog_chrom_start
## 2985                                      drerio_homolog_chrom_end
## 2986                   drerio_homolog_canonical_transcript_protein
## 2987                                        drerio_homolog_subtype
## 2988                                 drerio_homolog_orthology_type
## 2989                                        drerio_homolog_perc_id
## 2990                                     drerio_homolog_perc_id_r1
## 2991                                      drerio_homolog_goc_score
## 2992                                   drerio_homolog_wga_coverage
## 2993                           drerio_homolog_orthology_confidence
## 2994                                 marmatus_homolog_ensembl_gene
## 2995                         marmatus_homolog_associated_gene_name
## 2996                              marmatus_homolog_ensembl_peptide
## 2997                                   marmatus_homolog_chromosome
## 2998                                  marmatus_homolog_chrom_start
## 2999                                    marmatus_homolog_chrom_end
## 3000                 marmatus_homolog_canonical_transcript_protein
## 3001                                      marmatus_homolog_subtype
## 3002                               marmatus_homolog_orthology_type
## 3003                                      marmatus_homolog_perc_id
## 3004                                   marmatus_homolog_perc_id_r1
## 3005                                    marmatus_homolog_goc_score
## 3006                         marmatus_homolog_orthology_confidence
## 3007                                 hsapiens_paralog_ensembl_gene
## 3008                         hsapiens_paralog_associated_gene_name
## 3009                              hsapiens_paralog_ensembl_peptide
## 3010                                   hsapiens_paralog_chromosome
## 3011                                  hsapiens_paralog_chrom_start
## 3012                                    hsapiens_paralog_chrom_end
## 3013                 hsapiens_paralog_canonical_transcript_protein
## 3014                                      hsapiens_paralog_subtype
## 3015                               hsapiens_paralog_orthology_type
## 3016                                      hsapiens_paralog_perc_id
## 3017                                   hsapiens_paralog_perc_id_r1
## 3018                                               ensembl_gene_id
## 3019                                       ensembl_gene_id_version
## 3020                                                       version
## 3021                                         ensembl_transcript_id
## 3022                                 ensembl_transcript_id_version
## 3023                                            transcript_version
## 3024                                            ensembl_peptide_id
## 3025                                    ensembl_peptide_id_version
## 3026                                               peptide_version
## 3027                                               chromosome_name
## 3028                                                start_position
## 3029                                                  end_position
## 3030                                                        strand
## 3031                                                          band
## 3032                                            external_gene_name
## 3033                                          external_gene_source
## 3034                                              transcript_count
## 3035                                    percentage_gene_gc_content
## 3036                                                   description
## 3037                                                variation_name
## 3038                                    germ_line_variation_source
## 3039                                            source_description
## 3040                                                        allele
## 3041                                                     validated
## 3042                                                     mapweight
## 3043                                                  minor_allele
## 3044                                             minor_allele_freq
## 3045                                            minor_allele_count
## 3046                                         clinical_significance
## 3047                                           transcript_location
## 3048                                         snp_chromosome_strand
## 3049                                              peptide_location
## 3050                                              chromosome_start
## 3051                                                chromosome_end
## 3052                                      polyphen_prediction_2076
## 3053                                           polyphen_score_2076
## 3054                                          sift_prediction_2076
## 3055                                               sift_score_2076
## 3056                                   distance_to_transcript_2076
## 3057                                                cds_start_2076
## 3058                                                  cds_end_2076
## 3059                                                 peptide_shift
## 3060                                             synonymous_status
## 3061                                            allele_string_2076
## 3062                                               ensembl_gene_id
## 3063                                       ensembl_gene_id_version
## 3064                                                       version
## 3065                                         ensembl_transcript_id
## 3066                                 ensembl_transcript_id_version
## 3067                                            transcript_version
## 3068                                            ensembl_peptide_id
## 3069                                    ensembl_peptide_id_version
## 3070                                               peptide_version
## 3071                                               chromosome_name
## 3072                                                start_position
## 3073                                                  end_position
## 3074                                                        strand
## 3075                                                          band
## 3076                                            external_gene_name
## 3077                                          external_gene_source
## 3078                                              transcript_count
## 3079                                    percentage_gene_gc_content
## 3080                                                   description
## 3081                                        somatic_variation_name
## 3082                                           somatic_source_name
## 3083                                    somatic_source_description
## 3084                                                somatic_allele
## 3085                                             somatic_validated
## 3086                                             somatic_mapweight
## 3087                                   somatic_transcript_location
## 3088                                 somatic_snp_chromosome_strand
## 3089                                      somatic_peptide_location
## 3090                                      somatic_chromosome_start
## 3091                                        somatic_chromosome_end
## 3092 mart_transcript_variation_som__dm_distance_to_transcript_2076
## 3093                                        somatic_cds_start_2076
## 3094                                          somatic_cds_end_2076
## 3095                                     somatic_synonymous_status
## 3096          mart_transcript_variation_som__dm_allele_string_2076
## 3097                                        transcript_exon_intron
## 3098                                              gene_exon_intron
## 3099                                              transcript_flank
## 3100                                                    gene_flank
## 3101                                       coding_transcript_flank
## 3102                                             coding_gene_flank
## 3103                                                          5utr
## 3104                                                          3utr
## 3105                                                     gene_exon
## 3106                                                          cdna
## 3107                                                        coding
## 3108                                                       peptide
## 3109                                                upstream_flank
## 3110                                              downstream_flank
## 3111                                               ensembl_gene_id
## 3112                                       ensembl_gene_id_version
## 3113                                                   description
## 3114                                            external_gene_name
## 3115                                          external_gene_source
## 3116                                               chromosome_name
## 3117                                                start_position
## 3118                                                  end_position
## 3119                                                  gene_biotype
## 3120                                                       version
## 3121                                                       uniparc
## 3122                                              uniprotswissprot
## 3123                                               uniprotsptrembl
## 3124                                             cdna_coding_start
## 3125                                               cdna_coding_end
## 3126                                                   5_utr_start
## 3127                                                     5_utr_end
## 3128                                                   3_utr_start
## 3129                                                     3_utr_end
## 3130                                         ensembl_transcript_id
## 3131                                 ensembl_transcript_id_version
## 3132                                            ensembl_peptide_id
## 3133                                    ensembl_peptide_id_version
## 3134                                            transcript_biotype
## 3135                                            transcript_version
## 3136                                               peptide_version
## 3137                                                        strand
## 3138                                              transcript_start
## 3139                                                transcript_end
## 3140                                      transcription_start_site
## 3141                                             transcript_length
## 3142                                                    cds_length
## 3143                                                     cds_start
## 3144                                                       cds_end
## 3145                                               ensembl_exon_id
## 3146                                              exon_chrom_start
## 3147                                                exon_chrom_end
## 3148                                                        strand
## 3149                                                          rank
## 3150                                                         phase
## 3151                                                     end_phase
## 3152                                             cdna_coding_start
## 3153                                               cdna_coding_end
## 3154                                          genomic_coding_start
## 3155                                            genomic_coding_end
## 3156                                               is_constitutive
##                                                                          description
## 1                                                                     Gene stable ID
## 2                                                             Gene stable ID version
## 3                                                               Transcript stable ID
## 4                                                       Transcript stable ID version
## 5                                                                  Protein stable ID
## 6                                                          Protein stable ID version
## 7                                                                     Exon stable ID
## 8                                                                   Gene description
## 9                                                           Chromosome/scaffold name
## 10                                                                   Gene start (bp)
## 11                                                                     Gene end (bp)
## 12                                                                            Strand
## 13                                                                    Karyotype band
## 14                                                             Transcript start (bp)
## 15                                                               Transcript end (bp)
## 16                                                    Transcription start site (TSS)
## 17                                        Transcript length (including UTRs and CDS)
## 18                                                    Transcript support level (TSL)
## 19                                                          GENCODE basic annotation
## 20                                                                 APPRIS annotation
## 21                                                                 Ensembl Canonical
## 22                                             RefSeq match transcript (MANE Select)
## 23                                      RefSeq match transcript (MANE Plus Clinical)
## 24                                                                         Gene name
## 25                                                               Source of gene name
## 26                                                                   Transcript name
## 27                                                         Source of transcript name
## 28                                                                  Transcript count
## 29                                                                 Gene % GC content
## 30                                                                         Gene type
## 31                                                                   Transcript type
## 32                                                                     Source (gene)
## 33                                                               Source (transcript)
## 34                                                                    Version (gene)
## 35                                                              Version (transcript)
## 36                                                                 Version (protein)
## 37                                                                      Gene Synonym
## 38                                                             Phenotype description
## 39                                                                       Source name
## 40                                                          Study external reference
## 41                                                                       Strain name
## 42                                                                     Strain gender
## 43                                                                           P value
## 44                                                                 GO term accession
## 45                                                                      GO term name
## 46                                                                GO term definition
## 47                                                             GO term evidence code
## 48                                                                         GO domain
## 49                                                           GOSlim GOA Accession(s)
## 50                                                            GOSlim GOA Description
## 51      BioGRID Interaction data, The General Repository for Interaction Datasets ID
## 52                                                                           CCDS ID
## 53                                                                         ChEMBL ID
## 54                                         DataBase of Aberrant 3' Splice Sites name
## 55                                           DataBase of Aberrant 3' Splice Sites ID
## 56                                         DataBase of Aberrant 5' Splice Sites name
## 57                                           DataBase of Aberrant 5' Splice Sites ID
## 58                                                     EntrezGene transcript name ID
## 59                                                    European Nucleotide Archive ID
## 60                                                               Expression Atlas ID
## 61                                                                      GeneCards ID
## 62                                                                           HGNC ID
## 63                                                                       HGNC symbol
## 64                                                     Human Protein Atlas accession
## 65                                                            Human Protein Atlas ID
## 66                                                                  INSDC protein ID
## 67                                                    LRG display in Ensembl gene ID
## 68                                              LRG display in Ensembl transcript ID
## 69                                                MEROPS - the Peptidase Database ID
## 70                                                              MIM gene description
## 71                                                                MIM gene accession
## 72                                                            MIM morbid description
## 73                                                              MIM morbid accession
## 74                                                                 miRBase accession
## 75                                                                        miRBase ID
## 76                                                        miRBase transcript name ID
## 77                                       NCBI gene (formerly Entrezgene) description
## 78                                         NCBI gene (formerly Entrezgene) accession
## 79                                                NCBI gene (formerly Entrezgene) ID
## 80                                                                            PDB ID
## 81                                                                       Reactome ID
## 82                                                                  Reactome gene ID
## 83                                                            Reactome transcript ID
## 84                                                                    RefSeq mRNA ID
## 85                                                          RefSeq mRNA predicted ID
## 86                                                                   RefSeq ncRNA ID
## 87                                                         RefSeq ncRNA predicted ID
## 88                                                                 RefSeq peptide ID
## 89                                                       RefSeq peptide predicted ID
## 90                                                                           RFAM ID
## 91                                                           RFAM transcript name ID
## 92                                                                     RNAcentral ID
## 93                                                                Transcript name ID
## 94                                                                    UCSC Stable ID
## 95                                                                        UniParc ID
## 96                                                        UniProtKB Gene Name symbol
## 97                                                            UniProtKB Gene Name ID
## 98                                                              UniProtKB isoform ID
## 99                                                           UniProtKB/Swiss-Prot ID
## 100                                                              UniProtKB/TrEMBL ID
## 101                                                             WikiGene description
## 102                                                                    WikiGene name
## 103                                                                      WikiGene ID
## 104                                                               AFFY HC G110 probe
## 105                                                              AFFY HG Focus probe
## 106                                                            AFFY HG U133A 2 probe
## 107                                                              AFFY HG U133B probe
## 108                                                        AFFY HG U133 Plus 2 probe
## 109                                                               AFFY HG U95A probe
## 110                                                             AFFY HG U95Av2 probe
## 111                                                               AFFY HG U95B probe
## 112                                                               AFFY HG U95C probe
## 113                                                               AFFY HG U95D probe
## 114                                                               AFFY HG U95E probe
## 115                                                               AFFY HTA 2 0 probe
## 116                                                    AFFY HT HG U133 Plus PM probe
## 117                                                        AFFY HuEx 1 0 st v2 probe
## 118                                                              AFFY HuGeneFL probe
## 119                                                      AFFY HuGene 1 0 st v1 probe
## 120                                                      AFFY HuGene 2 0 st v1 probe
## 121                                                      AFFY HuGene 2 1 st v1 probe
## 122                                                             AFFY PrimeView probe
## 123                                                              AFFY U133 X3P probe
## 124                                                            AGILENT CGH 44b probe
## 125                                                           AGILENT GPL19072 probe
## 126                                                           AGILENT GPL26966 probe
## 127                                                            AGILENT GPL6848 probe
## 128                                              AGILENT SurePrint G3 GE 8x60k probe
## 129                                           AGILENT SurePrint G3 GE 8x60k v2 probe
## 130                                                        AGILENT WholeGenome probe
## 131                                               AGILENT WholeGenome 4x44k v1 probe
## 132                                               AGILENT WholeGenome 4x44k v2 probe
## 133                                                          CODELINK CODELINK probe
## 134                                                     ILLUMINA HumanRef 8 V3 probe
## 135                                                      ILLUMINA HumanWG 6 V3 probe
## 136                                                           PHALANX OneArray probe
## 137                                                                           CDD ID
## 138                                                                        CDD start
## 139                                                                          CDD end
## 140                                                                        Gene3D ID
## 141                                                                     Gene3D start
## 142                                                                       Gene3D end
## 143                                                                         HAMAP ID
## 144                                                                      HAMAP start
## 145                                                                        HAMAP end
## 146                                                                       PANTHER ID
## 147                                                                    PANTHER start
## 148                                                                      PANTHER end
## 149                                                                          Pfam ID
## 150                                                                       Pfam start
## 151                                                                         Pfam end
## 152                                                                         PIRSF ID
## 153                                                                      PIRSF start
## 154                                                                        PIRSF end
## 155                                                                        Prints ID
## 156                                                                     Prints start
## 157                                                                       Prints end
## 158                                                              PROSITE patterns ID
## 159                                                           PROSITE patterns start
## 160                                                             PROSITE patterns end
## 161                                                              PROSITE profiles ID
## 162                                                           PROSITE profiles start
## 163                                                             PROSITE profiles end
## 164                                                                          SFLD ID
## 165                                                                       SFLD start
## 166                                                                         SFLD end
## 167                                                                         SMART ID
## 168                                                                      SMART start
## 169                                                                        SMART end
## 170                                                                   Superfamily ID
## 171                                                                Superfamily start
## 172                                                                  Superfamily end
## 173                                                                       TIGRFAM ID
## 174                                                                    TIGRFAM start
## 175                                                                      TIGRFAM end
## 176                                                                      Interpro ID
## 177                                                       Interpro Short Description
## 178                                                             Interpro Description
## 179                                                                   Interpro start
## 180                                                                     Interpro end
## 181                                                               AFDB-ENSP mappings
## 182                                                         AFDB-ENSP mappings start
## 183                                                           AFDB-ENSP mappings end
## 184                                                                      MobiDB lite
## 185                                                                MobiDB lite start
## 186                                                                  MobiDB lite end
## 187                                                            Coiled-coils (Ncoils)
## 188                                                      Coiled-coils (Ncoils) start
## 189                                                        Coiled-coils (Ncoils) end
## 190                                                             Low complexity (Seg)
## 191                                                       Low complexity (Seg) start
## 192                                                         Low complexity (Seg) end
## 193                                                                PDB-ENSP mappings
## 194                                                          PDB-ENSP mappings start
## 195                                                            PDB-ENSP mappings end
## 196                                                          Cleavage site (Signalp)
## 197                                                    Cleavage site (Signalp) start
## 198                                                      Cleavage site (Signalp) end
## 199                                                            Transmembrane helices
## 200                                                      Transmembrane helices start
## 201                                                        Transmembrane helices end
## 202                                                                   Gene stable ID
## 203                                                           Gene stable ID version
## 204                                                                   Version (gene)
## 205                                                             Transcript stable ID
## 206                                                     Transcript stable ID version
## 207                                                             Version (transcript)
## 208                                                                Protein stable ID
## 209                                                        Protein stable ID version
## 210                                                                Version (protein)
## 211                                                         Chromosome/scaffold name
## 212                                                                  Gene start (bp)
## 213                                                                    Gene end (bp)
## 214                                                            Transcript start (bp)
## 215                                                              Transcript end (bp)
## 216                                                   Transcription start site (TSS)
## 217                                       Transcript length (including UTRs and CDS)
## 218                                                                           Strand
## 219                                                                        Gene name
## 220                                                              Source of gene name
## 221                                                                     5' UTR start
## 222                                                                       5' UTR end
## 223                                                                     3' UTR start
## 224                                                                       3' UTR end
## 225                                                                       CDS Length
## 226                                                                 Transcript count
## 227                                                                 Gene description
## 228                                                                        Gene type
## 229                                                           Exon region start (bp)
## 230                                                             Exon region end (bp)
## 231                                                                Constitutive exon
## 232                                                          Exon rank in transcript
## 233                                                                      Start phase
## 234                                                                        End phase
## 235                                                                cDNA coding start
## 236                                                                  cDNA coding end
## 237                                                             Genomic coding start
## 238                                                               Genomic coding end
## 239                                                                   Exon stable ID
## 240                                                                        CDS start
## 241                                                                          CDS end
## 242                                                                   Gene stable ID
## 243                                                           Gene stable ID version
## 244                                                                   Version (gene)
## 245                                                             Transcript stable ID
## 246                                                     Transcript stable ID version
## 247                                                             Version (transcript)
## 248                                                                Protein stable ID
## 249                                                        Protein stable ID version
## 250                                                                Version (protein)
## 251                                                         Chromosome/scaffold name
## 252                                                                  Gene start (bp)
## 253                                                                    Gene end (bp)
## 254                                                                           Strand
## 255                                                                   Karyotype band
## 256                                                                        Gene name
## 257                                                              Source of gene name
## 258                                                                 Transcript count
## 259                                                                Gene % GC content
## 260                                                                 Gene description
## 261                                    Abingdon island giant tortoise gene stable ID
## 262                                         Abingdon island giant tortoise gene name
## 263                   Abingdon island giant tortoise protein or transcript stable ID
## 264                          Abingdon island giant tortoise chromosome/scaffold name
## 265                    Abingdon island giant tortoise chromosome/scaffold start (bp)
## 266                      Abingdon island giant tortoise chromosome/scaffold end (bp)
## 267                                                   Query protein or transcript ID
## 268                         Last common ancestor with Abingdon island giant tortoise
## 269                                     Abingdon island giant tortoise homology type
## 270          %id. target Abingdon island giant tortoise gene identical to query gene
## 271          %id. query gene identical to target Abingdon island giant tortoise gene
## 272                     Abingdon island giant tortoise Gene-order conservation score
## 273                   Abingdon island giant tortoise Whole-genome alignment coverage
## 274              Abingdon island giant tortoise orthology confidence [0 low, 1 high]
## 275                                                   African ostrich gene stable ID
## 276                                                        African ostrich gene name
## 277                                  African ostrich protein or transcript stable ID
## 278                                         African ostrich chromosome/scaffold name
## 279                                   African ostrich chromosome/scaffold start (bp)
## 280                                     African ostrich chromosome/scaffold end (bp)
## 281                                                   Query protein or transcript ID
## 282                                        Last common ancestor with African ostrich
## 283                                                    African ostrich homology type
## 284                         %id. target African ostrich gene identical to query gene
## 285                         %id. query gene identical to target African ostrich gene
## 286                                    African ostrich Gene-order conservation score
## 287                                  African ostrich Whole-genome alignment coverage
## 288                             African ostrich orthology confidence [0 low, 1 high]
## 289                                                    Algerian mouse gene stable ID
## 290                                                         Algerian mouse gene name
## 291                                   Algerian mouse protein or transcript stable ID
## 292                                          Algerian mouse chromosome/scaffold name
## 293                                    Algerian mouse chromosome/scaffold start (bp)
## 294                                      Algerian mouse chromosome/scaffold end (bp)
## 295                                                   Query protein or transcript ID
## 296                                         Last common ancestor with Algerian mouse
## 297                                                     Algerian mouse homology type
## 298                          %id. target Algerian mouse gene identical to query gene
## 299                          %id. query gene identical to target Algerian mouse gene
## 300                                     Algerian mouse Gene-order conservation score
## 301                                   Algerian mouse Whole-genome alignment coverage
## 302                              Algerian mouse orthology confidence [0 low, 1 high]
## 303                                                            Alpaca gene stable ID
## 304                                                                 Alpaca gene name
## 305                                           Alpaca protein or transcript stable ID
## 306                                                  Alpaca chromosome/scaffold name
## 307                                            Alpaca chromosome/scaffold start (bp)
## 308                                              Alpaca chromosome/scaffold end (bp)
## 309                                                   Query protein or transcript ID
## 310                                                 Last common ancestor with Alpaca
## 311                                                             Alpaca homology type
## 312                                  %id. target Alpaca gene identical to query gene
## 313                                  %id. query gene identical to target Alpaca gene
## 314                                             Alpaca Gene-order conservation score
## 315                                           Alpaca Whole-genome alignment coverage
## 316                                      Alpaca orthology confidence [0 low, 1 high]
## 317                                                     Alpine marmot gene stable ID
## 318                                                          Alpine marmot gene name
## 319                                    Alpine marmot protein or transcript stable ID
## 320                                           Alpine marmot chromosome/scaffold name
## 321                                     Alpine marmot chromosome/scaffold start (bp)
## 322                                       Alpine marmot chromosome/scaffold end (bp)
## 323                                                   Query protein or transcript ID
## 324                                          Last common ancestor with Alpine marmot
## 325                                                      Alpine marmot homology type
## 326                           %id. target Alpine marmot gene identical to query gene
## 327                           %id. query gene identical to target Alpine marmot gene
## 328                                      Alpine marmot Gene-order conservation score
## 329                                    Alpine marmot Whole-genome alignment coverage
## 330                               Alpine marmot orthology confidence [0 low, 1 high]
## 331                                                      Amazon molly gene stable ID
## 332                                                           Amazon molly gene name
## 333                                     Amazon molly protein or transcript stable ID
## 334                                            Amazon molly chromosome/scaffold name
## 335                                      Amazon molly chromosome/scaffold start (bp)
## 336                                        Amazon molly chromosome/scaffold end (bp)
## 337                                                   Query protein or transcript ID
## 338                                           Last common ancestor with Amazon molly
## 339                                                       Amazon molly homology type
## 340                            %id. target Amazon molly gene identical to query gene
## 341                            %id. query gene identical to target Amazon molly gene
## 342                                       Amazon molly Gene-order conservation score
## 343                                     Amazon molly Whole-genome alignment coverage
## 344                                Amazon molly orthology confidence [0 low, 1 high]
## 345                                                    American bison gene stable ID
## 346                                                         American bison gene name
## 347                                   American bison protein or transcript stable ID
## 348                                          American bison chromosome/scaffold name
## 349                                    American bison chromosome/scaffold start (bp)
## 350                                      American bison chromosome/scaffold end (bp)
## 351                                                   Query protein or transcript ID
## 352                                         Last common ancestor with American bison
## 353                                                     American bison homology type
## 354                          %id. target American bison gene identical to query gene
## 355                          %id. query gene identical to target American bison gene
## 356                                     American bison Gene-order conservation score
## 357                                   American bison Whole-genome alignment coverage
## 358                              American bison orthology confidence [0 low, 1 high]
## 359                                               American black bear gene stable ID
## 360                                                    American black bear gene name
## 361                              American black bear protein or transcript stable ID
## 362                                     American black bear chromosome/scaffold name
## 363                               American black bear chromosome/scaffold start (bp)
## 364                                 American black bear chromosome/scaffold end (bp)
## 365                                                   Query protein or transcript ID
## 366                                    Last common ancestor with American black bear
## 367                                                American black bear homology type
## 368                     %id. target American black bear gene identical to query gene
## 369                     %id. query gene identical to target American black bear gene
## 370                                American black bear Gene-order conservation score
## 371                              American black bear Whole-genome alignment coverage
## 372                         American black bear orthology confidence [0 low, 1 high]
## 373                                                     American mink gene stable ID
## 374                                                          American mink gene name
## 375                                    American mink protein or transcript stable ID
## 376                                           American mink chromosome/scaffold name
## 377                                     American mink chromosome/scaffold start (bp)
## 378                                       American mink chromosome/scaffold end (bp)
## 379                                                   Query protein or transcript ID
## 380                                          Last common ancestor with American mink
## 381                                                      American mink homology type
## 382                           %id. target American mink gene identical to query gene
## 383                           %id. query gene identical to target American mink gene
## 384                                      American mink Gene-order conservation score
## 385                                    American mink Whole-genome alignment coverage
## 386                               American mink orthology confidence [0 low, 1 high]
## 387                                                     Arabian camel gene stable ID
## 388                                                          Arabian camel gene name
## 389                                    Arabian camel protein or transcript stable ID
## 390                                           Arabian camel chromosome/scaffold name
## 391                                     Arabian camel chromosome/scaffold start (bp)
## 392                                       Arabian camel chromosome/scaffold end (bp)
## 393                                                   Query protein or transcript ID
## 394                                          Last common ancestor with Arabian camel
## 395                                                      Arabian camel homology type
## 396                           %id. target Arabian camel gene identical to query gene
## 397                           %id. query gene identical to target Arabian camel gene
## 398                                      Arabian camel Gene-order conservation score
## 399                                    Arabian camel Whole-genome alignment coverage
## 400                               Arabian camel orthology confidence [0 low, 1 high]
## 401                                            Arctic ground squirrel gene stable ID
## 402                                                 Arctic ground squirrel gene name
## 403                           Arctic ground squirrel protein or transcript stable ID
## 404                                  Arctic ground squirrel chromosome/scaffold name
## 405                            Arctic ground squirrel chromosome/scaffold start (bp)
## 406                              Arctic ground squirrel chromosome/scaffold end (bp)
## 407                                                   Query protein or transcript ID
## 408                                 Last common ancestor with Arctic ground squirrel
## 409                                             Arctic ground squirrel homology type
## 410                  %id. target Arctic ground squirrel gene identical to query gene
## 411                  %id. query gene identical to target Arctic ground squirrel gene
## 412                             Arctic ground squirrel Gene-order conservation score
## 413                           Arctic ground squirrel Whole-genome alignment coverage
## 414                      Arctic ground squirrel orthology confidence [0 low, 1 high]
## 415                                    Argentine black and white tegu gene stable ID
## 416                                         Argentine black and white tegu gene name
## 417                   Argentine black and white tegu protein or transcript stable ID
## 418                          Argentine black and white tegu chromosome/scaffold name
## 419                    Argentine black and white tegu chromosome/scaffold start (bp)
## 420                      Argentine black and white tegu chromosome/scaffold end (bp)
## 421                                                   Query protein or transcript ID
## 422                         Last common ancestor with Argentine black and white tegu
## 423                                     Argentine black and white tegu homology type
## 424          %id. target Argentine black and white tegu gene identical to query gene
## 425          %id. query gene identical to target Argentine black and white tegu gene
## 426                     Argentine black and white tegu Gene-order conservation score
## 427                   Argentine black and white tegu Whole-genome alignment coverage
## 428              Argentine black and white tegu orthology confidence [0 low, 1 high]
## 429                                                         Armadillo gene stable ID
## 430                                                              Armadillo gene name
## 431                                        Armadillo protein or transcript stable ID
## 432                                               Armadillo chromosome/scaffold name
## 433                                         Armadillo chromosome/scaffold start (bp)
## 434                                           Armadillo chromosome/scaffold end (bp)
## 435                                                   Query protein or transcript ID
## 436                                              Last common ancestor with Armadillo
## 437                                                          Armadillo homology type
## 438                               %id. target Armadillo gene identical to query gene
## 439                               %id. query gene identical to target Armadillo gene
## 440                                          Armadillo Gene-order conservation score
## 441                                        Armadillo Whole-genome alignment coverage
## 442                                   Armadillo orthology confidence [0 low, 1 high]
## 443                                                  Asian bonytongue gene stable ID
## 444                                                       Asian bonytongue gene name
## 445                                 Asian bonytongue protein or transcript stable ID
## 446                                        Asian bonytongue chromosome/scaffold name
## 447                                  Asian bonytongue chromosome/scaffold start (bp)
## 448                                    Asian bonytongue chromosome/scaffold end (bp)
## 449                                                   Query protein or transcript ID
## 450                                       Last common ancestor with Asian bonytongue
## 451                                                   Asian bonytongue homology type
## 452                        %id. target Asian bonytongue gene identical to query gene
## 453                        %id. query gene identical to target Asian bonytongue gene
## 454                                   Asian bonytongue Gene-order conservation score
## 455                                 Asian bonytongue Whole-genome alignment coverage
## 456                            Asian bonytongue orthology confidence [0 low, 1 high]
## 457                                                      Atlantic cod gene stable ID
## 458                                                           Atlantic cod gene name
## 459                                     Atlantic cod protein or transcript stable ID
## 460                                            Atlantic cod chromosome/scaffold name
## 461                                      Atlantic cod chromosome/scaffold start (bp)
## 462                                        Atlantic cod chromosome/scaffold end (bp)
## 463                                                   Query protein or transcript ID
## 464                                           Last common ancestor with Atlantic cod
## 465                                                       Atlantic cod homology type
## 466                            %id. target Atlantic cod gene identical to query gene
## 467                            %id. query gene identical to target Atlantic cod gene
## 468                                       Atlantic cod Gene-order conservation score
## 469                                Atlantic cod orthology confidence [0 low, 1 high]
## 470                                                  Atlantic herring gene stable ID
## 471                                                       Atlantic herring gene name
## 472                                 Atlantic herring protein or transcript stable ID
## 473                                        Atlantic herring chromosome/scaffold name
## 474                                  Atlantic herring chromosome/scaffold start (bp)
## 475                                    Atlantic herring chromosome/scaffold end (bp)
## 476                                                   Query protein or transcript ID
## 477                                       Last common ancestor with Atlantic herring
## 478                                                   Atlantic herring homology type
## 479                        %id. target Atlantic herring gene identical to query gene
## 480                        %id. query gene identical to target Atlantic herring gene
## 481                                   Atlantic herring Gene-order conservation score
## 482                                 Atlantic herring Whole-genome alignment coverage
## 483                            Atlantic herring orthology confidence [0 low, 1 high]
## 484                                                   Atlantic salmon gene stable ID
## 485                                                        Atlantic salmon gene name
## 486                                  Atlantic salmon protein or transcript stable ID
## 487                                         Atlantic salmon chromosome/scaffold name
## 488                                   Atlantic salmon chromosome/scaffold start (bp)
## 489                                     Atlantic salmon chromosome/scaffold end (bp)
## 490                                                   Query protein or transcript ID
## 491                                        Last common ancestor with Atlantic salmon
## 492                                                    Atlantic salmon homology type
## 493                         %id. target Atlantic salmon gene identical to query gene
## 494                         %id. query gene identical to target Atlantic salmon gene
## 495                                    Atlantic salmon Gene-order conservation score
## 496                             Atlantic salmon orthology confidence [0 low, 1 high]
## 497                                    Australian saltwater crocodile gene stable ID
## 498                                         Australian saltwater crocodile gene name
## 499                   Australian saltwater crocodile protein or transcript stable ID
## 500                          Australian saltwater crocodile chromosome/scaffold name
## 501                    Australian saltwater crocodile chromosome/scaffold start (bp)
## 502                      Australian saltwater crocodile chromosome/scaffold end (bp)
## 503                                                   Query protein or transcript ID
## 504                         Last common ancestor with Australian saltwater crocodile
## 505                                     Australian saltwater crocodile homology type
## 506          %id. target Australian saltwater crocodile gene identical to query gene
## 507          %id. query gene identical to target Australian saltwater crocodile gene
## 508                     Australian saltwater crocodile Gene-order conservation score
## 509                   Australian saltwater crocodile Whole-genome alignment coverage
## 510              Australian saltwater crocodile orthology confidence [0 low, 1 high]
## 511                                                     Ballan wrasse gene stable ID
## 512                                                          Ballan wrasse gene name
## 513                                    Ballan wrasse protein or transcript stable ID
## 514                                           Ballan wrasse chromosome/scaffold name
## 515                                     Ballan wrasse chromosome/scaffold start (bp)
## 516                                       Ballan wrasse chromosome/scaffold end (bp)
## 517                                                   Query protein or transcript ID
## 518                                          Last common ancestor with Ballan wrasse
## 519                                                      Ballan wrasse homology type
## 520                           %id. target Ballan wrasse gene identical to query gene
## 521                           %id. query gene identical to target Ballan wrasse gene
## 522                                      Ballan wrasse Gene-order conservation score
## 523                                    Ballan wrasse Whole-genome alignment coverage
## 524                               Ballan wrasse orthology confidence [0 low, 1 high]
## 525                                                  Barramundi perch gene stable ID
## 526                                                       Barramundi perch gene name
## 527                                 Barramundi perch protein or transcript stable ID
## 528                                        Barramundi perch chromosome/scaffold name
## 529                                  Barramundi perch chromosome/scaffold start (bp)
## 530                                    Barramundi perch chromosome/scaffold end (bp)
## 531                                                   Query protein or transcript ID
## 532                                       Last common ancestor with Barramundi perch
## 533                                                   Barramundi perch homology type
## 534                        %id. target Barramundi perch gene identical to query gene
## 535                        %id. query gene identical to target Barramundi perch gene
## 536                                   Barramundi perch Gene-order conservation score
## 537                                 Barramundi perch Whole-genome alignment coverage
## 538                            Barramundi perch orthology confidence [0 low, 1 high]
## 539                                                      Beluga whale gene stable ID
## 540                                                           Beluga whale gene name
## 541                                     Beluga whale protein or transcript stable ID
## 542                                            Beluga whale chromosome/scaffold name
## 543                                      Beluga whale chromosome/scaffold start (bp)
## 544                                        Beluga whale chromosome/scaffold end (bp)
## 545                                                   Query protein or transcript ID
## 546                                           Last common ancestor with Beluga whale
## 547                                                       Beluga whale homology type
## 548                            %id. target Beluga whale gene identical to query gene
## 549                            %id. query gene identical to target Beluga whale gene
## 550                                       Beluga whale Gene-order conservation score
## 551                                     Beluga whale Whole-genome alignment coverage
## 552                                Beluga whale orthology confidence [0 low, 1 high]
## 553                                                Bicolor damselfish gene stable ID
## 554                                                     Bicolor damselfish gene name
## 555                               Bicolor damselfish protein or transcript stable ID
## 556                                      Bicolor damselfish chromosome/scaffold name
## 557                                Bicolor damselfish chromosome/scaffold start (bp)
## 558                                  Bicolor damselfish chromosome/scaffold end (bp)
## 559                                                   Query protein or transcript ID
## 560                                     Last common ancestor with Bicolor damselfish
## 561                                                 Bicolor damselfish homology type
## 562                      %id. target Bicolor damselfish gene identical to query gene
## 563                      %id. query gene identical to target Bicolor damselfish gene
## 564                                 Bicolor damselfish Gene-order conservation score
## 565                               Bicolor damselfish Whole-genome alignment coverage
## 566                          Bicolor damselfish orthology confidence [0 low, 1 high]
## 567                                           Black snub-nosed monkey gene stable ID
## 568                                                Black snub-nosed monkey gene name
## 569                          Black snub-nosed monkey protein or transcript stable ID
## 570                                 Black snub-nosed monkey chromosome/scaffold name
## 571                           Black snub-nosed monkey chromosome/scaffold start (bp)
## 572                             Black snub-nosed monkey chromosome/scaffold end (bp)
## 573                                                   Query protein or transcript ID
## 574                                Last common ancestor with Black snub-nosed monkey
## 575                                            Black snub-nosed monkey homology type
## 576                 %id. target Black snub-nosed monkey gene identical to query gene
## 577                 %id. query gene identical to target Black snub-nosed monkey gene
## 578                            Black snub-nosed monkey Gene-order conservation score
## 579                          Black snub-nosed monkey Whole-genome alignment coverage
## 580                     Black snub-nosed monkey orthology confidence [0 low, 1 high]
## 581                                                        Blue whale gene stable ID
## 582                                                             Blue whale gene name
## 583                                       Blue whale protein or transcript stable ID
## 584                                              Blue whale chromosome/scaffold name
## 585                                        Blue whale chromosome/scaffold start (bp)
## 586                                          Blue whale chromosome/scaffold end (bp)
## 587                                                   Query protein or transcript ID
## 588                                             Last common ancestor with Blue whale
## 589                                                         Blue whale homology type
## 590                              %id. target Blue whale gene identical to query gene
## 591                              %id. query gene identical to target Blue whale gene
## 592                                         Blue whale Gene-order conservation score
## 593                                       Blue whale Whole-genome alignment coverage
## 594                                  Blue whale orthology confidence [0 low, 1 high]
## 595                                             Blue-ringed sea krait gene stable ID
## 596                                                  Blue-ringed sea krait gene name
## 597                            Blue-ringed sea krait protein or transcript stable ID
## 598                                   Blue-ringed sea krait chromosome/scaffold name
## 599                             Blue-ringed sea krait chromosome/scaffold start (bp)
## 600                               Blue-ringed sea krait chromosome/scaffold end (bp)
## 601                                                   Query protein or transcript ID
## 602                                  Last common ancestor with Blue-ringed sea krait
## 603                                              Blue-ringed sea krait homology type
## 604                   %id. target Blue-ringed sea krait gene identical to query gene
## 605                   %id. query gene identical to target Blue-ringed sea krait gene
## 606                              Blue-ringed sea krait Gene-order conservation score
## 607                            Blue-ringed sea krait Whole-genome alignment coverage
## 608                       Blue-ringed sea krait orthology confidence [0 low, 1 high]
## 609                                          Bolivian squirrel monkey gene stable ID
## 610                                               Bolivian squirrel monkey gene name
## 611                         Bolivian squirrel monkey protein or transcript stable ID
## 612                                Bolivian squirrel monkey chromosome/scaffold name
## 613                          Bolivian squirrel monkey chromosome/scaffold start (bp)
## 614                            Bolivian squirrel monkey chromosome/scaffold end (bp)
## 615                                                   Query protein or transcript ID
## 616                               Last common ancestor with Bolivian squirrel monkey
## 617                                           Bolivian squirrel monkey homology type
## 618                %id. target Bolivian squirrel monkey gene identical to query gene
## 619                %id. query gene identical to target Bolivian squirrel monkey gene
## 620                           Bolivian squirrel monkey Gene-order conservation score
## 621                         Bolivian squirrel monkey Whole-genome alignment coverage
## 622                    Bolivian squirrel monkey orthology confidence [0 low, 1 high]
## 623                                                            Bonobo gene stable ID
## 624                                                                 Bonobo gene name
## 625                                           Bonobo protein or transcript stable ID
## 626                                                  Bonobo chromosome/scaffold name
## 627                                            Bonobo chromosome/scaffold start (bp)
## 628                                              Bonobo chromosome/scaffold end (bp)
## 629                                                   Query protein or transcript ID
## 630                                                 Last common ancestor with Bonobo
## 631                                                             Bonobo homology type
## 632                                  %id. target Bonobo gene identical to query gene
## 633                                  %id. query gene identical to target Bonobo gene
## 634                                             Bonobo Gene-order conservation score
## 635                                           Bonobo Whole-genome alignment coverage
## 636                                      Bonobo orthology confidence [0 low, 1 high]
## 637                                                       Brown trout gene stable ID
## 638                                                            Brown trout gene name
## 639                                      Brown trout protein or transcript stable ID
## 640                                             Brown trout chromosome/scaffold name
## 641                                       Brown trout chromosome/scaffold start (bp)
## 642                                         Brown trout chromosome/scaffold end (bp)
## 643                                                   Query protein or transcript ID
## 644                                            Last common ancestor with Brown trout
## 645                                                        Brown trout homology type
## 646                             %id. target Brown trout gene identical to query gene
## 647                             %id. query gene identical to target Brown trout gene
## 648                                        Brown trout Gene-order conservation score
## 649                                      Brown trout Whole-genome alignment coverage
## 650                                 Brown trout orthology confidence [0 low, 1 high]
## 651                                             Burton's mouthbrooder gene stable ID
## 652                                                  Burton's mouthbrooder gene name
## 653                            Burton's mouthbrooder protein or transcript stable ID
## 654                                   Burton's mouthbrooder chromosome/scaffold name
## 655                             Burton's mouthbrooder chromosome/scaffold start (bp)
## 656                               Burton's mouthbrooder chromosome/scaffold end (bp)
## 657                                                   Query protein or transcript ID
## 658                                  Last common ancestor with Burton's mouthbrooder
## 659                                              Burton's mouthbrooder homology type
## 660                   %id. target Burton's mouthbrooder gene identical to query gene
## 661                   %id. query gene identical to target Burton's mouthbrooder gene
## 662                              Burton's mouthbrooder Gene-order conservation score
## 663                            Burton's mouthbrooder Whole-genome alignment coverage
## 664                       Burton's mouthbrooder orthology confidence [0 low, 1 high]
## 665                                                          Bushbaby gene stable ID
## 666                                                               Bushbaby gene name
## 667                                         Bushbaby protein or transcript stable ID
## 668                                                Bushbaby chromosome/scaffold name
## 669                                          Bushbaby chromosome/scaffold start (bp)
## 670                                            Bushbaby chromosome/scaffold end (bp)
## 671                                                   Query protein or transcript ID
## 672                                               Last common ancestor with Bushbaby
## 673                                                           Bushbaby homology type
## 674                                %id. target Bushbaby gene identical to query gene
## 675                                %id. query gene identical to target Bushbaby gene
## 676                                           Bushbaby Gene-order conservation score
## 677                                         Bushbaby Whole-genome alignment coverage
## 678                                    Bushbaby orthology confidence [0 low, 1 high]
## 679                                                    C.intestinalis gene stable ID
## 680                                                         C.intestinalis gene name
## 681                                   C.intestinalis protein or transcript stable ID
## 682                                          C.intestinalis chromosome/scaffold name
## 683                                    C.intestinalis chromosome/scaffold start (bp)
## 684                                      C.intestinalis chromosome/scaffold end (bp)
## 685                                                   Query protein or transcript ID
## 686                                         Last common ancestor with C.intestinalis
## 687                                                     C.intestinalis homology type
## 688                          %id. target C.intestinalis gene identical to query gene
## 689                          %id. query gene identical to target C.intestinalis gene
## 690                                   C.intestinalis Whole-genome alignment coverage
## 691                              C.intestinalis orthology confidence [0 low, 1 high]
## 692                                                        C.savignyi gene stable ID
## 693                                                             C.savignyi gene name
## 694                                       C.savignyi protein or transcript stable ID
## 695                                              C.savignyi chromosome/scaffold name
## 696                                        C.savignyi chromosome/scaffold start (bp)
## 697                                          C.savignyi chromosome/scaffold end (bp)
## 698                                                   Query protein or transcript ID
## 699                                             Last common ancestor with C.savignyi
## 700                                                         C.savignyi homology type
## 701                              %id. target C.savignyi gene identical to query gene
## 702                              %id. query gene identical to target C.savignyi gene
## 703                                       C.savignyi Whole-genome alignment coverage
## 704                                  C.savignyi orthology confidence [0 low, 1 high]
## 705                               Caenorhabditis elegans (PRJNA13758) gene stable ID
## 706                                    Caenorhabditis elegans (PRJNA13758) gene name
## 707              Caenorhabditis elegans (PRJNA13758) protein or transcript stable ID
## 708                     Caenorhabditis elegans (PRJNA13758) chromosome/scaffold name
## 709               Caenorhabditis elegans (PRJNA13758) chromosome/scaffold start (bp)
## 710                 Caenorhabditis elegans (PRJNA13758) chromosome/scaffold end (bp)
## 711                                                   Query protein or transcript ID
## 712                    Last common ancestor with Caenorhabditis elegans (PRJNA13758)
## 713                                Caenorhabditis elegans (PRJNA13758) homology type
## 714     %id. target Caenorhabditis elegans (PRJNA13758) gene identical to query gene
## 715     %id. query gene identical to target Caenorhabditis elegans (PRJNA13758) gene
## 716         Caenorhabditis elegans (PRJNA13758) orthology confidence [0 low, 1 high]
## 717                                                               Cat gene stable ID
## 718                                                                    Cat gene name
## 719                                              Cat protein or transcript stable ID
## 720                                                     Cat chromosome/scaffold name
## 721                                               Cat chromosome/scaffold start (bp)
## 722                                                 Cat chromosome/scaffold end (bp)
## 723                                                   Query protein or transcript ID
## 724                                                    Last common ancestor with Cat
## 725                                                                Cat homology type
## 726                                     %id. target Cat gene identical to query gene
## 727                                     %id. query gene identical to target Cat gene
## 728                                                Cat Gene-order conservation score
## 729                                              Cat Whole-genome alignment coverage
## 730                                         Cat orthology confidence [0 low, 1 high]
## 731                                                   Chacoan peccary gene stable ID
## 732                                                        Chacoan peccary gene name
## 733                                  Chacoan peccary protein or transcript stable ID
## 734                                         Chacoan peccary chromosome/scaffold name
## 735                                   Chacoan peccary chromosome/scaffold start (bp)
## 736                                     Chacoan peccary chromosome/scaffold end (bp)
## 737                                                   Query protein or transcript ID
## 738                                        Last common ancestor with Chacoan peccary
## 739                                                    Chacoan peccary homology type
## 740                         %id. target Chacoan peccary gene identical to query gene
## 741                         %id. query gene identical to target Chacoan peccary gene
## 742                                    Chacoan peccary Gene-order conservation score
## 743                                  Chacoan peccary Whole-genome alignment coverage
## 744                             Chacoan peccary orthology confidence [0 low, 1 high]
## 745                                               Channel bull blenny gene stable ID
## 746                                                    Channel bull blenny gene name
## 747                              Channel bull blenny protein or transcript stable ID
## 748                                     Channel bull blenny chromosome/scaffold name
## 749                               Channel bull blenny chromosome/scaffold start (bp)
## 750                                 Channel bull blenny chromosome/scaffold end (bp)
## 751                                                   Query protein or transcript ID
## 752                                    Last common ancestor with Channel bull blenny
## 753                                                Channel bull blenny homology type
## 754                     %id. target Channel bull blenny gene identical to query gene
## 755                     %id. query gene identical to target Channel bull blenny gene
## 756                                Channel bull blenny Gene-order conservation score
## 757                              Channel bull blenny Whole-genome alignment coverage
## 758                         Channel bull blenny orthology confidence [0 low, 1 high]
## 759                                                   Channel catfish gene stable ID
## 760                                                        Channel catfish gene name
## 761                                  Channel catfish protein or transcript stable ID
## 762                                         Channel catfish chromosome/scaffold name
## 763                                   Channel catfish chromosome/scaffold start (bp)
## 764                                     Channel catfish chromosome/scaffold end (bp)
## 765                                                   Query protein or transcript ID
## 766                                        Last common ancestor with Channel catfish
## 767                                                    Channel catfish homology type
## 768                         %id. target Channel catfish gene identical to query gene
## 769                         %id. query gene identical to target Channel catfish gene
## 770                                    Channel catfish Gene-order conservation score
## 771                                  Channel catfish Whole-genome alignment coverage
## 772                             Channel catfish orthology confidence [0 low, 1 high]
## 773                                                           Chicken gene stable ID
## 774                                                                Chicken gene name
## 775                                          Chicken protein or transcript stable ID
## 776                                                 Chicken chromosome/scaffold name
## 777                                           Chicken chromosome/scaffold start (bp)
## 778                                             Chicken chromosome/scaffold end (bp)
## 779                                                   Query protein or transcript ID
## 780                                                Last common ancestor with Chicken
## 781                                                            Chicken homology type
## 782                                 %id. target Chicken gene identical to query gene
## 783                                 %id. query gene identical to target Chicken gene
## 784                                            Chicken Gene-order conservation score
## 785                                          Chicken Whole-genome alignment coverage
## 786                                     Chicken orthology confidence [0 low, 1 high]
## 787                                                        Chimpanzee gene stable ID
## 788                                                             Chimpanzee gene name
## 789                                       Chimpanzee protein or transcript stable ID
## 790                                              Chimpanzee chromosome/scaffold name
## 791                                        Chimpanzee chromosome/scaffold start (bp)
## 792                                          Chimpanzee chromosome/scaffold end (bp)
## 793                                                   Query protein or transcript ID
## 794                                             Last common ancestor with Chimpanzee
## 795                                                         Chimpanzee homology type
## 796                              %id. target Chimpanzee gene identical to query gene
## 797                              %id. query gene identical to target Chimpanzee gene
## 798                                         Chimpanzee Gene-order conservation score
## 799                                       Chimpanzee Whole-genome alignment coverage
## 800                                  Chimpanzee orthology confidence [0 low, 1 high]
## 801                                           Chinese hamster CHOK1GS gene stable ID
## 802                                                Chinese hamster CHOK1GS gene name
## 803                          Chinese hamster CHOK1GS protein or transcript stable ID
## 804                                 Chinese hamster CHOK1GS chromosome/scaffold name
## 805                           Chinese hamster CHOK1GS chromosome/scaffold start (bp)
## 806                             Chinese hamster CHOK1GS chromosome/scaffold end (bp)
## 807                                                   Query protein or transcript ID
## 808                                Last common ancestor with Chinese hamster CHOK1GS
## 809                                            Chinese hamster CHOK1GS homology type
## 810                 %id. target Chinese hamster CHOK1GS gene identical to query gene
## 811                 %id. query gene identical to target Chinese hamster CHOK1GS gene
## 812                            Chinese hamster CHOK1GS Gene-order conservation score
## 813                          Chinese hamster CHOK1GS Whole-genome alignment coverage
## 814                     Chinese hamster CHOK1GS orthology confidence [0 low, 1 high]
## 815                                                    Chinese medaka gene stable ID
## 816                                                         Chinese medaka gene name
## 817                                   Chinese medaka protein or transcript stable ID
## 818                                          Chinese medaka chromosome/scaffold name
## 819                                    Chinese medaka chromosome/scaffold start (bp)
## 820                                      Chinese medaka chromosome/scaffold end (bp)
## 821                                                   Query protein or transcript ID
## 822                                         Last common ancestor with Chinese medaka
## 823                                                     Chinese medaka homology type
## 824                          %id. target Chinese medaka gene identical to query gene
## 825                          %id. query gene identical to target Chinese medaka gene
## 826                                     Chinese medaka Gene-order conservation score
## 827                                   Chinese medaka Whole-genome alignment coverage
## 828                              Chinese medaka orthology confidence [0 low, 1 high]
## 829                                          Chinese softshell turtle gene stable ID
## 830                                               Chinese softshell turtle gene name
## 831                         Chinese softshell turtle protein or transcript stable ID
## 832                                Chinese softshell turtle chromosome/scaffold name
## 833                          Chinese softshell turtle chromosome/scaffold start (bp)
## 834                            Chinese softshell turtle chromosome/scaffold end (bp)
## 835                                                   Query protein or transcript ID
## 836                               Last common ancestor with Chinese softshell turtle
## 837                                           Chinese softshell turtle homology type
## 838                %id. target Chinese softshell turtle gene identical to query gene
## 839                %id. query gene identical to target Chinese softshell turtle gene
## 840                           Chinese softshell turtle Gene-order conservation score
## 841                         Chinese softshell turtle Whole-genome alignment coverage
## 842                    Chinese softshell turtle orthology confidence [0 low, 1 high]
## 843                                                    Chinook salmon gene stable ID
## 844                                                         Chinook salmon gene name
## 845                                   Chinook salmon protein or transcript stable ID
## 846                                          Chinook salmon chromosome/scaffold name
## 847                                    Chinook salmon chromosome/scaffold start (bp)
## 848                                      Chinook salmon chromosome/scaffold end (bp)
## 849                                                   Query protein or transcript ID
## 850                                         Last common ancestor with Chinook salmon
## 851                                                     Chinook salmon homology type
## 852                          %id. target Chinook salmon gene identical to query gene
## 853                          %id. query gene identical to target Chinook salmon gene
## 854                                     Chinook salmon Gene-order conservation score
## 855                                   Chinook salmon Whole-genome alignment coverage
## 856                              Chinook salmon orthology confidence [0 low, 1 high]
## 857                                                    Climbing perch gene stable ID
## 858                                                         Climbing perch gene name
## 859                                   Climbing perch protein or transcript stable ID
## 860                                          Climbing perch chromosome/scaffold name
## 861                                    Climbing perch chromosome/scaffold start (bp)
## 862                                      Climbing perch chromosome/scaffold end (bp)
## 863                                                   Query protein or transcript ID
## 864                                         Last common ancestor with Climbing perch
## 865                                                     Climbing perch homology type
## 866                          %id. target Climbing perch gene identical to query gene
## 867                          %id. query gene identical to target Climbing perch gene
## 868                                     Climbing perch Gene-order conservation score
## 869                              Climbing perch orthology confidence [0 low, 1 high]
## 870                                                 Clown anemonefish gene stable ID
## 871                                                      Clown anemonefish gene name
## 872                                Clown anemonefish protein or transcript stable ID
## 873                                       Clown anemonefish chromosome/scaffold name
## 874                                 Clown anemonefish chromosome/scaffold start (bp)
## 875                                   Clown anemonefish chromosome/scaffold end (bp)
## 876                                                   Query protein or transcript ID
## 877                                      Last common ancestor with Clown anemonefish
## 878                                                  Clown anemonefish homology type
## 879                       %id. target Clown anemonefish gene identical to query gene
## 880                       %id. query gene identical to target Clown anemonefish gene
## 881                                  Clown anemonefish Gene-order conservation score
## 882                                Clown anemonefish Whole-genome alignment coverage
## 883                           Clown anemonefish orthology confidence [0 low, 1 high]
## 884                                                        Coelacanth gene stable ID
## 885                                                             Coelacanth gene name
## 886                                       Coelacanth protein or transcript stable ID
## 887                                              Coelacanth chromosome/scaffold name
## 888                                        Coelacanth chromosome/scaffold start (bp)
## 889                                          Coelacanth chromosome/scaffold end (bp)
## 890                                                   Query protein or transcript ID
## 891                                             Last common ancestor with Coelacanth
## 892                                                         Coelacanth homology type
## 893                              %id. target Coelacanth gene identical to query gene
## 894                              %id. query gene identical to target Coelacanth gene
## 895                                         Coelacanth Gene-order conservation score
## 896                                       Coelacanth Whole-genome alignment coverage
## 897                                  Coelacanth orthology confidence [0 low, 1 high]
## 898                                                       Coho salmon gene stable ID
## 899                                                            Coho salmon gene name
## 900                                      Coho salmon protein or transcript stable ID
## 901                                             Coho salmon chromosome/scaffold name
## 902                                       Coho salmon chromosome/scaffold start (bp)
## 903                                         Coho salmon chromosome/scaffold end (bp)
## 904                                                   Query protein or transcript ID
## 905                                            Last common ancestor with Coho salmon
## 906                                                        Coho salmon homology type
## 907                             %id. target Coho salmon gene identical to query gene
## 908                             %id. query gene identical to target Coho salmon gene
## 909                                        Coho salmon Gene-order conservation score
## 910                                      Coho salmon Whole-genome alignment coverage
## 911                                 Coho salmon orthology confidence [0 low, 1 high]
## 912                                               Collared flycatcher gene stable ID
## 913                                                    Collared flycatcher gene name
## 914                              Collared flycatcher protein or transcript stable ID
## 915                                     Collared flycatcher chromosome/scaffold name
## 916                               Collared flycatcher chromosome/scaffold start (bp)
## 917                                 Collared flycatcher chromosome/scaffold end (bp)
## 918                                                   Query protein or transcript ID
## 919                                    Last common ancestor with Collared flycatcher
## 920                                                Collared flycatcher homology type
## 921                     %id. target Collared flycatcher gene identical to query gene
## 922                     %id. query gene identical to target Collared flycatcher gene
## 923                                Collared flycatcher Gene-order conservation score
## 924                         Collared flycatcher orthology confidence [0 low, 1 high]
## 925                                                     Common canary gene stable ID
## 926                                                          Common canary gene name
## 927                                    Common canary protein or transcript stable ID
## 928                                           Common canary chromosome/scaffold name
## 929                                     Common canary chromosome/scaffold start (bp)
## 930                                       Common canary chromosome/scaffold end (bp)
## 931                                                   Query protein or transcript ID
## 932                                          Last common ancestor with Common canary
## 933                                                      Common canary homology type
## 934                           %id. target Common canary gene identical to query gene
## 935                           %id. query gene identical to target Common canary gene
## 936                                      Common canary Gene-order conservation score
## 937                                    Common canary Whole-genome alignment coverage
## 938                               Common canary orthology confidence [0 low, 1 high]
## 939                                                       Common carp gene stable ID
## 940                                                            Common carp gene name
## 941                                      Common carp protein or transcript stable ID
## 942                                             Common carp chromosome/scaffold name
## 943                                       Common carp chromosome/scaffold start (bp)
## 944                                         Common carp chromosome/scaffold end (bp)
## 945                                                   Query protein or transcript ID
## 946                                            Last common ancestor with Common carp
## 947                                                        Common carp homology type
## 948                             %id. target Common carp gene identical to query gene
## 949                             %id. query gene identical to target Common carp gene
## 950                                        Common carp Gene-order conservation score
## 951                                 Common carp orthology confidence [0 low, 1 high]
## 952                                                Common wall lizard gene stable ID
## 953                                                     Common wall lizard gene name
## 954                               Common wall lizard protein or transcript stable ID
## 955                                      Common wall lizard chromosome/scaffold name
## 956                                Common wall lizard chromosome/scaffold start (bp)
## 957                                  Common wall lizard chromosome/scaffold end (bp)
## 958                                                   Query protein or transcript ID
## 959                                     Last common ancestor with Common wall lizard
## 960                                                 Common wall lizard homology type
## 961                      %id. target Common wall lizard gene identical to query gene
## 962                      %id. query gene identical to target Common wall lizard gene
## 963                                 Common wall lizard Gene-order conservation score
## 964                               Common wall lizard Whole-genome alignment coverage
## 965                          Common wall lizard orthology confidence [0 low, 1 high]
## 966                                                     Common wombat gene stable ID
## 967                                                          Common wombat gene name
## 968                                    Common wombat protein or transcript stable ID
## 969                                           Common wombat chromosome/scaffold name
## 970                                     Common wombat chromosome/scaffold start (bp)
## 971                                       Common wombat chromosome/scaffold end (bp)
## 972                                                   Query protein or transcript ID
## 973                                          Last common ancestor with Common wombat
## 974                                                      Common wombat homology type
## 975                           %id. target Common wombat gene identical to query gene
## 976                           %id. query gene identical to target Common wombat gene
## 977                                      Common wombat Gene-order conservation score
## 978                                    Common wombat Whole-genome alignment coverage
## 979                               Common wombat orthology confidence [0 low, 1 high]
## 980                                                 Coquerel's sifaka gene stable ID
## 981                                                      Coquerel's sifaka gene name
## 982                                Coquerel's sifaka protein or transcript stable ID
## 983                                       Coquerel's sifaka chromosome/scaffold name
## 984                                 Coquerel's sifaka chromosome/scaffold start (bp)
## 985                                   Coquerel's sifaka chromosome/scaffold end (bp)
## 986                                                   Query protein or transcript ID
## 987                                      Last common ancestor with Coquerel's sifaka
## 988                                                  Coquerel's sifaka homology type
## 989                       %id. target Coquerel's sifaka gene identical to query gene
## 990                       %id. query gene identical to target Coquerel's sifaka gene
## 991                                  Coquerel's sifaka Gene-order conservation score
## 992                                Coquerel's sifaka Whole-genome alignment coverage
## 993                           Coquerel's sifaka orthology confidence [0 low, 1 high]
## 994                                                               Cow gene stable ID
## 995                                                                    Cow gene name
## 996                                              Cow protein or transcript stable ID
## 997                                                     Cow chromosome/scaffold name
## 998                                               Cow chromosome/scaffold start (bp)
## 999                                                 Cow chromosome/scaffold end (bp)
## 1000                                                  Query protein or transcript ID
## 1001                                                   Last common ancestor with Cow
## 1002                                                               Cow homology type
## 1003                                    %id. target Cow gene identical to query gene
## 1004                                    %id. query gene identical to target Cow gene
## 1005                                               Cow Gene-order conservation score
## 1006                                             Cow Whole-genome alignment coverage
## 1007                                        Cow orthology confidence [0 low, 1 high]
## 1008                                              Crab-eating macaque gene stable ID
## 1009                                                   Crab-eating macaque gene name
## 1010                             Crab-eating macaque protein or transcript stable ID
## 1011                                    Crab-eating macaque chromosome/scaffold name
## 1012                              Crab-eating macaque chromosome/scaffold start (bp)
## 1013                                Crab-eating macaque chromosome/scaffold end (bp)
## 1014                                                  Query protein or transcript ID
## 1015                                   Last common ancestor with Crab-eating macaque
## 1016                                               Crab-eating macaque homology type
## 1017                    %id. target Crab-eating macaque gene identical to query gene
## 1018                    %id. query gene identical to target Crab-eating macaque gene
## 1019                               Crab-eating macaque Gene-order conservation score
## 1020                             Crab-eating macaque Whole-genome alignment coverage
## 1021                        Crab-eating macaque orthology confidence [0 low, 1 high]
## 1022                                                             Degu gene stable ID
## 1023                                                                  Degu gene name
## 1024                                            Degu protein or transcript stable ID
## 1025                                                   Degu chromosome/scaffold name
## 1026                                             Degu chromosome/scaffold start (bp)
## 1027                                               Degu chromosome/scaffold end (bp)
## 1028                                                  Query protein or transcript ID
## 1029                                                  Last common ancestor with Degu
## 1030                                                              Degu homology type
## 1031                                   %id. target Degu gene identical to query gene
## 1032                                   %id. query gene identical to target Degu gene
## 1033                                              Degu Gene-order conservation score
## 1034                                            Degu Whole-genome alignment coverage
## 1035                                       Degu orthology confidence [0 low, 1 high]
## 1036                                                 Denticle herring gene stable ID
## 1037                                                      Denticle herring gene name
## 1038                                Denticle herring protein or transcript stable ID
## 1039                                       Denticle herring chromosome/scaffold name
## 1040                                 Denticle herring chromosome/scaffold start (bp)
## 1041                                   Denticle herring chromosome/scaffold end (bp)
## 1042                                                  Query protein or transcript ID
## 1043                                      Last common ancestor with Denticle herring
## 1044                                                  Denticle herring homology type
## 1045                       %id. target Denticle herring gene identical to query gene
## 1046                       %id. query gene identical to target Denticle herring gene
## 1047                                  Denticle herring Gene-order conservation score
## 1048                                Denticle herring Whole-genome alignment coverage
## 1049                           Denticle herring orthology confidence [0 low, 1 high]
## 1050                                                            Dingo gene stable ID
## 1051                                                                 Dingo gene name
## 1052                                           Dingo protein or transcript stable ID
## 1053                                                  Dingo chromosome/scaffold name
## 1054                                            Dingo chromosome/scaffold start (bp)
## 1055                                              Dingo chromosome/scaffold end (bp)
## 1056                                                  Query protein or transcript ID
## 1057                                                 Last common ancestor with Dingo
## 1058                                                             Dingo homology type
## 1059                                  %id. target Dingo gene identical to query gene
## 1060                                  %id. query gene identical to target Dingo gene
## 1061                                             Dingo Gene-order conservation score
## 1062                                           Dingo Whole-genome alignment coverage
## 1063                                      Dingo orthology confidence [0 low, 1 high]
## 1064                                                              Dog gene stable ID
## 1065                                                                   Dog gene name
## 1066                                             Dog protein or transcript stable ID
## 1067                                                    Dog chromosome/scaffold name
## 1068                                              Dog chromosome/scaffold start (bp)
## 1069                                                Dog chromosome/scaffold end (bp)
## 1070                                                  Query protein or transcript ID
## 1071                                                   Last common ancestor with Dog
## 1072                                                               Dog homology type
## 1073                                    %id. target Dog gene identical to query gene
## 1074                                    %id. query gene identical to target Dog gene
## 1075                                               Dog Gene-order conservation score
## 1076                                             Dog Whole-genome alignment coverage
## 1077                                        Dog orthology confidence [0 low, 1 high]
## 1078                                                          Dolphin gene stable ID
## 1079                                                               Dolphin gene name
## 1080                                         Dolphin protein or transcript stable ID
## 1081                                                Dolphin chromosome/scaffold name
## 1082                                          Dolphin chromosome/scaffold start (bp)
## 1083                                            Dolphin chromosome/scaffold end (bp)
## 1084                                                  Query protein or transcript ID
## 1085                                               Last common ancestor with Dolphin
## 1086                                                           Dolphin homology type
## 1087                                %id. target Dolphin gene identical to query gene
## 1088                                %id. query gene identical to target Dolphin gene
## 1089                                           Dolphin Gene-order conservation score
## 1090                                         Dolphin Whole-genome alignment coverage
## 1091                                    Dolphin orthology confidence [0 low, 1 high]
## 1092                                                     Domestic yak gene stable ID
## 1093                                                          Domestic yak gene name
## 1094                                    Domestic yak protein or transcript stable ID
## 1095                                           Domestic yak chromosome/scaffold name
## 1096                                     Domestic yak chromosome/scaffold start (bp)
## 1097                                       Domestic yak chromosome/scaffold end (bp)
## 1098                                                  Query protein or transcript ID
## 1099                                          Last common ancestor with Domestic yak
## 1100                                                      Domestic yak homology type
## 1101                           %id. target Domestic yak gene identical to query gene
## 1102                           %id. query gene identical to target Domestic yak gene
## 1103                                      Domestic yak Gene-order conservation score
## 1104                                    Domestic yak Whole-genome alignment coverage
## 1105                               Domestic yak orthology confidence [0 low, 1 high]
## 1106                                                           Donkey gene stable ID
## 1107                                                                Donkey gene name
## 1108                                          Donkey protein or transcript stable ID
## 1109                                                 Donkey chromosome/scaffold name
## 1110                                           Donkey chromosome/scaffold start (bp)
## 1111                                             Donkey chromosome/scaffold end (bp)
## 1112                                                  Query protein or transcript ID
## 1113                                                Last common ancestor with Donkey
## 1114                                                            Donkey homology type
## 1115                                 %id. target Donkey gene identical to query gene
## 1116                                 %id. query gene identical to target Donkey gene
## 1117                                            Donkey Gene-order conservation score
## 1118                                     Donkey orthology confidence [0 low, 1 high]
## 1119                                                            Drill gene stable ID
## 1120                                                                 Drill gene name
## 1121                                           Drill protein or transcript stable ID
## 1122                                                  Drill chromosome/scaffold name
## 1123                                            Drill chromosome/scaffold start (bp)
## 1124                                              Drill chromosome/scaffold end (bp)
## 1125                                                  Query protein or transcript ID
## 1126                                                 Last common ancestor with Drill
## 1127                                                             Drill homology type
## 1128                                  %id. target Drill gene identical to query gene
## 1129                                  %id. query gene identical to target Drill gene
## 1130                                             Drill Gene-order conservation score
## 1131                                           Drill Whole-genome alignment coverage
## 1132                                      Drill orthology confidence [0 low, 1 high]
## 1133                                          Drosophila melanogaster gene stable ID
## 1134                                               Drosophila melanogaster gene name
## 1135                         Drosophila melanogaster protein or transcript stable ID
## 1136                                Drosophila melanogaster chromosome/scaffold name
## 1137                          Drosophila melanogaster chromosome/scaffold start (bp)
## 1138                            Drosophila melanogaster chromosome/scaffold end (bp)
## 1139                                                  Query protein or transcript ID
## 1140                               Last common ancestor with Drosophila melanogaster
## 1141                                           Drosophila melanogaster homology type
## 1142                %id. target Drosophila melanogaster gene identical to query gene
## 1143                %id. query gene identical to target Drosophila melanogaster gene
## 1144                    Drosophila melanogaster orthology confidence [0 low, 1 high]
## 1145                                                             Duck gene stable ID
## 1146                                                                  Duck gene name
## 1147                                            Duck protein or transcript stable ID
## 1148                                                   Duck chromosome/scaffold name
## 1149                                             Duck chromosome/scaffold start (bp)
## 1150                                               Duck chromosome/scaffold end (bp)
## 1151                                                  Query protein or transcript ID
## 1152                                                  Last common ancestor with Duck
## 1153                                                              Duck homology type
## 1154                                   %id. target Duck gene identical to query gene
## 1155                                   %id. query gene identical to target Duck gene
## 1156                                              Duck Gene-order conservation score
## 1157                                            Duck Whole-genome alignment coverage
## 1158                                       Duck orthology confidence [0 low, 1 high]
## 1159                                              Eastern brown snake gene stable ID
## 1160                                                   Eastern brown snake gene name
## 1161                             Eastern brown snake protein or transcript stable ID
## 1162                                    Eastern brown snake chromosome/scaffold name
## 1163                              Eastern brown snake chromosome/scaffold start (bp)
## 1164                                Eastern brown snake chromosome/scaffold end (bp)
## 1165                                                  Query protein or transcript ID
## 1166                                   Last common ancestor with Eastern brown snake
## 1167                                               Eastern brown snake homology type
## 1168                    %id. target Eastern brown snake gene identical to query gene
## 1169                    %id. query gene identical to target Eastern brown snake gene
## 1170                               Eastern brown snake Gene-order conservation score
## 1171                             Eastern brown snake Whole-genome alignment coverage
## 1172                        Eastern brown snake orthology confidence [0 low, 1 high]
## 1173                                                    Eastern happy gene stable ID
## 1174                                                         Eastern happy gene name
## 1175                                   Eastern happy protein or transcript stable ID
## 1176                                          Eastern happy chromosome/scaffold name
## 1177                                    Eastern happy chromosome/scaffold start (bp)
## 1178                                      Eastern happy chromosome/scaffold end (bp)
## 1179                                                  Query protein or transcript ID
## 1180                                         Last common ancestor with Eastern happy
## 1181                                                     Eastern happy homology type
## 1182                          %id. target Eastern happy gene identical to query gene
## 1183                          %id. query gene identical to target Eastern happy gene
## 1184                                     Eastern happy Gene-order conservation score
## 1185                                   Eastern happy Whole-genome alignment coverage
## 1186                              Eastern happy orthology confidence [0 low, 1 high]
## 1187                                                     Electric eel gene stable ID
## 1188                                                          Electric eel gene name
## 1189                                    Electric eel protein or transcript stable ID
## 1190                                           Electric eel chromosome/scaffold name
## 1191                                     Electric eel chromosome/scaffold start (bp)
## 1192                                       Electric eel chromosome/scaffold end (bp)
## 1193                                                  Query protein or transcript ID
## 1194                                          Last common ancestor with Electric eel
## 1195                                                      Electric eel homology type
## 1196                           %id. target Electric eel gene identical to query gene
## 1197                           %id. query gene identical to target Electric eel gene
## 1198                                      Electric eel Gene-order conservation score
## 1199                                    Electric eel Whole-genome alignment coverage
## 1200                               Electric eel orthology confidence [0 low, 1 high]
## 1201                                                         Elephant gene stable ID
## 1202                                                              Elephant gene name
## 1203                                        Elephant protein or transcript stable ID
## 1204                                               Elephant chromosome/scaffold name
## 1205                                         Elephant chromosome/scaffold start (bp)
## 1206                                           Elephant chromosome/scaffold end (bp)
## 1207                                                  Query protein or transcript ID
## 1208                                              Last common ancestor with Elephant
## 1209                                                          Elephant homology type
## 1210                               %id. target Elephant gene identical to query gene
## 1211                               %id. query gene identical to target Elephant gene
## 1212                                          Elephant Gene-order conservation score
## 1213                                        Elephant Whole-genome alignment coverage
## 1214                                   Elephant orthology confidence [0 low, 1 high]
## 1215                                                   Elephant shark gene stable ID
## 1216                                                        Elephant shark gene name
## 1217                                  Elephant shark protein or transcript stable ID
## 1218                                         Elephant shark chromosome/scaffold name
## 1219                                   Elephant shark chromosome/scaffold start (bp)
## 1220                                     Elephant shark chromosome/scaffold end (bp)
## 1221                                                  Query protein or transcript ID
## 1222                                        Last common ancestor with Elephant shark
## 1223                                                    Elephant shark homology type
## 1224                         %id. target Elephant shark gene identical to query gene
## 1225                         %id. query gene identical to target Elephant shark gene
## 1226                                  Elephant shark Whole-genome alignment coverage
## 1227                             Elephant shark orthology confidence [0 low, 1 high]
## 1228                                            Eurasian red squirrel gene stable ID
## 1229                                                 Eurasian red squirrel gene name
## 1230                           Eurasian red squirrel protein or transcript stable ID
## 1231                                  Eurasian red squirrel chromosome/scaffold name
## 1232                            Eurasian red squirrel chromosome/scaffold start (bp)
## 1233                              Eurasian red squirrel chromosome/scaffold end (bp)
## 1234                                                  Query protein or transcript ID
## 1235                                 Last common ancestor with Eurasian red squirrel
## 1236                                             Eurasian red squirrel homology type
## 1237                  %id. target Eurasian red squirrel gene identical to query gene
## 1238                  %id. query gene identical to target Eurasian red squirrel gene
## 1239                             Eurasian red squirrel Gene-order conservation score
## 1240                           Eurasian red squirrel Whole-genome alignment coverage
## 1241                      Eurasian red squirrel orthology confidence [0 low, 1 high]
## 1242                                                 European seabass gene stable ID
## 1243                                                      European seabass gene name
## 1244                                European seabass protein or transcript stable ID
## 1245                                       European seabass chromosome/scaffold name
## 1246                                 European seabass chromosome/scaffold start (bp)
## 1247                                   European seabass chromosome/scaffold end (bp)
## 1248                                                  Query protein or transcript ID
## 1249                                      Last common ancestor with European seabass
## 1250                                                  European seabass homology type
## 1251                       %id. target European seabass gene identical to query gene
## 1252                       %id. query gene identical to target European seabass gene
## 1253                                  European seabass Gene-order conservation score
## 1254                           European seabass orthology confidence [0 low, 1 high]
## 1255                                                           Ferret gene stable ID
## 1256                                                                Ferret gene name
## 1257                                          Ferret protein or transcript stable ID
## 1258                                                 Ferret chromosome/scaffold name
## 1259                                           Ferret chromosome/scaffold start (bp)
## 1260                                             Ferret chromosome/scaffold end (bp)
## 1261                                                  Query protein or transcript ID
## 1262                                                Last common ancestor with Ferret
## 1263                                                            Ferret homology type
## 1264                                 %id. target Ferret gene identical to query gene
## 1265                                 %id. query gene identical to target Ferret gene
## 1266                                            Ferret Gene-order conservation score
## 1267                                          Ferret Whole-genome alignment coverage
## 1268                                     Ferret orthology confidence [0 low, 1 high]
## 1269                                                             Fugu gene stable ID
## 1270                                                                  Fugu gene name
## 1271                                            Fugu protein or transcript stable ID
## 1272                                                   Fugu chromosome/scaffold name
## 1273                                             Fugu chromosome/scaffold start (bp)
## 1274                                               Fugu chromosome/scaffold end (bp)
## 1275                                                  Query protein or transcript ID
## 1276                                                  Last common ancestor with Fugu
## 1277                                                              Fugu homology type
## 1278                                   %id. target Fugu gene identical to query gene
## 1279                                   %id. query gene identical to target Fugu gene
## 1280                                              Fugu Gene-order conservation score
## 1281                                            Fugu Whole-genome alignment coverage
## 1282                                       Fugu orthology confidence [0 low, 1 high]
## 1283                                                      Giant panda gene stable ID
## 1284                                                           Giant panda gene name
## 1285                                     Giant panda protein or transcript stable ID
## 1286                                            Giant panda chromosome/scaffold name
## 1287                                      Giant panda chromosome/scaffold start (bp)
## 1288                                        Giant panda chromosome/scaffold end (bp)
## 1289                                                  Query protein or transcript ID
## 1290                                           Last common ancestor with Giant panda
## 1291                                                       Giant panda homology type
## 1292                            %id. target Giant panda gene identical to query gene
## 1293                            %id. query gene identical to target Giant panda gene
## 1294                                       Giant panda Gene-order conservation score
## 1295                                Giant panda orthology confidence [0 low, 1 high]
## 1296                                                           Gibbon gene stable ID
## 1297                                                                Gibbon gene name
## 1298                                          Gibbon protein or transcript stable ID
## 1299                                                 Gibbon chromosome/scaffold name
## 1300                                           Gibbon chromosome/scaffold start (bp)
## 1301                                             Gibbon chromosome/scaffold end (bp)
## 1302                                                  Query protein or transcript ID
## 1303                                                Last common ancestor with Gibbon
## 1304                                                            Gibbon homology type
## 1305                                 %id. target Gibbon gene identical to query gene
## 1306                                 %id. query gene identical to target Gibbon gene
## 1307                                            Gibbon Gene-order conservation score
## 1308                                          Gibbon Whole-genome alignment coverage
## 1309                                     Gibbon orthology confidence [0 low, 1 high]
## 1310                                                Gilthead seabream gene stable ID
## 1311                                                     Gilthead seabream gene name
## 1312                               Gilthead seabream protein or transcript stable ID
## 1313                                      Gilthead seabream chromosome/scaffold name
## 1314                                Gilthead seabream chromosome/scaffold start (bp)
## 1315                                  Gilthead seabream chromosome/scaffold end (bp)
## 1316                                                  Query protein or transcript ID
## 1317                                     Last common ancestor with Gilthead seabream
## 1318                                                 Gilthead seabream homology type
## 1319                      %id. target Gilthead seabream gene identical to query gene
## 1320                      %id. query gene identical to target Gilthead seabream gene
## 1321                                 Gilthead seabream Gene-order conservation score
## 1322                               Gilthead seabream Whole-genome alignment coverage
## 1323                          Gilthead seabream orthology confidence [0 low, 1 high]
## 1324                                                             Goat gene stable ID
## 1325                                                                  Goat gene name
## 1326                                            Goat protein or transcript stable ID
## 1327                                                   Goat chromosome/scaffold name
## 1328                                             Goat chromosome/scaffold start (bp)
## 1329                                               Goat chromosome/scaffold end (bp)
## 1330                                                  Query protein or transcript ID
## 1331                                                  Last common ancestor with Goat
## 1332                                                              Goat homology type
## 1333                                   %id. target Goat gene identical to query gene
## 1334                                   %id. query gene identical to target Goat gene
## 1335                                              Goat Gene-order conservation score
## 1336                                            Goat Whole-genome alignment coverage
## 1337                                       Goat orthology confidence [0 low, 1 high]
## 1338                                                   Golden Hamster gene stable ID
## 1339                                                        Golden Hamster gene name
## 1340                                  Golden Hamster protein or transcript stable ID
## 1341                                         Golden Hamster chromosome/scaffold name
## 1342                                   Golden Hamster chromosome/scaffold start (bp)
## 1343                                     Golden Hamster chromosome/scaffold end (bp)
## 1344                                                  Query protein or transcript ID
## 1345                                        Last common ancestor with Golden Hamster
## 1346                                                    Golden Hamster homology type
## 1347                         %id. target Golden Hamster gene identical to query gene
## 1348                         %id. query gene identical to target Golden Hamster gene
## 1349                                    Golden Hamster Gene-order conservation score
## 1350                                  Golden Hamster Whole-genome alignment coverage
## 1351                             Golden Hamster orthology confidence [0 low, 1 high]
## 1352                                                     Golden eagle gene stable ID
## 1353                                                          Golden eagle gene name
## 1354                                    Golden eagle protein or transcript stable ID
## 1355                                           Golden eagle chromosome/scaffold name
## 1356                                     Golden eagle chromosome/scaffold start (bp)
## 1357                                       Golden eagle chromosome/scaffold end (bp)
## 1358                                                  Query protein or transcript ID
## 1359                                          Last common ancestor with Golden eagle
## 1360                                                      Golden eagle homology type
## 1361                           %id. target Golden eagle gene identical to query gene
## 1362                           %id. query gene identical to target Golden eagle gene
## 1363                                      Golden eagle Gene-order conservation score
## 1364                                    Golden eagle Whole-genome alignment coverage
## 1365                               Golden eagle orthology confidence [0 low, 1 high]
## 1366                                         Golden snub-nosed monkey gene stable ID
## 1367                                              Golden snub-nosed monkey gene name
## 1368                        Golden snub-nosed monkey protein or transcript stable ID
## 1369                               Golden snub-nosed monkey chromosome/scaffold name
## 1370                         Golden snub-nosed monkey chromosome/scaffold start (bp)
## 1371                           Golden snub-nosed monkey chromosome/scaffold end (bp)
## 1372                                                  Query protein or transcript ID
## 1373                              Last common ancestor with Golden snub-nosed monkey
## 1374                                          Golden snub-nosed monkey homology type
## 1375               %id. target Golden snub-nosed monkey gene identical to query gene
## 1376               %id. query gene identical to target Golden snub-nosed monkey gene
## 1377                          Golden snub-nosed monkey Gene-order conservation score
## 1378                        Golden snub-nosed monkey Whole-genome alignment coverage
## 1379                   Golden snub-nosed monkey orthology confidence [0 low, 1 high]
## 1380                                               Golden-line barbel gene stable ID
## 1381                                                    Golden-line barbel gene name
## 1382                              Golden-line barbel protein or transcript stable ID
## 1383                                     Golden-line barbel chromosome/scaffold name
## 1384                               Golden-line barbel chromosome/scaffold start (bp)
## 1385                                 Golden-line barbel chromosome/scaffold end (bp)
## 1386                                                  Query protein or transcript ID
## 1387                                    Last common ancestor with Golden-line barbel
## 1388                                                Golden-line barbel homology type
## 1389                     %id. target Golden-line barbel gene identical to query gene
## 1390                     %id. query gene identical to target Golden-line barbel gene
## 1391                                Golden-line barbel Gene-order conservation score
## 1392                              Golden-line barbel Whole-genome alignment coverage
## 1393                         Golden-line barbel orthology confidence [0 low, 1 high]
## 1394                                                         Goldfish gene stable ID
## 1395                                                              Goldfish gene name
## 1396                                        Goldfish protein or transcript stable ID
## 1397                                               Goldfish chromosome/scaffold name
## 1398                                         Goldfish chromosome/scaffold start (bp)
## 1399                                           Goldfish chromosome/scaffold end (bp)
## 1400                                                  Query protein or transcript ID
## 1401                                              Last common ancestor with Goldfish
## 1402                                                          Goldfish homology type
## 1403                               %id. target Goldfish gene identical to query gene
## 1404                               %id. query gene identical to target Goldfish gene
## 1405                                          Goldfish Gene-order conservation score
## 1406                                        Goldfish Whole-genome alignment coverage
## 1407                                   Goldfish orthology confidence [0 low, 1 high]
## 1408                                       Goodes thornscrub tortoise gene stable ID
## 1409                                            Goodes thornscrub tortoise gene name
## 1410                      Goodes thornscrub tortoise protein or transcript stable ID
## 1411                             Goodes thornscrub tortoise chromosome/scaffold name
## 1412                       Goodes thornscrub tortoise chromosome/scaffold start (bp)
## 1413                         Goodes thornscrub tortoise chromosome/scaffold end (bp)
## 1414                                                  Query protein or transcript ID
## 1415                            Last common ancestor with Goodes thornscrub tortoise
## 1416                                        Goodes thornscrub tortoise homology type
## 1417             %id. target Goodes thornscrub tortoise gene identical to query gene
## 1418             %id. query gene identical to target Goodes thornscrub tortoise gene
## 1419                        Goodes thornscrub tortoise Gene-order conservation score
## 1420                      Goodes thornscrub tortoise Whole-genome alignment coverage
## 1421                 Goodes thornscrub tortoise orthology confidence [0 low, 1 high]
## 1422                                                          Gorilla gene stable ID
## 1423                                                               Gorilla gene name
## 1424                                         Gorilla protein or transcript stable ID
## 1425                                                Gorilla chromosome/scaffold name
## 1426                                          Gorilla chromosome/scaffold start (bp)
## 1427                                            Gorilla chromosome/scaffold end (bp)
## 1428                                                  Query protein or transcript ID
## 1429                                               Last common ancestor with Gorilla
## 1430                                                           Gorilla homology type
## 1431                                %id. target Gorilla gene identical to query gene
## 1432                                %id. query gene identical to target Gorilla gene
## 1433                                           Gorilla Gene-order conservation score
## 1434                                         Gorilla Whole-genome alignment coverage
## 1435                                    Gorilla orthology confidence [0 low, 1 high]
## 1436                                                        Great Tit gene stable ID
## 1437                                                             Great Tit gene name
## 1438                                       Great Tit protein or transcript stable ID
## 1439                                              Great Tit chromosome/scaffold name
## 1440                                        Great Tit chromosome/scaffold start (bp)
## 1441                                          Great Tit chromosome/scaffold end (bp)
## 1442                                                  Query protein or transcript ID
## 1443                                             Last common ancestor with Great Tit
## 1444                                                         Great Tit homology type
## 1445                              %id. target Great Tit gene identical to query gene
## 1446                              %id. query gene identical to target Great Tit gene
## 1447                                         Great Tit Gene-order conservation score
## 1448                                       Great Tit Whole-genome alignment coverage
## 1449                                  Great Tit orthology confidence [0 low, 1 high]
## 1450                                                Greater amberjack gene stable ID
## 1451                                                     Greater amberjack gene name
## 1452                               Greater amberjack protein or transcript stable ID
## 1453                                      Greater amberjack chromosome/scaffold name
## 1454                                Greater amberjack chromosome/scaffold start (bp)
## 1455                                  Greater amberjack chromosome/scaffold end (bp)
## 1456                                                  Query protein or transcript ID
## 1457                                     Last common ancestor with Greater amberjack
## 1458                                                 Greater amberjack homology type
## 1459                      %id. target Greater amberjack gene identical to query gene
## 1460                      %id. query gene identical to target Greater amberjack gene
## 1461                                 Greater amberjack Gene-order conservation score
## 1462                               Greater amberjack Whole-genome alignment coverage
## 1463                          Greater amberjack orthology confidence [0 low, 1 high]
## 1464                                             Greater bamboo lemur gene stable ID
## 1465                                                  Greater bamboo lemur gene name
## 1466                            Greater bamboo lemur protein or transcript stable ID
## 1467                                   Greater bamboo lemur chromosome/scaffold name
## 1468                             Greater bamboo lemur chromosome/scaffold start (bp)
## 1469                               Greater bamboo lemur chromosome/scaffold end (bp)
## 1470                                                  Query protein or transcript ID
## 1471                                  Last common ancestor with Greater bamboo lemur
## 1472                                              Greater bamboo lemur homology type
## 1473                   %id. target Greater bamboo lemur gene identical to query gene
## 1474                   %id. query gene identical to target Greater bamboo lemur gene
## 1475                              Greater bamboo lemur Gene-order conservation score
## 1476                            Greater bamboo lemur Whole-genome alignment coverage
## 1477                       Greater bamboo lemur orthology confidence [0 low, 1 high]
## 1478                                            Greater horseshoe bat gene stable ID
## 1479                                                 Greater horseshoe bat gene name
## 1480                           Greater horseshoe bat protein or transcript stable ID
## 1481                                  Greater horseshoe bat chromosome/scaffold name
## 1482                            Greater horseshoe bat chromosome/scaffold start (bp)
## 1483                              Greater horseshoe bat chromosome/scaffold end (bp)
## 1484                                                  Query protein or transcript ID
## 1485                                 Last common ancestor with Greater horseshoe bat
## 1486                                             Greater horseshoe bat homology type
## 1487                  %id. target Greater horseshoe bat gene identical to query gene
## 1488                  %id. query gene identical to target Greater horseshoe bat gene
## 1489                             Greater horseshoe bat Gene-order conservation score
## 1490                           Greater horseshoe bat Whole-genome alignment coverage
## 1491                      Greater horseshoe bat orthology confidence [0 low, 1 high]
## 1492                                                      Green anole gene stable ID
## 1493                                                           Green anole gene name
## 1494                                     Green anole protein or transcript stable ID
## 1495                                            Green anole chromosome/scaffold name
## 1496                                      Green anole chromosome/scaffold start (bp)
## 1497                                        Green anole chromosome/scaffold end (bp)
## 1498                                                  Query protein or transcript ID
## 1499                                           Last common ancestor with Green anole
## 1500                                                       Green anole homology type
## 1501                            %id. target Green anole gene identical to query gene
## 1502                            %id. query gene identical to target Green anole gene
## 1503                                       Green anole Gene-order conservation score
## 1504                                Green anole orthology confidence [0 low, 1 high]
## 1505                                                       Guinea Pig gene stable ID
## 1506                                                            Guinea Pig gene name
## 1507                                      Guinea Pig protein or transcript stable ID
## 1508                                             Guinea Pig chromosome/scaffold name
## 1509                                       Guinea Pig chromosome/scaffold start (bp)
## 1510                                         Guinea Pig chromosome/scaffold end (bp)
## 1511                                                  Query protein or transcript ID
## 1512                                            Last common ancestor with Guinea Pig
## 1513                                                        Guinea Pig homology type
## 1514                             %id. target Guinea Pig gene identical to query gene
## 1515                             %id. query gene identical to target Guinea Pig gene
## 1516                                        Guinea Pig Gene-order conservation score
## 1517                                      Guinea Pig Whole-genome alignment coverage
## 1518                                 Guinea Pig orthology confidence [0 low, 1 high]
## 1519                                                            Guppy gene stable ID
## 1520                                                                 Guppy gene name
## 1521                                           Guppy protein or transcript stable ID
## 1522                                                  Guppy chromosome/scaffold name
## 1523                                            Guppy chromosome/scaffold start (bp)
## 1524                                              Guppy chromosome/scaffold end (bp)
## 1525                                                  Query protein or transcript ID
## 1526                                                 Last common ancestor with Guppy
## 1527                                                             Guppy homology type
## 1528                                  %id. target Guppy gene identical to query gene
## 1529                                  %id. query gene identical to target Guppy gene
## 1530                                             Guppy Gene-order conservation score
## 1531                                           Guppy Whole-genome alignment coverage
## 1532                                      Guppy orthology confidence [0 low, 1 high]
## 1533                                                          Hagfish gene stable ID
## 1534                                                               Hagfish gene name
## 1535                                         Hagfish protein or transcript stable ID
## 1536                                                Hagfish chromosome/scaffold name
## 1537                                          Hagfish chromosome/scaffold start (bp)
## 1538                                            Hagfish chromosome/scaffold end (bp)
## 1539                                                  Query protein or transcript ID
## 1540                                               Last common ancestor with Hagfish
## 1541                                                           Hagfish homology type
## 1542                                %id. target Hagfish gene identical to query gene
## 1543                                %id. query gene identical to target Hagfish gene
## 1544                                         Hagfish Whole-genome alignment coverage
## 1545                                    Hagfish orthology confidence [0 low, 1 high]
## 1546                                                         Hedgehog gene stable ID
## 1547                                                              Hedgehog gene name
## 1548                                        Hedgehog protein or transcript stable ID
## 1549                                               Hedgehog chromosome/scaffold name
## 1550                                         Hedgehog chromosome/scaffold start (bp)
## 1551                                           Hedgehog chromosome/scaffold end (bp)
## 1552                                                  Query protein or transcript ID
## 1553                                              Last common ancestor with Hedgehog
## 1554                                                          Hedgehog homology type
## 1555                               %id. target Hedgehog gene identical to query gene
## 1556                               %id. query gene identical to target Hedgehog gene
## 1557                                          Hedgehog Gene-order conservation score
## 1558                                        Hedgehog Whole-genome alignment coverage
## 1559                                   Hedgehog orthology confidence [0 low, 1 high]
## 1560                                                            Horse gene stable ID
## 1561                                                                 Horse gene name
## 1562                                           Horse protein or transcript stable ID
## 1563                                                  Horse chromosome/scaffold name
## 1564                                            Horse chromosome/scaffold start (bp)
## 1565                                              Horse chromosome/scaffold end (bp)
## 1566                                                  Query protein or transcript ID
## 1567                                                 Last common ancestor with Horse
## 1568                                                             Horse homology type
## 1569                                  %id. target Horse gene identical to query gene
## 1570                                  %id. query gene identical to target Horse gene
## 1571                                             Horse Gene-order conservation score
## 1572                                           Horse Whole-genome alignment coverage
## 1573                                      Horse orthology confidence [0 low, 1 high]
## 1574                                                           Huchen gene stable ID
## 1575                                                                Huchen gene name
## 1576                                          Huchen protein or transcript stable ID
## 1577                                                 Huchen chromosome/scaffold name
## 1578                                           Huchen chromosome/scaffold start (bp)
## 1579                                             Huchen chromosome/scaffold end (bp)
## 1580                                                  Query protein or transcript ID
## 1581                                                Last common ancestor with Huchen
## 1582                                                            Huchen homology type
## 1583                                 %id. target Huchen gene identical to query gene
## 1584                                 %id. query gene identical to target Huchen gene
## 1585                                            Huchen Gene-order conservation score
## 1586                                          Huchen Whole-genome alignment coverage
## 1587                                     Huchen orthology confidence [0 low, 1 high]
## 1588                                             Hybrid - Bos Indicus gene stable ID
## 1589                                                  Hybrid - Bos Indicus gene name
## 1590                            Hybrid - Bos Indicus protein or transcript stable ID
## 1591                                   Hybrid - Bos Indicus chromosome/scaffold name
## 1592                             Hybrid - Bos Indicus chromosome/scaffold start (bp)
## 1593                               Hybrid - Bos Indicus chromosome/scaffold end (bp)
## 1594                                                  Query protein or transcript ID
## 1595                                  Last common ancestor with Hybrid - Bos Indicus
## 1596                                              Hybrid - Bos Indicus homology type
## 1597                   %id. target Hybrid - Bos Indicus gene identical to query gene
## 1598                   %id. query gene identical to target Hybrid - Bos Indicus gene
## 1599                              Hybrid - Bos Indicus Gene-order conservation score
## 1600                            Hybrid - Bos Indicus Whole-genome alignment coverage
## 1601                       Hybrid - Bos Indicus orthology confidence [0 low, 1 high]
## 1602                                                            Hyrax gene stable ID
## 1603                                                                 Hyrax gene name
## 1604                                           Hyrax protein or transcript stable ID
## 1605                                                  Hyrax chromosome/scaffold name
## 1606                                            Hyrax chromosome/scaffold start (bp)
## 1607                                              Hyrax chromosome/scaffold end (bp)
## 1608                                                  Query protein or transcript ID
## 1609                                                 Last common ancestor with Hyrax
## 1610                                                             Hyrax homology type
## 1611                                  %id. target Hyrax gene identical to query gene
## 1612                                  %id. query gene identical to target Hyrax gene
## 1613                                             Hyrax Gene-order conservation score
## 1614                                           Hyrax Whole-genome alignment coverage
## 1615                                      Hyrax orthology confidence [0 low, 1 high]
## 1616                                                     Indian cobra gene stable ID
## 1617                                                          Indian cobra gene name
## 1618                                    Indian cobra protein or transcript stable ID
## 1619                                           Indian cobra chromosome/scaffold name
## 1620                                     Indian cobra chromosome/scaffold start (bp)
## 1621                                       Indian cobra chromosome/scaffold end (bp)
## 1622                                                  Query protein or transcript ID
## 1623                                          Last common ancestor with Indian cobra
## 1624                                                      Indian cobra homology type
## 1625                           %id. target Indian cobra gene identical to query gene
## 1626                           %id. query gene identical to target Indian cobra gene
## 1627                                      Indian cobra Gene-order conservation score
## 1628                                    Indian cobra Whole-genome alignment coverage
## 1629                               Indian cobra orthology confidence [0 low, 1 high]
## 1630                                                    Indian medaka gene stable ID
## 1631                                                         Indian medaka gene name
## 1632                                   Indian medaka protein or transcript stable ID
## 1633                                          Indian medaka chromosome/scaffold name
## 1634                                    Indian medaka chromosome/scaffold start (bp)
## 1635                                      Indian medaka chromosome/scaffold end (bp)
## 1636                                                  Query protein or transcript ID
## 1637                                         Last common ancestor with Indian medaka
## 1638                                                     Indian medaka homology type
## 1639                          %id. target Indian medaka gene identical to query gene
## 1640                          %id. query gene identical to target Indian medaka gene
## 1641                                     Indian medaka Gene-order conservation score
## 1642                                   Indian medaka Whole-genome alignment coverage
## 1643                              Indian medaka orthology confidence [0 low, 1 high]
## 1644                                             Japanese medaka HdrR gene stable ID
## 1645                                                  Japanese medaka HdrR gene name
## 1646                            Japanese medaka HdrR protein or transcript stable ID
## 1647                                   Japanese medaka HdrR chromosome/scaffold name
## 1648                             Japanese medaka HdrR chromosome/scaffold start (bp)
## 1649                               Japanese medaka HdrR chromosome/scaffold end (bp)
## 1650                                                  Query protein or transcript ID
## 1651                                  Last common ancestor with Japanese medaka HdrR
## 1652                                              Japanese medaka HdrR homology type
## 1653                   %id. target Japanese medaka HdrR gene identical to query gene
## 1654                   %id. query gene identical to target Japanese medaka HdrR gene
## 1655                              Japanese medaka HdrR Gene-order conservation score
## 1656                            Japanese medaka HdrR Whole-genome alignment coverage
## 1657                       Japanese medaka HdrR orthology confidence [0 low, 1 high]
## 1658                                                   Japanese quail gene stable ID
## 1659                                                        Japanese quail gene name
## 1660                                  Japanese quail protein or transcript stable ID
## 1661                                         Japanese quail chromosome/scaffold name
## 1662                                   Japanese quail chromosome/scaffold start (bp)
## 1663                                     Japanese quail chromosome/scaffold end (bp)
## 1664                                                  Query protein or transcript ID
## 1665                                        Last common ancestor with Japanese quail
## 1666                                                    Japanese quail homology type
## 1667                         %id. target Japanese quail gene identical to query gene
## 1668                         %id. query gene identical to target Japanese quail gene
## 1669                                    Japanese quail Gene-order conservation score
## 1670                                  Japanese quail Whole-genome alignment coverage
## 1671                             Japanese quail orthology confidence [0 low, 1 high]
## 1672                                                Javanese ricefish gene stable ID
## 1673                                                     Javanese ricefish gene name
## 1674                               Javanese ricefish protein or transcript stable ID
## 1675                                      Javanese ricefish chromosome/scaffold name
## 1676                                Javanese ricefish chromosome/scaffold start (bp)
## 1677                                  Javanese ricefish chromosome/scaffold end (bp)
## 1678                                                  Query protein or transcript ID
## 1679                                     Last common ancestor with Javanese ricefish
## 1680                                                 Javanese ricefish homology type
## 1681                      %id. target Javanese ricefish gene identical to query gene
## 1682                      %id. query gene identical to target Javanese ricefish gene
## 1683                                 Javanese ricefish Gene-order conservation score
## 1684                               Javanese ricefish Whole-genome alignment coverage
## 1685                          Javanese ricefish orthology confidence [0 low, 1 high]
## 1686                                                           Kakapo gene stable ID
## 1687                                                                Kakapo gene name
## 1688                                          Kakapo protein or transcript stable ID
## 1689                                                 Kakapo chromosome/scaffold name
## 1690                                           Kakapo chromosome/scaffold start (bp)
## 1691                                             Kakapo chromosome/scaffold end (bp)
## 1692                                                  Query protein or transcript ID
## 1693                                                Last common ancestor with Kakapo
## 1694                                                            Kakapo homology type
## 1695                                 %id. target Kakapo gene identical to query gene
## 1696                                 %id. query gene identical to target Kakapo gene
## 1697                                            Kakapo Gene-order conservation score
## 1698                                          Kakapo Whole-genome alignment coverage
## 1699                                     Kakapo orthology confidence [0 low, 1 high]
## 1700                                                     Kangaroo rat gene stable ID
## 1701                                                          Kangaroo rat gene name
## 1702                                    Kangaroo rat protein or transcript stable ID
## 1703                                           Kangaroo rat chromosome/scaffold name
## 1704                                     Kangaroo rat chromosome/scaffold start (bp)
## 1705                                       Kangaroo rat chromosome/scaffold end (bp)
## 1706                                                  Query protein or transcript ID
## 1707                                          Last common ancestor with Kangaroo rat
## 1708                                                      Kangaroo rat homology type
## 1709                           %id. target Kangaroo rat gene identical to query gene
## 1710                           %id. query gene identical to target Kangaroo rat gene
## 1711                                      Kangaroo rat Gene-order conservation score
## 1712                                    Kangaroo rat Whole-genome alignment coverage
## 1713                               Kangaroo rat orthology confidence [0 low, 1 high]
## 1714                                                            Koala gene stable ID
## 1715                                                                 Koala gene name
## 1716                                           Koala protein or transcript stable ID
## 1717                                                  Koala chromosome/scaffold name
## 1718                                            Koala chromosome/scaffold start (bp)
## 1719                                              Koala chromosome/scaffold end (bp)
## 1720                                                  Query protein or transcript ID
## 1721                                                 Last common ancestor with Koala
## 1722                                                             Koala homology type
## 1723                                  %id. target Koala gene identical to query gene
## 1724                                  %id. query gene identical to target Koala gene
## 1725                                             Koala Gene-order conservation score
## 1726                                           Koala Whole-genome alignment coverage
## 1727                                      Koala orthology confidence [0 low, 1 high]
## 1728                                                          Lamprey gene stable ID
## 1729                                                               Lamprey gene name
## 1730                                         Lamprey protein or transcript stable ID
## 1731                                                Lamprey chromosome/scaffold name
## 1732                                          Lamprey chromosome/scaffold start (bp)
## 1733                                            Lamprey chromosome/scaffold end (bp)
## 1734                                                  Query protein or transcript ID
## 1735                                               Last common ancestor with Lamprey
## 1736                                                           Lamprey homology type
## 1737                                %id. target Lamprey gene identical to query gene
## 1738                                %id. query gene identical to target Lamprey gene
## 1739                                         Lamprey Whole-genome alignment coverage
## 1740                                    Lamprey orthology confidence [0 low, 1 high]
## 1741                                             Large yellow croaker gene stable ID
## 1742                                                  Large yellow croaker gene name
## 1743                            Large yellow croaker protein or transcript stable ID
## 1744                                   Large yellow croaker chromosome/scaffold name
## 1745                             Large yellow croaker chromosome/scaffold start (bp)
## 1746                               Large yellow croaker chromosome/scaffold end (bp)
## 1747                                                  Query protein or transcript ID
## 1748                                  Last common ancestor with Large yellow croaker
## 1749                                              Large yellow croaker homology type
## 1750                   %id. target Large yellow croaker gene identical to query gene
## 1751                   %id. query gene identical to target Large yellow croaker gene
## 1752                              Large yellow croaker Gene-order conservation score
## 1753                            Large yellow croaker Whole-genome alignment coverage
## 1754                       Large yellow croaker orthology confidence [0 low, 1 high]
## 1755                                               Leishan spiny toad gene stable ID
## 1756                                                    Leishan spiny toad gene name
## 1757                              Leishan spiny toad protein or transcript stable ID
## 1758                                     Leishan spiny toad chromosome/scaffold name
## 1759                               Leishan spiny toad chromosome/scaffold start (bp)
## 1760                                 Leishan spiny toad chromosome/scaffold end (bp)
## 1761                                                  Query protein or transcript ID
## 1762                                    Last common ancestor with Leishan spiny toad
## 1763                                                Leishan spiny toad homology type
## 1764                     %id. target Leishan spiny toad gene identical to query gene
## 1765                     %id. query gene identical to target Leishan spiny toad gene
## 1766                                Leishan spiny toad Gene-order conservation score
## 1767                              Leishan spiny toad Whole-genome alignment coverage
## 1768                         Leishan spiny toad orthology confidence [0 low, 1 high]
## 1769                                                          Leopard gene stable ID
## 1770                                                               Leopard gene name
## 1771                                         Leopard protein or transcript stable ID
## 1772                                                Leopard chromosome/scaffold name
## 1773                                          Leopard chromosome/scaffold start (bp)
## 1774                                            Leopard chromosome/scaffold end (bp)
## 1775                                                  Query protein or transcript ID
## 1776                                               Last common ancestor with Leopard
## 1777                                                           Leopard homology type
## 1778                                %id. target Leopard gene identical to query gene
## 1779                                %id. query gene identical to target Leopard gene
## 1780                                           Leopard Gene-order conservation score
## 1781                                         Leopard Whole-genome alignment coverage
## 1782                                    Leopard orthology confidence [0 low, 1 high]
## 1783                                           Lesser Egyptian jerboa gene stable ID
## 1784                                                Lesser Egyptian jerboa gene name
## 1785                          Lesser Egyptian jerboa protein or transcript stable ID
## 1786                                 Lesser Egyptian jerboa chromosome/scaffold name
## 1787                           Lesser Egyptian jerboa chromosome/scaffold start (bp)
## 1788                             Lesser Egyptian jerboa chromosome/scaffold end (bp)
## 1789                                                  Query protein or transcript ID
## 1790                                Last common ancestor with Lesser Egyptian jerboa
## 1791                                            Lesser Egyptian jerboa homology type
## 1792                 %id. target Lesser Egyptian jerboa gene identical to query gene
## 1793                 %id. query gene identical to target Lesser Egyptian jerboa gene
## 1794                            Lesser Egyptian jerboa Gene-order conservation score
## 1795                          Lesser Egyptian jerboa Whole-genome alignment coverage
## 1796                     Lesser Egyptian jerboa orthology confidence [0 low, 1 high]
## 1797                                           Lesser hedgehog tenrec gene stable ID
## 1798                                                Lesser hedgehog tenrec gene name
## 1799                          Lesser hedgehog tenrec protein or transcript stable ID
## 1800                                 Lesser hedgehog tenrec chromosome/scaffold name
## 1801                           Lesser hedgehog tenrec chromosome/scaffold start (bp)
## 1802                             Lesser hedgehog tenrec chromosome/scaffold end (bp)
## 1803                                                  Query protein or transcript ID
## 1804                                Last common ancestor with Lesser hedgehog tenrec
## 1805                                            Lesser hedgehog tenrec homology type
## 1806                 %id. target Lesser hedgehog tenrec gene identical to query gene
## 1807                 %id. query gene identical to target Lesser hedgehog tenrec gene
## 1808                            Lesser hedgehog tenrec Gene-order conservation score
## 1809                          Lesser hedgehog tenrec Whole-genome alignment coverage
## 1810                     Lesser hedgehog tenrec orthology confidence [0 low, 1 high]
## 1811                                                             Lion gene stable ID
## 1812                                                                  Lion gene name
## 1813                                            Lion protein or transcript stable ID
## 1814                                                   Lion chromosome/scaffold name
## 1815                                             Lion chromosome/scaffold start (bp)
## 1816                                               Lion chromosome/scaffold end (bp)
## 1817                                                  Query protein or transcript ID
## 1818                                                  Last common ancestor with Lion
## 1819                                                              Lion homology type
## 1820                                   %id. target Lion gene identical to query gene
## 1821                                   %id. query gene identical to target Lion gene
## 1822                                              Lion Gene-order conservation score
## 1823                                            Lion Whole-genome alignment coverage
## 1824                                       Lion orthology confidence [0 low, 1 high]
## 1825                                           Long-tailed chinchilla gene stable ID
## 1826                                                Long-tailed chinchilla gene name
## 1827                          Long-tailed chinchilla protein or transcript stable ID
## 1828                                 Long-tailed chinchilla chromosome/scaffold name
## 1829                           Long-tailed chinchilla chromosome/scaffold start (bp)
## 1830                             Long-tailed chinchilla chromosome/scaffold end (bp)
## 1831                                                  Query protein or transcript ID
## 1832                                Last common ancestor with Long-tailed chinchilla
## 1833                                            Long-tailed chinchilla homology type
## 1834                 %id. target Long-tailed chinchilla gene identical to query gene
## 1835                 %id. query gene identical to target Long-tailed chinchilla gene
## 1836                            Long-tailed chinchilla Gene-order conservation score
## 1837                          Long-tailed chinchilla Whole-genome alignment coverage
## 1838                     Long-tailed chinchilla orthology confidence [0 low, 1 high]
## 1839                                                         Lumpfish gene stable ID
## 1840                                                              Lumpfish gene name
## 1841                                        Lumpfish protein or transcript stable ID
## 1842                                               Lumpfish chromosome/scaffold name
## 1843                                         Lumpfish chromosome/scaffold start (bp)
## 1844                                           Lumpfish chromosome/scaffold end (bp)
## 1845                                                  Query protein or transcript ID
## 1846                                              Last common ancestor with Lumpfish
## 1847                                                          Lumpfish homology type
## 1848                               %id. target Lumpfish gene identical to query gene
## 1849                               %id. query gene identical to target Lumpfish gene
## 1850                                          Lumpfish Gene-order conservation score
## 1851                                        Lumpfish Whole-genome alignment coverage
## 1852                                   Lumpfish orthology confidence [0 low, 1 high]
## 1853                                                 Lyretail cichlid gene stable ID
## 1854                                                      Lyretail cichlid gene name
## 1855                                Lyretail cichlid protein or transcript stable ID
## 1856                                       Lyretail cichlid chromosome/scaffold name
## 1857                                 Lyretail cichlid chromosome/scaffold start (bp)
## 1858                                   Lyretail cichlid chromosome/scaffold end (bp)
## 1859                                                  Query protein or transcript ID
## 1860                                      Last common ancestor with Lyretail cichlid
## 1861                                                  Lyretail cichlid homology type
## 1862                       %id. target Lyretail cichlid gene identical to query gene
## 1863                       %id. query gene identical to target Lyretail cichlid gene
## 1864                                  Lyretail cichlid Gene-order conservation score
## 1865                                Lyretail cichlid Whole-genome alignment coverage
## 1866                           Lyretail cichlid orthology confidence [0 low, 1 high]
## 1867                                                Ma's night monkey gene stable ID
## 1868                                                     Ma's night monkey gene name
## 1869                               Ma's night monkey protein or transcript stable ID
## 1870                                      Ma's night monkey chromosome/scaffold name
## 1871                                Ma's night monkey chromosome/scaffold start (bp)
## 1872                                  Ma's night monkey chromosome/scaffold end (bp)
## 1873                                                  Query protein or transcript ID
## 1874                                     Last common ancestor with Ma's night monkey
## 1875                                                 Ma's night monkey homology type
## 1876                      %id. target Ma's night monkey gene identical to query gene
## 1877                      %id. query gene identical to target Ma's night monkey gene
## 1878                                 Ma's night monkey Gene-order conservation score
## 1879                               Ma's night monkey Whole-genome alignment coverage
## 1880                          Ma's night monkey orthology confidence [0 low, 1 high]
## 1881                                                          Macaque gene stable ID
## 1882                                                               Macaque gene name
## 1883                                         Macaque protein or transcript stable ID
## 1884                                                Macaque chromosome/scaffold name
## 1885                                          Macaque chromosome/scaffold start (bp)
## 1886                                            Macaque chromosome/scaffold end (bp)
## 1887                                                  Query protein or transcript ID
## 1888                                               Last common ancestor with Macaque
## 1889                                                           Macaque homology type
## 1890                                %id. target Macaque gene identical to query gene
## 1891                                %id. query gene identical to target Macaque gene
## 1892                                           Macaque Gene-order conservation score
## 1893                                         Macaque Whole-genome alignment coverage
## 1894                                    Macaque orthology confidence [0 low, 1 high]
## 1895                                             Mainland tiger snake gene stable ID
## 1896                                                  Mainland tiger snake gene name
## 1897                            Mainland tiger snake protein or transcript stable ID
## 1898                                   Mainland tiger snake chromosome/scaffold name
## 1899                             Mainland tiger snake chromosome/scaffold start (bp)
## 1900                               Mainland tiger snake chromosome/scaffold end (bp)
## 1901                                                  Query protein or transcript ID
## 1902                                  Last common ancestor with Mainland tiger snake
## 1903                                              Mainland tiger snake homology type
## 1904                   %id. target Mainland tiger snake gene identical to query gene
## 1905                   %id. query gene identical to target Mainland tiger snake gene
## 1906                              Mainland tiger snake Gene-order conservation score
## 1907                            Mainland tiger snake Whole-genome alignment coverage
## 1908                       Mainland tiger snake orthology confidence [0 low, 1 high]
## 1909                                            Makobe Island cichlid gene stable ID
## 1910                                                 Makobe Island cichlid gene name
## 1911                           Makobe Island cichlid protein or transcript stable ID
## 1912                                  Makobe Island cichlid chromosome/scaffold name
## 1913                            Makobe Island cichlid chromosome/scaffold start (bp)
## 1914                              Makobe Island cichlid chromosome/scaffold end (bp)
## 1915                                                  Query protein or transcript ID
## 1916                                 Last common ancestor with Makobe Island cichlid
## 1917                                             Makobe Island cichlid homology type
## 1918                  %id. target Makobe Island cichlid gene identical to query gene
## 1919                  %id. query gene identical to target Makobe Island cichlid gene
## 1920                             Makobe Island cichlid Gene-order conservation score
## 1921                           Makobe Island cichlid Whole-genome alignment coverage
## 1922                      Makobe Island cichlid orthology confidence [0 low, 1 high]
## 1923                                                 Mangrove rivulus gene stable ID
## 1924                                                      Mangrove rivulus gene name
## 1925                                Mangrove rivulus protein or transcript stable ID
## 1926                                       Mangrove rivulus chromosome/scaffold name
## 1927                                 Mangrove rivulus chromosome/scaffold start (bp)
## 1928                                   Mangrove rivulus chromosome/scaffold end (bp)
## 1929                                                  Query protein or transcript ID
## 1930                                      Last common ancestor with Mangrove rivulus
## 1931                                                  Mangrove rivulus homology type
## 1932                       %id. target Mangrove rivulus gene identical to query gene
## 1933                       %id. query gene identical to target Mangrove rivulus gene
## 1934                                  Mangrove rivulus Gene-order conservation score
## 1935                                Mangrove rivulus Whole-genome alignment coverage
## 1936                           Mangrove rivulus orthology confidence [0 low, 1 high]
## 1937                                              Medium ground-finch gene stable ID
## 1938                                                   Medium ground-finch gene name
## 1939                             Medium ground-finch protein or transcript stable ID
## 1940                                    Medium ground-finch chromosome/scaffold name
## 1941                              Medium ground-finch chromosome/scaffold start (bp)
## 1942                                Medium ground-finch chromosome/scaffold end (bp)
## 1943                                                  Query protein or transcript ID
## 1944                                   Last common ancestor with Medium ground-finch
## 1945                                               Medium ground-finch homology type
## 1946                    %id. target Medium ground-finch gene identical to query gene
## 1947                    %id. query gene identical to target Medium ground-finch gene
## 1948                               Medium ground-finch Gene-order conservation score
## 1949                             Medium ground-finch Whole-genome alignment coverage
## 1950                        Medium ground-finch orthology confidence [0 low, 1 high]
## 1951                                                          Megabat gene stable ID
## 1952                                                               Megabat gene name
## 1953                                         Megabat protein or transcript stable ID
## 1954                                                Megabat chromosome/scaffold name
## 1955                                          Megabat chromosome/scaffold start (bp)
## 1956                                            Megabat chromosome/scaffold end (bp)
## 1957                                                  Query protein or transcript ID
## 1958                                               Last common ancestor with Megabat
## 1959                                                           Megabat homology type
## 1960                                %id. target Megabat gene identical to query gene
## 1961                                %id. query gene identical to target Megabat gene
## 1962                                           Megabat Gene-order conservation score
## 1963                                         Megabat Whole-genome alignment coverage
## 1964                                    Megabat orthology confidence [0 low, 1 high]
## 1965                                                    Mexican tetra gene stable ID
## 1966                                                         Mexican tetra gene name
## 1967                                   Mexican tetra protein or transcript stable ID
## 1968                                          Mexican tetra chromosome/scaffold name
## 1969                                    Mexican tetra chromosome/scaffold start (bp)
## 1970                                      Mexican tetra chromosome/scaffold end (bp)
## 1971                                                  Query protein or transcript ID
## 1972                                         Last common ancestor with Mexican tetra
## 1973                                                     Mexican tetra homology type
## 1974                          %id. target Mexican tetra gene identical to query gene
## 1975                          %id. query gene identical to target Mexican tetra gene
## 1976                                     Mexican tetra Gene-order conservation score
## 1977                                   Mexican tetra Whole-genome alignment coverage
## 1978                              Mexican tetra orthology confidence [0 low, 1 high]
## 1979                                                         Microbat gene stable ID
## 1980                                                              Microbat gene name
## 1981                                        Microbat protein or transcript stable ID
## 1982                                               Microbat chromosome/scaffold name
## 1983                                         Microbat chromosome/scaffold start (bp)
## 1984                                           Microbat chromosome/scaffold end (bp)
## 1985                                                  Query protein or transcript ID
## 1986                                              Last common ancestor with Microbat
## 1987                                                          Microbat homology type
## 1988                               %id. target Microbat gene identical to query gene
## 1989                               %id. query gene identical to target Microbat gene
## 1990                                          Microbat Gene-order conservation score
## 1991                                        Microbat Whole-genome alignment coverage
## 1992                                   Microbat orthology confidence [0 low, 1 high]
## 1993                                                    Midas cichlid gene stable ID
## 1994                                                         Midas cichlid gene name
## 1995                                   Midas cichlid protein or transcript stable ID
## 1996                                          Midas cichlid chromosome/scaffold name
## 1997                                    Midas cichlid chromosome/scaffold start (bp)
## 1998                                      Midas cichlid chromosome/scaffold end (bp)
## 1999                                                  Query protein or transcript ID
## 2000                                         Last common ancestor with Midas cichlid
## 2001                                                     Midas cichlid homology type
## 2002                          %id. target Midas cichlid gene identical to query gene
## 2003                          %id. query gene identical to target Midas cichlid gene
## 2004                                     Midas cichlid Gene-order conservation score
## 2005                                   Midas cichlid Whole-genome alignment coverage
## 2006                              Midas cichlid orthology confidence [0 low, 1 high]
## 2007                                                            Mouse gene stable ID
## 2008                                                                 Mouse gene name
## 2009                                           Mouse protein or transcript stable ID
## 2010                                                  Mouse chromosome/scaffold name
## 2011                                            Mouse chromosome/scaffold start (bp)
## 2012                                              Mouse chromosome/scaffold end (bp)
## 2013                                                  Query protein or transcript ID
## 2014                                                 Last common ancestor with Mouse
## 2015                                                             Mouse homology type
## 2016                                  %id. target Mouse gene identical to query gene
## 2017                                  %id. query gene identical to target Mouse gene
## 2018                                             Mouse Gene-order conservation score
## 2019                                           Mouse Whole-genome alignment coverage
## 2020                                      Mouse orthology confidence [0 low, 1 high]
## 2021                                                      Mouse Lemur gene stable ID
## 2022                                                           Mouse Lemur gene name
## 2023                                     Mouse Lemur protein or transcript stable ID
## 2024                                            Mouse Lemur chromosome/scaffold name
## 2025                                      Mouse Lemur chromosome/scaffold start (bp)
## 2026                                        Mouse Lemur chromosome/scaffold end (bp)
## 2027                                                  Query protein or transcript ID
## 2028                                           Last common ancestor with Mouse Lemur
## 2029                                                       Mouse Lemur homology type
## 2030                            %id. target Mouse Lemur gene identical to query gene
## 2031                            %id. query gene identical to target Mouse Lemur gene
## 2032                                       Mouse Lemur Gene-order conservation score
## 2033                                     Mouse Lemur Whole-genome alignment coverage
## 2034                                Mouse Lemur orthology confidence [0 low, 1 high]
## 2035                                                        Mummichog gene stable ID
## 2036                                                             Mummichog gene name
## 2037                                       Mummichog protein or transcript stable ID
## 2038                                              Mummichog chromosome/scaffold name
## 2039                                        Mummichog chromosome/scaffold start (bp)
## 2040                                          Mummichog chromosome/scaffold end (bp)
## 2041                                                  Query protein or transcript ID
## 2042                                             Last common ancestor with Mummichog
## 2043                                                         Mummichog homology type
## 2044                              %id. target Mummichog gene identical to query gene
## 2045                              %id. query gene identical to target Mummichog gene
## 2046                                         Mummichog Gene-order conservation score
## 2047                                       Mummichog Whole-genome alignment coverage
## 2048                                  Mummichog orthology confidence [0 low, 1 high]
## 2049                                            Naked mole-rat female gene stable ID
## 2050                                                 Naked mole-rat female gene name
## 2051                           Naked mole-rat female protein or transcript stable ID
## 2052                                  Naked mole-rat female chromosome/scaffold name
## 2053                            Naked mole-rat female chromosome/scaffold start (bp)
## 2054                              Naked mole-rat female chromosome/scaffold end (bp)
## 2055                                                  Query protein or transcript ID
## 2056                                 Last common ancestor with Naked mole-rat female
## 2057                                             Naked mole-rat female homology type
## 2058                  %id. target Naked mole-rat female gene identical to query gene
## 2059                  %id. query gene identical to target Naked mole-rat female gene
## 2060                             Naked mole-rat female Gene-order conservation score
## 2061                           Naked mole-rat female Whole-genome alignment coverage
## 2062                      Naked mole-rat female orthology confidence [0 low, 1 high]
## 2063                                                          Narwhal gene stable ID
## 2064                                                               Narwhal gene name
## 2065                                         Narwhal protein or transcript stable ID
## 2066                                                Narwhal chromosome/scaffold name
## 2067                                          Narwhal chromosome/scaffold start (bp)
## 2068                                            Narwhal chromosome/scaffold end (bp)
## 2069                                                  Query protein or transcript ID
## 2070                                               Last common ancestor with Narwhal
## 2071                                                           Narwhal homology type
## 2072                                %id. target Narwhal gene identical to query gene
## 2073                                %id. query gene identical to target Narwhal gene
## 2074                                           Narwhal Gene-order conservation score
## 2075                                         Narwhal Whole-genome alignment coverage
## 2076                                    Narwhal orthology confidence [0 low, 1 high]
## 2077                                                     Nile tilapia gene stable ID
## 2078                                                          Nile tilapia gene name
## 2079                                    Nile tilapia protein or transcript stable ID
## 2080                                           Nile tilapia chromosome/scaffold name
## 2081                                     Nile tilapia chromosome/scaffold start (bp)
## 2082                                       Nile tilapia chromosome/scaffold end (bp)
## 2083                                                  Query protein or transcript ID
## 2084                                          Last common ancestor with Nile tilapia
## 2085                                                      Nile tilapia homology type
## 2086                           %id. target Nile tilapia gene identical to query gene
## 2087                           %id. query gene identical to target Nile tilapia gene
## 2088                                      Nile tilapia Gene-order conservation score
## 2089                                    Nile tilapia Whole-genome alignment coverage
## 2090                               Nile tilapia orthology confidence [0 low, 1 high]
## 2091                                     Northern American deer mouse gene stable ID
## 2092                                          Northern American deer mouse gene name
## 2093                    Northern American deer mouse protein or transcript stable ID
## 2094                           Northern American deer mouse chromosome/scaffold name
## 2095                     Northern American deer mouse chromosome/scaffold start (bp)
## 2096                       Northern American deer mouse chromosome/scaffold end (bp)
## 2097                                                  Query protein or transcript ID
## 2098                          Last common ancestor with Northern American deer mouse
## 2099                                      Northern American deer mouse homology type
## 2100           %id. target Northern American deer mouse gene identical to query gene
## 2101           %id. query gene identical to target Northern American deer mouse gene
## 2102                      Northern American deer mouse Gene-order conservation score
## 2103                    Northern American deer mouse Whole-genome alignment coverage
## 2104               Northern American deer mouse orthology confidence [0 low, 1 high]
## 2105                                                    Northern pike gene stable ID
## 2106                                                         Northern pike gene name
## 2107                                   Northern pike protein or transcript stable ID
## 2108                                          Northern pike chromosome/scaffold name
## 2109                                    Northern pike chromosome/scaffold start (bp)
## 2110                                      Northern pike chromosome/scaffold end (bp)
## 2111                                                  Query protein or transcript ID
## 2112                                         Last common ancestor with Northern pike
## 2113                                                     Northern pike homology type
## 2114                          %id. target Northern pike gene identical to query gene
## 2115                          %id. query gene identical to target Northern pike gene
## 2116                                     Northern pike Gene-order conservation score
## 2117                                   Northern pike Whole-genome alignment coverage
## 2118                              Northern pike orthology confidence [0 low, 1 high]
## 2119                                                     Olive baboon gene stable ID
## 2120                                                          Olive baboon gene name
## 2121                                    Olive baboon protein or transcript stable ID
## 2122                                           Olive baboon chromosome/scaffold name
## 2123                                     Olive baboon chromosome/scaffold start (bp)
## 2124                                       Olive baboon chromosome/scaffold end (bp)
## 2125                                                  Query protein or transcript ID
## 2126                                          Last common ancestor with Olive baboon
## 2127                                                      Olive baboon homology type
## 2128                           %id. target Olive baboon gene identical to query gene
## 2129                           %id. query gene identical to target Olive baboon gene
## 2130                                      Olive baboon Gene-order conservation score
## 2131                                    Olive baboon Whole-genome alignment coverage
## 2132                               Olive baboon orthology confidence [0 low, 1 high]
## 2133                                                          Opossum gene stable ID
## 2134                                                               Opossum gene name
## 2135                                         Opossum protein or transcript stable ID
## 2136                                                Opossum chromosome/scaffold name
## 2137                                          Opossum chromosome/scaffold start (bp)
## 2138                                            Opossum chromosome/scaffold end (bp)
## 2139                                                  Query protein or transcript ID
## 2140                                               Last common ancestor with Opossum
## 2141                                                           Opossum homology type
## 2142                                %id. target Opossum gene identical to query gene
## 2143                                %id. query gene identical to target Opossum gene
## 2144                                           Opossum Gene-order conservation score
## 2145                                         Opossum Whole-genome alignment coverage
## 2146                                    Opossum orthology confidence [0 low, 1 high]
## 2147                                                 Orange clownfish gene stable ID
## 2148                                                      Orange clownfish gene name
## 2149                                Orange clownfish protein or transcript stable ID
## 2150                                       Orange clownfish chromosome/scaffold name
## 2151                                 Orange clownfish chromosome/scaffold start (bp)
## 2152                                   Orange clownfish chromosome/scaffold end (bp)
## 2153                                                  Query protein or transcript ID
## 2154                                      Last common ancestor with Orange clownfish
## 2155                                                  Orange clownfish homology type
## 2156                       %id. target Orange clownfish gene identical to query gene
## 2157                       %id. query gene identical to target Orange clownfish gene
## 2158                                  Orange clownfish Gene-order conservation score
## 2159                                Orange clownfish Whole-genome alignment coverage
## 2160                           Orange clownfish orthology confidence [0 low, 1 high]
## 2161                                                   Painted turtle gene stable ID
## 2162                                                        Painted turtle gene name
## 2163                                  Painted turtle protein or transcript stable ID
## 2164                                         Painted turtle chromosome/scaffold name
## 2165                                   Painted turtle chromosome/scaffold start (bp)
## 2166                                     Painted turtle chromosome/scaffold end (bp)
## 2167                                                  Query protein or transcript ID
## 2168                                        Last common ancestor with Painted turtle
## 2169                                                    Painted turtle homology type
## 2170                         %id. target Painted turtle gene identical to query gene
## 2171                         %id. query gene identical to target Painted turtle gene
## 2172                                    Painted turtle Gene-order conservation score
## 2173                                  Painted turtle Whole-genome alignment coverage
## 2174                             Painted turtle orthology confidence [0 low, 1 high]
## 2175                                         Paramormyrops kingsleyae gene stable ID
## 2176                                              Paramormyrops kingsleyae gene name
## 2177                        Paramormyrops kingsleyae protein or transcript stable ID
## 2178                               Paramormyrops kingsleyae chromosome/scaffold name
## 2179                         Paramormyrops kingsleyae chromosome/scaffold start (bp)
## 2180                           Paramormyrops kingsleyae chromosome/scaffold end (bp)
## 2181                                                  Query protein or transcript ID
## 2182                              Last common ancestor with Paramormyrops kingsleyae
## 2183                                          Paramormyrops kingsleyae homology type
## 2184               %id. target Paramormyrops kingsleyae gene identical to query gene
## 2185               %id. query gene identical to target Paramormyrops kingsleyae gene
## 2186                          Paramormyrops kingsleyae Gene-order conservation score
## 2187                        Paramormyrops kingsleyae Whole-genome alignment coverage
## 2188                   Paramormyrops kingsleyae orthology confidence [0 low, 1 high]
## 2189                                                              Pig gene stable ID
## 2190                                                                   Pig gene name
## 2191                                             Pig protein or transcript stable ID
## 2192                                                    Pig chromosome/scaffold name
## 2193                                              Pig chromosome/scaffold start (bp)
## 2194                                                Pig chromosome/scaffold end (bp)
## 2195                                                  Query protein or transcript ID
## 2196                                                   Last common ancestor with Pig
## 2197                                                               Pig homology type
## 2198                                    %id. target Pig gene identical to query gene
## 2199                                    %id. query gene identical to target Pig gene
## 2200                                               Pig Gene-order conservation score
## 2201                                             Pig Whole-genome alignment coverage
## 2202                                        Pig orthology confidence [0 low, 1 high]
## 2203                                               Pig-tailed macaque gene stable ID
## 2204                                                    Pig-tailed macaque gene name
## 2205                              Pig-tailed macaque protein or transcript stable ID
## 2206                                     Pig-tailed macaque chromosome/scaffold name
## 2207                               Pig-tailed macaque chromosome/scaffold start (bp)
## 2208                                 Pig-tailed macaque chromosome/scaffold end (bp)
## 2209                                                  Query protein or transcript ID
## 2210                                    Last common ancestor with Pig-tailed macaque
## 2211                                                Pig-tailed macaque homology type
## 2212                     %id. target Pig-tailed macaque gene identical to query gene
## 2213                     %id. query gene identical to target Pig-tailed macaque gene
## 2214                                Pig-tailed macaque Gene-order conservation score
## 2215                              Pig-tailed macaque Whole-genome alignment coverage
## 2216                         Pig-tailed macaque orthology confidence [0 low, 1 high]
## 2217                                                             Pika gene stable ID
## 2218                                                                  Pika gene name
## 2219                                            Pika protein or transcript stable ID
## 2220                                                   Pika chromosome/scaffold name
## 2221                                             Pika chromosome/scaffold start (bp)
## 2222                                               Pika chromosome/scaffold end (bp)
## 2223                                                  Query protein or transcript ID
## 2224                                                  Last common ancestor with Pika
## 2225                                                              Pika homology type
## 2226                                   %id. target Pika gene identical to query gene
## 2227                                   %id. query gene identical to target Pika gene
## 2228                                              Pika Gene-order conservation score
## 2229                                            Pika Whole-genome alignment coverage
## 2230                                       Pika orthology confidence [0 low, 1 high]
## 2231                                                       Pike-perch gene stable ID
## 2232                                                            Pike-perch gene name
## 2233                                      Pike-perch protein or transcript stable ID
## 2234                                             Pike-perch chromosome/scaffold name
## 2235                                       Pike-perch chromosome/scaffold start (bp)
## 2236                                         Pike-perch chromosome/scaffold end (bp)
## 2237                                                  Query protein or transcript ID
## 2238                                            Last common ancestor with Pike-perch
## 2239                                                        Pike-perch homology type
## 2240                             %id. target Pike-perch gene identical to query gene
## 2241                             %id. query gene identical to target Pike-perch gene
## 2242                                        Pike-perch Gene-order conservation score
## 2243                                      Pike-perch Whole-genome alignment coverage
## 2244                                 Pike-perch orthology confidence [0 low, 1 high]
## 2245                                             Pinecone soldierfish gene stable ID
## 2246                                                  Pinecone soldierfish gene name
## 2247                            Pinecone soldierfish protein or transcript stable ID
## 2248                                   Pinecone soldierfish chromosome/scaffold name
## 2249                             Pinecone soldierfish chromosome/scaffold start (bp)
## 2250                               Pinecone soldierfish chromosome/scaffold end (bp)
## 2251                                                  Query protein or transcript ID
## 2252                                  Last common ancestor with Pinecone soldierfish
## 2253                                              Pinecone soldierfish homology type
## 2254                   %id. target Pinecone soldierfish gene identical to query gene
## 2255                   %id. query gene identical to target Pinecone soldierfish gene
## 2256                              Pinecone soldierfish Gene-order conservation score
## 2257                            Pinecone soldierfish Whole-genome alignment coverage
## 2258                       Pinecone soldierfish orthology confidence [0 low, 1 high]
## 2259                                                Pink-footed goose gene stable ID
## 2260                                                     Pink-footed goose gene name
## 2261                               Pink-footed goose protein or transcript stable ID
## 2262                                      Pink-footed goose chromosome/scaffold name
## 2263                                Pink-footed goose chromosome/scaffold start (bp)
## 2264                                  Pink-footed goose chromosome/scaffold end (bp)
## 2265                                                  Query protein or transcript ID
## 2266                                     Last common ancestor with Pink-footed goose
## 2267                                                 Pink-footed goose homology type
## 2268                      %id. target Pink-footed goose gene identical to query gene
## 2269                      %id. query gene identical to target Pink-footed goose gene
## 2270                                 Pink-footed goose Gene-order conservation score
## 2271                               Pink-footed goose Whole-genome alignment coverage
## 2272                          Pink-footed goose orthology confidence [0 low, 1 high]
## 2273                                                        Platyfish gene stable ID
## 2274                                                             Platyfish gene name
## 2275                                       Platyfish protein or transcript stable ID
## 2276                                              Platyfish chromosome/scaffold name
## 2277                                        Platyfish chromosome/scaffold start (bp)
## 2278                                          Platyfish chromosome/scaffold end (bp)
## 2279                                                  Query protein or transcript ID
## 2280                                             Last common ancestor with Platyfish
## 2281                                                         Platyfish homology type
## 2282                              %id. target Platyfish gene identical to query gene
## 2283                              %id. query gene identical to target Platyfish gene
## 2284                                         Platyfish Gene-order conservation score
## 2285                                       Platyfish Whole-genome alignment coverage
## 2286                                  Platyfish orthology confidence [0 low, 1 high]
## 2287                                                         Platypus gene stable ID
## 2288                                                              Platypus gene name
## 2289                                        Platypus protein or transcript stable ID
## 2290                                               Platypus chromosome/scaffold name
## 2291                                         Platypus chromosome/scaffold start (bp)
## 2292                                           Platypus chromosome/scaffold end (bp)
## 2293                                                  Query protein or transcript ID
## 2294                                              Last common ancestor with Platypus
## 2295                                                          Platypus homology type
## 2296                               %id. target Platypus gene identical to query gene
## 2297                               %id. query gene identical to target Platypus gene
## 2298                                          Platypus Gene-order conservation score
## 2299                                        Platypus Whole-genome alignment coverage
## 2300                                   Platypus orthology confidence [0 low, 1 high]
## 2301                                                       Polar bear gene stable ID
## 2302                                                            Polar bear gene name
## 2303                                      Polar bear protein or transcript stable ID
## 2304                                             Polar bear chromosome/scaffold name
## 2305                                       Polar bear chromosome/scaffold start (bp)
## 2306                                         Polar bear chromosome/scaffold end (bp)
## 2307                                                  Query protein or transcript ID
## 2308                                            Last common ancestor with Polar bear
## 2309                                                        Polar bear homology type
## 2310                             %id. target Polar bear gene identical to query gene
## 2311                             %id. query gene identical to target Polar bear gene
## 2312                                        Polar bear Gene-order conservation score
## 2313                                      Polar bear Whole-genome alignment coverage
## 2314                                 Polar bear orthology confidence [0 low, 1 high]
## 2315                                                     Prairie vole gene stable ID
## 2316                                                          Prairie vole gene name
## 2317                                    Prairie vole protein or transcript stable ID
## 2318                                           Prairie vole chromosome/scaffold name
## 2319                                     Prairie vole chromosome/scaffold start (bp)
## 2320                                       Prairie vole chromosome/scaffold end (bp)
## 2321                                                  Query protein or transcript ID
## 2322                                          Last common ancestor with Prairie vole
## 2323                                                      Prairie vole homology type
## 2324                           %id. target Prairie vole gene identical to query gene
## 2325                           %id. query gene identical to target Prairie vole gene
## 2326                                      Prairie vole Gene-order conservation score
## 2327                                    Prairie vole Whole-genome alignment coverage
## 2328                               Prairie vole orthology confidence [0 low, 1 high]
## 2329                                                           Rabbit gene stable ID
## 2330                                                                Rabbit gene name
## 2331                                          Rabbit protein or transcript stable ID
## 2332                                                 Rabbit chromosome/scaffold name
## 2333                                           Rabbit chromosome/scaffold start (bp)
## 2334                                             Rabbit chromosome/scaffold end (bp)
## 2335                                                  Query protein or transcript ID
## 2336                                                Last common ancestor with Rabbit
## 2337                                                            Rabbit homology type
## 2338                                 %id. target Rabbit gene identical to query gene
## 2339                                 %id. query gene identical to target Rabbit gene
## 2340                                            Rabbit Gene-order conservation score
## 2341                                          Rabbit Whole-genome alignment coverage
## 2342                                     Rabbit orthology confidence [0 low, 1 high]
## 2343                                                    Rainbow trout gene stable ID
## 2344                                                         Rainbow trout gene name
## 2345                                   Rainbow trout protein or transcript stable ID
## 2346                                          Rainbow trout chromosome/scaffold name
## 2347                                    Rainbow trout chromosome/scaffold start (bp)
## 2348                                      Rainbow trout chromosome/scaffold end (bp)
## 2349                                                  Query protein or transcript ID
## 2350                                         Last common ancestor with Rainbow trout
## 2351                                                     Rainbow trout homology type
## 2352                          %id. target Rainbow trout gene identical to query gene
## 2353                          %id. query gene identical to target Rainbow trout gene
## 2354                                     Rainbow trout Gene-order conservation score
## 2355                              Rainbow trout orthology confidence [0 low, 1 high]
## 2356                                                              Rat gene stable ID
## 2357                                                                   Rat gene name
## 2358                                             Rat protein or transcript stable ID
## 2359                                                    Rat chromosome/scaffold name
## 2360                                              Rat chromosome/scaffold start (bp)
## 2361                                                Rat chromosome/scaffold end (bp)
## 2362                                                  Query protein or transcript ID
## 2363                                                   Last common ancestor with Rat
## 2364                                                               Rat homology type
## 2365                                    %id. target Rat gene identical to query gene
## 2366                                    %id. query gene identical to target Rat gene
## 2367                                               Rat Gene-order conservation score
## 2368                                             Rat Whole-genome alignment coverage
## 2369                                        Rat orthology confidence [0 low, 1 high]
## 2370                                                          Red fox gene stable ID
## 2371                                                               Red fox gene name
## 2372                                         Red fox protein or transcript stable ID
## 2373                                                Red fox chromosome/scaffold name
## 2374                                          Red fox chromosome/scaffold start (bp)
## 2375                                            Red fox chromosome/scaffold end (bp)
## 2376                                                  Query protein or transcript ID
## 2377                                               Last common ancestor with Red fox
## 2378                                                           Red fox homology type
## 2379                                %id. target Red fox gene identical to query gene
## 2380                                %id. query gene identical to target Red fox gene
## 2381                                           Red fox Gene-order conservation score
## 2382                                         Red fox Whole-genome alignment coverage
## 2383                                    Red fox orthology confidence [0 low, 1 high]
## 2384                                              Red-bellied piranha gene stable ID
## 2385                                                   Red-bellied piranha gene name
## 2386                             Red-bellied piranha protein or transcript stable ID
## 2387                                    Red-bellied piranha chromosome/scaffold name
## 2388                              Red-bellied piranha chromosome/scaffold start (bp)
## 2389                                Red-bellied piranha chromosome/scaffold end (bp)
## 2390                                                  Query protein or transcript ID
## 2391                                   Last common ancestor with Red-bellied piranha
## 2392                                               Red-bellied piranha homology type
## 2393                    %id. target Red-bellied piranha gene identical to query gene
## 2394                    %id. query gene identical to target Red-bellied piranha gene
## 2395                               Red-bellied piranha Gene-order conservation score
## 2396                             Red-bellied piranha Whole-genome alignment coverage
## 2397                        Red-bellied piranha orthology confidence [0 low, 1 high]
## 2398                                                         Reedfish gene stable ID
## 2399                                                              Reedfish gene name
## 2400                                        Reedfish protein or transcript stable ID
## 2401                                               Reedfish chromosome/scaffold name
## 2402                                         Reedfish chromosome/scaffold start (bp)
## 2403                                           Reedfish chromosome/scaffold end (bp)
## 2404                                                  Query protein or transcript ID
## 2405                                              Last common ancestor with Reedfish
## 2406                                                          Reedfish homology type
## 2407                               %id. target Reedfish gene identical to query gene
## 2408                               %id. query gene identical to target Reedfish gene
## 2409                                          Reedfish Gene-order conservation score
## 2410                                        Reedfish Whole-genome alignment coverage
## 2411                                   Reedfish orthology confidence [0 low, 1 high]
## 2412                                                     Ryukyu mouse gene stable ID
## 2413                                                          Ryukyu mouse gene name
## 2414                                    Ryukyu mouse protein or transcript stable ID
## 2415                                           Ryukyu mouse chromosome/scaffold name
## 2416                                     Ryukyu mouse chromosome/scaffold start (bp)
## 2417                                       Ryukyu mouse chromosome/scaffold end (bp)
## 2418                                                  Query protein or transcript ID
## 2419                                          Last common ancestor with Ryukyu mouse
## 2420                                                      Ryukyu mouse homology type
## 2421                           %id. target Ryukyu mouse gene identical to query gene
## 2422                           %id. query gene identical to target Ryukyu mouse gene
## 2423                                      Ryukyu mouse Gene-order conservation score
## 2424                                    Ryukyu mouse Whole-genome alignment coverage
## 2425                               Ryukyu mouse orthology confidence [0 low, 1 high]
## 2426                                         Saccharomyces cerevisiae gene stable ID
## 2427                                              Saccharomyces cerevisiae gene name
## 2428                        Saccharomyces cerevisiae protein or transcript stable ID
## 2429                               Saccharomyces cerevisiae chromosome/scaffold name
## 2430                         Saccharomyces cerevisiae chromosome/scaffold start (bp)
## 2431                           Saccharomyces cerevisiae chromosome/scaffold end (bp)
## 2432                                                  Query protein or transcript ID
## 2433                              Last common ancestor with Saccharomyces cerevisiae
## 2434                                          Saccharomyces cerevisiae homology type
## 2435               %id. target Saccharomyces cerevisiae gene identical to query gene
## 2436               %id. query gene identical to target Saccharomyces cerevisiae gene
## 2437                   Saccharomyces cerevisiae orthology confidence [0 low, 1 high]
## 2438                                                    Sailfin molly gene stable ID
## 2439                                                         Sailfin molly gene name
## 2440                                   Sailfin molly protein or transcript stable ID
## 2441                                          Sailfin molly chromosome/scaffold name
## 2442                                    Sailfin molly chromosome/scaffold start (bp)
## 2443                                      Sailfin molly chromosome/scaffold end (bp)
## 2444                                                  Query protein or transcript ID
## 2445                                         Last common ancestor with Sailfin molly
## 2446                                                     Sailfin molly homology type
## 2447                          %id. target Sailfin molly gene identical to query gene
## 2448                          %id. query gene identical to target Sailfin molly gene
## 2449                                     Sailfin molly Gene-order conservation score
## 2450                                   Sailfin molly Whole-genome alignment coverage
## 2451                              Sailfin molly orthology confidence [0 low, 1 high]
## 2452                                                            Sheep gene stable ID
## 2453                                                                 Sheep gene name
## 2454                                           Sheep protein or transcript stable ID
## 2455                                                  Sheep chromosome/scaffold name
## 2456                                            Sheep chromosome/scaffold start (bp)
## 2457                                              Sheep chromosome/scaffold end (bp)
## 2458                                                  Query protein or transcript ID
## 2459                                                 Last common ancestor with Sheep
## 2460                                                             Sheep homology type
## 2461                                  %id. target Sheep gene identical to query gene
## 2462                                  %id. query gene identical to target Sheep gene
## 2463                                             Sheep Gene-order conservation score
## 2464                                           Sheep Whole-genome alignment coverage
## 2465                                      Sheep orthology confidence [0 low, 1 high]
## 2466                                                Sheepshead minnow gene stable ID
## 2467                                                     Sheepshead minnow gene name
## 2468                               Sheepshead minnow protein or transcript stable ID
## 2469                                      Sheepshead minnow chromosome/scaffold name
## 2470                                Sheepshead minnow chromosome/scaffold start (bp)
## 2471                                  Sheepshead minnow chromosome/scaffold end (bp)
## 2472                                                  Query protein or transcript ID
## 2473                                     Last common ancestor with Sheepshead minnow
## 2474                                                 Sheepshead minnow homology type
## 2475                      %id. target Sheepshead minnow gene identical to query gene
## 2476                      %id. query gene identical to target Sheepshead minnow gene
## 2477                                 Sheepshead minnow Gene-order conservation score
## 2478                               Sheepshead minnow Whole-genome alignment coverage
## 2479                          Sheepshead minnow orthology confidence [0 low, 1 high]
## 2480                                                            Shrew gene stable ID
## 2481                                                                 Shrew gene name
## 2482                                           Shrew protein or transcript stable ID
## 2483                                                  Shrew chromosome/scaffold name
## 2484                                            Shrew chromosome/scaffold start (bp)
## 2485                                              Shrew chromosome/scaffold end (bp)
## 2486                                                  Query protein or transcript ID
## 2487                                                 Last common ancestor with Shrew
## 2488                                                             Shrew homology type
## 2489                                  %id. target Shrew gene identical to query gene
## 2490                                  %id. query gene identical to target Shrew gene
## 2491                                             Shrew Gene-order conservation score
## 2492                                           Shrew Whole-genome alignment coverage
## 2493                                      Shrew orthology confidence [0 low, 1 high]
## 2494                                                      Shrew mouse gene stable ID
## 2495                                                           Shrew mouse gene name
## 2496                                     Shrew mouse protein or transcript stable ID
## 2497                                            Shrew mouse chromosome/scaffold name
## 2498                                      Shrew mouse chromosome/scaffold start (bp)
## 2499                                        Shrew mouse chromosome/scaffold end (bp)
## 2500                                                  Query protein or transcript ID
## 2501                                           Last common ancestor with Shrew mouse
## 2502                                                       Shrew mouse homology type
## 2503                            %id. target Shrew mouse gene identical to query gene
## 2504                            %id. query gene identical to target Shrew mouse gene
## 2505                                       Shrew mouse Gene-order conservation score
## 2506                                     Shrew mouse Whole-genome alignment coverage
## 2507                                Shrew mouse orthology confidence [0 low, 1 high]
## 2508                                            Siamese fighting fish gene stable ID
## 2509                                                 Siamese fighting fish gene name
## 2510                           Siamese fighting fish protein or transcript stable ID
## 2511                                  Siamese fighting fish chromosome/scaffold name
## 2512                            Siamese fighting fish chromosome/scaffold start (bp)
## 2513                              Siamese fighting fish chromosome/scaffold end (bp)
## 2514                                                  Query protein or transcript ID
## 2515                                 Last common ancestor with Siamese fighting fish
## 2516                                             Siamese fighting fish homology type
## 2517                  %id. target Siamese fighting fish gene identical to query gene
## 2518                  %id. query gene identical to target Siamese fighting fish gene
## 2519                             Siamese fighting fish Gene-order conservation score
## 2520                           Siamese fighting fish Whole-genome alignment coverage
## 2521                      Siamese fighting fish orthology confidence [0 low, 1 high]
## 2522                                               Siberian musk deer gene stable ID
## 2523                                                    Siberian musk deer gene name
## 2524                              Siberian musk deer protein or transcript stable ID
## 2525                                     Siberian musk deer chromosome/scaffold name
## 2526                               Siberian musk deer chromosome/scaffold start (bp)
## 2527                                 Siberian musk deer chromosome/scaffold end (bp)
## 2528                                                  Query protein or transcript ID
## 2529                                    Last common ancestor with Siberian musk deer
## 2530                                                Siberian musk deer homology type
## 2531                     %id. target Siberian musk deer gene identical to query gene
## 2532                     %id. query gene identical to target Siberian musk deer gene
## 2533                                Siberian musk deer Gene-order conservation score
## 2534                              Siberian musk deer Whole-genome alignment coverage
## 2535                         Siberian musk deer orthology confidence [0 low, 1 high]
## 2536                                                            Sloth gene stable ID
## 2537                                                                 Sloth gene name
## 2538                                           Sloth protein or transcript stable ID
## 2539                                                  Sloth chromosome/scaffold name
## 2540                                            Sloth chromosome/scaffold start (bp)
## 2541                                              Sloth chromosome/scaffold end (bp)
## 2542                                                  Query protein or transcript ID
## 2543                                                 Last common ancestor with Sloth
## 2544                                                             Sloth homology type
## 2545                                  %id. target Sloth gene identical to query gene
## 2546                                  %id. query gene identical to target Sloth gene
## 2547                                             Sloth Gene-order conservation score
## 2548                                           Sloth Whole-genome alignment coverage
## 2549                                      Sloth orthology confidence [0 low, 1 high]
## 2550                                                   Sooty mangabey gene stable ID
## 2551                                                        Sooty mangabey gene name
## 2552                                  Sooty mangabey protein or transcript stable ID
## 2553                                         Sooty mangabey chromosome/scaffold name
## 2554                                   Sooty mangabey chromosome/scaffold start (bp)
## 2555                                     Sooty mangabey chromosome/scaffold end (bp)
## 2556                                                  Query protein or transcript ID
## 2557                                        Last common ancestor with Sooty mangabey
## 2558                                                    Sooty mangabey homology type
## 2559                         %id. target Sooty mangabey gene identical to query gene
## 2560                         %id. query gene identical to target Sooty mangabey gene
## 2561                                    Sooty mangabey Gene-order conservation score
## 2562                                  Sooty mangabey Whole-genome alignment coverage
## 2563                             Sooty mangabey orthology confidence [0 low, 1 high]
## 2564                                                      Sperm whale gene stable ID
## 2565                                                           Sperm whale gene name
## 2566                                     Sperm whale protein or transcript stable ID
## 2567                                            Sperm whale chromosome/scaffold name
## 2568                                      Sperm whale chromosome/scaffold start (bp)
## 2569                                        Sperm whale chromosome/scaffold end (bp)
## 2570                                                  Query protein or transcript ID
## 2571                                           Last common ancestor with Sperm whale
## 2572                                                       Sperm whale homology type
## 2573                            %id. target Sperm whale gene identical to query gene
## 2574                            %id. query gene identical to target Sperm whale gene
## 2575                                       Sperm whale Gene-order conservation score
## 2576                                     Sperm whale Whole-genome alignment coverage
## 2577                                Sperm whale orthology confidence [0 low, 1 high]
## 2578                                                    Spiny chromis gene stable ID
## 2579                                                         Spiny chromis gene name
## 2580                                   Spiny chromis protein or transcript stable ID
## 2581                                          Spiny chromis chromosome/scaffold name
## 2582                                    Spiny chromis chromosome/scaffold start (bp)
## 2583                                      Spiny chromis chromosome/scaffold end (bp)
## 2584                                                  Query protein or transcript ID
## 2585                                         Last common ancestor with Spiny chromis
## 2586                                                     Spiny chromis homology type
## 2587                          %id. target Spiny chromis gene identical to query gene
## 2588                          %id. query gene identical to target Spiny chromis gene
## 2589                                     Spiny chromis Gene-order conservation score
## 2590                                   Spiny chromis Whole-genome alignment coverage
## 2591                              Spiny chromis orthology confidence [0 low, 1 high]
## 2592                                                      Spotted gar gene stable ID
## 2593                                                           Spotted gar gene name
## 2594                                     Spotted gar protein or transcript stable ID
## 2595                                            Spotted gar chromosome/scaffold name
## 2596                                      Spotted gar chromosome/scaffold start (bp)
## 2597                                        Spotted gar chromosome/scaffold end (bp)
## 2598                                                  Query protein or transcript ID
## 2599                                           Last common ancestor with Spotted gar
## 2600                                                       Spotted gar homology type
## 2601                            %id. target Spotted gar gene identical to query gene
## 2602                            %id. query gene identical to target Spotted gar gene
## 2603                                       Spotted gar Gene-order conservation score
## 2604                                     Spotted gar Whole-genome alignment coverage
## 2605                                Spotted gar orthology confidence [0 low, 1 high]
## 2606                                                         Squirrel gene stable ID
## 2607                                                              Squirrel gene name
## 2608                                        Squirrel protein or transcript stable ID
## 2609                                               Squirrel chromosome/scaffold name
## 2610                                         Squirrel chromosome/scaffold start (bp)
## 2611                                           Squirrel chromosome/scaffold end (bp)
## 2612                                                  Query protein or transcript ID
## 2613                                              Last common ancestor with Squirrel
## 2614                                                          Squirrel homology type
## 2615                               %id. target Squirrel gene identical to query gene
## 2616                               %id. query gene identical to target Squirrel gene
## 2617                                          Squirrel Gene-order conservation score
## 2618                                        Squirrel Whole-genome alignment coverage
## 2619                                   Squirrel orthology confidence [0 low, 1 high]
## 2620                                                     Steppe mouse gene stable ID
## 2621                                                          Steppe mouse gene name
## 2622                                    Steppe mouse protein or transcript stable ID
## 2623                                           Steppe mouse chromosome/scaffold name
## 2624                                     Steppe mouse chromosome/scaffold start (bp)
## 2625                                       Steppe mouse chromosome/scaffold end (bp)
## 2626                                                  Query protein or transcript ID
## 2627                                          Last common ancestor with Steppe mouse
## 2628                                                      Steppe mouse homology type
## 2629                           %id. target Steppe mouse gene identical to query gene
## 2630                           %id. query gene identical to target Steppe mouse gene
## 2631                                      Steppe mouse Gene-order conservation score
## 2632                                    Steppe mouse Whole-genome alignment coverage
## 2633                               Steppe mouse orthology confidence [0 low, 1 high]
## 2634                                                      Stickleback gene stable ID
## 2635                                                           Stickleback gene name
## 2636                                     Stickleback protein or transcript stable ID
## 2637                                            Stickleback chromosome/scaffold name
## 2638                                      Stickleback chromosome/scaffold start (bp)
## 2639                                        Stickleback chromosome/scaffold end (bp)
## 2640                                                  Query protein or transcript ID
## 2641                                           Last common ancestor with Stickleback
## 2642                                                       Stickleback homology type
## 2643                            %id. target Stickleback gene identical to query gene
## 2644                            %id. query gene identical to target Stickleback gene
## 2645                                       Stickleback Gene-order conservation score
## 2646                                     Stickleback Whole-genome alignment coverage
## 2647                                Stickleback orthology confidence [0 low, 1 high]
## 2648                                               Sumatran orangutan gene stable ID
## 2649                                                    Sumatran orangutan gene name
## 2650                              Sumatran orangutan protein or transcript stable ID
## 2651                                     Sumatran orangutan chromosome/scaffold name
## 2652                               Sumatran orangutan chromosome/scaffold start (bp)
## 2653                                 Sumatran orangutan chromosome/scaffold end (bp)
## 2654                                                  Query protein or transcript ID
## 2655                                    Last common ancestor with Sumatran orangutan
## 2656                                                Sumatran orangutan homology type
## 2657                     %id. target Sumatran orangutan gene identical to query gene
## 2658                     %id. query gene identical to target Sumatran orangutan gene
## 2659                                Sumatran orangutan Gene-order conservation score
## 2660                              Sumatran orangutan Whole-genome alignment coverage
## 2661                         Sumatran orangutan orthology confidence [0 low, 1 high]
## 2662                                                          Tarsier gene stable ID
## 2663                                                               Tarsier gene name
## 2664                                         Tarsier protein or transcript stable ID
## 2665                                                Tarsier chromosome/scaffold name
## 2666                                          Tarsier chromosome/scaffold start (bp)
## 2667                                            Tarsier chromosome/scaffold end (bp)
## 2668                                                  Query protein or transcript ID
## 2669                                               Last common ancestor with Tarsier
## 2670                                                           Tarsier homology type
## 2671                                %id. target Tarsier gene identical to query gene
## 2672                                %id. query gene identical to target Tarsier gene
## 2673                                           Tarsier Gene-order conservation score
## 2674                                         Tarsier Whole-genome alignment coverage
## 2675                                    Tarsier orthology confidence [0 low, 1 high]
## 2676                                                  Tasmanian devil gene stable ID
## 2677                                                       Tasmanian devil gene name
## 2678                                 Tasmanian devil protein or transcript stable ID
## 2679                                        Tasmanian devil chromosome/scaffold name
## 2680                                  Tasmanian devil chromosome/scaffold start (bp)
## 2681                                    Tasmanian devil chromosome/scaffold end (bp)
## 2682                                                  Query protein or transcript ID
## 2683                                       Last common ancestor with Tasmanian devil
## 2684                                                   Tasmanian devil homology type
## 2685                        %id. target Tasmanian devil gene identical to query gene
## 2686                        %id. query gene identical to target Tasmanian devil gene
## 2687                                   Tasmanian devil Gene-order conservation score
## 2688                            Tasmanian devil orthology confidence [0 low, 1 high]
## 2689                                                        Tetraodon gene stable ID
## 2690                                                             Tetraodon gene name
## 2691                                       Tetraodon protein or transcript stable ID
## 2692                                              Tetraodon chromosome/scaffold name
## 2693                                        Tetraodon chromosome/scaffold start (bp)
## 2694                                          Tetraodon chromosome/scaffold end (bp)
## 2695                                                  Query protein or transcript ID
## 2696                                             Last common ancestor with Tetraodon
## 2697                                                         Tetraodon homology type
## 2698                              %id. target Tetraodon gene identical to query gene
## 2699                              %id. query gene identical to target Tetraodon gene
## 2700                                         Tetraodon Gene-order conservation score
## 2701                                       Tetraodon Whole-genome alignment coverage
## 2702                                  Tetraodon orthology confidence [0 low, 1 high]
## 2703                                            Three-toed box turtle gene stable ID
## 2704                                                 Three-toed box turtle gene name
## 2705                           Three-toed box turtle protein or transcript stable ID
## 2706                                  Three-toed box turtle chromosome/scaffold name
## 2707                            Three-toed box turtle chromosome/scaffold start (bp)
## 2708                              Three-toed box turtle chromosome/scaffold end (bp)
## 2709                                                  Query protein or transcript ID
## 2710                                 Last common ancestor with Three-toed box turtle
## 2711                                             Three-toed box turtle homology type
## 2712                  %id. target Three-toed box turtle gene identical to query gene
## 2713                  %id. query gene identical to target Three-toed box turtle gene
## 2714                             Three-toed box turtle Gene-order conservation score
## 2715                           Three-toed box turtle Whole-genome alignment coverage
## 2716                      Three-toed box turtle orthology confidence [0 low, 1 high]
## 2717                                                            Tiger gene stable ID
## 2718                                                                 Tiger gene name
## 2719                                           Tiger protein or transcript stable ID
## 2720                                                  Tiger chromosome/scaffold name
## 2721                                            Tiger chromosome/scaffold start (bp)
## 2722                                              Tiger chromosome/scaffold end (bp)
## 2723                                                  Query protein or transcript ID
## 2724                                                 Last common ancestor with Tiger
## 2725                                                             Tiger homology type
## 2726                                  %id. target Tiger gene identical to query gene
## 2727                                  %id. query gene identical to target Tiger gene
## 2728                                             Tiger Gene-order conservation score
## 2729                                           Tiger Whole-genome alignment coverage
## 2730                                      Tiger orthology confidence [0 low, 1 high]
## 2731                                              Tiger tail seahorse gene stable ID
## 2732                                                   Tiger tail seahorse gene name
## 2733                             Tiger tail seahorse protein or transcript stable ID
## 2734                                    Tiger tail seahorse chromosome/scaffold name
## 2735                              Tiger tail seahorse chromosome/scaffold start (bp)
## 2736                                Tiger tail seahorse chromosome/scaffold end (bp)
## 2737                                                  Query protein or transcript ID
## 2738                                   Last common ancestor with Tiger tail seahorse
## 2739                                               Tiger tail seahorse homology type
## 2740                    %id. target Tiger tail seahorse gene identical to query gene
## 2741                    %id. query gene identical to target Tiger tail seahorse gene
## 2742                               Tiger tail seahorse Gene-order conservation score
## 2743                             Tiger tail seahorse Whole-genome alignment coverage
## 2744                        Tiger tail seahorse orthology confidence [0 low, 1 high]
## 2745                                                      Tongue sole gene stable ID
## 2746                                                           Tongue sole gene name
## 2747                                     Tongue sole protein or transcript stable ID
## 2748                                            Tongue sole chromosome/scaffold name
## 2749                                      Tongue sole chromosome/scaffold start (bp)
## 2750                                        Tongue sole chromosome/scaffold end (bp)
## 2751                                                  Query protein or transcript ID
## 2752                                           Last common ancestor with Tongue sole
## 2753                                                       Tongue sole homology type
## 2754                            %id. target Tongue sole gene identical to query gene
## 2755                            %id. query gene identical to target Tongue sole gene
## 2756                                       Tongue sole Gene-order conservation score
## 2757                                     Tongue sole Whole-genome alignment coverage
## 2758                                Tongue sole orthology confidence [0 low, 1 high]
## 2759                                                       Tree Shrew gene stable ID
## 2760                                                            Tree Shrew gene name
## 2761                                      Tree Shrew protein or transcript stable ID
## 2762                                             Tree Shrew chromosome/scaffold name
## 2763                                       Tree Shrew chromosome/scaffold start (bp)
## 2764                                         Tree Shrew chromosome/scaffold end (bp)
## 2765                                                  Query protein or transcript ID
## 2766                                            Last common ancestor with Tree Shrew
## 2767                                                        Tree Shrew homology type
## 2768                             %id. target Tree Shrew gene identical to query gene
## 2769                             %id. query gene identical to target Tree Shrew gene
## 2770                                        Tree Shrew Gene-order conservation score
## 2771                                      Tree Shrew Whole-genome alignment coverage
## 2772                                 Tree Shrew orthology confidence [0 low, 1 high]
## 2773                                             Tropical clawed frog gene stable ID
## 2774                                                  Tropical clawed frog gene name
## 2775                            Tropical clawed frog protein or transcript stable ID
## 2776                                   Tropical clawed frog chromosome/scaffold name
## 2777                             Tropical clawed frog chromosome/scaffold start (bp)
## 2778                               Tropical clawed frog chromosome/scaffold end (bp)
## 2779                                                  Query protein or transcript ID
## 2780                                  Last common ancestor with Tropical clawed frog
## 2781                                              Tropical clawed frog homology type
## 2782                   %id. target Tropical clawed frog gene identical to query gene
## 2783                   %id. query gene identical to target Tropical clawed frog gene
## 2784                              Tropical clawed frog Gene-order conservation score
## 2785                       Tropical clawed frog orthology confidence [0 low, 1 high]
## 2786                                                          Tuatara gene stable ID
## 2787                                                               Tuatara gene name
## 2788                                         Tuatara protein or transcript stable ID
## 2789                                                Tuatara chromosome/scaffold name
## 2790                                          Tuatara chromosome/scaffold start (bp)
## 2791                                            Tuatara chromosome/scaffold end (bp)
## 2792                                                  Query protein or transcript ID
## 2793                                               Last common ancestor with Tuatara
## 2794                                                           Tuatara homology type
## 2795                                %id. target Tuatara gene identical to query gene
## 2796                                %id. query gene identical to target Tuatara gene
## 2797                                           Tuatara Gene-order conservation score
## 2798                                         Tuatara Whole-genome alignment coverage
## 2799                                    Tuatara orthology confidence [0 low, 1 high]
## 2800                                                           Turbot gene stable ID
## 2801                                                                Turbot gene name
## 2802                                          Turbot protein or transcript stable ID
## 2803                                                 Turbot chromosome/scaffold name
## 2804                                           Turbot chromosome/scaffold start (bp)
## 2805                                             Turbot chromosome/scaffold end (bp)
## 2806                                                  Query protein or transcript ID
## 2807                                                Last common ancestor with Turbot
## 2808                                                            Turbot homology type
## 2809                                 %id. target Turbot gene identical to query gene
## 2810                                 %id. query gene identical to target Turbot gene
## 2811                                            Turbot Gene-order conservation score
## 2812                                     Turbot orthology confidence [0 low, 1 high]
## 2813                                                           Turkey gene stable ID
## 2814                                                                Turkey gene name
## 2815                                          Turkey protein or transcript stable ID
## 2816                                                 Turkey chromosome/scaffold name
## 2817                                           Turkey chromosome/scaffold start (bp)
## 2818                                             Turkey chromosome/scaffold end (bp)
## 2819                                                  Query protein or transcript ID
## 2820                                                Last common ancestor with Turkey
## 2821                                                            Turkey homology type
## 2822                                 %id. target Turkey gene identical to query gene
## 2823                                 %id. query gene identical to target Turkey gene
## 2824                                            Turkey Gene-order conservation score
## 2825                                     Turkey orthology confidence [0 low, 1 high]
## 2826                                              Turquoise killifish gene stable ID
## 2827                                                   Turquoise killifish gene name
## 2828                             Turquoise killifish protein or transcript stable ID
## 2829                                    Turquoise killifish chromosome/scaffold name
## 2830                              Turquoise killifish chromosome/scaffold start (bp)
## 2831                                Turquoise killifish chromosome/scaffold end (bp)
## 2832                                                  Query protein or transcript ID
## 2833                                   Last common ancestor with Turquoise killifish
## 2834                                               Turquoise killifish homology type
## 2835                    %id. target Turquoise killifish gene identical to query gene
## 2836                    %id. query gene identical to target Turquoise killifish gene
## 2837                               Turquoise killifish Gene-order conservation score
## 2838                             Turquoise killifish Whole-genome alignment coverage
## 2839                        Turquoise killifish orthology confidence [0 low, 1 high]
## 2840                           Upper Galilee mountains blind mole rat gene stable ID
## 2841                                Upper Galilee mountains blind mole rat gene name
## 2842          Upper Galilee mountains blind mole rat protein or transcript stable ID
## 2843                 Upper Galilee mountains blind mole rat chromosome/scaffold name
## 2844           Upper Galilee mountains blind mole rat chromosome/scaffold start (bp)
## 2845             Upper Galilee mountains blind mole rat chromosome/scaffold end (bp)
## 2846                                                  Query protein or transcript ID
## 2847                Last common ancestor with Upper Galilee mountains blind mole rat
## 2848                            Upper Galilee mountains blind mole rat homology type
## 2849 %id. target Upper Galilee mountains blind mole rat gene identical to query gene
## 2850 %id. query gene identical to target Upper Galilee mountains blind mole rat gene
## 2851            Upper Galilee mountains blind mole rat Gene-order conservation score
## 2852          Upper Galilee mountains blind mole rat Whole-genome alignment coverage
## 2853     Upper Galilee mountains blind mole rat orthology confidence [0 low, 1 high]
## 2854                                                          Vaquita gene stable ID
## 2855                                                               Vaquita gene name
## 2856                                         Vaquita protein or transcript stable ID
## 2857                                                Vaquita chromosome/scaffold name
## 2858                                          Vaquita chromosome/scaffold start (bp)
## 2859                                            Vaquita chromosome/scaffold end (bp)
## 2860                                                  Query protein or transcript ID
## 2861                                               Last common ancestor with Vaquita
## 2862                                                           Vaquita homology type
## 2863                                %id. target Vaquita gene identical to query gene
## 2864                                %id. query gene identical to target Vaquita gene
## 2865                                           Vaquita Gene-order conservation score
## 2866                                         Vaquita Whole-genome alignment coverage
## 2867                                    Vaquita orthology confidence [0 low, 1 high]
## 2868                                                       Vervet-AGM gene stable ID
## 2869                                                            Vervet-AGM gene name
## 2870                                      Vervet-AGM protein or transcript stable ID
## 2871                                             Vervet-AGM chromosome/scaffold name
## 2872                                       Vervet-AGM chromosome/scaffold start (bp)
## 2873                                         Vervet-AGM chromosome/scaffold end (bp)
## 2874                                                  Query protein or transcript ID
## 2875                                            Last common ancestor with Vervet-AGM
## 2876                                                        Vervet-AGM homology type
## 2877                             %id. target Vervet-AGM gene identical to query gene
## 2878                             %id. query gene identical to target Vervet-AGM gene
## 2879                                        Vervet-AGM Gene-order conservation score
## 2880                                      Vervet-AGM Whole-genome alignment coverage
## 2881                                 Vervet-AGM orthology confidence [0 low, 1 high]
## 2882                                                          Wallaby gene stable ID
## 2883                                                               Wallaby gene name
## 2884                                         Wallaby protein or transcript stable ID
## 2885                                                Wallaby chromosome/scaffold name
## 2886                                          Wallaby chromosome/scaffold start (bp)
## 2887                                            Wallaby chromosome/scaffold end (bp)
## 2888                                                  Query protein or transcript ID
## 2889                                               Last common ancestor with Wallaby
## 2890                                                           Wallaby homology type
## 2891                                %id. target Wallaby gene identical to query gene
## 2892                                %id. query gene identical to target Wallaby gene
## 2893                                           Wallaby Gene-order conservation score
## 2894                                         Wallaby Whole-genome alignment coverage
## 2895                                    Wallaby orthology confidence [0 low, 1 high]
## 2896                                        White-tufted-ear marmoset gene stable ID
## 2897                                             White-tufted-ear marmoset gene name
## 2898                       White-tufted-ear marmoset protein or transcript stable ID
## 2899                              White-tufted-ear marmoset chromosome/scaffold name
## 2900                        White-tufted-ear marmoset chromosome/scaffold start (bp)
## 2901                          White-tufted-ear marmoset chromosome/scaffold end (bp)
## 2902                                                  Query protein or transcript ID
## 2903                             Last common ancestor with White-tufted-ear marmoset
## 2904                                         White-tufted-ear marmoset homology type
## 2905              %id. target White-tufted-ear marmoset gene identical to query gene
## 2906              %id. query gene identical to target White-tufted-ear marmoset gene
## 2907                         White-tufted-ear marmoset Gene-order conservation score
## 2908                       White-tufted-ear marmoset Whole-genome alignment coverage
## 2909                  White-tufted-ear marmoset orthology confidence [0 low, 1 high]
## 2910                                                         Wild yak gene stable ID
## 2911                                                              Wild yak gene name
## 2912                                        Wild yak protein or transcript stable ID
## 2913                                               Wild yak chromosome/scaffold name
## 2914                                         Wild yak chromosome/scaffold start (bp)
## 2915                                           Wild yak chromosome/scaffold end (bp)
## 2916                                                  Query protein or transcript ID
## 2917                                              Last common ancestor with Wild yak
## 2918                                                          Wild yak homology type
## 2919                               %id. target Wild yak gene identical to query gene
## 2920                               %id. query gene identical to target Wild yak gene
## 2921                                          Wild yak Gene-order conservation score
## 2922                                        Wild yak Whole-genome alignment coverage
## 2923                                   Wild yak orthology confidence [0 low, 1 high]
## 2924                                                     Yarkand deer gene stable ID
## 2925                                                          Yarkand deer gene name
## 2926                                    Yarkand deer protein or transcript stable ID
## 2927                                           Yarkand deer chromosome/scaffold name
## 2928                                     Yarkand deer chromosome/scaffold start (bp)
## 2929                                       Yarkand deer chromosome/scaffold end (bp)
## 2930                                                  Query protein or transcript ID
## 2931                                          Last common ancestor with Yarkand deer
## 2932                                                      Yarkand deer homology type
## 2933                           %id. target Yarkand deer gene identical to query gene
## 2934                           %id. query gene identical to target Yarkand deer gene
## 2935                                      Yarkand deer Gene-order conservation score
## 2936                                    Yarkand deer Whole-genome alignment coverage
## 2937                               Yarkand deer orthology confidence [0 low, 1 high]
## 2938                                             Yellowtail amberjack gene stable ID
## 2939                                                  Yellowtail amberjack gene name
## 2940                            Yellowtail amberjack protein or transcript stable ID
## 2941                                   Yellowtail amberjack chromosome/scaffold name
## 2942                             Yellowtail amberjack chromosome/scaffold start (bp)
## 2943                               Yellowtail amberjack chromosome/scaffold end (bp)
## 2944                                                  Query protein or transcript ID
## 2945                                  Last common ancestor with Yellowtail amberjack
## 2946                                              Yellowtail amberjack homology type
## 2947                   %id. target Yellowtail amberjack gene identical to query gene
## 2948                   %id. query gene identical to target Yellowtail amberjack gene
## 2949                              Yellowtail amberjack Gene-order conservation score
## 2950                            Yellowtail amberjack Whole-genome alignment coverage
## 2951                       Yellowtail amberjack orthology confidence [0 low, 1 high]
## 2952                                                      Zebra finch gene stable ID
## 2953                                                           Zebra finch gene name
## 2954                                     Zebra finch protein or transcript stable ID
## 2955                                            Zebra finch chromosome/scaffold name
## 2956                                      Zebra finch chromosome/scaffold start (bp)
## 2957                                        Zebra finch chromosome/scaffold end (bp)
## 2958                                                  Query protein or transcript ID
## 2959                                           Last common ancestor with Zebra finch
## 2960                                                       Zebra finch homology type
## 2961                            %id. target Zebra finch gene identical to query gene
## 2962                            %id. query gene identical to target Zebra finch gene
## 2963                                       Zebra finch Gene-order conservation score
## 2964                                     Zebra finch Whole-genome alignment coverage
## 2965                                Zebra finch orthology confidence [0 low, 1 high]
## 2966                                                      Zebra mbuna gene stable ID
## 2967                                                           Zebra mbuna gene name
## 2968                                     Zebra mbuna protein or transcript stable ID
## 2969                                            Zebra mbuna chromosome/scaffold name
## 2970                                      Zebra mbuna chromosome/scaffold start (bp)
## 2971                                        Zebra mbuna chromosome/scaffold end (bp)
## 2972                                                  Query protein or transcript ID
## 2973                                           Last common ancestor with Zebra mbuna
## 2974                                                       Zebra mbuna homology type
## 2975                            %id. target Zebra mbuna gene identical to query gene
## 2976                            %id. query gene identical to target Zebra mbuna gene
## 2977                                       Zebra mbuna Gene-order conservation score
## 2978                                     Zebra mbuna Whole-genome alignment coverage
## 2979                                Zebra mbuna orthology confidence [0 low, 1 high]
## 2980                                                        Zebrafish gene stable ID
## 2981                                                             Zebrafish gene name
## 2982                                       Zebrafish protein or transcript stable ID
## 2983                                              Zebrafish chromosome/scaffold name
## 2984                                        Zebrafish chromosome/scaffold start (bp)
## 2985                                          Zebrafish chromosome/scaffold end (bp)
## 2986                                                  Query protein or transcript ID
## 2987                                             Last common ancestor with Zebrafish
## 2988                                                         Zebrafish homology type
## 2989                              %id. target Zebrafish gene identical to query gene
## 2990                              %id. query gene identical to target Zebrafish gene
## 2991                                         Zebrafish Gene-order conservation score
## 2992                                       Zebrafish Whole-genome alignment coverage
## 2993                                  Zebrafish orthology confidence [0 low, 1 high]
## 2994                                                      Zig-zag eel gene stable ID
## 2995                                                           Zig-zag eel gene name
## 2996                                     Zig-zag eel protein or transcript stable ID
## 2997                                            Zig-zag eel chromosome/scaffold name
## 2998                                      Zig-zag eel chromosome/scaffold start (bp)
## 2999                                        Zig-zag eel chromosome/scaffold end (bp)
## 3000                                                  Query protein or transcript ID
## 3001                                           Last common ancestor with Zig-zag eel
## 3002                                                       Zig-zag eel homology type
## 3003                            %id. target Zig-zag eel gene identical to query gene
## 3004                            %id. query gene identical to target Zig-zag eel gene
## 3005                                       Zig-zag eel Gene-order conservation score
## 3006                                Zig-zag eel orthology confidence [0 low, 1 high]
## 3007                                                  Human paralogue gene stable ID
## 3008                                            Human paralogue associated gene name
## 3009                                        Human paralogue protein or transcript ID
## 3010                                        Human paralogue chromosome/scaffold name
## 3011                                  Human paralogue chromosome/scaffold start (bp)
## 3012                                    Human paralogue chromosome/scaffold end (bp)
## 3013                                        Paralogue query protein or transcript ID
## 3014                                       Paralogue last common ancestor with Human
## 3015                                                   Human paralogue homology type
## 3016                        Paralogue %id. target Human gene identical to query gene
## 3017                        Paralogue %id. query gene identical to target Human gene
## 3018                                                                  Gene stable ID
## 3019                                                          Gene stable ID version
## 3020                                                                  Version (gene)
## 3021                                                            Transcript stable ID
## 3022                                                    Transcript stable ID version
## 3023                                                            Version (transcript)
## 3024                                                               Protein stable ID
## 3025                                                       Protein stable ID version
## 3026                                                               Version (protein)
## 3027                                                        Chromosome/scaffold name
## 3028                                                                 Gene start (bp)
## 3029                                                                   Gene end (bp)
## 3030                                                                          Strand
## 3031                                                                  Karyotype band
## 3032                                                                       Gene name
## 3033                                                             Source of gene name
## 3034                                                                Transcript count
## 3035                                                               Gene % GC content
## 3036                                                                Gene description
## 3037                                                                    Variant name
## 3038                                                                  Variant source
## 3039                                                      Variant source description
## 3040                                                                 Variant alleles
## 3041                                                     Variant supporting evidence
## 3042                                                                       Mapweight
## 3043                                                                    Minor allele
## 3044                                                          Minor allele frequency
## 3045                                                              Minor allele count
## 3046                                                           Clinical significance
## 3047                                                        Transcript location (bp)
## 3048                                                       Variant chromosome Strand
## 3049                                                           Protein location (aa)
## 3050                                         chromosome/scaffold position start (bp)
## 3051                                           Chromosome/scaffold position end (bp)
## 3052                                                             PolyPhen prediction
## 3053                                                                  PolyPhen score
## 3054                                                                 SIFT prediction
## 3055                                                                      SIFT score
## 3056                                                          Distance to transcript
## 3057                                                                       CDS start
## 3058                                                                         CDS end
## 3059                                                                  Protein allele
## 3060                                                             Variant consequence
## 3061                                                     Consequence specific allele
## 3062                                                                  Gene stable ID
## 3063                                                          Gene stable ID version
## 3064                                                                  Version (gene)
## 3065                                                            Transcript stable ID
## 3066                                                    Transcript stable ID version
## 3067                                                            Version (transcript)
## 3068                                                               Protein stable ID
## 3069                                                       Protein stable ID version
## 3070                                                               Version (protein)
## 3071                                                        Chromosome/scaffold name
## 3072                                                                 Gene start (bp)
## 3073                                                                   Gene end (bp)
## 3074                                                                          Strand
## 3075                                                                  Karyotype band
## 3076                                                                       Gene name
## 3077                                                             Source of gene name
## 3078                                                                Transcript count
## 3079                                                               Gene % GC content
## 3080                                                                Gene description
## 3081                                                                    Variant name
## 3082                                                                  Variant source
## 3083                                                      Variant source description
## 3084                                                                 Variant alleles
## 3085                                                     Variant supporting evidence
## 3086                                                                       Mapweight
## 3087                                                        Transcript location (bp)
## 3088                                              Variant chromosome/scaffold strand
## 3089                                                           Protein location (aa)
## 3090                                         Chromosome/scaffold position start (bp)
## 3091                                           Chromosome/scaffold position end (bp)
## 3092                                                          Distance to transcript
## 3093                                                                       CDS start
## 3094                                                                         CDS end
## 3095                                                             Variant consequence
## 3096                                                     Consequence specific allele
## 3097                                                          Unspliced (Transcript)
## 3098                                                                Unspliced (Gene)
## 3099                                                              Flank (Transcript)
## 3100                                                                    Flank (Gene)
## 3101                                                Flank-coding region (Transcript)
## 3102                                                      Flank-coding region (Gene)
## 3103                                                                          5' UTR
## 3104                                                                          3' UTR
## 3105                                                                  Exon sequences
## 3106                                                                  cDNA sequences
## 3107                                                                 Coding sequence
## 3108                                                                         Peptide
## 3109                                                                  upstream_flank
## 3110                                                                downstream_flank
## 3111                                                                  Gene stable ID
## 3112                                                          Gene stable ID version
## 3113                                                                Gene description
## 3114                                                                       Gene name
## 3115                                                             Source of gene name
## 3116                                                        Chromosome/scaffold name
## 3117                                                                 Gene start (bp)
## 3118                                                                   Gene end (bp)
## 3119                                                                       Gene type
## 3120                                                                  Version (gene)
## 3121                                                                      UniParc ID
## 3122                                                         UniProtKB/Swiss-Prot ID
## 3123                                                             UniProtKB/TrEMBL ID
## 3124                                                         CDS start (within cDNA)
## 3125                                                           CDS end (within cDNA)
## 3126                                                                    5' UTR start
## 3127                                                                      5' UTR end
## 3128                                                                    3' UTR start
## 3129                                                                      3' UTR end
## 3130                                                            Transcript stable ID
## 3131                                                    Transcript stable ID version
## 3132                                                               Protein stable ID
## 3133                                                       Protein stable ID version
## 3134                                                                 Transcript type
## 3135                                                            Version (transcript)
## 3136                                                               Version (protein)
## 3137                                                                          Strand
## 3138                                                           Transcript start (bp)
## 3139                                                             Transcript end (bp)
## 3140                                                  Transcription start site (TSS)
## 3141                                      Transcript length (including UTRs and CDS)
## 3142                                                                      CDS Length
## 3143                                                                       CDS start
## 3144                                                                         CDS end
## 3145                                                                  Exon stable ID
## 3146                                                          Exon region start (bp)
## 3147                                                            Exon region end (bp)
## 3148                                                                          Strand
## 3149                                                         Exon rank in transcript
## 3150                                                                     Start phase
## 3151                                                                       End phase
## 3152                                                               cDNA coding start
## 3153                                                                 cDNA coding end
## 3154                                                            Genomic coding start
## 3155                                                              Genomic coding end
## 3156                                                               Constitutive exon
##              page
## 1    feature_page
## 2    feature_page
## 3    feature_page
## 4    feature_page
## 5    feature_page
## 6    feature_page
## 7    feature_page
## 8    feature_page
## 9    feature_page
## 10   feature_page
## 11   feature_page
## 12   feature_page
## 13   feature_page
## 14   feature_page
## 15   feature_page
## 16   feature_page
## 17   feature_page
## 18   feature_page
## 19   feature_page
## 20   feature_page
## 21   feature_page
## 22   feature_page
## 23   feature_page
## 24   feature_page
## 25   feature_page
## 26   feature_page
## 27   feature_page
## 28   feature_page
## 29   feature_page
## 30   feature_page
## 31   feature_page
## 32   feature_page
## 33   feature_page
## 34   feature_page
## 35   feature_page
## 36   feature_page
## 37   feature_page
## 38   feature_page
## 39   feature_page
## 40   feature_page
## 41   feature_page
## 42   feature_page
## 43   feature_page
## 44   feature_page
## 45   feature_page
## 46   feature_page
## 47   feature_page
## 48   feature_page
## 49   feature_page
## 50   feature_page
## 51   feature_page
## 52   feature_page
## 53   feature_page
## 54   feature_page
## 55   feature_page
## 56   feature_page
## 57   feature_page
## 58   feature_page
## 59   feature_page
## 60   feature_page
## 61   feature_page
## 62   feature_page
## 63   feature_page
## 64   feature_page
## 65   feature_page
## 66   feature_page
## 67   feature_page
## 68   feature_page
## 69   feature_page
## 70   feature_page
## 71   feature_page
## 72   feature_page
## 73   feature_page
## 74   feature_page
## 75   feature_page
## 76   feature_page
## 77   feature_page
## 78   feature_page
## 79   feature_page
## 80   feature_page
## 81   feature_page
## 82   feature_page
## 83   feature_page
## 84   feature_page
## 85   feature_page
## 86   feature_page
## 87   feature_page
## 88   feature_page
## 89   feature_page
## 90   feature_page
## 91   feature_page
## 92   feature_page
## 93   feature_page
## 94   feature_page
## 95   feature_page
## 96   feature_page
## 97   feature_page
## 98   feature_page
## 99   feature_page
## 100  feature_page
## 101  feature_page
## 102  feature_page
## 103  feature_page
## 104  feature_page
## 105  feature_page
## 106  feature_page
## 107  feature_page
## 108  feature_page
## 109  feature_page
## 110  feature_page
## 111  feature_page
## 112  feature_page
## 113  feature_page
## 114  feature_page
## 115  feature_page
## 116  feature_page
## 117  feature_page
## 118  feature_page
## 119  feature_page
## 120  feature_page
## 121  feature_page
## 122  feature_page
## 123  feature_page
## 124  feature_page
## 125  feature_page
## 126  feature_page
## 127  feature_page
## 128  feature_page
## 129  feature_page
## 130  feature_page
## 131  feature_page
## 132  feature_page
## 133  feature_page
## 134  feature_page
## 135  feature_page
## 136  feature_page
## 137  feature_page
## 138  feature_page
## 139  feature_page
## 140  feature_page
## 141  feature_page
## 142  feature_page
## 143  feature_page
## 144  feature_page
## 145  feature_page
## 146  feature_page
## 147  feature_page
## 148  feature_page
## 149  feature_page
## 150  feature_page
## 151  feature_page
## 152  feature_page
## 153  feature_page
## 154  feature_page
## 155  feature_page
## 156  feature_page
## 157  feature_page
## 158  feature_page
## 159  feature_page
## 160  feature_page
## 161  feature_page
## 162  feature_page
## 163  feature_page
## 164  feature_page
## 165  feature_page
## 166  feature_page
## 167  feature_page
## 168  feature_page
## 169  feature_page
## 170  feature_page
## 171  feature_page
## 172  feature_page
## 173  feature_page
## 174  feature_page
## 175  feature_page
## 176  feature_page
## 177  feature_page
## 178  feature_page
## 179  feature_page
## 180  feature_page
## 181  feature_page
## 182  feature_page
## 183  feature_page
## 184  feature_page
## 185  feature_page
## 186  feature_page
## 187  feature_page
## 188  feature_page
## 189  feature_page
## 190  feature_page
## 191  feature_page
## 192  feature_page
## 193  feature_page
## 194  feature_page
## 195  feature_page
## 196  feature_page
## 197  feature_page
## 198  feature_page
## 199  feature_page
## 200  feature_page
## 201  feature_page
## 202     structure
## 203     structure
## 204     structure
## 205     structure
## 206     structure
## 207     structure
## 208     structure
## 209     structure
## 210     structure
## 211     structure
## 212     structure
## 213     structure
## 214     structure
## 215     structure
## 216     structure
## 217     structure
## 218     structure
## 219     structure
## 220     structure
## 221     structure
## 222     structure
## 223     structure
## 224     structure
## 225     structure
## 226     structure
## 227     structure
## 228     structure
## 229     structure
## 230     structure
## 231     structure
## 232     structure
## 233     structure
## 234     structure
## 235     structure
## 236     structure
## 237     structure
## 238     structure
## 239     structure
## 240     structure
## 241     structure
## 242      homologs
## 243      homologs
## 244      homologs
## 245      homologs
## 246      homologs
## 247      homologs
## 248      homologs
## 249      homologs
## 250      homologs
## 251      homologs
## 252      homologs
## 253      homologs
## 254      homologs
## 255      homologs
## 256      homologs
## 257      homologs
## 258      homologs
## 259      homologs
## 260      homologs
## 261      homologs
## 262      homologs
## 263      homologs
## 264      homologs
## 265      homologs
## 266      homologs
## 267      homologs
## 268      homologs
## 269      homologs
## 270      homologs
## 271      homologs
## 272      homologs
## 273      homologs
## 274      homologs
## 275      homologs
## 276      homologs
## 277      homologs
## 278      homologs
## 279      homologs
## 280      homologs
## 281      homologs
## 282      homologs
## 283      homologs
## 284      homologs
## 285      homologs
## 286      homologs
## 287      homologs
## 288      homologs
## 289      homologs
## 290      homologs
## 291      homologs
## 292      homologs
## 293      homologs
## 294      homologs
## 295      homologs
## 296      homologs
## 297      homologs
## 298      homologs
## 299      homologs
## 300      homologs
## 301      homologs
## 302      homologs
## 303      homologs
## 304      homologs
## 305      homologs
## 306      homologs
## 307      homologs
## 308      homologs
## 309      homologs
## 310      homologs
## 311      homologs
## 312      homologs
## 313      homologs
## 314      homologs
## 315      homologs
## 316      homologs
## 317      homologs
## 318      homologs
## 319      homologs
## 320      homologs
## 321      homologs
## 322      homologs
## 323      homologs
## 324      homologs
## 325      homologs
## 326      homologs
## 327      homologs
## 328      homologs
## 329      homologs
## 330      homologs
## 331      homologs
## 332      homologs
## 333      homologs
## 334      homologs
## 335      homologs
## 336      homologs
## 337      homologs
## 338      homologs
## 339      homologs
## 340      homologs
## 341      homologs
## 342      homologs
## 343      homologs
## 344      homologs
## 345      homologs
## 346      homologs
## 347      homologs
## 348      homologs
## 349      homologs
## 350      homologs
## 351      homologs
## 352      homologs
## 353      homologs
## 354      homologs
## 355      homologs
## 356      homologs
## 357      homologs
## 358      homologs
## 359      homologs
## 360      homologs
## 361      homologs
## 362      homologs
## 363      homologs
## 364      homologs
## 365      homologs
## 366      homologs
## 367      homologs
## 368      homologs
## 369      homologs
## 370      homologs
## 371      homologs
## 372      homologs
## 373      homologs
## 374      homologs
## 375      homologs
## 376      homologs
## 377      homologs
## 378      homologs
## 379      homologs
## 380      homologs
## 381      homologs
## 382      homologs
## 383      homologs
## 384      homologs
## 385      homologs
## 386      homologs
## 387      homologs
## 388      homologs
## 389      homologs
## 390      homologs
## 391      homologs
## 392      homologs
## 393      homologs
## 394      homologs
## 395      homologs
## 396      homologs
## 397      homologs
## 398      homologs
## 399      homologs
## 400      homologs
## 401      homologs
## 402      homologs
## 403      homologs
## 404      homologs
## 405      homologs
## 406      homologs
## 407      homologs
## 408      homologs
## 409      homologs
## 410      homologs
## 411      homologs
## 412      homologs
## 413      homologs
## 414      homologs
## 415      homologs
## 416      homologs
## 417      homologs
## 418      homologs
## 419      homologs
## 420      homologs
## 421      homologs
## 422      homologs
## 423      homologs
## 424      homologs
## 425      homologs
## 426      homologs
## 427      homologs
## 428      homologs
## 429      homologs
## 430      homologs
## 431      homologs
## 432      homologs
## 433      homologs
## 434      homologs
## 435      homologs
## 436      homologs
## 437      homologs
## 438      homologs
## 439      homologs
## 440      homologs
## 441      homologs
## 442      homologs
## 443      homologs
## 444      homologs
## 445      homologs
## 446      homologs
## 447      homologs
## 448      homologs
## 449      homologs
## 450      homologs
## 451      homologs
## 452      homologs
## 453      homologs
## 454      homologs
## 455      homologs
## 456      homologs
## 457      homologs
## 458      homologs
## 459      homologs
## 460      homologs
## 461      homologs
## 462      homologs
## 463      homologs
## 464      homologs
## 465      homologs
## 466      homologs
## 467      homologs
## 468      homologs
## 469      homologs
## 470      homologs
## 471      homologs
## 472      homologs
## 473      homologs
## 474      homologs
## 475      homologs
## 476      homologs
## 477      homologs
## 478      homologs
## 479      homologs
## 480      homologs
## 481      homologs
## 482      homologs
## 483      homologs
## 484      homologs
## 485      homologs
## 486      homologs
## 487      homologs
## 488      homologs
## 489      homologs
## 490      homologs
## 491      homologs
## 492      homologs
## 493      homologs
## 494      homologs
## 495      homologs
## 496      homologs
## 497      homologs
## 498      homologs
## 499      homologs
## 500      homologs
## 501      homologs
## 502      homologs
## 503      homologs
## 504      homologs
## 505      homologs
## 506      homologs
## 507      homologs
## 508      homologs
## 509      homologs
## 510      homologs
## 511      homologs
## 512      homologs
## 513      homologs
## 514      homologs
## 515      homologs
## 516      homologs
## 517      homologs
## 518      homologs
## 519      homologs
## 520      homologs
## 521      homologs
## 522      homologs
## 523      homologs
## 524      homologs
## 525      homologs
## 526      homologs
## 527      homologs
## 528      homologs
## 529      homologs
## 530      homologs
## 531      homologs
## 532      homologs
## 533      homologs
## 534      homologs
## 535      homologs
## 536      homologs
## 537      homologs
## 538      homologs
## 539      homologs
## 540      homologs
## 541      homologs
## 542      homologs
## 543      homologs
## 544      homologs
## 545      homologs
## 546      homologs
## 547      homologs
## 548      homologs
## 549      homologs
## 550      homologs
## 551      homologs
## 552      homologs
## 553      homologs
## 554      homologs
## 555      homologs
## 556      homologs
## 557      homologs
## 558      homologs
## 559      homologs
## 560      homologs
## 561      homologs
## 562      homologs
## 563      homologs
## 564      homologs
## 565      homologs
## 566      homologs
## 567      homologs
## 568      homologs
## 569      homologs
## 570      homologs
## 571      homologs
## 572      homologs
## 573      homologs
## 574      homologs
## 575      homologs
## 576      homologs
## 577      homologs
## 578      homologs
## 579      homologs
## 580      homologs
## 581      homologs
## 582      homologs
## 583      homologs
## 584      homologs
## 585      homologs
## 586      homologs
## 587      homologs
## 588      homologs
## 589      homologs
## 590      homologs
## 591      homologs
## 592      homologs
## 593      homologs
## 594      homologs
## 595      homologs
## 596      homologs
## 597      homologs
## 598      homologs
## 599      homologs
## 600      homologs
## 601      homologs
## 602      homologs
## 603      homologs
## 604      homologs
## 605      homologs
## 606      homologs
## 607      homologs
## 608      homologs
## 609      homologs
## 610      homologs
## 611      homologs
## 612      homologs
## 613      homologs
## 614      homologs
## 615      homologs
## 616      homologs
## 617      homologs
## 618      homologs
## 619      homologs
## 620      homologs
## 621      homologs
## 622      homologs
## 623      homologs
## 624      homologs
## 625      homologs
## 626      homologs
## 627      homologs
## 628      homologs
## 629      homologs
## 630      homologs
## 631      homologs
## 632      homologs
## 633      homologs
## 634      homologs
## 635      homologs
## 636      homologs
## 637      homologs
## 638      homologs
## 639      homologs
## 640      homologs
## 641      homologs
## 642      homologs
## 643      homologs
## 644      homologs
## 645      homologs
## 646      homologs
## 647      homologs
## 648      homologs
## 649      homologs
## 650      homologs
## 651      homologs
## 652      homologs
## 653      homologs
## 654      homologs
## 655      homologs
## 656      homologs
## 657      homologs
## 658      homologs
## 659      homologs
## 660      homologs
## 661      homologs
## 662      homologs
## 663      homologs
## 664      homologs
## 665      homologs
## 666      homologs
## 667      homologs
## 668      homologs
## 669      homologs
## 670      homologs
## 671      homologs
## 672      homologs
## 673      homologs
## 674      homologs
## 675      homologs
## 676      homologs
## 677      homologs
## 678      homologs
## 679      homologs
## 680      homologs
## 681      homologs
## 682      homologs
## 683      homologs
## 684      homologs
## 685      homologs
## 686      homologs
## 687      homologs
## 688      homologs
## 689      homologs
## 690      homologs
## 691      homologs
## 692      homologs
## 693      homologs
## 694      homologs
## 695      homologs
## 696      homologs
## 697      homologs
## 698      homologs
## 699      homologs
## 700      homologs
## 701      homologs
## 702      homologs
## 703      homologs
## 704      homologs
## 705      homologs
## 706      homologs
## 707      homologs
## 708      homologs
## 709      homologs
## 710      homologs
## 711      homologs
## 712      homologs
## 713      homologs
## 714      homologs
## 715      homologs
## 716      homologs
## 717      homologs
## 718      homologs
## 719      homologs
## 720      homologs
## 721      homologs
## 722      homologs
## 723      homologs
## 724      homologs
## 725      homologs
## 726      homologs
## 727      homologs
## 728      homologs
## 729      homologs
## 730      homologs
## 731      homologs
## 732      homologs
## 733      homologs
## 734      homologs
## 735      homologs
## 736      homologs
## 737      homologs
## 738      homologs
## 739      homologs
## 740      homologs
## 741      homologs
## 742      homologs
## 743      homologs
## 744      homologs
## 745      homologs
## 746      homologs
## 747      homologs
## 748      homologs
## 749      homologs
## 750      homologs
## 751      homologs
## 752      homologs
## 753      homologs
## 754      homologs
## 755      homologs
## 756      homologs
## 757      homologs
## 758      homologs
## 759      homologs
## 760      homologs
## 761      homologs
## 762      homologs
## 763      homologs
## 764      homologs
## 765      homologs
## 766      homologs
## 767      homologs
## 768      homologs
## 769      homologs
## 770      homologs
## 771      homologs
## 772      homologs
## 773      homologs
## 774      homologs
## 775      homologs
## 776      homologs
## 777      homologs
## 778      homologs
## 779      homologs
## 780      homologs
## 781      homologs
## 782      homologs
## 783      homologs
## 784      homologs
## 785      homologs
## 786      homologs
## 787      homologs
## 788      homologs
## 789      homologs
## 790      homologs
## 791      homologs
## 792      homologs
## 793      homologs
## 794      homologs
## 795      homologs
## 796      homologs
## 797      homologs
## 798      homologs
## 799      homologs
## 800      homologs
## 801      homologs
## 802      homologs
## 803      homologs
## 804      homologs
## 805      homologs
## 806      homologs
## 807      homologs
## 808      homologs
## 809      homologs
## 810      homologs
## 811      homologs
## 812      homologs
## 813      homologs
## 814      homologs
## 815      homologs
## 816      homologs
## 817      homologs
## 818      homologs
## 819      homologs
## 820      homologs
## 821      homologs
## 822      homologs
## 823      homologs
## 824      homologs
## 825      homologs
## 826      homologs
## 827      homologs
## 828      homologs
## 829      homologs
## 830      homologs
## 831      homologs
## 832      homologs
## 833      homologs
## 834      homologs
## 835      homologs
## 836      homologs
## 837      homologs
## 838      homologs
## 839      homologs
## 840      homologs
## 841      homologs
## 842      homologs
## 843      homologs
## 844      homologs
## 845      homologs
## 846      homologs
## 847      homologs
## 848      homologs
## 849      homologs
## 850      homologs
## 851      homologs
## 852      homologs
## 853      homologs
## 854      homologs
## 855      homologs
## 856      homologs
## 857      homologs
## 858      homologs
## 859      homologs
## 860      homologs
## 861      homologs
## 862      homologs
## 863      homologs
## 864      homologs
## 865      homologs
## 866      homologs
## 867      homologs
## 868      homologs
## 869      homologs
## 870      homologs
## 871      homologs
## 872      homologs
## 873      homologs
## 874      homologs
## 875      homologs
## 876      homologs
## 877      homologs
## 878      homologs
## 879      homologs
## 880      homologs
## 881      homologs
## 882      homologs
## 883      homologs
## 884      homologs
## 885      homologs
## 886      homologs
## 887      homologs
## 888      homologs
## 889      homologs
## 890      homologs
## 891      homologs
## 892      homologs
## 893      homologs
## 894      homologs
## 895      homologs
## 896      homologs
## 897      homologs
## 898      homologs
## 899      homologs
## 900      homologs
## 901      homologs
## 902      homologs
## 903      homologs
## 904      homologs
## 905      homologs
## 906      homologs
## 907      homologs
## 908      homologs
## 909      homologs
## 910      homologs
## 911      homologs
## 912      homologs
## 913      homologs
## 914      homologs
## 915      homologs
## 916      homologs
## 917      homologs
## 918      homologs
## 919      homologs
## 920      homologs
## 921      homologs
## 922      homologs
## 923      homologs
## 924      homologs
## 925      homologs
## 926      homologs
## 927      homologs
## 928      homologs
## 929      homologs
## 930      homologs
## 931      homologs
## 932      homologs
## 933      homologs
## 934      homologs
## 935      homologs
## 936      homologs
## 937      homologs
## 938      homologs
## 939      homologs
## 940      homologs
## 941      homologs
## 942      homologs
## 943      homologs
## 944      homologs
## 945      homologs
## 946      homologs
## 947      homologs
## 948      homologs
## 949      homologs
## 950      homologs
## 951      homologs
## 952      homologs
## 953      homologs
## 954      homologs
## 955      homologs
## 956      homologs
## 957      homologs
## 958      homologs
## 959      homologs
## 960      homologs
## 961      homologs
## 962      homologs
## 963      homologs
## 964      homologs
## 965      homologs
## 966      homologs
## 967      homologs
## 968      homologs
## 969      homologs
## 970      homologs
## 971      homologs
## 972      homologs
## 973      homologs
## 974      homologs
## 975      homologs
## 976      homologs
## 977      homologs
## 978      homologs
## 979      homologs
## 980      homologs
## 981      homologs
## 982      homologs
## 983      homologs
## 984      homologs
## 985      homologs
## 986      homologs
## 987      homologs
## 988      homologs
## 989      homologs
## 990      homologs
## 991      homologs
## 992      homologs
## 993      homologs
## 994      homologs
## 995      homologs
## 996      homologs
## 997      homologs
## 998      homologs
## 999      homologs
## 1000     homologs
## 1001     homologs
## 1002     homologs
## 1003     homologs
## 1004     homologs
## 1005     homologs
## 1006     homologs
## 1007     homologs
## 1008     homologs
## 1009     homologs
## 1010     homologs
## 1011     homologs
## 1012     homologs
## 1013     homologs
## 1014     homologs
## 1015     homologs
## 1016     homologs
## 1017     homologs
## 1018     homologs
## 1019     homologs
## 1020     homologs
## 1021     homologs
## 1022     homologs
## 1023     homologs
## 1024     homologs
## 1025     homologs
## 1026     homologs
## 1027     homologs
## 1028     homologs
## 1029     homologs
## 1030     homologs
## 1031     homologs
## 1032     homologs
## 1033     homologs
## 1034     homologs
## 1035     homologs
## 1036     homologs
## 1037     homologs
## 1038     homologs
## 1039     homologs
## 1040     homologs
## 1041     homologs
## 1042     homologs
## 1043     homologs
## 1044     homologs
## 1045     homologs
## 1046     homologs
## 1047     homologs
## 1048     homologs
## 1049     homologs
## 1050     homologs
## 1051     homologs
## 1052     homologs
## 1053     homologs
## 1054     homologs
## 1055     homologs
## 1056     homologs
## 1057     homologs
## 1058     homologs
## 1059     homologs
## 1060     homologs
## 1061     homologs
## 1062     homologs
## 1063     homologs
## 1064     homologs
## 1065     homologs
## 1066     homologs
## 1067     homologs
## 1068     homologs
## 1069     homologs
## 1070     homologs
## 1071     homologs
## 1072     homologs
## 1073     homologs
## 1074     homologs
## 1075     homologs
## 1076     homologs
## 1077     homologs
## 1078     homologs
## 1079     homologs
## 1080     homologs
## 1081     homologs
## 1082     homologs
## 1083     homologs
## 1084     homologs
## 1085     homologs
## 1086     homologs
## 1087     homologs
## 1088     homologs
## 1089     homologs
## 1090     homologs
## 1091     homologs
## 1092     homologs
## 1093     homologs
## 1094     homologs
## 1095     homologs
## 1096     homologs
## 1097     homologs
## 1098     homologs
## 1099     homologs
## 1100     homologs
## 1101     homologs
## 1102     homologs
## 1103     homologs
## 1104     homologs
## 1105     homologs
## 1106     homologs
## 1107     homologs
## 1108     homologs
## 1109     homologs
## 1110     homologs
## 1111     homologs
## 1112     homologs
## 1113     homologs
## 1114     homologs
## 1115     homologs
## 1116     homologs
## 1117     homologs
## 1118     homologs
## 1119     homologs
## 1120     homologs
## 1121     homologs
## 1122     homologs
## 1123     homologs
## 1124     homologs
## 1125     homologs
## 1126     homologs
## 1127     homologs
## 1128     homologs
## 1129     homologs
## 1130     homologs
## 1131     homologs
## 1132     homologs
## 1133     homologs
## 1134     homologs
## 1135     homologs
## 1136     homologs
## 1137     homologs
## 1138     homologs
## 1139     homologs
## 1140     homologs
## 1141     homologs
## 1142     homologs
## 1143     homologs
## 1144     homologs
## 1145     homologs
## 1146     homologs
## 1147     homologs
## 1148     homologs
## 1149     homologs
## 1150     homologs
## 1151     homologs
## 1152     homologs
## 1153     homologs
## 1154     homologs
## 1155     homologs
## 1156     homologs
## 1157     homologs
## 1158     homologs
## 1159     homologs
## 1160     homologs
## 1161     homologs
## 1162     homologs
## 1163     homologs
## 1164     homologs
## 1165     homologs
## 1166     homologs
## 1167     homologs
## 1168     homologs
## 1169     homologs
## 1170     homologs
## 1171     homologs
## 1172     homologs
## 1173     homologs
## 1174     homologs
## 1175     homologs
## 1176     homologs
## 1177     homologs
## 1178     homologs
## 1179     homologs
## 1180     homologs
## 1181     homologs
## 1182     homologs
## 1183     homologs
## 1184     homologs
## 1185     homologs
## 1186     homologs
## 1187     homologs
## 1188     homologs
## 1189     homologs
## 1190     homologs
## 1191     homologs
## 1192     homologs
## 1193     homologs
## 1194     homologs
## 1195     homologs
## 1196     homologs
## 1197     homologs
## 1198     homologs
## 1199     homologs
## 1200     homologs
## 1201     homologs
## 1202     homologs
## 1203     homologs
## 1204     homologs
## 1205     homologs
## 1206     homologs
## 1207     homologs
## 1208     homologs
## 1209     homologs
## 1210     homologs
## 1211     homologs
## 1212     homologs
## 1213     homologs
## 1214     homologs
## 1215     homologs
## 1216     homologs
## 1217     homologs
## 1218     homologs
## 1219     homologs
## 1220     homologs
## 1221     homologs
## 1222     homologs
## 1223     homologs
## 1224     homologs
## 1225     homologs
## 1226     homologs
## 1227     homologs
## 1228     homologs
## 1229     homologs
## 1230     homologs
## 1231     homologs
## 1232     homologs
## 1233     homologs
## 1234     homologs
## 1235     homologs
## 1236     homologs
## 1237     homologs
## 1238     homologs
## 1239     homologs
## 1240     homologs
## 1241     homologs
## 1242     homologs
## 1243     homologs
## 1244     homologs
## 1245     homologs
## 1246     homologs
## 1247     homologs
## 1248     homologs
## 1249     homologs
## 1250     homologs
## 1251     homologs
## 1252     homologs
## 1253     homologs
## 1254     homologs
## 1255     homologs
## 1256     homologs
## 1257     homologs
## 1258     homologs
## 1259     homologs
## 1260     homologs
## 1261     homologs
## 1262     homologs
## 1263     homologs
## 1264     homologs
## 1265     homologs
## 1266     homologs
## 1267     homologs
## 1268     homologs
## 1269     homologs
## 1270     homologs
## 1271     homologs
## 1272     homologs
## 1273     homologs
## 1274     homologs
## 1275     homologs
## 1276     homologs
## 1277     homologs
## 1278     homologs
## 1279     homologs
## 1280     homologs
## 1281     homologs
## 1282     homologs
## 1283     homologs
## 1284     homologs
## 1285     homologs
## 1286     homologs
## 1287     homologs
## 1288     homologs
## 1289     homologs
## 1290     homologs
## 1291     homologs
## 1292     homologs
## 1293     homologs
## 1294     homologs
## 1295     homologs
## 1296     homologs
## 1297     homologs
## 1298     homologs
## 1299     homologs
## 1300     homologs
## 1301     homologs
## 1302     homologs
## 1303     homologs
## 1304     homologs
## 1305     homologs
## 1306     homologs
## 1307     homologs
## 1308     homologs
## 1309     homologs
## 1310     homologs
## 1311     homologs
## 1312     homologs
## 1313     homologs
## 1314     homologs
## 1315     homologs
## 1316     homologs
## 1317     homologs
## 1318     homologs
## 1319     homologs
## 1320     homologs
## 1321     homologs
## 1322     homologs
## 1323     homologs
## 1324     homologs
## 1325     homologs
## 1326     homologs
## 1327     homologs
## 1328     homologs
## 1329     homologs
## 1330     homologs
## 1331     homologs
## 1332     homologs
## 1333     homologs
## 1334     homologs
## 1335     homologs
## 1336     homologs
## 1337     homologs
## 1338     homologs
## 1339     homologs
## 1340     homologs
## 1341     homologs
## 1342     homologs
## 1343     homologs
## 1344     homologs
## 1345     homologs
## 1346     homologs
## 1347     homologs
## 1348     homologs
## 1349     homologs
## 1350     homologs
## 1351     homologs
## 1352     homologs
## 1353     homologs
## 1354     homologs
## 1355     homologs
## 1356     homologs
## 1357     homologs
## 1358     homologs
## 1359     homologs
## 1360     homologs
## 1361     homologs
## 1362     homologs
## 1363     homologs
## 1364     homologs
## 1365     homologs
## 1366     homologs
## 1367     homologs
## 1368     homologs
## 1369     homologs
## 1370     homologs
## 1371     homologs
## 1372     homologs
## 1373     homologs
## 1374     homologs
## 1375     homologs
## 1376     homologs
## 1377     homologs
## 1378     homologs
## 1379     homologs
## 1380     homologs
## 1381     homologs
## 1382     homologs
## 1383     homologs
## 1384     homologs
## 1385     homologs
## 1386     homologs
## 1387     homologs
## 1388     homologs
## 1389     homologs
## 1390     homologs
## 1391     homologs
## 1392     homologs
## 1393     homologs
## 1394     homologs
## 1395     homologs
## 1396     homologs
## 1397     homologs
## 1398     homologs
## 1399     homologs
## 1400     homologs
## 1401     homologs
## 1402     homologs
## 1403     homologs
## 1404     homologs
## 1405     homologs
## 1406     homologs
## 1407     homologs
## 1408     homologs
## 1409     homologs
## 1410     homologs
## 1411     homologs
## 1412     homologs
## 1413     homologs
## 1414     homologs
## 1415     homologs
## 1416     homologs
## 1417     homologs
## 1418     homologs
## 1419     homologs
## 1420     homologs
## 1421     homologs
## 1422     homologs
## 1423     homologs
## 1424     homologs
## 1425     homologs
## 1426     homologs
## 1427     homologs
## 1428     homologs
## 1429     homologs
## 1430     homologs
## 1431     homologs
## 1432     homologs
## 1433     homologs
## 1434     homologs
## 1435     homologs
## 1436     homologs
## 1437     homologs
## 1438     homologs
## 1439     homologs
## 1440     homologs
## 1441     homologs
## 1442     homologs
## 1443     homologs
## 1444     homologs
## 1445     homologs
## 1446     homologs
## 1447     homologs
## 1448     homologs
## 1449     homologs
## 1450     homologs
## 1451     homologs
## 1452     homologs
## 1453     homologs
## 1454     homologs
## 1455     homologs
## 1456     homologs
## 1457     homologs
## 1458     homologs
## 1459     homologs
## 1460     homologs
## 1461     homologs
## 1462     homologs
## 1463     homologs
## 1464     homologs
## 1465     homologs
## 1466     homologs
## 1467     homologs
## 1468     homologs
## 1469     homologs
## 1470     homologs
## 1471     homologs
## 1472     homologs
## 1473     homologs
## 1474     homologs
## 1475     homologs
## 1476     homologs
## 1477     homologs
## 1478     homologs
## 1479     homologs
## 1480     homologs
## 1481     homologs
## 1482     homologs
## 1483     homologs
## 1484     homologs
## 1485     homologs
## 1486     homologs
## 1487     homologs
## 1488     homologs
## 1489     homologs
## 1490     homologs
## 1491     homologs
## 1492     homologs
## 1493     homologs
## 1494     homologs
## 1495     homologs
## 1496     homologs
## 1497     homologs
## 1498     homologs
## 1499     homologs
## 1500     homologs
## 1501     homologs
## 1502     homologs
## 1503     homologs
## 1504     homologs
## 1505     homologs
## 1506     homologs
## 1507     homologs
## 1508     homologs
## 1509     homologs
## 1510     homologs
## 1511     homologs
## 1512     homologs
## 1513     homologs
## 1514     homologs
## 1515     homologs
## 1516     homologs
## 1517     homologs
## 1518     homologs
## 1519     homologs
## 1520     homologs
## 1521     homologs
## 1522     homologs
## 1523     homologs
## 1524     homologs
## 1525     homologs
## 1526     homologs
## 1527     homologs
## 1528     homologs
## 1529     homologs
## 1530     homologs
## 1531     homologs
## 1532     homologs
## 1533     homologs
## 1534     homologs
## 1535     homologs
## 1536     homologs
## 1537     homologs
## 1538     homologs
## 1539     homologs
## 1540     homologs
## 1541     homologs
## 1542     homologs
## 1543     homologs
## 1544     homologs
## 1545     homologs
## 1546     homologs
## 1547     homologs
## 1548     homologs
## 1549     homologs
## 1550     homologs
## 1551     homologs
## 1552     homologs
## 1553     homologs
## 1554     homologs
## 1555     homologs
## 1556     homologs
## 1557     homologs
## 1558     homologs
## 1559     homologs
## 1560     homologs
## 1561     homologs
## 1562     homologs
## 1563     homologs
## 1564     homologs
## 1565     homologs
## 1566     homologs
## 1567     homologs
## 1568     homologs
## 1569     homologs
## 1570     homologs
## 1571     homologs
## 1572     homologs
## 1573     homologs
## 1574     homologs
## 1575     homologs
## 1576     homologs
## 1577     homologs
## 1578     homologs
## 1579     homologs
## 1580     homologs
## 1581     homologs
## 1582     homologs
## 1583     homologs
## 1584     homologs
## 1585     homologs
## 1586     homologs
## 1587     homologs
## 1588     homologs
## 1589     homologs
## 1590     homologs
## 1591     homologs
## 1592     homologs
## 1593     homologs
## 1594     homologs
## 1595     homologs
## 1596     homologs
## 1597     homologs
## 1598     homologs
## 1599     homologs
## 1600     homologs
## 1601     homologs
## 1602     homologs
## 1603     homologs
## 1604     homologs
## 1605     homologs
## 1606     homologs
## 1607     homologs
## 1608     homologs
## 1609     homologs
## 1610     homologs
## 1611     homologs
## 1612     homologs
## 1613     homologs
## 1614     homologs
## 1615     homologs
## 1616     homologs
## 1617     homologs
## 1618     homologs
## 1619     homologs
## 1620     homologs
## 1621     homologs
## 1622     homologs
## 1623     homologs
## 1624     homologs
## 1625     homologs
## 1626     homologs
## 1627     homologs
## 1628     homologs
## 1629     homologs
## 1630     homologs
## 1631     homologs
## 1632     homologs
## 1633     homologs
## 1634     homologs
## 1635     homologs
## 1636     homologs
## 1637     homologs
## 1638     homologs
## 1639     homologs
## 1640     homologs
## 1641     homologs
## 1642     homologs
## 1643     homologs
## 1644     homologs
## 1645     homologs
## 1646     homologs
## 1647     homologs
## 1648     homologs
## 1649     homologs
## 1650     homologs
## 1651     homologs
## 1652     homologs
## 1653     homologs
## 1654     homologs
## 1655     homologs
## 1656     homologs
## 1657     homologs
## 1658     homologs
## 1659     homologs
## 1660     homologs
## 1661     homologs
## 1662     homologs
## 1663     homologs
## 1664     homologs
## 1665     homologs
## 1666     homologs
## 1667     homologs
## 1668     homologs
## 1669     homologs
## 1670     homologs
## 1671     homologs
## 1672     homologs
## 1673     homologs
## 1674     homologs
## 1675     homologs
## 1676     homologs
## 1677     homologs
## 1678     homologs
## 1679     homologs
## 1680     homologs
## 1681     homologs
## 1682     homologs
## 1683     homologs
## 1684     homologs
## 1685     homologs
## 1686     homologs
## 1687     homologs
## 1688     homologs
## 1689     homologs
## 1690     homologs
## 1691     homologs
## 1692     homologs
## 1693     homologs
## 1694     homologs
## 1695     homologs
## 1696     homologs
## 1697     homologs
## 1698     homologs
## 1699     homologs
## 1700     homologs
## 1701     homologs
## 1702     homologs
## 1703     homologs
## 1704     homologs
## 1705     homologs
## 1706     homologs
## 1707     homologs
## 1708     homologs
## 1709     homologs
## 1710     homologs
## 1711     homologs
## 1712     homologs
## 1713     homologs
## 1714     homologs
## 1715     homologs
## 1716     homologs
## 1717     homologs
## 1718     homologs
## 1719     homologs
## 1720     homologs
## 1721     homologs
## 1722     homologs
## 1723     homologs
## 1724     homologs
## 1725     homologs
## 1726     homologs
## 1727     homologs
## 1728     homologs
## 1729     homologs
## 1730     homologs
## 1731     homologs
## 1732     homologs
## 1733     homologs
## 1734     homologs
## 1735     homologs
## 1736     homologs
## 1737     homologs
## 1738     homologs
## 1739     homologs
## 1740     homologs
## 1741     homologs
## 1742     homologs
## 1743     homologs
## 1744     homologs
## 1745     homologs
## 1746     homologs
## 1747     homologs
## 1748     homologs
## 1749     homologs
## 1750     homologs
## 1751     homologs
## 1752     homologs
## 1753     homologs
## 1754     homologs
## 1755     homologs
## 1756     homologs
## 1757     homologs
## 1758     homologs
## 1759     homologs
## 1760     homologs
## 1761     homologs
## 1762     homologs
## 1763     homologs
## 1764     homologs
## 1765     homologs
## 1766     homologs
## 1767     homologs
## 1768     homologs
## 1769     homologs
## 1770     homologs
## 1771     homologs
## 1772     homologs
## 1773     homologs
## 1774     homologs
## 1775     homologs
## 1776     homologs
## 1777     homologs
## 1778     homologs
## 1779     homologs
## 1780     homologs
## 1781     homologs
## 1782     homologs
## 1783     homologs
## 1784     homologs
## 1785     homologs
## 1786     homologs
## 1787     homologs
## 1788     homologs
## 1789     homologs
## 1790     homologs
## 1791     homologs
## 1792     homologs
## 1793     homologs
## 1794     homologs
## 1795     homologs
## 1796     homologs
## 1797     homologs
## 1798     homologs
## 1799     homologs
## 1800     homologs
## 1801     homologs
## 1802     homologs
## 1803     homologs
## 1804     homologs
## 1805     homologs
## 1806     homologs
## 1807     homologs
## 1808     homologs
## 1809     homologs
## 1810     homologs
## 1811     homologs
## 1812     homologs
## 1813     homologs
## 1814     homologs
## 1815     homologs
## 1816     homologs
## 1817     homologs
## 1818     homologs
## 1819     homologs
## 1820     homologs
## 1821     homologs
## 1822     homologs
## 1823     homologs
## 1824     homologs
## 1825     homologs
## 1826     homologs
## 1827     homologs
## 1828     homologs
## 1829     homologs
## 1830     homologs
## 1831     homologs
## 1832     homologs
## 1833     homologs
## 1834     homologs
## 1835     homologs
## 1836     homologs
## 1837     homologs
## 1838     homologs
## 1839     homologs
## 1840     homologs
## 1841     homologs
## 1842     homologs
## 1843     homologs
## 1844     homologs
## 1845     homologs
## 1846     homologs
## 1847     homologs
## 1848     homologs
## 1849     homologs
## 1850     homologs
## 1851     homologs
## 1852     homologs
## 1853     homologs
## 1854     homologs
## 1855     homologs
## 1856     homologs
## 1857     homologs
## 1858     homologs
## 1859     homologs
## 1860     homologs
## 1861     homologs
## 1862     homologs
## 1863     homologs
## 1864     homologs
## 1865     homologs
## 1866     homologs
## 1867     homologs
## 1868     homologs
## 1869     homologs
## 1870     homologs
## 1871     homologs
## 1872     homologs
## 1873     homologs
## 1874     homologs
## 1875     homologs
## 1876     homologs
## 1877     homologs
## 1878     homologs
## 1879     homologs
## 1880     homologs
## 1881     homologs
## 1882     homologs
## 1883     homologs
## 1884     homologs
## 1885     homologs
## 1886     homologs
## 1887     homologs
## 1888     homologs
## 1889     homologs
## 1890     homologs
## 1891     homologs
## 1892     homologs
## 1893     homologs
## 1894     homologs
## 1895     homologs
## 1896     homologs
## 1897     homologs
## 1898     homologs
## 1899     homologs
## 1900     homologs
## 1901     homologs
## 1902     homologs
## 1903     homologs
## 1904     homologs
## 1905     homologs
## 1906     homologs
## 1907     homologs
## 1908     homologs
## 1909     homologs
## 1910     homologs
## 1911     homologs
## 1912     homologs
## 1913     homologs
## 1914     homologs
## 1915     homologs
## 1916     homologs
## 1917     homologs
## 1918     homologs
## 1919     homologs
## 1920     homologs
## 1921     homologs
## 1922     homologs
## 1923     homologs
## 1924     homologs
## 1925     homologs
## 1926     homologs
## 1927     homologs
## 1928     homologs
## 1929     homologs
## 1930     homologs
## 1931     homologs
## 1932     homologs
## 1933     homologs
## 1934     homologs
## 1935     homologs
## 1936     homologs
## 1937     homologs
## 1938     homologs
## 1939     homologs
## 1940     homologs
## 1941     homologs
## 1942     homologs
## 1943     homologs
## 1944     homologs
## 1945     homologs
## 1946     homologs
## 1947     homologs
## 1948     homologs
## 1949     homologs
## 1950     homologs
## 1951     homologs
## 1952     homologs
## 1953     homologs
## 1954     homologs
## 1955     homologs
## 1956     homologs
## 1957     homologs
## 1958     homologs
## 1959     homologs
## 1960     homologs
## 1961     homologs
## 1962     homologs
## 1963     homologs
## 1964     homologs
## 1965     homologs
## 1966     homologs
## 1967     homologs
## 1968     homologs
## 1969     homologs
## 1970     homologs
## 1971     homologs
## 1972     homologs
## 1973     homologs
## 1974     homologs
## 1975     homologs
## 1976     homologs
## 1977     homologs
## 1978     homologs
## 1979     homologs
## 1980     homologs
## 1981     homologs
## 1982     homologs
## 1983     homologs
## 1984     homologs
## 1985     homologs
## 1986     homologs
## 1987     homologs
## 1988     homologs
## 1989     homologs
## 1990     homologs
## 1991     homologs
## 1992     homologs
## 1993     homologs
## 1994     homologs
## 1995     homologs
## 1996     homologs
## 1997     homologs
## 1998     homologs
## 1999     homologs
## 2000     homologs
## 2001     homologs
## 2002     homologs
## 2003     homologs
## 2004     homologs
## 2005     homologs
## 2006     homologs
## 2007     homologs
## 2008     homologs
## 2009     homologs
## 2010     homologs
## 2011     homologs
## 2012     homologs
## 2013     homologs
## 2014     homologs
## 2015     homologs
## 2016     homologs
## 2017     homologs
## 2018     homologs
## 2019     homologs
## 2020     homologs
## 2021     homologs
## 2022     homologs
## 2023     homologs
## 2024     homologs
## 2025     homologs
## 2026     homologs
## 2027     homologs
## 2028     homologs
## 2029     homologs
## 2030     homologs
## 2031     homologs
## 2032     homologs
## 2033     homologs
## 2034     homologs
## 2035     homologs
## 2036     homologs
## 2037     homologs
## 2038     homologs
## 2039     homologs
## 2040     homologs
## 2041     homologs
## 2042     homologs
## 2043     homologs
## 2044     homologs
## 2045     homologs
## 2046     homologs
## 2047     homologs
## 2048     homologs
## 2049     homologs
## 2050     homologs
## 2051     homologs
## 2052     homologs
## 2053     homologs
## 2054     homologs
## 2055     homologs
## 2056     homologs
## 2057     homologs
## 2058     homologs
## 2059     homologs
## 2060     homologs
## 2061     homologs
## 2062     homologs
## 2063     homologs
## 2064     homologs
## 2065     homologs
## 2066     homologs
## 2067     homologs
## 2068     homologs
## 2069     homologs
## 2070     homologs
## 2071     homologs
## 2072     homologs
## 2073     homologs
## 2074     homologs
## 2075     homologs
## 2076     homologs
## 2077     homologs
## 2078     homologs
## 2079     homologs
## 2080     homologs
## 2081     homologs
## 2082     homologs
## 2083     homologs
## 2084     homologs
## 2085     homologs
## 2086     homologs
## 2087     homologs
## 2088     homologs
## 2089     homologs
## 2090     homologs
## 2091     homologs
## 2092     homologs
## 2093     homologs
## 2094     homologs
## 2095     homologs
## 2096     homologs
## 2097     homologs
## 2098     homologs
## 2099     homologs
## 2100     homologs
## 2101     homologs
## 2102     homologs
## 2103     homologs
## 2104     homologs
## 2105     homologs
## 2106     homologs
## 2107     homologs
## 2108     homologs
## 2109     homologs
## 2110     homologs
## 2111     homologs
## 2112     homologs
## 2113     homologs
## 2114     homologs
## 2115     homologs
## 2116     homologs
## 2117     homologs
## 2118     homologs
## 2119     homologs
## 2120     homologs
## 2121     homologs
## 2122     homologs
## 2123     homologs
## 2124     homologs
## 2125     homologs
## 2126     homologs
## 2127     homologs
## 2128     homologs
## 2129     homologs
## 2130     homologs
## 2131     homologs
## 2132     homologs
## 2133     homologs
## 2134     homologs
## 2135     homologs
## 2136     homologs
## 2137     homologs
## 2138     homologs
## 2139     homologs
## 2140     homologs
## 2141     homologs
## 2142     homologs
## 2143     homologs
## 2144     homologs
## 2145     homologs
## 2146     homologs
## 2147     homologs
## 2148     homologs
## 2149     homologs
## 2150     homologs
## 2151     homologs
## 2152     homologs
## 2153     homologs
## 2154     homologs
## 2155     homologs
## 2156     homologs
## 2157     homologs
## 2158     homologs
## 2159     homologs
## 2160     homologs
## 2161     homologs
## 2162     homologs
## 2163     homologs
## 2164     homologs
## 2165     homologs
## 2166     homologs
## 2167     homologs
## 2168     homologs
## 2169     homologs
## 2170     homologs
## 2171     homologs
## 2172     homologs
## 2173     homologs
## 2174     homologs
## 2175     homologs
## 2176     homologs
## 2177     homologs
## 2178     homologs
## 2179     homologs
## 2180     homologs
## 2181     homologs
## 2182     homologs
## 2183     homologs
## 2184     homologs
## 2185     homologs
## 2186     homologs
## 2187     homologs
## 2188     homologs
## 2189     homologs
## 2190     homologs
## 2191     homologs
## 2192     homologs
## 2193     homologs
## 2194     homologs
## 2195     homologs
## 2196     homologs
## 2197     homologs
## 2198     homologs
## 2199     homologs
## 2200     homologs
## 2201     homologs
## 2202     homologs
## 2203     homologs
## 2204     homologs
## 2205     homologs
## 2206     homologs
## 2207     homologs
## 2208     homologs
## 2209     homologs
## 2210     homologs
## 2211     homologs
## 2212     homologs
## 2213     homologs
## 2214     homologs
## 2215     homologs
## 2216     homologs
## 2217     homologs
## 2218     homologs
## 2219     homologs
## 2220     homologs
## 2221     homologs
## 2222     homologs
## 2223     homologs
## 2224     homologs
## 2225     homologs
## 2226     homologs
## 2227     homologs
## 2228     homologs
## 2229     homologs
## 2230     homologs
## 2231     homologs
## 2232     homologs
## 2233     homologs
## 2234     homologs
## 2235     homologs
## 2236     homologs
## 2237     homologs
## 2238     homologs
## 2239     homologs
## 2240     homologs
## 2241     homologs
## 2242     homologs
## 2243     homologs
## 2244     homologs
## 2245     homologs
## 2246     homologs
## 2247     homologs
## 2248     homologs
## 2249     homologs
## 2250     homologs
## 2251     homologs
## 2252     homologs
## 2253     homologs
## 2254     homologs
## 2255     homologs
## 2256     homologs
## 2257     homologs
## 2258     homologs
## 2259     homologs
## 2260     homologs
## 2261     homologs
## 2262     homologs
## 2263     homologs
## 2264     homologs
## 2265     homologs
## 2266     homologs
## 2267     homologs
## 2268     homologs
## 2269     homologs
## 2270     homologs
## 2271     homologs
## 2272     homologs
## 2273     homologs
## 2274     homologs
## 2275     homologs
## 2276     homologs
## 2277     homologs
## 2278     homologs
## 2279     homologs
## 2280     homologs
## 2281     homologs
## 2282     homologs
## 2283     homologs
## 2284     homologs
## 2285     homologs
## 2286     homologs
## 2287     homologs
## 2288     homologs
## 2289     homologs
## 2290     homologs
## 2291     homologs
## 2292     homologs
## 2293     homologs
## 2294     homologs
## 2295     homologs
## 2296     homologs
## 2297     homologs
## 2298     homologs
## 2299     homologs
## 2300     homologs
## 2301     homologs
## 2302     homologs
## 2303     homologs
## 2304     homologs
## 2305     homologs
## 2306     homologs
## 2307     homologs
## 2308     homologs
## 2309     homologs
## 2310     homologs
## 2311     homologs
## 2312     homologs
## 2313     homologs
## 2314     homologs
## 2315     homologs
## 2316     homologs
## 2317     homologs
## 2318     homologs
## 2319     homologs
## 2320     homologs
## 2321     homologs
## 2322     homologs
## 2323     homologs
## 2324     homologs
## 2325     homologs
## 2326     homologs
## 2327     homologs
## 2328     homologs
## 2329     homologs
## 2330     homologs
## 2331     homologs
## 2332     homologs
## 2333     homologs
## 2334     homologs
## 2335     homologs
## 2336     homologs
## 2337     homologs
## 2338     homologs
## 2339     homologs
## 2340     homologs
## 2341     homologs
## 2342     homologs
## 2343     homologs
## 2344     homologs
## 2345     homologs
## 2346     homologs
## 2347     homologs
## 2348     homologs
## 2349     homologs
## 2350     homologs
## 2351     homologs
## 2352     homologs
## 2353     homologs
## 2354     homologs
## 2355     homologs
## 2356     homologs
## 2357     homologs
## 2358     homologs
## 2359     homologs
## 2360     homologs
## 2361     homologs
## 2362     homologs
## 2363     homologs
## 2364     homologs
## 2365     homologs
## 2366     homologs
## 2367     homologs
## 2368     homologs
## 2369     homologs
## 2370     homologs
## 2371     homologs
## 2372     homologs
## 2373     homologs
## 2374     homologs
## 2375     homologs
## 2376     homologs
## 2377     homologs
## 2378     homologs
## 2379     homologs
## 2380     homologs
## 2381     homologs
## 2382     homologs
## 2383     homologs
## 2384     homologs
## 2385     homologs
## 2386     homologs
## 2387     homologs
## 2388     homologs
## 2389     homologs
## 2390     homologs
## 2391     homologs
## 2392     homologs
## 2393     homologs
## 2394     homologs
## 2395     homologs
## 2396     homologs
## 2397     homologs
## 2398     homologs
## 2399     homologs
## 2400     homologs
## 2401     homologs
## 2402     homologs
## 2403     homologs
## 2404     homologs
## 2405     homologs
## 2406     homologs
## 2407     homologs
## 2408     homologs
## 2409     homologs
## 2410     homologs
## 2411     homologs
## 2412     homologs
## 2413     homologs
## 2414     homologs
## 2415     homologs
## 2416     homologs
## 2417     homologs
## 2418     homologs
## 2419     homologs
## 2420     homologs
## 2421     homologs
## 2422     homologs
## 2423     homologs
## 2424     homologs
## 2425     homologs
## 2426     homologs
## 2427     homologs
## 2428     homologs
## 2429     homologs
## 2430     homologs
## 2431     homologs
## 2432     homologs
## 2433     homologs
## 2434     homologs
## 2435     homologs
## 2436     homologs
## 2437     homologs
## 2438     homologs
## 2439     homologs
## 2440     homologs
## 2441     homologs
## 2442     homologs
## 2443     homologs
## 2444     homologs
## 2445     homologs
## 2446     homologs
## 2447     homologs
## 2448     homologs
## 2449     homologs
## 2450     homologs
## 2451     homologs
## 2452     homologs
## 2453     homologs
## 2454     homologs
## 2455     homologs
## 2456     homologs
## 2457     homologs
## 2458     homologs
## 2459     homologs
## 2460     homologs
## 2461     homologs
## 2462     homologs
## 2463     homologs
## 2464     homologs
## 2465     homologs
## 2466     homologs
## 2467     homologs
## 2468     homologs
## 2469     homologs
## 2470     homologs
## 2471     homologs
## 2472     homologs
## 2473     homologs
## 2474     homologs
## 2475     homologs
## 2476     homologs
## 2477     homologs
## 2478     homologs
## 2479     homologs
## 2480     homologs
## 2481     homologs
## 2482     homologs
## 2483     homologs
## 2484     homologs
## 2485     homologs
## 2486     homologs
## 2487     homologs
## 2488     homologs
## 2489     homologs
## 2490     homologs
## 2491     homologs
## 2492     homologs
## 2493     homologs
## 2494     homologs
## 2495     homologs
## 2496     homologs
## 2497     homologs
## 2498     homologs
## 2499     homologs
## 2500     homologs
## 2501     homologs
## 2502     homologs
## 2503     homologs
## 2504     homologs
## 2505     homologs
## 2506     homologs
## 2507     homologs
## 2508     homologs
## 2509     homologs
## 2510     homologs
## 2511     homologs
## 2512     homologs
## 2513     homologs
## 2514     homologs
## 2515     homologs
## 2516     homologs
## 2517     homologs
## 2518     homologs
## 2519     homologs
## 2520     homologs
## 2521     homologs
## 2522     homologs
## 2523     homologs
## 2524     homologs
## 2525     homologs
## 2526     homologs
## 2527     homologs
## 2528     homologs
## 2529     homologs
## 2530     homologs
## 2531     homologs
## 2532     homologs
## 2533     homologs
## 2534     homologs
## 2535     homologs
## 2536     homologs
## 2537     homologs
## 2538     homologs
## 2539     homologs
## 2540     homologs
## 2541     homologs
## 2542     homologs
## 2543     homologs
## 2544     homologs
## 2545     homologs
## 2546     homologs
## 2547     homologs
## 2548     homologs
## 2549     homologs
## 2550     homologs
## 2551     homologs
## 2552     homologs
## 2553     homologs
## 2554     homologs
## 2555     homologs
## 2556     homologs
## 2557     homologs
## 2558     homologs
## 2559     homologs
## 2560     homologs
## 2561     homologs
## 2562     homologs
## 2563     homologs
## 2564     homologs
## 2565     homologs
## 2566     homologs
## 2567     homologs
## 2568     homologs
## 2569     homologs
## 2570     homologs
## 2571     homologs
## 2572     homologs
## 2573     homologs
## 2574     homologs
## 2575     homologs
## 2576     homologs
## 2577     homologs
## 2578     homologs
## 2579     homologs
## 2580     homologs
## 2581     homologs
## 2582     homologs
## 2583     homologs
## 2584     homologs
## 2585     homologs
## 2586     homologs
## 2587     homologs
## 2588     homologs
## 2589     homologs
## 2590     homologs
## 2591     homologs
## 2592     homologs
## 2593     homologs
## 2594     homologs
## 2595     homologs
## 2596     homologs
## 2597     homologs
## 2598     homologs
## 2599     homologs
## 2600     homologs
## 2601     homologs
## 2602     homologs
## 2603     homologs
## 2604     homologs
## 2605     homologs
## 2606     homologs
## 2607     homologs
## 2608     homologs
## 2609     homologs
## 2610     homologs
## 2611     homologs
## 2612     homologs
## 2613     homologs
## 2614     homologs
## 2615     homologs
## 2616     homologs
## 2617     homologs
## 2618     homologs
## 2619     homologs
## 2620     homologs
## 2621     homologs
## 2622     homologs
## 2623     homologs
## 2624     homologs
## 2625     homologs
## 2626     homologs
## 2627     homologs
## 2628     homologs
## 2629     homologs
## 2630     homologs
## 2631     homologs
## 2632     homologs
## 2633     homologs
## 2634     homologs
## 2635     homologs
## 2636     homologs
## 2637     homologs
## 2638     homologs
## 2639     homologs
## 2640     homologs
## 2641     homologs
## 2642     homologs
## 2643     homologs
## 2644     homologs
## 2645     homologs
## 2646     homologs
## 2647     homologs
## 2648     homologs
## 2649     homologs
## 2650     homologs
## 2651     homologs
## 2652     homologs
## 2653     homologs
## 2654     homologs
## 2655     homologs
## 2656     homologs
## 2657     homologs
## 2658     homologs
## 2659     homologs
## 2660     homologs
## 2661     homologs
## 2662     homologs
## 2663     homologs
## 2664     homologs
## 2665     homologs
## 2666     homologs
## 2667     homologs
## 2668     homologs
## 2669     homologs
## 2670     homologs
## 2671     homologs
## 2672     homologs
## 2673     homologs
## 2674     homologs
## 2675     homologs
## 2676     homologs
## 2677     homologs
## 2678     homologs
## 2679     homologs
## 2680     homologs
## 2681     homologs
## 2682     homologs
## 2683     homologs
## 2684     homologs
## 2685     homologs
## 2686     homologs
## 2687     homologs
## 2688     homologs
## 2689     homologs
## 2690     homologs
## 2691     homologs
## 2692     homologs
## 2693     homologs
## 2694     homologs
## 2695     homologs
## 2696     homologs
## 2697     homologs
## 2698     homologs
## 2699     homologs
## 2700     homologs
## 2701     homologs
## 2702     homologs
## 2703     homologs
## 2704     homologs
## 2705     homologs
## 2706     homologs
## 2707     homologs
## 2708     homologs
## 2709     homologs
## 2710     homologs
## 2711     homologs
## 2712     homologs
## 2713     homologs
## 2714     homologs
## 2715     homologs
## 2716     homologs
## 2717     homologs
## 2718     homologs
## 2719     homologs
## 2720     homologs
## 2721     homologs
## 2722     homologs
## 2723     homologs
## 2724     homologs
## 2725     homologs
## 2726     homologs
## 2727     homologs
## 2728     homologs
## 2729     homologs
## 2730     homologs
## 2731     homologs
## 2732     homologs
## 2733     homologs
## 2734     homologs
## 2735     homologs
## 2736     homologs
## 2737     homologs
## 2738     homologs
## 2739     homologs
## 2740     homologs
## 2741     homologs
## 2742     homologs
## 2743     homologs
## 2744     homologs
## 2745     homologs
## 2746     homologs
## 2747     homologs
## 2748     homologs
## 2749     homologs
## 2750     homologs
## 2751     homologs
## 2752     homologs
## 2753     homologs
## 2754     homologs
## 2755     homologs
## 2756     homologs
## 2757     homologs
## 2758     homologs
## 2759     homologs
## 2760     homologs
## 2761     homologs
## 2762     homologs
## 2763     homologs
## 2764     homologs
## 2765     homologs
## 2766     homologs
## 2767     homologs
## 2768     homologs
## 2769     homologs
## 2770     homologs
## 2771     homologs
## 2772     homologs
## 2773     homologs
## 2774     homologs
## 2775     homologs
## 2776     homologs
## 2777     homologs
## 2778     homologs
## 2779     homologs
## 2780     homologs
## 2781     homologs
## 2782     homologs
## 2783     homologs
## 2784     homologs
## 2785     homologs
## 2786     homologs
## 2787     homologs
## 2788     homologs
## 2789     homologs
## 2790     homologs
## 2791     homologs
## 2792     homologs
## 2793     homologs
## 2794     homologs
## 2795     homologs
## 2796     homologs
## 2797     homologs
## 2798     homologs
## 2799     homologs
## 2800     homologs
## 2801     homologs
## 2802     homologs
## 2803     homologs
## 2804     homologs
## 2805     homologs
## 2806     homologs
## 2807     homologs
## 2808     homologs
## 2809     homologs
## 2810     homologs
## 2811     homologs
## 2812     homologs
## 2813     homologs
## 2814     homologs
## 2815     homologs
## 2816     homologs
## 2817     homologs
## 2818     homologs
## 2819     homologs
## 2820     homologs
## 2821     homologs
## 2822     homologs
## 2823     homologs
## 2824     homologs
## 2825     homologs
## 2826     homologs
## 2827     homologs
## 2828     homologs
## 2829     homologs
## 2830     homologs
## 2831     homologs
## 2832     homologs
## 2833     homologs
## 2834     homologs
## 2835     homologs
## 2836     homologs
## 2837     homologs
## 2838     homologs
## 2839     homologs
## 2840     homologs
## 2841     homologs
## 2842     homologs
## 2843     homologs
## 2844     homologs
## 2845     homologs
## 2846     homologs
## 2847     homologs
## 2848     homologs
## 2849     homologs
## 2850     homologs
## 2851     homologs
## 2852     homologs
## 2853     homologs
## 2854     homologs
## 2855     homologs
## 2856     homologs
## 2857     homologs
## 2858     homologs
## 2859     homologs
## 2860     homologs
## 2861     homologs
## 2862     homologs
## 2863     homologs
## 2864     homologs
## 2865     homologs
## 2866     homologs
## 2867     homologs
## 2868     homologs
## 2869     homologs
## 2870     homologs
## 2871     homologs
## 2872     homologs
## 2873     homologs
## 2874     homologs
## 2875     homologs
## 2876     homologs
## 2877     homologs
## 2878     homologs
## 2879     homologs
## 2880     homologs
## 2881     homologs
## 2882     homologs
## 2883     homologs
## 2884     homologs
## 2885     homologs
## 2886     homologs
## 2887     homologs
## 2888     homologs
## 2889     homologs
## 2890     homologs
## 2891     homologs
## 2892     homologs
## 2893     homologs
## 2894     homologs
## 2895     homologs
## 2896     homologs
## 2897     homologs
## 2898     homologs
## 2899     homologs
## 2900     homologs
## 2901     homologs
## 2902     homologs
## 2903     homologs
## 2904     homologs
## 2905     homologs
## 2906     homologs
## 2907     homologs
## 2908     homologs
## 2909     homologs
## 2910     homologs
## 2911     homologs
## 2912     homologs
## 2913     homologs
## 2914     homologs
## 2915     homologs
## 2916     homologs
## 2917     homologs
## 2918     homologs
## 2919     homologs
## 2920     homologs
## 2921     homologs
## 2922     homologs
## 2923     homologs
## 2924     homologs
## 2925     homologs
## 2926     homologs
## 2927     homologs
## 2928     homologs
## 2929     homologs
## 2930     homologs
## 2931     homologs
## 2932     homologs
## 2933     homologs
## 2934     homologs
## 2935     homologs
## 2936     homologs
## 2937     homologs
## 2938     homologs
## 2939     homologs
## 2940     homologs
## 2941     homologs
## 2942     homologs
## 2943     homologs
## 2944     homologs
## 2945     homologs
## 2946     homologs
## 2947     homologs
## 2948     homologs
## 2949     homologs
## 2950     homologs
## 2951     homologs
## 2952     homologs
## 2953     homologs
## 2954     homologs
## 2955     homologs
## 2956     homologs
## 2957     homologs
## 2958     homologs
## 2959     homologs
## 2960     homologs
## 2961     homologs
## 2962     homologs
## 2963     homologs
## 2964     homologs
## 2965     homologs
## 2966     homologs
## 2967     homologs
## 2968     homologs
## 2969     homologs
## 2970     homologs
## 2971     homologs
## 2972     homologs
## 2973     homologs
## 2974     homologs
## 2975     homologs
## 2976     homologs
## 2977     homologs
## 2978     homologs
## 2979     homologs
## 2980     homologs
## 2981     homologs
## 2982     homologs
## 2983     homologs
## 2984     homologs
## 2985     homologs
## 2986     homologs
## 2987     homologs
## 2988     homologs
## 2989     homologs
## 2990     homologs
## 2991     homologs
## 2992     homologs
## 2993     homologs
## 2994     homologs
## 2995     homologs
## 2996     homologs
## 2997     homologs
## 2998     homologs
## 2999     homologs
## 3000     homologs
## 3001     homologs
## 3002     homologs
## 3003     homologs
## 3004     homologs
## 3005     homologs
## 3006     homologs
## 3007     homologs
## 3008     homologs
## 3009     homologs
## 3010     homologs
## 3011     homologs
## 3012     homologs
## 3013     homologs
## 3014     homologs
## 3015     homologs
## 3016     homologs
## 3017     homologs
## 3018          snp
## 3019          snp
## 3020          snp
## 3021          snp
## 3022          snp
## 3023          snp
## 3024          snp
## 3025          snp
## 3026          snp
## 3027          snp
## 3028          snp
## 3029          snp
## 3030          snp
## 3031          snp
## 3032          snp
## 3033          snp
## 3034          snp
## 3035          snp
## 3036          snp
## 3037          snp
## 3038          snp
## 3039          snp
## 3040          snp
## 3041          snp
## 3042          snp
## 3043          snp
## 3044          snp
## 3045          snp
## 3046          snp
## 3047          snp
## 3048          snp
## 3049          snp
## 3050          snp
## 3051          snp
## 3052          snp
## 3053          snp
## 3054          snp
## 3055          snp
## 3056          snp
## 3057          snp
## 3058          snp
## 3059          snp
## 3060          snp
## 3061          snp
## 3062  snp_somatic
## 3063  snp_somatic
## 3064  snp_somatic
## 3065  snp_somatic
## 3066  snp_somatic
## 3067  snp_somatic
## 3068  snp_somatic
## 3069  snp_somatic
## 3070  snp_somatic
## 3071  snp_somatic
## 3072  snp_somatic
## 3073  snp_somatic
## 3074  snp_somatic
## 3075  snp_somatic
## 3076  snp_somatic
## 3077  snp_somatic
## 3078  snp_somatic
## 3079  snp_somatic
## 3080  snp_somatic
## 3081  snp_somatic
## 3082  snp_somatic
## 3083  snp_somatic
## 3084  snp_somatic
## 3085  snp_somatic
## 3086  snp_somatic
## 3087  snp_somatic
## 3088  snp_somatic
## 3089  snp_somatic
## 3090  snp_somatic
## 3091  snp_somatic
## 3092  snp_somatic
## 3093  snp_somatic
## 3094  snp_somatic
## 3095  snp_somatic
## 3096  snp_somatic
## 3097    sequences
## 3098    sequences
## 3099    sequences
## 3100    sequences
## 3101    sequences
## 3102    sequences
## 3103    sequences
## 3104    sequences
## 3105    sequences
## 3106    sequences
## 3107    sequences
## 3108    sequences
## 3109    sequences
## 3110    sequences
## 3111    sequences
## 3112    sequences
## 3113    sequences
## 3114    sequences
## 3115    sequences
## 3116    sequences
## 3117    sequences
## 3118    sequences
## 3119    sequences
## 3120    sequences
## 3121    sequences
## 3122    sequences
## 3123    sequences
## 3124    sequences
## 3125    sequences
## 3126    sequences
## 3127    sequences
## 3128    sequences
## 3129    sequences
## 3130    sequences
## 3131    sequences
## 3132    sequences
## 3133    sequences
## 3134    sequences
## 3135    sequences
## 3136    sequences
## 3137    sequences
## 3138    sequences
## 3139    sequences
## 3140    sequences
## 3141    sequences
## 3142    sequences
## 3143    sequences
## 3144    sequences
## 3145    sequences
## 3146    sequences
## 3147    sequences
## 3148    sequences
## 3149    sequences
## 3150    sequences
## 3151    sequences
## 3152    sequences
## 3153    sequences
## 3154    sequences
## 3155    sequences
## 3156    sequences
tx2gene <- getBM(attributes = c("ensembl_transcript_id_version", "hgnc_symbol"), mart = mart, useCache = FALSE)

head(tx2gene)
##   ensembl_transcript_id_version hgnc_symbol
## 1             ENST00000387314.1       MT-TF
## 2             ENST00000389680.2     MT-RNR1
## 3             ENST00000387342.1       MT-TV
## 4             ENST00000387347.2     MT-RNR2
## 5             ENST00000386347.1      MT-TL1
## 6             ENST00000361390.2      MT-ND1

TXI object

txi <- tximport(files, type = "kallisto", tx2gene = tx2gene)
head(txi$counts)
##             D_CON1       D_CON2       D_CON3     D_TREAT1     D_TREAT2
##       320239.33685 279214.59791 310829.19263 3.660786e+05 3.268363e+05
## A1BG      79.16316     19.52848     16.26144 4.146486e+01 3.923610e+01
## A1CF       4.00000      0.00000      6.00253 4.006365e+00 4.031743e+00
## A2M     4126.00000   1005.00000   1374.00000 6.950000e+02 1.529000e+03
## A2ML1     17.93577     14.40054     13.08318 9.010019e+00 1.881112e+01
## A2MP1      7.00000     11.00000      2.00000 1.800000e+01 9.000000e+00
##           D_TREAT3      H_CON1       H_CON2       H_CON3     H_CYTKN1
##       265697.16538 350090.2698 2.686039e+05 2.260295e+05 3.253813e+05
## A1BG      45.90271     56.5765 1.015497e+02 3.824340e+01 7.106578e+01
## A1CF       0.00000      1.0000 0.000000e+00 4.008713e+00 4.000000e+00
## A2M     2930.00000   3003.0000 8.760000e+02 5.580000e+02 6.465000e+03
## A2ML1     15.06801     16.6282 7.492394e+00 4.028411e+00 8.244331e+00
## A2MP1      4.00000      5.0000 3.000000e+00 1.000000e+01 1.000000e+01
##           H_CYTKN2     H_CYTKN3     H_TREAT1     H_TREAT2     H_TREAT3
##       2.949614e+05 374090.09195 2.641537e+05 2.943063e+05 223570.33200
## A1BG  6.908696e+01     56.30732 6.004986e+01 4.121510e+01     61.27979
## A1CF  3.000659e+00      2.00000 7.009629e+00 1.009330e+00      0.00000
## A2M   3.740000e+02   1294.00000 1.070000e+02 1.854000e+03    102.00000
## A2ML1 5.297068e+00     12.00922 8.069787e+00 8.022131e+00     18.58668
## A2MP1 1.000000e+00     10.00000 3.000000e+00 1.300000e+01      3.00000

Beware DDS object

dds <- DESeqDataSetFromTximport(txi, colData = samples, design = ~ replicate + condition )

Start to change case by case Relevel

dds$condition <- relevel(dds$condition, ref = "healthy_control")
dds <- DESeq(dds)
resultsNames(dds)
## [1] "Intercept"                                     
## [2] "replicate_2_vs_1"                              
## [3] "replicate_3_vs_1"                              
## [4] "condition_disease_control_vs_healthy_control"  
## [5] "condition_disease_treatment_vs_healthy_control"
## [6] "condition_healthy_cytokine_vs_healthy_control" 
## [7] "condition_healthy_treatment_vs_healthy_control"

extract counts

counts <- counts(dds, normalized=TRUE)

transform counts

## DESeq2 is weird about extracting transformations as a matrix - you must use `assay()` 
log2 <- assay(normTransform(dds))
rld <- assay(rlog(dds))
## x-axis is the transformed mean not the raw mean..

log2_plt <- meanSdPlot(log2, ranks=FALSE, plot=FALSE)
log2_plt$gg + ggtitle("Log2 + PC Transformation") + xlim(0,20)

rld_plt <- meanSdPlot(rld, ranks=FALSE, plot=FALSE)
rld_plt$gg + ggtitle("Rlog Transformation") + xlim(0,20)

Sample heatmap

rld <- assay(rlog(dds))
sampleDists <- dist(t(rld))

## Place distances in matrix
sampleDistMatrix <- as.matrix(sampleDists)

## Optional, remove colnames
colnames(sampleDistMatrix) <- NULL

## create annotation dataframe
ann <- data.frame(Condition = samples$condition)

col <- c("blue", "red1")
names(col) <- c("treatment", "control")
ann_col <- list(Condition = col)

## match annotation rownames to distance mat
rownames(ann) <- rownames(sampleDistMatrix)

pheatmap(mat=sampleDistMatrix,
         ## pass distance metric calculated to heatmap
         clustering_distance_rows=sampleDists,
         clustering_distance_cols=sampleDists,
         ## pass annotation dataframe 
         ## add colors
         #annotation_colors = ann_col,
         ## heatmap colours
         col=hcl.colors(100,"GnBu",rev=T))

PCA

p <- pca(rld, metadata = samples)

biplot(p,
       colby = 'condition',
       colkey = c('healthy_treatment'='royalblue', 'healthy_control'='red1',
                  'healthy_cytokine' = 'forestgreen', 'disease_control' = 'purple',
                  'disease_treatment' = 'gold'),
       ellipse = T,
       hline = 0,
       vline = 0,
       legendPosition = 'right',
       legendLabSize = 12,
       legendIconSize = 8.0,
       title = 'PCA bi-plot',
       subtitle = 'PC1 versus PC2')

DESeq

# make healthy_cytokine vs healthy_control
h_con_v_h_cyto <- results(dds, filterFun=ihw, alpha=0.05,pAdjustMethod ='BH', c("condition", "healthy_cytokine", "healthy_control"))
summary(h_con_v_h_cyto)
## 
## out of 23094 with nonzero total read count
## adjusted p-value < 0.05
## LFC > 0 (up)       : 1764, 7.6%
## LFC < 0 (down)     : 1373, 5.9%
## outliers [1]       : 0, 0%
## [1] see 'cooksCutoff' argument of ?results
## see metadata(res)$ihwResult on hypothesis weighting
res1 <- lfcShrink(dds=dds, res=h_con_v_h_cyto, coef=6, type="apeglm")
summary(res1)
## 
## out of 23094 with nonzero total read count
## adjusted p-value < 0.05
## LFC > 0 (up)       : 1764, 7.6%
## LFC < 0 (down)     : 1373, 5.9%
## outliers [1]       : 0, 0%
## [1] see 'cooksCutoff' argument of ?results
## see metadata(res)$ihwResult on hypothesis weighting

function

#resdf<- as.data.frame(res)
get_upregulated <- function(df){

    key <- intersect(rownames(df)[which(df$log2FoldChange>=1)], rownames(df)[which(df$padj<=0.05)])

    results <- as.data.frame((df)[which(rownames(df) %in% key),])
    return(results)
}

get_downregulated <- function(df){

    key <- intersect(rownames(df)[which(df$log2FoldChange<=-1)],rownames(df)[which(df$padj<=0.05)])

    results <- as.data.frame((df)[which(rownames(df) %in% key),])
    return(results)
}

de_up <- get_upregulated(as.data.frame(res1))
de_up
##                  baseMean log2FoldChange     lfcSE       pvalue         padj
## ABCA1        4.650326e+02       2.276044 0.4660556 4.080967e-08 1.529277e-06
## ABL1         6.655701e+03       1.160539 0.1686530 4.515174e-13 3.598308e-11
## ACO1         5.636925e+03       1.468141 0.1256035 1.186891e-32 7.002231e-30
## ACSL4        3.137373e+03       1.161492 0.3424450 3.609074e-05 5.061742e-04
## ADAM28       4.356398e+01       1.054643 0.9748620 7.668585e-03 3.568933e-02
## ADAMTS1      2.720092e+04       1.220355 0.5234274 8.919441e-04 5.694897e-03
## ADAMTS6      2.929875e+02       1.710356 0.6030130 1.369170e-04 1.731944e-03
## ADM          2.833821e+03       1.428694 0.2976183 8.812256e-08 2.915090e-06
## ADORA2A      7.133919e+01       2.684819 0.3718029 2.268519e-14 3.493971e-12
## AFP          3.647333e+01       2.574054 0.5468393 1.131794e-07 3.289252e-06
## AKR1B1       8.299065e+03       2.615382 0.1972541 1.091626e-41 2.240890e-38
## AKR1C1       6.201265e+03       3.160914 0.5694378 6.751833e-10 3.156608e-08
## AKR1C2       3.337844e+03       2.504152 0.5444392 7.392330e-08 2.427718e-06
## AKR1C3       8.055705e+02       1.435340 0.5445224 3.010543e-04 2.991007e-03
## AMPD3        8.624474e+02       1.063115 0.2941902 2.468059e-05 3.569613e-04
## AMPH         5.546650e+02       2.048781 0.3977750 1.143369e-08 4.933402e-07
## ANGPT1       1.246138e+03       1.678147 0.3151492 5.097469e-09 2.366670e-07
## ANGPTL4      4.469447e+02       1.488122 0.3519777 1.087481e-06 2.867835e-05
## ANO9         3.213292e+01       2.814630 1.5157907 8.815396e-04 6.752759e-03
## ARHGAP24     2.262061e+02       1.015431 0.4080003 8.059223e-04 8.194547e-03
## ARRDC3       1.364293e+03       1.283630 0.4292531 1.066529e-04 1.218908e-03
## ASAH2        4.215038e+01       1.381979 0.6851600 1.668255e-03 1.356163e-02
## ATP8B4       3.687810e+01       2.542212 0.5784458 5.165966e-07 1.260459e-05
## BASP1        3.549104e+03       1.146532 0.2596612 8.012599e-07 1.846862e-05
## BATF         1.599800e+01       1.203985 1.4072554 6.617249e-03 4.928438e-02
## BCL2A1       6.362805e+01       5.593233 1.0408408 1.192158e-09 7.140627e-08
## BDNF         9.013505e+02       3.467979 0.4864835 1.293803e-14 1.735941e-12
## BID          9.809329e+02       2.007908 0.1606726 4.342153e-37 7.557843e-34
## BIRC3        9.396073e+02       1.817804 0.3435916 5.608836e-09 2.895410e-07
## BMP2         3.509065e+02       2.953066 0.6228562 3.481473e-08 1.455709e-06
## BMP6         6.873867e+02       2.031781 0.3258368 2.486470e-11 2.042104e-09
## BNIP3        4.089910e+03       1.082938 0.3184158 3.899369e-05 4.248846e-04
## BRINP2       1.301127e+01       2.365199 1.0937774 1.082141e-03 1.188504e-02
## BST2         1.842749e+01       2.019894 1.6001487 3.022869e-03 2.522409e-02
## C10orf90     8.215803e+01       1.213120 0.3087706 6.169842e-06 1.321267e-04
## C11orf96     1.049779e+03       1.632942 0.5705351 1.787587e-04 1.936189e-03
## C15orf48     3.569027e+02       9.925556 0.9627993 9.293877e-25 4.832101e-22
## C1orf53      4.496728e+01       1.231393 0.3236223 1.046646e-05 2.070513e-04
## C1QTNF1      3.351862e+03       2.882125 0.2562107 3.764796e-31 2.129641e-28
## C2CD4A       2.250980e+01       3.209395 0.9080476 4.871428e-06 1.397651e-04
## C2CD4B       1.299342e+01       8.514112 2.8903616 4.327887e-07 1.604328e-05
## C3           2.380020e+04       3.972832 0.3852386 1.962403e-26 5.844584e-24
## CA12         1.579642e+04       1.766609 0.6149719 1.486958e-04 1.311672e-03
## CA9          2.395215e+02       4.003972 0.8653765 8.563682e-09 4.099859e-07
## CABLES1      2.557544e+03       3.352638 0.4089590 2.821554e-18 5.853555e-16
## CCL2         6.948155e+03       4.906176 0.4119234 5.446453e-35 4.929453e-32
## CCL20        1.120427e+02       6.553882 0.9074407 4.737632e-14 1.060797e-11
## CCL5         4.281536e+01       2.882088 0.8003010 7.753401e-06 1.321267e-04
## CCL7         7.829765e+01       4.012090 0.9489262 2.079563e-07 7.188965e-06
## CCN6         1.340583e+03       1.543086 0.1791270 3.645201e-19 9.358000e-17
## CCR7         1.218668e+02       1.399034 0.4131390 3.866871e-05 6.803503e-04
## CD274        5.963699e+01       1.765940 0.7243918 3.448274e-04 3.847575e-03
## CD38         8.089254e+01       2.029369 0.6125662 4.136092e-05 6.297958e-04
## CD55         9.052822e+03       2.130531 0.4116630 1.050683e-08 3.897355e-07
## CD82         3.386489e+03       1.167447 0.4049581 1.889085e-04 1.638324e-03
## CD83         4.247097e+02       2.899131 0.5674363 5.461308e-09 3.310865e-07
## CDH6         3.298643e+02       1.120643 0.6611049 2.959005e-03 2.092386e-02
## CDKN2B       8.206290e+02       1.684023 0.2535194 1.743866e-12 1.817327e-10
## CEMIP2       7.787046e+02       1.027237 0.3316445 1.477828e-04 1.592737e-03
## CFB          2.538986e+04       4.066095 0.3347143 3.072045e-36 4.170650e-33
## CFH          9.729428e+03       1.224133 0.2806091 9.736690e-07 1.737929e-05
## CH25H        8.462035e+02       3.109195 0.4079013 8.393514e-16 1.473195e-13
## CHEK2        6.813766e+02       1.112820 0.2657027 2.297430e-06 5.157472e-05
## CHI3L2       1.588192e+03       1.885264 0.5088437 5.758170e-06 1.206835e-04
## CHMP1B       4.889547e+03       1.686867 0.2147426 2.194260e-16 3.124738e-14
## CHRDL2       1.042835e+03       5.443001 0.4913667 7.070423e-30 4.612111e-27
## CHST7        1.414639e+02       1.614188 0.4299934 8.150417e-06 1.665836e-04
## CLDN1        2.382394e+03       2.433112 0.4015088 4.039948e-11 2.636870e-09
## CMIP         2.073590e+03       1.007849 0.2956176 4.701586e-05 6.971286e-04
## COL18A1      1.027271e+04       1.444934 0.9455614 2.376014e-03 1.373938e-02
## COL3A1       1.347453e+05       1.454210 0.1617644 1.715147e-20 3.663685e-18
## COL4A1       6.671747e+03       1.453020 0.4388341 4.268453e-05 4.582409e-04
## COL4A2       1.245026e+04       1.149191 0.3623390 9.736457e-05 1.024871e-03
## COL4A3       6.727366e+01       1.843122 0.7066560 2.585435e-04 2.412288e-03
## COL4A4       1.281629e+02       3.086995 0.5172637 8.785306e-11 7.352196e-09
## COL7A1       7.256604e+03       2.329836 0.3591988 3.462488e-12 2.584193e-10
## CPXM1        1.864665e+02       4.696889 1.9412147 5.424727e-05 7.862948e-04
## CSF1         1.671788e+04       2.380784 0.2832104 2.292038e-18 3.680027e-16
## CSF2         8.341368e+01       8.189383 1.1567609 1.931491e-13 2.071382e-11
## CSF3         7.013287e+01       8.170180 1.4631797 2.000913e-10 1.168794e-08
## CSGALNACT1   3.914490e+03       1.975951 0.4309129 1.495026e-07 4.336898e-06
## CSPG4BP      4.149249e+01       2.142682 0.4901678 5.469232e-07 1.640792e-05
## CTSS         5.541577e+02       3.890583 0.3493298 3.059666e-31 2.008974e-28
## CXCL1        3.271157e+04       7.907546 0.9130081 1.632773e-21 4.346423e-19
## CXCL10       1.258279e+01       7.850994 2.7809202 4.449373e-07 1.640792e-05
## CXCL2        2.029081e+03       6.948940 0.4326570 1.953808e-60 1.623635e-56
## CXCL3        3.229667e+03       8.611662 0.7174166 8.244308e-35 6.265228e-32
## CXCL5        3.484832e+03      10.428798 0.9135591 4.254669e-36 4.792012e-33
## CXCL6        2.890303e+04      11.159461 0.9715438 8.596883e-35 6.265228e-32
## CXCL8        2.618590e+04      10.162949 0.9061936 7.181194e-36 6.533708e-33
## CXXC4        1.808296e+01       3.463219 1.3571264 1.341065e-04 2.072722e-03
## CYP24A1      3.947167e+02       7.791313 1.1058829 2.069763e-15 4.128206e-13
## CYP7B1       1.045516e+03       1.614649 0.3148925 1.377678e-08 6.275655e-07
## CYTL1        9.879906e+02       2.961284 0.4991673 5.062139e-11 3.036556e-09
## DAAM1        9.437220e+02       1.159194 0.2372182 7.363813e-08 2.514763e-06
## DAW1         1.464634e+02       2.179103 0.5621666 4.148430e-06 9.293685e-05
## DCLK1        8.608750e+03       1.285103 0.5054369 4.781096e-04 3.838806e-03
## DENND2A      8.579489e+02       2.323267 0.4972123 1.029709e-07 3.339116e-06
## DNER         6.458797e+02       2.386771 0.3080637 2.733930e-16 4.751861e-14
## DOCK4        2.863928e+02       1.304475 0.9908085 4.536696e-03 2.819626e-02
## DOK6         4.621387e+02       1.074718 0.4477316 9.695770e-04 8.114456e-03
## DRAM1        3.023546e+03       1.848709 0.2191986 1.823549e-18 3.680027e-16
## DSEL         2.316466e+03       1.193843 0.2278407 1.428064e-08 5.040634e-07
## DUSP1        7.994170e+03       1.212798 0.1610189 4.130814e-15 4.939651e-13
## DUSP16       7.548480e+02       1.429902 0.1706462 3.422839e-18 6.712910e-16
## DUSP4        1.202225e+03       1.059275 0.4565197 1.027998e-03 8.737817e-03
## DUSP5        1.663533e+03       1.023735 0.2742908 1.607484e-05 2.897692e-04
## EDN1         5.928949e+02       1.567095 0.4398385 1.678552e-05 2.767370e-04
## EDNRA        3.346001e+02       1.441827 0.5512528 3.532205e-04 3.752964e-03
## EDNRB        5.947454e+02       5.958515 0.6488891 2.088324e-22 7.101642e-20
## EFEMP1       3.262615e+04       1.372039 0.5091105 3.222683e-04 2.399512e-03
## EGLN3        4.680327e+01       2.295834 0.7156171 3.757441e-05 6.722620e-04
## ELF3         1.438634e+02       4.880101 0.7482806 3.368941e-13 4.092605e-11
## ELOVL2       1.972175e+02       1.196167 0.6813305 3.000602e-03 2.338465e-02
## ELOVL3       6.688574e+01       2.463906 0.5241836 1.123131e-07 3.948542e-06
## EPAS1        1.352362e+04       1.668289 0.1616268 3.505542e-26 1.321992e-23
## EPG5         6.165439e+03       1.226277 0.1675625 2.090804e-14 2.075224e-12
## EPHB2        6.284995e+02       1.152278 0.3205884 1.914231e-05 3.366866e-04
## EPSTI1       3.813292e+02       1.116156 0.4136046 4.531330e-04 5.559747e-03
## ETV4         1.226479e+02       1.645119 0.6427106 3.213273e-04 3.929901e-03
## F3           1.209966e+02       2.170231 0.4030660 1.890017e-09 1.698333e-07
## F5           6.645194e+01       2.711591 1.1985841 3.407023e-04 3.629434e-03
## FAM107B      2.009606e+03       1.662188 0.2888911 4.072000e-10 2.565463e-08
## FAM124A      3.063774e+02       1.130248 0.3176520 2.314857e-05 4.548821e-04
## FAM167A      2.242161e+02       1.722548 0.3901769 4.326022e-07 1.474554e-05
## FAM20A       1.695402e+02       1.012609 0.7745486 7.033533e-03 4.413938e-02
## FBN2         7.401716e+03       2.403073 0.3328817 1.366125e-14 1.330884e-12
## FBXW10B      1.134454e+02       1.607213 0.3887354 1.978999e-06 5.356416e-05
## FCAMR        1.048814e+01       7.036031 2.7855799 1.382114e-05 5.055198e-04
## FGF10        4.450264e+02       2.883485 0.7653613 3.268645e-06 7.538085e-05
## FGF11        2.656711e+02       1.708681 0.5909880 1.582953e-04 1.912880e-03
## FGF7         3.056951e+03       1.291975 0.3401144 9.166722e-06 1.545314e-04
## FGFBP1       1.082116e+03       2.650437 1.4209102 8.023996e-04 7.217507e-03
## FIBIN        3.526017e+02       2.430143 0.5433986 1.540340e-07 6.445540e-06
## FILIP1L      4.312409e+02       2.619978 0.5316456 3.568290e-08 1.455709e-06
## FLVCR2       2.152670e+02       1.005714 0.2660343 1.386131e-05 2.867781e-04
## FOXF1        2.784774e+03       1.601848 0.1668192 4.308613e-23 1.241406e-20
## FTH1         1.222299e+05       1.199643 0.2094676 7.999828e-10 3.992896e-08
## G0S2         5.448726e+02       3.651762 0.5147125 9.886361e-15 1.431962e-12
## GABARAPL1    3.974026e+03       1.409178 0.2237985 2.041120e-11 1.295880e-09
## GABBR2       7.206285e+01       2.816417 0.4976570 5.234195e-10 2.653215e-08
## GALNT2       1.343835e+04       1.071895 0.1704638 2.709874e-11 1.830329e-09
## GAS6         2.725026e+04       1.132790 0.4511261 6.383884e-04 4.802004e-03
## GCH1         4.664982e+02       2.882625 0.4214132 2.382292e-13 2.725518e-11
## GFRA2        1.120110e+02       4.656560 0.7890475 3.552448e-11 3.202222e-09
## GGT1         1.494448e+02       1.603210 0.2419709 2.110115e-12 3.431054e-10
## GGT5         5.338298e+02       1.189799 0.6786768 3.238006e-03 2.237486e-02
## GGTLC4P      3.504158e+01       1.915129 0.6995543 1.980288e-04 2.003208e-03
## GJB2         2.093577e+01       4.956773 1.2290809 1.872673e-06 6.025900e-05
## GK           4.306643e+02       1.666420 0.3491639 8.364841e-08 3.148429e-06
## GLIPR2       7.561425e+02       1.880504 0.3256781 3.924675e-10 2.268698e-08
## GLP2R        6.742843e+01       2.284664 0.6274295 7.365464e-06 1.682156e-04
## GNA14        1.697994e+02       2.749893 0.5577202 1.054597e-08 5.138992e-07
## GNG11        1.340150e+03       1.850969 0.3108603 1.146195e-10 7.352196e-09
## GOLGA8F      2.633479e+01       2.709819 1.1799652 2.478914e-04 5.538380e-03
## GPC4         1.499874e+03       2.011327 0.6004305 2.847127e-05 3.655311e-04
## GPR37L1      3.453219e+01       3.649666 0.5251710 1.548376e-13 2.305721e-11
## GPR39        8.080865e+01       1.143867 0.5041864 1.145264e-03 8.052577e-03
## GPRC5A       9.601787e+02       1.280662 0.4345385 1.393441e-04 1.756178e-03
## GRIP2        1.438888e+02       1.461902 1.3368009 3.817555e-03 2.474719e-02
## GRK5         1.405026e+03       1.067309 0.2767279 8.453544e-06 1.668100e-04
## GTF2IP4      5.260012e+03       1.647967 0.1582164 1.363242e-26 4.377624e-24
## H2AC19       5.378053e+02       1.507735 0.2971823 2.316281e-08 9.637633e-07
## H2BC21       4.407631e+02       1.271251 0.3264378 6.714943e-06 1.656585e-04
## H4C12        2.639236e+01       1.391027 0.6225115 1.140527e-03 1.239939e-02
## HAS3         2.043076e+02       2.898180 0.4359266 7.205918e-13 1.261814e-10
## HCK          1.030665e+01       4.187152 1.6261798 2.831405e-04 4.169596e-03
## HDAC4        2.550444e+03       1.634355 0.2157827 2.340705e-15 3.209872e-13
## HERC4        5.373708e+03       1.099595 0.2214075 4.529255e-08 1.529277e-06
## HGD          1.864532e+01       2.872361 0.9558806 7.570200e-05 2.090381e-03
## HMGN2P46     3.513501e+01       1.293683 0.5404803 7.635157e-04 7.248663e-03
## HPD          1.153008e+03       3.729677 0.5084722 7.865967e-15 1.210154e-12
## HSD11B1      5.406855e+02       6.002738 1.2574159 6.914809e-09 3.472818e-07
## HSD17B2      3.658485e+02       4.028344 0.6364539 7.450539e-12 6.788542e-10
## ICAM1        1.404166e+03       1.916143 0.5803121 4.224052e-05 6.533569e-04
## ICOSLG       2.246760e+02       1.783199 0.2539191 1.217263e-13 1.852168e-11
## IER3         3.974853e+03       2.725453 0.3177324 2.446048e-19 5.271094e-17
## IFI44L       4.643904e+01       2.271758 0.5939790 4.580389e-06 1.128508e-04
## IFI6         1.531008e+03       2.571188 0.6082582 9.543393e-07 2.288055e-05
## IGFBP4       8.839961e+04       1.715470 0.1436407 3.944493e-34 2.818473e-31
## IL11         3.345930e+03       3.995213 0.7877209 6.603719e-09 2.810439e-07
## IL15         3.760513e+02       1.929880 0.3508625 1.889321e-09 1.273077e-07
## IL15RA       3.487588e+02       1.647649 0.2021605 2.263444e-17 4.965878e-15
## IL23A        4.357754e+01       2.526227 0.7107010 7.160926e-06 1.426706e-04
## IL33         5.898826e+01       2.919950 0.6183916 9.812123e-08 3.671613e-06
## IL4I1        5.948345e+01       2.405653 0.9700168 3.084892e-04 3.507917e-03
## IL6          4.809050e+03       9.322718 0.5341973 2.379561e-74 3.230524e-70
## IL7          3.305351e+01       1.639528 0.5079680 5.671347e-05 7.103914e-04
## IL7R         1.527480e+03       2.115711 0.6241675 1.684961e-05 2.696108e-04
## INHBA        8.702523e+03       1.667773 0.2926606 7.228055e-10 2.909077e-08
## INSL4        1.754594e+01       3.207829 0.7793701 1.305195e-06 4.085370e-05
## IRAK2        5.482919e+02       2.085001 0.3022745 1.610514e-13 1.930287e-11
## IRS1         3.161197e+03       1.225815 0.2073812 2.284762e-10 1.194147e-08
## ITPRIP       7.296838e+02       1.012360 0.5571316 3.578907e-03 2.193829e-02
## JUP          9.892245e+02       1.347839 0.3335794 3.335485e-06 6.344986e-05
## KCNE4        1.734089e+03       1.299845 0.3189655 2.862305e-06 6.472398e-05
## KCNJ2        1.633478e+02       2.507245 0.8199799 5.204348e-05 7.980106e-04
## KIAA1217     1.264124e+03       1.802127 0.3212824 1.006565e-09 5.799984e-08
## KIFC3        4.787184e+03       1.031047 0.1920667 7.012377e-09 2.327926e-07
## KITLG        4.139298e+02       1.066815 0.5272463 1.765442e-03 1.354877e-02
## KLF9         2.014527e+03       1.668228 0.2382253 1.585795e-13 2.021783e-11
## KLHL13       4.800427e+03       1.666913 0.2816783 1.746196e-10 8.325338e-09
## KRT7         2.424483e+03       1.735356 0.3338413 1.227540e-08 4.802666e-07
## KRT81        6.024806e+01       1.428776 0.4568903 9.397372e-05 1.438101e-03
## KRT87P       1.239670e+02       1.301992 0.5225192 6.047123e-04 6.498029e-03
## KSR1         1.328510e+03       1.030909 0.2731952 1.201784e-05 2.024884e-04
## KYNU         1.629466e+02       2.524111 0.6262440 1.618985e-06 4.518899e-05
## LACC1        4.227413e+02       1.125650 0.2506633 5.300434e-07 1.601291e-05
## LAMA4        6.852766e+03       1.388873 0.2910570 1.016998e-07 2.883258e-06
## LAMB3        1.176525e+03       1.942978 0.4509714 5.152012e-07 1.522439e-05
## LAMC2        4.308904e+02       1.912673 0.3516134 2.682755e-09 1.494967e-07
## LCN2         1.966068e+02       6.370909 0.7266167 6.747516e-21 2.078503e-18
## LCTL         3.146225e+02       1.258772 0.4883221 4.817129e-04 5.821119e-03
## LDHA         2.880104e+04       1.430058 0.1858958 7.442459e-16 1.074892e-13
## LGALS9       3.423484e+01       2.063940 0.7307280 1.172330e-04 1.725991e-03
## LIF          3.132717e+03       2.835136 0.5824283 1.438718e-08 5.868876e-07
## LIPG         8.334053e+01       1.256168 0.6092965 1.687152e-03 1.138066e-02
## LRIG1        3.999244e+03       2.071473 0.2226711 7.022395e-22 1.801946e-19
## LRMDA        2.572707e+02       1.045390 0.3329837 1.154969e-04 1.743846e-03
## LRP8         2.214124e+03       1.373195 0.3484651 4.426887e-06 8.164587e-05
## LRRC55       9.927339e+00       1.683481 0.8675189 1.868179e-03 1.751038e-02
## LRRN3        5.391866e+01       1.913899 0.6732563 1.636274e-04 1.710680e-03
## LSAMP        1.803213e+03       1.238135 0.4286067 2.171309e-04 2.544966e-03
## LTBP1        6.913819e+03       1.372648 0.5456465 3.534664e-04 2.979035e-03
## LYPD1        4.333666e+02       5.900929 0.6432980 1.552750e-22 7.101642e-20
## LYPD3        1.440618e+02       2.326839 0.6816693 1.574850e-05 3.186527e-04
## MAFF         1.721684e+03       1.063845 0.2624120 4.094144e-06 8.929862e-05
## MAN1A1       7.336989e+03       1.993396 0.2564514 3.073280e-16 4.253143e-14
## MAOA         6.815110e+02       1.754459 0.3975284 5.300670e-07 1.390261e-05
## MAOB         1.022122e+03       1.854681 0.4282684 3.505538e-07 1.079786e-05
## MARCKSL1     4.463194e+02       1.631497 0.5117494 5.851043e-05 8.146690e-04
## MARCOL       5.277563e+01      10.140717 2.6212649 7.801406e-13 6.847449e-11
## MCC          9.589412e+02       1.338591 0.2409469 1.800706e-09 8.957547e-08
## MCTP1        1.737597e+01       2.035298 0.7639431 2.334338e-04 3.315256e-03
## MEDAG        1.529808e+03       1.841660 0.6383846 1.252701e-04 1.444124e-03
## MEGF10       1.569519e+02       1.088439 0.6145619 2.921618e-03 2.122939e-02
## MFF          5.697570e+03       1.367464 0.1682242 2.345377e-17 3.414254e-15
## MFSD2A       1.332217e+02       1.315719 0.4251837 9.244342e-05 1.398772e-03
## MGAT4A       4.401022e+02       2.021309 0.4900311 1.198411e-06 3.093237e-05
## MIF          5.907858e+03       1.283920 0.2668766 8.397098e-08 2.193296e-06
## MMP1         9.645530e+01       5.466399 0.9588717 3.364748e-10 2.182057e-08
## MMP10        1.502537e+01       5.309777 1.1659673 1.718236e-07 7.895386e-06
## MMP12        6.116220e+01       8.201897 1.3366246 6.861668e-11 5.380243e-09
## MMP3         3.277639e+04       7.840096 1.0395395 3.471975e-17 6.121560e-15
## MPHOSPH6     5.431411e+02       1.393224 0.2188273 1.378135e-11 1.036310e-09
## MPP4         3.332593e+02       2.341967 0.4896512 5.747921e-08 2.656066e-06
## MREG         1.371929e+02       1.053075 0.5571754 2.424574e-03 2.595288e-02
## MT1E         1.954081e+03       1.683910 0.2656836 1.039517e-11 8.173577e-10
## MT1F         9.334288e+01       2.546756 0.5954917 3.126065e-07 9.729345e-06
## MT1G         3.075014e+01       4.439108 1.5720702 3.618986e-05 4.635572e-04
## MT1X         2.437614e+03       2.369157 0.2206100 2.547395e-28 9.588139e-26
## MT2A         1.164163e+04       2.386387 0.4025918 9.019662e-11 5.515863e-09
## MTFP1        1.060145e+02       1.552801 0.4744426 3.918439e-05 6.317193e-04
## MTHFD2L      2.325835e+02       1.347900 0.2515784 5.535854e-09 3.229781e-07
## MYPN         8.617055e+02       2.399360 0.5263285 2.041840e-07 6.117365e-06
## NAMPT        5.596389e+03       2.501056 0.2565850 3.354120e-24 1.007610e-21
## NCCRP1       3.130019e+01       1.976474 0.5640755 1.945316e-05 2.774361e-04
## NCOA7        1.114374e+03       1.043428 0.2949189 3.043238e-05 4.418411e-04
## NDUFV2       1.818516e+03       1.326281 0.2099662 1.252029e-11 1.083802e-09
## NFKB2        3.501599e+03       1.900402 0.1734726 3.158096e-29 1.649029e-26
## NFKBIA       3.654283e+03       2.237790 0.1835986 1.987631e-35 2.061755e-32
## NFKBIZ       1.576020e+03       2.452451 0.1978340 1.058282e-36 1.637351e-33
## NID2         1.594577e+03       1.922505 0.4426020 4.755559e-07 1.400006e-05
## NKX3-1       5.495773e+02       1.397172 0.4995001 1.908260e-04 2.290737e-03
## NNMT         1.132891e+04       1.334941 0.1961638 6.869171e-13 5.750259e-11
## NOD2         7.918600e+01       2.237308 1.0603418 4.269659e-04 3.808073e-03
## NOS2         5.704347e+02       6.139083 1.1884965 3.015939e-10 1.902347e-08
## NR4A2        2.530190e+02       2.448688 0.4449376 1.136519e-09 6.831084e-08
## NR4A3        3.175417e+02       3.364720 0.3764117 1.228424e-20 3.593465e-18
## NRG2         1.507367e+02       1.066922 0.5526224 2.455959e-03 1.764982e-02
## NRP2         6.029579e+03       1.627472 0.2786259 2.550022e-10 1.179713e-08
## NUAK2        7.499994e+02       1.987408 0.1840507 2.149615e-28 1.015899e-25
## OASL         4.019776e+01       1.695652 0.7148200 5.068589e-04 4.351271e-03
## OLR1         6.038369e+01       1.501585 0.5260737 1.693961e-04 2.028545e-03
## OSGIN2       1.202661e+03       1.516521 0.1939634 3.779906e-16 5.721051e-14
## OSMR         6.122740e+03       1.095230 0.1993904 2.835535e-09 1.049439e-07
## OSTM1        1.647410e+03       1.109022 0.1190322 1.058517e-21 2.947884e-19
## P4HA3        4.665250e+02       2.436701 0.4834768 1.655085e-08 7.174367e-07
## PALMD        6.404520e+02       1.028956 0.3339404 1.430655e-04 1.655589e-03
## PAPPA        1.160769e+04       2.624736 0.4452841 1.141366e-10 5.383520e-09
## PCK1         5.946336e+01       4.668777 1.1854566 1.680082e-07 4.834922e-06
## PCSK9        6.904081e+02       1.003703 0.3169616 1.120093e-04 1.465968e-03
## PDCD1LG2     3.547222e+02       1.852459 0.3475267 3.193966e-09 1.806447e-07
## PDE10A       1.226443e+03       3.656725 0.4300484 1.577219e-19 4.148534e-17
## PDE4B        2.673019e+03       3.346093 0.2957760 2.848211e-31 1.880091e-28
## PDE4D        7.869721e+02       2.309069 0.4896669 6.573608e-08 2.005027e-06
## PDE7B        1.858860e+02       1.180589 0.6106942 1.728278e-03 1.334817e-02
## PDE8B        1.327958e+02       1.581666 0.4801541 4.301801e-05 7.397959e-04
## PDK1         8.446859e+02       1.310899 0.2976960 5.689124e-07 1.319812e-05
## PDK4         5.691871e+02       2.317060 0.5135669 3.024656e-07 9.098952e-06
## PDZK1IP1     1.160546e+02       3.316962 0.5700831 8.415262e-11 7.095134e-09
## PEDS1-UBE2V1 1.997400e+02       1.011108 0.3474805 2.604051e-04 3.321240e-03
## PF4V1        3.282606e+02       4.845650 1.2401494 1.396595e-06 4.271305e-05
## PFKFB4       4.742586e+02       1.749857 0.3029473 3.067028e-10 1.932814e-08
## PFKP         4.667209e+03       1.110696 0.4142175 3.428483e-04 2.888368e-03
## PGK1         1.533223e+04       1.247817 0.2451267 2.147169e-08 7.942852e-07
## PGM2L1       3.686412e+02       1.087259 0.7353630 4.850645e-03 3.030337e-02
## PHF10        2.568060e+03       1.164649 0.1679299 2.858152e-13 2.948046e-11
## PHLDA1       1.841782e+03       1.628335 0.5129140 4.692316e-05 6.971286e-04
## PI3          2.332024e+02       5.833968 0.4828267 6.068395e-36 8.894712e-33
## PID1         2.104074e+03       2.063935 0.3256689 7.262007e-12 6.631655e-10
## PIK3R3       4.714008e+02       1.019994 0.3676408 3.686608e-04 3.771146e-03
## PILRA        4.601459e+01       2.027599 0.4319040 1.644046e-07 4.761163e-06
## PITPNC1      7.832392e+01       1.070712 0.4802027 1.258241e-03 1.187605e-02
## PKNOX2       5.318052e+02       1.089401 0.1899570 8.358328e-10 4.305591e-08
## PLA2G4A      1.359666e+03       1.694465 0.2971294 5.693910e-10 3.026161e-08
## PLAT         3.684406e+02       1.808675 0.6060405 5.395158e-05 9.639406e-04
## PLD1         3.823524e+02       1.002769 0.2351822 1.739740e-06 4.271305e-05
## PLOD2        1.548796e+04       2.128700 0.2913853 7.535604e-15 8.839479e-13
## PLPPR4       1.140937e+02       1.599245 0.5401548 1.008335e-04 1.320447e-03
## PLXNA4       2.576328e+03       4.173224 0.3977361 1.580546e-27 5.408198e-25
## POM121L15P   4.597193e+02       2.170958 0.5352940 1.377104e-06 3.489642e-05
## POM121L4P    1.171678e+01       1.591372 0.8477145 1.744618e-03 1.654404e-02
## POM121L7P    2.540712e+01       1.660262 0.8772048 1.646567e-03 2.477886e-02
## POM121L9P    7.093643e+01       2.238079 0.9779670 3.602324e-04 3.808073e-03
## PON2         2.313181e+03       1.074232 0.1537122 1.988788e-13 2.146750e-11
## POU2F2       1.657164e+02       2.933520 0.8235023 6.715802e-06 2.096624e-04
## PPIF         1.532065e+03       1.335636 0.2722623 4.804594e-08 1.647168e-06
## PRKAA2       3.039372e+02       1.007814 0.2007401 5.021974e-08 2.451681e-06
## PRL          1.655380e+01       8.596443 3.0138236 1.140338e-06 3.625109e-05
## PRR5L        2.495893e+02       1.242970 0.3027123 1.983990e-06 4.794356e-05
## PRRG4        1.214308e+02       1.854234 0.3212586 4.771313e-10 3.117661e-08
## PSMA6        2.734154e+03       1.136521 0.1315252 4.909662e-19 9.358000e-17
## PTGER4       5.719605e+02       1.830723 0.7487120 4.303826e-04 3.950829e-03
## PTGES        1.439972e+03       2.402906 0.3694949 4.337274e-12 4.013007e-10
## PTGFR        1.473666e+03       1.333797 0.3509714 7.102005e-06 1.296707e-04
## PTGS1        3.208293e+02       2.933646 0.4424782 1.478942e-12 1.832171e-10
## PTGS2        1.899272e+03       5.012726 0.5341659 4.040385e-23 1.486830e-20
## PTP4A1       3.075040e+03       1.994389 0.3239065 2.681518e-11 1.820233e-09
## PTX3         1.142842e+04       1.319715 0.9675583 3.601645e-03 2.077164e-02
## QRFP         1.455290e+01       1.303863 0.5807054 1.252885e-03 1.371634e-02
## QSOX1        2.867060e+04       1.515281 0.2010397 2.483105e-15 3.163387e-13
## RAB27B       5.814695e+02       1.997169 1.1013464 1.060782e-03 8.737817e-03
## RAI14        2.802887e+03       1.269703 0.1991646 1.457964e-11 1.036310e-09
## RASD1        2.711648e+02       2.427130 0.8097915 4.972186e-05 7.462309e-04
## RASD2        2.142985e+02       1.179032 1.1724539 4.243393e-03 2.801823e-02
## RASSF8       2.218562e+03       1.320865 0.1906827 3.031403e-13 3.103756e-11
## RCAN1        1.612563e+04       2.466207 0.3113189 6.305053e-17 9.526200e-15
## RELB         9.539494e+02       1.956067 0.2949149 1.910758e-12 1.954601e-10
## RGS2         2.978901e+02       2.636790 0.8063260 2.036688e-05 3.468366e-04
## RIPK2        8.270156e+02       1.373800 0.2140324 9.100186e-12 8.173577e-10
## RND3         1.028541e+04       1.451636 0.1918329 2.502267e-15 3.163387e-13
## RNF122       7.678555e+01       1.006282 0.5690021 3.646360e-03 2.722267e-02
## RNF145       3.826972e+03       1.007653 0.1657035 9.324339e-11 5.299152e-09
## RNF152       1.738089e+02       2.240674 0.4125295 2.924410e-09 1.576226e-07
## RNF182       4.258047e+02       3.423458 0.5743234 3.682829e-11 3.448598e-09
## RORB         4.955201e+01       2.437492 0.5425452 2.225839e-07 8.399434e-06
## RPL4P6       1.000677e+01       1.306263 0.6716062 2.451898e-03 3.374158e-02
## RPS20P22     2.228498e+01       1.192861 0.5775793 1.734117e-03 1.778934e-02
## RSPO3        8.198072e+02       5.890991 0.5554950 9.046649e-29 4.220759e-26
## RTP4         1.059646e+02       1.218214 0.2547436 1.358006e-07 4.900820e-06
## SAA1         4.784027e+02       2.568778 1.0106821 2.654224e-04 2.650615e-03
## SAA2         1.255705e+02       4.260920 0.7021649 4.910950e-11 4.332246e-09
## SAT1         2.073840e+04       1.784178 0.3542505 2.479317e-08 7.416235e-07
## SCG2         2.675174e+02       1.080259 0.9336744 6.626567e-03 4.503667e-02
## SCN4B        1.264360e+03       3.328872 0.5411096 1.219082e-11 1.036310e-09
## SEMA3A       4.783957e+03       2.702118 0.2981309 4.686091e-21 1.095417e-18
## SERPINE2     1.501515e+05       2.182372 0.3375904 5.578685e-12 3.994909e-10
## SFRP1        6.190345e+03       1.382835 1.3141795 4.467758e-03 1.998790e-02
## SGIP1        4.196803e+02       1.960941 0.6118818 5.031296e-05 7.520970e-04
## SHISA2       4.130043e+02       1.210629 0.4536689 3.530874e-04 4.549648e-03
## SIK1         7.376370e+02       2.827056 0.1882054 2.418976e-52 1.179244e-48
## SLC11A2      3.378774e+03       1.745962 0.1961874 3.282539e-20 6.177573e-18
## SLC12A2      1.385153e+03       1.341377 0.2714521 5.247323e-08 1.867194e-06
## SLC16A3      6.926167e+03       1.405185 0.4120650 3.000935e-05 4.119425e-04
## SLC18B1      7.105970e+02       2.008708 0.2429418 6.159878e-18 1.253404e-15
## SLC19A2      5.730682e+02       1.264177 0.1992047 1.748956e-11 1.407395e-09
## SLC19A3      1.674473e+02       1.903320 0.4012214 6.003468e-08 3.588532e-06
## SLC22A23     1.685260e+03       1.364283 0.1935200 1.068862e-13 1.260647e-11
## SLC24A3      1.506594e+02       1.466348 0.6177079 5.553864e-04 8.114456e-03
## SLC2A1       5.672214e+03       1.451183 0.2981852 5.327702e-08 1.420354e-06
## SLC39A14     1.855808e+04       2.247985 0.2326009 1.479500e-23 3.846006e-21
## SLC39A8      4.922251e+03       3.639180 0.3114466 2.919483e-33 1.808509e-30
## SLC6A6       8.148649e+03       1.309083 0.3608285 1.679801e-05 2.311707e-04
## SLC7A2       1.872977e+03       2.813079 0.8182875 8.177732e-06 1.625785e-04
## SLC8A3       1.029543e+02       4.685599 0.6320243 3.574569e-15 5.594711e-13
## SLPI         7.161405e+03       1.760180 0.3047765 2.293982e-10 1.194147e-08
## SMIM3        5.842934e+02       1.251254 0.4116482 1.085922e-04 1.266363e-03
## SMIM43       1.767716e+02       1.989825 0.6024905 3.197126e-05 5.287619e-04
## SMOC1        1.732156e+04       3.438956 0.3298288 1.210608e-27 3.943548e-25
## SMOX         1.941623e+03       1.355709 0.3549630 7.917416e-06 1.585412e-04
## SOD2         9.390512e+04       4.112535 0.2772179 2.716301e-51 7.414166e-48
## SOX4         1.545970e+03       2.073806 0.2587565 3.913057e-17 6.897183e-15
## SPIB         1.294302e+01       1.483326 0.7526643 1.596444e-03 2.427584e-02
## SPINK13      3.309098e+01       3.601774 1.1708199 2.179566e-05 3.064991e-04
## SPINK6       1.535810e+01       7.385623 1.4538499 7.404683e-09 4.550934e-07
## SPON1        4.469152e+02       1.316802 0.6338675 1.558759e-03 1.190496e-02
## SPTSSA       1.925828e+03       1.565621 0.1702471 2.093875e-21 6.692432e-19
## SQOR         2.021603e+03       1.030183 0.1571823 5.189072e-12 3.781687e-10
## SRPX2        2.320773e+03       2.343553 0.4910397 3.376463e-08 1.214881e-06
## SST          3.613849e+02       5.886061 1.3919670 6.752412e-09 3.320613e-07
## SSTR1        2.426460e+02       2.850821 0.8634956 3.035334e-05 5.511474e-04
## ST3GAL1      2.597963e+03       1.213049 0.2599153 1.714545e-07 5.155029e-06
## ST3GAL5      5.528717e+02       1.548630 0.3190589 6.121994e-08 2.287259e-06
## STAMBPL1     4.877771e+02       1.200070 0.5616432 1.485230e-03 1.201588e-02
## STAT4        1.322916e+02       1.045515 0.3380969 1.449445e-04 2.734412e-03
## STC1         4.235703e+03       7.479219 1.0018867 2.433576e-16 2.984417e-14
## STEAP1       2.797792e+02       1.744698 0.4564824 5.663710e-06 1.228934e-04
## STEAP1B      2.861667e+02       1.002498 0.4429707 1.419869e-03 1.382439e-02
## STK32B       3.413299e+02       1.185884 0.2673203 6.851099e-07 1.963041e-05
## SULF2        2.664828e+04       1.413584 0.3838868 1.012755e-05 1.639995e-04
## SULT1C4      3.928120e+01       1.693047 0.5710026 1.035441e-04 1.133182e-03
## TCF21        1.790002e+01       4.344919 1.5477969 1.114518e-04 2.883756e-03
## TFPI         1.412879e+03       1.664524 0.3287410 1.451638e-08 6.575825e-07
## TFPI2        1.455196e+03       4.238781 0.8988743 2.521478e-08 8.465908e-07
## TFRC         8.189955e+03       2.078548 0.1934085 2.147872e-28 8.086391e-26
## TGFB3        2.242881e+03       1.843219 0.4302944 6.360107e-07 1.525542e-05
## TGFBI        6.615255e+04       1.836117 0.5524936 1.911295e-05 2.328971e-04
## TIFA         4.627990e+02       1.040960 0.3418771 1.662716e-04 2.037041e-03
## TLCD1        1.985294e+02       1.045181 0.2672941 7.174484e-06 2.207031e-04
## TM4SF20      2.619075e+02       1.803223 0.4312517 9.025603e-07 2.945787e-05
## TMEM100      3.196902e+01       1.361220 1.2214584 4.061771e-03 2.592761e-02
## TMEM132A     1.882636e+03       4.407448 0.8768633 1.023290e-08 4.788658e-07
## TMEM178B     5.958717e+02       1.484594 0.4691950 5.617565e-05 7.856463e-04
## TMEM51       2.610620e+02       1.128810 0.6488258 3.113179e-03 2.176485e-02
## TMEM64       1.091136e+03       1.004901 0.1521935 3.900845e-12 3.803667e-10
## TMPRSS4      4.831423e+01       1.719375 0.5532811 6.373969e-05 9.014090e-04
## TNFAIP2      4.071222e+03       2.457630 0.1946237 8.848210e-38 1.380072e-34
## TNFAIP3      3.178494e+03       2.796585 0.2341084 1.494296e-34 1.127043e-31
## TNFAIP6      1.563837e+03       4.245305 1.0575226 2.529957e-07 6.353801e-06
## TNFRSF10D    2.961672e+03       1.053192 0.3043688 3.292906e-05 4.120870e-04
## TNFRSF11B    6.727519e+04       1.200188 0.4127909 2.024847e-04 1.623836e-03
## TNFRSF1B     1.121884e+02       2.217094 0.6227448 8.572443e-06 1.737680e-04
## TNFRSF21     1.445956e+02       1.497919 0.3165633 1.055692e-07 4.299583e-06
## TNFRSF9      1.193583e+02       2.654105 0.4080305 3.271610e-12 3.688725e-10
## TNFSF10      7.029394e+01       2.471909 0.6212012 1.449961e-06 3.085845e-05
## TNFSF14      8.181516e+01       4.337846 0.5484012 1.560662e-16 3.433206e-14
## TNIP1        3.751579e+03       1.204741 0.1294150 1.010501e-21 2.328627e-19
## TNS4         1.472477e+02       1.294800 0.5710326 8.824860e-04 8.801632e-03
## TPI1         1.783761e+04       1.166746 0.2801532 1.931751e-06 3.583281e-05
## TRABD2B      4.841384e+02       1.495555 0.3208149 1.787865e-07 6.108785e-06
## TRAF3IP2     1.040846e+03       1.152186 0.1576809 2.276908e-14 3.321343e-12
## TREM1        3.871975e+01       5.603808 1.1642664 9.339432e-09 5.121762e-07
## TRPM3        3.020487e+01       1.790069 0.4961230 1.614971e-05 3.005246e-04
## TSKU         1.821690e+03       1.513264 0.1658128 4.858255e-21 1.315770e-18
## TSPAN2       8.885800e+02       1.950473 0.4477532 3.662151e-07 9.731676e-06
## TTPA         7.783546e+01       1.111380 0.3912213 2.830176e-04 3.597387e-03
## TYMP         9.216856e+02       1.076409 0.2777737 7.837143e-06 1.240091e-04
## UCN2         1.229859e+02       3.111809 0.4963528 7.171163e-12 7.412724e-10
## UST          1.596080e+03       1.427718 0.2242967 1.344959e-11 1.036310e-09
## VNN1         5.438306e+01       2.715919 0.4575329 1.148661e-10 7.007885e-09
## VNN2         8.153108e+01       3.297482 0.5061391 1.757560e-12 1.871501e-10
## VNN3P        6.230433e+01       2.995549 0.4907866 4.525524e-11 2.831814e-09
## VWC2         5.705884e+01       1.993354 0.8104603 2.950121e-04 2.681150e-03
## WFDC1        1.103406e+02       1.337478 0.8958468 2.940314e-03 2.299947e-02
## WIF1         3.759075e+01       2.782047 0.4616518 1.239190e-10 1.029569e-08
## WNT2B        8.395491e+02       2.252871 0.3617560 2.252984e-11 1.859716e-09
## WNT5A        7.546576e+03       1.141339 0.9785697 4.901497e-03 2.436832e-02
## WTAP         4.346894e+03       1.521236 0.1402607 1.726808e-28 7.595982e-26
## WTAPP1       1.654237e+01       5.473717 1.5494039 8.267659e-06 2.122180e-04
## WWC1         1.292633e+03       1.359271 0.2439464 1.769480e-09 8.438116e-08
## ZC3H12A      1.416814e+03       3.390401 0.2406619 8.169313e-47 2.724303e-43
## ZC3H12D      3.824020e+01       1.297321 0.4994911 4.874061e-04 4.062657e-03
## ZSWIM4       5.328226e+02       1.593892 0.2223834 4.487706e-14 5.492836e-12
de_down <- get_downregulated(as.data.frame(res1))
de_down
##               baseMean log2FoldChange     lfcSE       pvalue         padj
## ABCA3       377.015753      -1.285063 0.3138990 2.338510e-06 6.581030e-05
## ABHD1        21.524180      -1.254763 0.6512420 2.146132e-03 2.110522e-02
## ACAN      98306.117775      -1.610562 0.3617184 4.393585e-07 8.841435e-06
## ACSBG2       33.469644      -1.263470 0.5971136 1.446079e-03 1.331148e-02
## ACTC1       103.268224      -3.443251 0.7400191 1.203220e-07 4.211914e-06
## ADAM11       20.561841      -1.011737 0.6982662 6.354753e-03 4.415248e-02
## ADAMTS15    410.549487      -1.961088 0.6832912 6.658552e-05 1.113218e-03
## ADAMTSL2     13.204259      -1.329758 0.7499819 3.530616e-03 2.991321e-02
## ADAMTSL3    425.077410      -1.767241 0.8298806 5.496507e-04 6.476511e-03
## ADCY10P1     63.445729      -1.326261 0.3182731 1.974200e-06 4.928422e-05
## ADIRF      5787.467265      -1.247385 0.3255748 6.958094e-06 1.100964e-04
## AGAP11      474.628577      -1.271548 0.4633587 2.580982e-04 2.703011e-03
## AGT         141.811683      -1.633583 0.3815770 9.831515e-07 2.944780e-05
## AHNAK2    18003.149533      -1.507080 0.3744199 1.747358e-06 2.971606e-05
## AKAP6       180.989393      -1.799348 0.4449399 2.078179e-06 5.590745e-05
## ALS2CL     1397.878300      -1.457089 0.2866064 1.418369e-08 6.397141e-07
## AMY2B       150.510963      -1.039146 0.3462945 2.014450e-04 2.669309e-03
## ANGPTL7      14.278748      -3.454130 1.2033218 6.338334e-05 1.121581e-03
## ANK3        448.028190      -2.316962 0.5006150 9.305010e-08 3.267669e-06
## AOC2       1532.106656      -2.647167 0.4836191 1.306237e-09 6.703022e-08
## AOC3        357.162416      -1.969689 0.6031509 4.128115e-05 6.291698e-04
## AQP1        206.206120      -2.264265 0.8393430 9.709390e-05 1.961761e-03
## AQP3         33.527696      -2.156407 0.5317509 2.481434e-06 5.953450e-05
## ARMC12       15.201081      -1.494337 1.0231477 3.235431e-03 2.864800e-02
## ARVCF       473.569689      -1.829722 0.3648937 2.337075e-08 9.386698e-07
## ASPDH        19.649923      -1.199486 0.8620086 5.082451e-03 4.035633e-02
## ATP10A     2657.071690      -1.181303 0.3721872 8.215086e-05 9.598032e-04
## ATP1A3      142.635294      -2.041258 0.8291648 4.412357e-04 6.729857e-03
## ATP6V1G2     71.244497      -1.046756 0.3411790 1.638119e-04 1.969309e-03
## ATP8A1       68.115640      -1.492946 0.5627349 2.808849e-04 2.581461e-03
## ATP8B1     2453.483783      -1.411356 0.3444995 2.151757e-06 3.637273e-05
## B3GALT2      23.482745      -2.873992 1.1945438 1.744739e-04 2.586875e-03
## B3GNT7      162.000391      -1.990022 0.5882246 2.558914e-05 4.194630e-04
## B4GALNT3     59.833394      -2.806016 0.7113475 2.866794e-06 6.666747e-05
## BCL2L15      26.237783      -1.370308 0.6833218 1.625933e-03 1.641733e-02
## BEND6       688.975963      -1.029170 0.2236679 3.647051e-07 1.079786e-05
## BEX2         70.059034      -2.293182 0.5619596 1.154608e-06 2.945787e-05
## BGN       11876.338002      -1.225469 0.2604050 1.789625e-07 4.660137e-06
## BHLHE41     159.737100      -2.515217 0.7366800 8.276863e-06 1.615426e-04
## BHMT        116.110772      -1.884790 0.8138716 4.317432e-04 4.979789e-03
## BMS1P3       88.956079      -1.268406 0.4029605 9.135738e-05 1.218908e-03
## C11orf21    121.946485      -1.829427 0.3795000 6.050981e-08 2.339543e-06
## C14orf132  2295.231850      -1.339457 0.1562147 7.421381e-19 1.526571e-16
## C1QTNF3     497.122399      -1.936780 0.3894399 3.691284e-08 1.422065e-06
## CA3          49.877804      -1.755337 1.2482422 1.920479e-03 1.514801e-02
## CA5B       1701.187064      -1.014261 0.2682323 1.289175e-05 1.863380e-04
## CACNG4      180.277917      -1.999636 0.7563912 2.771496e-04 3.479427e-03
## CALHM3       20.628746      -2.900298 1.2893675 6.151918e-04 7.546925e-03
## CAMK2A       52.325302      -1.489415 0.4847372 1.039248e-04 1.179969e-03
## CAPG       4321.819107      -1.177359 0.1698664 3.052041e-13 2.826419e-11
## CAPN12       33.497960      -1.282498 0.7451407 2.975964e-03 2.346671e-02
## CAPS       1668.602018      -1.329223 0.1478787 1.767998e-20 4.980425e-18
## CARD10      326.283032      -1.480964 0.2661124 1.499924e-09 8.390030e-08
## CATSPER1     54.196132      -1.944452 0.4950932 3.595630e-06 6.415244e-05
## CCDC146      93.507084      -1.128783 0.4480729 6.761652e-04 7.114749e-03
## CCDC154      31.406929      -1.451489 0.6971465 1.191071e-03 8.600687e-03
## CCDC171     117.801141      -1.100566 0.2969457 1.574376e-05 3.186527e-04
## CCDC74B     348.955084      -1.139616 0.2602449 9.389474e-07 3.032177e-05
## CCN3       9622.166931      -2.350994 0.8108823 6.107325e-05 6.960915e-04
## CD248       962.892600      -1.626146 0.4916908 3.215136e-05 4.432622e-04
## CD8B2        60.127920      -1.953092 0.8954595 4.430554e-04 4.482179e-03
## CEP126      928.576802      -1.028124 0.2164485 1.763273e-07 5.115181e-06
## CFAP43       30.073996      -1.228666 0.5645460 1.440723e-03 1.150704e-02
## CFAP57       57.363452      -1.470326 0.5291049 1.850691e-04 2.295100e-03
## CGN         182.025879      -2.904364 0.7737784 2.993394e-06 7.601306e-05
## CHAD         29.639335      -1.189174 0.5489565 1.459899e-03 1.011106e-02
## CHRFAM7A    146.856508      -1.189673 0.5401027 1.197126e-03 1.122737e-02
## CHRNE        27.924595      -1.007892 0.6708689 5.867386e-03 3.914000e-02
## CHST5        13.559838      -1.852881 1.1390034 2.738841e-03 2.361682e-02
## CILP        827.669576      -2.026429 0.9737463 7.189262e-04 6.074168e-03
## CILP2        53.070432      -2.618685 0.6874303 2.693361e-06 5.054118e-05
## CLCNKB       68.812605      -1.601729 0.4062749 4.096877e-06 7.172565e-05
## CLEC18A      68.780536      -1.421213 0.4229760 4.280727e-05 6.469774e-04
## CLEC18B      14.956129      -1.566794 1.0703042 3.653382e-03 3.161685e-02
## CLEC3B     9796.319367      -1.498961 0.9695998 2.621217e-03 1.604418e-02
## CLSTN2      107.281236      -3.028003 0.4718350 5.145505e-12 5.477424e-10
## CMKLR1     1722.550631      -1.263794 0.3973894 7.104156e-05 1.005729e-03
## CMYA5       207.394124      -1.260486 0.2244646 1.398087e-09 7.847360e-08
## CNKSR2      104.408727      -1.191759 0.6766450 1.990162e-03 1.686166e-02
## COL15A1   17248.568102      -1.890275 0.3365949 9.483753e-10 3.834960e-08
## COL21A1     220.343823      -2.388929 0.8896497 1.230549e-04 1.555143e-03
## COL25A1      16.632569      -2.121724 0.8131889 2.881469e-04 3.929133e-03
## COL9A2      438.604066      -2.682981 0.7738935 5.999348e-06 1.517859e-04
## COLGALT2    479.654271      -1.323083 0.3141209 1.461611e-06 3.385418e-05
## CORIN        99.093872      -2.129845 0.4496411 8.348957e-08 3.504110e-06
## CORO2B      466.820287      -2.965810 0.4227098 3.508555e-14 4.369065e-12
## CPA1         21.695625      -1.984429 1.3864947 2.960846e-03 2.611674e-02
## CPAMD8      285.360987      -1.291569 0.5861861 9.084664e-04 9.678947e-03
## CRABP2      203.655738      -2.262373 0.5181753 4.384959e-07 1.316902e-05
## CRACD       110.787253      -1.250911 0.7326449 2.792078e-03 2.213622e-02
## CRACR2B     223.353202      -1.135170 0.5184866 1.475605e-03 1.173956e-02
## CRIP1       565.793697      -2.612128 0.4327552 3.317077e-11 2.526737e-09
## CRIP2      3549.025996      -2.094658 0.2090601 3.881360e-25 1.351125e-22
## CSPG4     14815.266629      -1.327458 0.3009087 6.457337e-07 1.258152e-05
## CSPG4P13     58.732885      -5.626652 1.3922118 2.352848e-06 6.239426e-05
## CSPG4P5      50.764190      -1.041899 0.4263214 8.980599e-04 7.905979e-03
## CST6        211.140873      -2.779060 0.4121277 3.339262e-13 3.882484e-11
## CYBRD1    28254.127157      -1.145037 0.2961076 7.067391e-06 9.530443e-05
## CYP2A7       11.141246      -2.425861 1.3739543 8.899119e-04 1.532619e-02
## CYS1        611.237110      -1.416366 0.5659202 4.634200e-04 4.502645e-03
## CYSRT1       49.910690      -1.468329 0.4348461 3.338871e-05 5.215779e-04
## DACT3       131.743599      -1.411501 0.2488710 9.737971e-10 6.533584e-08
## DBH          24.439959      -1.390844 0.5232614 4.169777e-04 5.275411e-03
## DCST2        22.973495      -1.712685 0.5246418 5.543758e-05 1.000247e-03
## DCT          22.285197      -1.614783 0.8724753 2.089888e-03 2.016322e-02
## DEGS2        15.126546      -2.906273 0.8323824 1.600107e-05 3.833691e-04
## DES          63.138582      -2.948909 0.3743269 1.327035e-16 2.168605e-14
## DIRAS1      692.503300      -1.955234 0.2973138 1.895121e-12 1.510937e-10
## DMPK       3186.580340      -1.170953 0.2605414 5.081352e-07 1.080548e-05
## DNAH12       21.842418      -1.212792 0.5728262 1.621276e-03 1.638499e-02
## DNAJC22    1117.128890      -1.331470 0.6490584 1.445037e-03 1.177066e-02
## DOC2B        35.413419      -2.590579 1.0405062 3.969929e-04 4.290863e-03
## DRC1         13.808682      -1.466169 0.7751943 2.441578e-03 2.167472e-02
## DYSF        242.355034      -1.518080 0.4629615 4.825591e-05 7.485841e-04
## ECRG4      1079.407508      -1.495508 0.6063143 2.824989e-04 3.172760e-03
## EFCAB13      79.172635      -1.405410 0.3000531 1.888524e-07 5.124101e-06
## EFHD1       570.996482      -2.414252 0.3575676 2.697360e-13 2.882652e-11
## EGR1       1981.169224      -1.245771 0.3696016 3.558396e-05 5.042758e-04
## ELAPOR2     244.921339      -1.005518 0.5266597 3.076522e-03 2.213622e-02
## ELFN1        64.342061      -3.905884 0.9491141 7.481900e-07 2.349742e-05
## ELL3         80.749252      -1.504844 0.3408096 6.066941e-07 1.484833e-05
## EPHB1       365.366235      -1.149693 0.3569098 8.211365e-05 1.142874e-03
## EPPK1        22.885457      -1.782187 0.6115071 1.686159e-04 2.650615e-03
## ERICH2      198.557046      -1.161206 0.4306858 3.958153e-04 4.641387e-03
## EXPH5       339.454009      -2.366539 0.7204482 1.159971e-05 2.190414e-04
## FABP3       165.638649      -1.833071 0.4025445 2.282745e-07 8.446010e-06
## FAHD2CP      16.422616      -1.025693 0.6772821 6.096482e-03 4.492995e-02
## FAIM2       183.998301      -2.341886 0.5936960 1.448740e-06 4.085370e-05
## FAM107A     327.859468      -2.140095 0.8967397 2.980747e-04 3.407459e-03
## FAT2         46.527348      -1.025545 0.6927706 4.960927e-03 3.458283e-02
## FEM1B      4043.316589      -1.431044 0.2236633 1.019194e-11 5.902250e-10
## FGF17         9.758976      -2.227880 1.1874185 1.953632e-03 1.814471e-02
## FGF18        36.538244      -2.016865 0.8526909 3.997339e-04 4.741594e-03
## FGF9        257.284848      -2.228891 0.7737576 6.739549e-05 1.163169e-03
## FGFR3      2163.748909      -1.381948 0.6023298 6.766231e-04 5.559747e-03
## FHL1      26783.194525      -1.401797 0.2023546 2.311551e-13 2.395568e-11
## FOS         504.217464      -2.694816 0.3835718 6.539774e-14 8.299345e-12
## FOSB         37.351347      -1.969974 0.4142454 1.031228e-07 3.657036e-06
## FOXC2       647.050352      -1.787574 0.2478047 3.066221e-14 3.885824e-12
## FOXD2        33.464485      -1.542837 0.6583982 8.755382e-04 6.478994e-03
## FOXL1       292.096735      -1.140777 0.3822493 1.694870e-04 2.068834e-03
## FOXO1       586.370843      -1.778697 0.2491210 3.414031e-14 4.603926e-12
## FOXO6        66.815483      -1.038527 0.3701977 3.626458e-04 3.329806e-03
## FRMD4B     1281.838578      -2.036062 0.4216586 3.479808e-08 1.455709e-06
## FRMD7        11.921918      -6.784019 2.6742680 2.644951e-06 7.916201e-05
## FRMPD3      161.333797      -1.218784 0.3311177 1.616020e-05 3.261941e-04
## FRZB        193.002383      -3.209803 0.7948269 1.166885e-06 2.963174e-05
## FXYD1       183.164231      -2.295101 0.6816747 8.999774e-06 2.693898e-04
## FYB1         16.795919      -2.408688 0.9061819 2.371648e-04 5.330230e-03
## GAL3ST2       7.590008      -3.187241 1.3018505 8.474253e-04 4.755831e-02
## GALNT16     402.694919      -1.208847 0.5795918 1.613850e-03 1.288652e-02
## GALNT8       18.153767      -3.761087 1.0091859 8.545114e-06 2.229282e-04
## GAP43       751.150787      -1.327936 0.7491781 2.319832e-03 1.372611e-02
## GARNL3      190.944324      -1.049521 0.2926646 2.536297e-05 4.714956e-04
## GCNT3        70.902370      -1.260718 0.4589637 3.290023e-04 2.936996e-03
## GDF15       598.524508      -1.019590 0.5054259 2.061089e-03 1.490528e-02
## GDF7         46.902886      -2.587568 0.6578103 2.693618e-06 5.054118e-05
## GJA3          7.596339      -2.758012 1.0842367 4.640652e-04 3.289137e-02
## GLIS2      1704.751650      -1.228029 0.2318981 7.378003e-09 2.847597e-07
## GOLGA8T      27.618598      -2.488696 0.8114264 1.061174e-04 1.200890e-03
## GP1BB       222.456979      -1.229570 0.2797364 8.319963e-07 2.551040e-05
## GPNMB      1083.556924      -2.449166 1.0295265 1.325692e-04 1.687374e-03
## GPR132       28.953747      -2.004647 0.4792247 1.320445e-06 3.306695e-05
## GPR153      502.268837      -1.205807 0.3759651 8.314698e-05 1.095705e-03
## GRIN3A       20.273347      -1.256554 0.9529978 4.682386e-03 3.544600e-02
## H1-9P        26.926095      -1.745860 0.8352573 1.063775e-03 7.901788e-03
## HCFC1R1    1198.798833      -1.355353 0.2083613 5.506385e-12 5.037145e-10
## HCG9P5       49.245761      -1.258542 0.3883616 7.750880e-05 8.837506e-04
## HLF          38.763944      -2.327238 1.1794448 6.066560e-04 5.025710e-03
## HRCT1       778.328519      -1.582203 0.7864505 6.696286e-04 6.365673e-03
## HSPB1      7641.930755      -1.177885 0.2566545 3.131004e-07 8.316729e-06
## HSPB6      1075.356651      -2.028563 0.4762030 8.467274e-07 2.274831e-05
## HSPB7      4860.623567      -1.673536 0.4785791 2.049927e-05 3.005246e-04
## IGFBP6    10383.276569      -1.332095 0.3530611 8.926424e-06 1.479687e-04
## IL17RD      170.889034      -1.339754 0.3098238 9.830885e-07 2.696105e-05
## IL17RE      133.102073      -1.252093 0.3446128 1.697215e-05 4.563248e-04
## INSYN2B     115.859608      -1.156949 0.4990674 1.066408e-03 1.370222e-02
## ITGA10     1571.372123      -1.689455 0.6456785 1.973424e-04 2.100522e-03
## ITGA11    35342.171016      -1.722557 0.3638353 7.819625e-08 1.978437e-06
## ITIH5      5996.771308      -2.713300 0.3308518 1.160491e-17 1.657114e-15
## ITM2A      1268.251087      -1.748091 0.4771001 1.027091e-05 1.920358e-04
## KCNA1        97.007267      -3.383389 0.9362829 4.016577e-06 8.602600e-05
## KCNA4       730.633782      -2.022016 0.5523960 4.024428e-06 6.823102e-05
## KCNA6        37.779639      -3.741301 1.1559624 1.742377e-05 3.190701e-04
## KCND3       369.526820      -1.198549 0.4551559 3.581770e-04 3.860534e-03
## KCNMB4       26.861049      -1.160833 0.9620031 7.754759e-03 3.732469e-02
## KCNN4       397.105542      -1.163577 0.3730923 1.116619e-04 1.437954e-03
## KHDRBS3     715.333161      -1.111763 0.2857858 7.598137e-06 1.317572e-04
## KHK          53.068902      -1.357907 0.3380413 3.805173e-06 7.011252e-05
## KIF26A       40.389957      -1.046881 0.6980850 5.548852e-03 3.455373e-02
## KLF13      2400.376993      -1.024484 0.2016952 2.974112e-08 9.076425e-07
## KLF2       1538.175854      -1.600727 0.3385510 8.060620e-08 2.952822e-06
## KLF5        528.335463      -1.467675 0.4142819 1.917693e-05 3.187926e-04
## KLHDC9      120.025141      -1.374845 0.4054818 3.646698e-05 5.934564e-04
## KRT14        30.792348      -4.308645 0.8612096 3.099286e-08 1.499945e-06
## KRT16       129.264438      -5.234739 0.9134643 1.196075e-10 8.970684e-09
## KRT4        464.818889      -5.735558 1.1359378 1.982936e-10 1.291110e-08
## KY          225.729559      -3.853717 0.4327509 2.810178e-20 8.778199e-18
## LAMA2       291.161267      -1.138377 0.6531875 2.603583e-03 2.242092e-02
## LAMP3       105.433745      -2.841191 0.6652342 3.631149e-07 1.281331e-05
## LDHD        107.970174      -1.033806 0.2393659 1.454475e-06 3.576313e-05
## LFNG         32.900329      -1.300203 0.7611724 2.927274e-03 1.770950e-02
## LINGO1      160.447478      -2.656180 0.9658888 4.412980e-05 7.520970e-04
## LLGL2        74.907823      -1.049845 0.6615068 4.239395e-03 2.675715e-02
## LMNTD2       61.472286      -1.031779 0.3812985 4.967940e-04 5.653868e-03
## LOXL4      1332.917470      -1.334758 0.2232309 1.528618e-10 9.214456e-09
## LPIN1      2302.130351      -1.171507 0.2882473 3.273409e-06 5.695936e-05
## LRATD2      458.113588      -1.140646 0.4596790 5.553769e-04 4.846602e-03
## LRRC2       558.494529      -1.405527 0.5337149 2.523622e-04 2.729495e-03
## LRRC32      102.324567      -1.437678 0.4792388 1.198515e-04 2.345248e-03
## LRRC66       73.941008      -1.163971 0.3415012 4.423200e-05 7.645259e-04
## LSP1       2833.607888      -1.344089 0.5280451 4.525511e-04 4.162122e-03
## LTC4S        44.865978      -2.915220 0.4650264 2.779932e-11 2.599785e-09
## LURAP1L    1022.081975      -1.176675 0.4214829 2.413769e-04 2.501855e-03
## MAF        1976.384006      -1.301286 0.2246323 4.379055e-10 2.170127e-08
## MAMLD1      657.779310      -1.618137 0.4622408 2.098826e-05 3.346990e-04
## MAP1LC3C    151.329232      -3.643845 0.6126032 5.578467e-11 4.889463e-09
## MAP3K7CL    104.495182      -1.170964 0.3499518 5.051573e-05 1.149943e-03
## MAPK15       48.757429      -1.508367 0.4361640 2.851590e-05 5.287619e-04
## MATN2       782.586932      -1.412708 0.6849873 1.141868e-03 7.800486e-03
## MEF2C       437.222965      -1.721697 0.5051448 2.167897e-05 3.839499e-04
## MEIS2      1741.599442      -1.968757 0.3035395 4.166109e-12 3.994909e-10
## MEOX2       389.514342      -1.446795 1.0221564 1.664849e-03 1.354671e-02
## METTL7B       9.520955      -1.374284 0.7536133 2.762553e-03 2.375366e-02
## MFAP5      1030.120209      -1.414261 0.5500310 4.307413e-04 4.466531e-03
## MFNG          8.393073      -6.428837 2.7617309 2.504541e-05 3.250053e-03
## MFSD4A       24.805049      -1.196847 0.7407435 3.847801e-03 3.289137e-02
## MMP25       117.868530      -1.249706 0.4509767 2.432310e-04 4.191991e-03
## MRAP2       375.074752      -3.178347 0.3801354 1.026867e-18 2.643835e-16
## MROH7       215.469400      -1.062538 0.3395108 1.210507e-04 1.538174e-03
## MTMR11      970.297572      -1.177529 0.1722005 6.273701e-13 6.973848e-11
## MTND5P1       9.647996      -1.848005 0.8653726 1.461290e-03 2.277022e-02
## MTNR1B       21.260484      -1.437819 0.6830614 1.410320e-03 2.220482e-02
## MTSS1       112.986535      -1.163761 0.4888144 8.310811e-04 7.778806e-03
## MYH7B        87.851637      -1.326887 0.3097342 1.206311e-06 3.532902e-05
## MYO15B      741.958451      -1.186677 0.3702728 7.442590e-05 9.011746e-04
## MYO1D      2647.558083      -1.349657 0.3524698 4.961433e-06 9.042665e-05
## MYO5B       309.085294      -1.021626 0.6013222 3.101797e-03 2.543684e-02
## MYO5C       134.670118      -1.200629 0.7547310 3.158623e-03 2.251528e-02
## MYOC        397.744720      -3.847299 1.0128411 5.291678e-07 1.863459e-05
## NANOS1      694.058602      -1.105952 0.4487854 6.835446e-04 5.821119e-03
## NAP1L2       40.628546      -2.459716 0.5670250 4.632478e-07 1.576067e-05
## NAP1L3      724.230220      -1.094032 0.1073907 2.638264e-25 8.745833e-23
## NBEAL2      359.009484      -1.002695 0.2218851 5.506236e-07 1.576067e-05
## NCAM1       605.963450      -1.052321 0.9195226 6.825048e-03 3.752524e-02
## NEK11       308.734050      -1.265110 0.2147393 2.738357e-10 1.804598e-08
## NGEF        933.565125      -3.409442 0.3339515 5.278199e-26 2.086304e-23
## NHSL2        45.317007      -2.421387 0.8136548 8.464175e-05 9.930617e-04
## NIBAN1     5222.706171      -2.109377 0.2638324 6.236711e-17 8.406495e-15
## NKX6-1      293.187884      -1.002884 0.2733547 2.074720e-05 4.175673e-04
## NLGN3        48.703247      -1.224334 0.3866430 1.023932e-04 1.402943e-03
## NOXA1        80.560897      -1.339834 0.4786378 2.731512e-04 2.522795e-03
## NPAS1        86.985734      -1.992016 0.5388867 9.461167e-06 1.566634e-04
## NPR1         12.277709      -1.897028 0.9305978 1.655905e-03 1.584515e-02
## NPTX1        20.712932      -1.263232 0.9691848 4.329487e-03 3.584354e-02
## NR3C2       101.059851      -1.089493 0.5871236 2.896580e-03 2.276015e-02
## NRTN         33.448393      -1.567615 0.9715925 2.288649e-03 1.663843e-02
## NTNG2        90.591989      -1.529677 0.4745860 6.370408e-05 1.028695e-03
## OLFML1      121.124051      -2.685450 0.7511508 3.528111e-06 1.213815e-04
## OR2S1P       16.290562      -1.242272 0.6435029 2.427932e-03 2.259210e-02
## OSBPL9     2130.127304      -1.181396 0.2230047 7.292457e-09 3.251574e-07
## PARD6A       30.740169      -1.133662 0.4842893 1.115529e-03 7.898709e-03
## PCSK6       406.491518      -1.174889 0.8095512 4.592690e-03 3.343160e-02
## PDE5A      2797.476216      -1.500589 0.2867284 1.067458e-08 3.936010e-07
## PDIA5      3198.490487      -1.633891 0.2584457 1.412646e-11 1.025576e-09
## PDZD2       207.656705      -1.780034 0.4042766 5.230444e-07 1.712255e-05
## PDZD7        93.035631      -1.642258 0.4377968 8.453126e-06 1.639995e-04
## PDZK1        84.960785      -1.114521 0.2937395 1.128647e-05 1.736526e-04
## PEG3        127.105792      -1.879906 0.6484169 1.433221e-04 1.849169e-03
## PGAM1P8      21.683326      -1.246721 0.5221956 8.934732e-04 9.697893e-03
## PIFO         68.822755      -1.085640 0.4266218 7.081517e-04 5.480015e-03
## PKMP3        25.175276      -1.205983 0.6212646 2.275714e-03 2.055974e-02
## PLA2R1     1362.450545      -1.148806 0.2570709 5.823299e-07 1.648697e-05
## PLAC8        70.225072      -1.249629 0.4324737 2.099934e-04 2.099484e-03
## PLCD1      1845.751266      -1.387938 0.2078699 1.361933e-12 1.268673e-10
## PLCD3      5793.626333      -1.005495 0.2868523 3.088741e-05 3.880826e-04
## PLCL1        36.401847      -1.846321 0.8729484 9.119333e-04 6.696399e-03
## PLEKHA7     126.263000      -1.684181 0.3288609 1.630197e-08 7.683408e-07
## PLEKHB1      38.167137      -1.005381 0.5470169 3.121858e-03 1.869718e-02
## PLEKHF1     518.649014      -1.302468 0.3899896 3.960356e-05 5.685210e-04
## PLXDC1      175.030426      -2.340085 0.4602507 1.806384e-08 9.252699e-07
## PLXNA2     1939.857442      -1.336954 0.3354530 3.500902e-06 6.587656e-05
## PNPLA7      281.945778      -2.012456 0.2985825 7.382766e-13 9.500097e-11
## PODN        180.697240      -3.089446 0.7117446 1.541312e-07 6.055504e-06
## PODXL       402.508663      -1.865747 0.8931161 5.752840e-04 6.699462e-03
## PPFIBP2     810.702951      -1.133252 0.4200180 3.164008e-04 2.991007e-03
## PPM1E        62.916578      -1.164926 0.4651396 6.772333e-04 6.309765e-03
## PRAM1        11.617972      -1.885612 0.9326568 1.176565e-03 1.927088e-02
## PRIMA1      191.164746      -3.548361 0.5831662 1.264664e-11 1.130349e-09
## PRODH        24.839754      -1.597902 1.3137172 3.219346e-03 2.654313e-02
## PROS1      1674.557810      -1.100566 0.4766073 9.303307e-04 8.237770e-03
## PRPH        106.398868      -1.546448 0.7922263 1.190361e-03 1.117495e-02
## PRR33       533.566982      -1.813198 1.1415264 2.141022e-03 1.527916e-02
## PRRT2       411.720813      -1.805944 0.4880981 9.543786e-06 2.228025e-04
## PRSS16       37.987605      -1.459676 0.5544652 3.816746e-04 4.164436e-03
## PRSS27       80.208185      -1.061262 0.2920887 2.165468e-05 3.172365e-04
## PTGIS      2527.086997      -1.474200 0.2547246 3.246471e-10 1.508567e-08
## PTH1R       161.290498      -1.095199 0.6530346 3.332456e-03 2.510448e-02
## PTPN13     1237.044704      -1.111070 0.2420849 3.576575e-07 1.094295e-05
## QRICH2      327.239190      -1.316363 0.1610677 2.484540e-17 6.624460e-15
## RAB37        21.684758      -1.297064 0.6893834 2.193583e-03 1.997090e-02
## RAB39B       52.751903      -2.418209 0.5969572 2.341825e-06 5.689722e-05
## RABGAP1    7183.864311      -1.459803 0.5177810 1.448654e-04 1.423294e-03
## RANP4        12.803469      -1.592747 0.6566210 7.391216e-04 8.306497e-03
## RAPGEF3     528.971785      -1.107590 0.2084726 8.376162e-09 3.602126e-07
## RASA4      1356.312860      -1.950940 0.4807348 1.303357e-06 2.867835e-05
## RASA4B      884.769758      -1.882690 0.5859133 2.872871e-05 4.222665e-04
## RASGEF1A     76.671028      -1.833976 0.4686981 4.678150e-06 1.150729e-04
## RBFOX1       22.428448      -1.023975 0.5615530 3.733048e-03 2.980222e-02
## RCAN2       931.085428      -1.236237 0.4773007 4.856130e-04 3.929901e-03
## RFLNA       132.730166      -2.297870 0.4213935 2.180521e-09 1.927670e-07
## RGMA        963.640847      -1.973983 0.4650205 5.073584e-07 1.363860e-05
## RGS5        315.503717      -1.142722 0.5532036 1.823976e-03 1.455993e-02
## RHOJ        335.649785      -1.329768 0.4304017 1.079885e-04 1.710680e-03
## RINL        155.800686      -1.005843 0.2737947 1.919681e-05 5.061742e-04
## RNF180       67.686547      -1.430966 0.6372707 9.939875e-04 8.547076e-03
## RNF224       41.375887      -1.243105 0.4853894 5.071623e-04 5.248150e-03
## ROBO2       231.788119      -1.541239 0.5400350 1.852074e-04 2.501855e-03
## ROM1        193.756077      -1.369364 0.2680943 2.003033e-08 9.263477e-07
## RSPH9        88.732866      -1.006826 0.2922803 4.860620e-05 6.264978e-04
## RSPO2       131.481071      -1.216695 0.4607049 4.650592e-04 4.658458e-03
## RUBCNL      130.912662      -2.681245 0.5049106 3.246219e-09 1.995342e-07
## S100A5       19.870728      -1.121221 0.6512019 3.972062e-03 3.287475e-02
## SALL4        27.539414      -4.200273 0.7939265 4.425107e-09 2.301265e-07
## SAMD11     1431.853496      -1.612687 0.2823307 5.967715e-10 3.699097e-08
## SCHIP1      120.954962      -1.655803 0.3740087 4.702859e-07 1.394366e-05
## SCNN1A       86.555125      -1.216616 0.3263587 1.368600e-05 2.602940e-04
## SCRG1      2080.786547      -1.936496 0.4684774 9.384167e-07 1.940947e-05
## SEC14L5      24.680020      -1.419432 0.6855743 1.332289e-03 1.401758e-02
## SEMA3B     5352.389096      -1.025430 0.3831811 3.980682e-04 2.847944e-03
## SEMA3D       76.190598      -1.184384 0.6963796 2.614153e-03 2.130791e-02
## SEMA4A      101.551959      -1.118911 0.5659638 2.227799e-03 2.438790e-02
## SEMA5B       61.564780      -2.736086 0.8968042 5.253735e-05 7.642323e-04
## SERPINF1    169.302508      -2.275231 0.7333613 3.626691e-05 5.913162e-04
## SERTAD4      79.525522      -1.051998 1.3501192 7.719023e-03 3.721794e-02
## SESN3      1569.384312      -1.852923 0.2715337 5.860377e-13 4.992255e-11
## SEZ6L        19.998719      -2.359315 1.4371662 9.342977e-04 9.993020e-03
## SGCA        107.870380      -1.081117 0.6013123 3.000964e-03 2.172359e-02
## SGCG         80.441945      -1.619795 1.4292423 3.231891e-03 2.488657e-02
## SGK2         43.715152      -2.111313 0.4224080 3.054592e-08 1.281471e-06
## SHF         393.758207      -1.274752 0.2616507 7.049127e-08 2.656066e-06
## SHISA6       24.611086      -4.114947 0.9176492 2.020615e-07 1.394366e-05
## SIM2         91.642127      -1.224883 1.2850486 5.322080e-03 4.695818e-02
## SIX1       2804.810069      -1.299537 0.2902910 6.078972e-07 1.503503e-05
## SLC22A15    339.379287      -1.083072 0.2246971 1.150408e-07 4.820426e-06
## SLC23A3      95.737130      -1.289135 0.3131716 2.508818e-06 5.711502e-05
## SLC26A4      24.860657      -1.394737 0.9216370 3.519727e-03 2.842021e-02
## SLC29A1    1474.445276      -1.553276 0.1924859 4.237679e-17 7.375998e-15
## SLC29A2     121.857624      -1.611085 0.2342346 3.779901e-13 4.992255e-11
## SLC38A4     254.638686      -2.073800 0.6189823 2.181844e-05 3.852334e-04
## SLC7A8      389.873983      -1.214351 0.6155887 1.907688e-03 1.752387e-02
## SMIM38       27.042783      -4.382781 1.0631495 1.318103e-06 3.305917e-05
## SMIM5        47.458314      -1.609223 0.6289061 4.392911e-04 4.449629e-03
## SMOC2      2303.628433      -2.770241 0.4833502 2.388116e-10 1.374114e-08
## SOX15        73.330513      -1.742235 0.3635835 9.357606e-08 2.819793e-06
## SPTB         92.299943      -1.305786 0.3974363 5.675941e-05 1.263642e-03
## SPTBN5      132.719837      -1.962337 0.6310974 5.847500e-05 8.390818e-04
## SPTSSB      375.022462      -1.594619 0.5607609 1.418735e-04 1.840452e-03
## SSPN        887.901855      -1.088874 0.2203905 6.006265e-08 2.367577e-06
## SSTR5        66.490215      -5.010855 1.1479979 1.460270e-07 4.962321e-06
## STARD5      225.312088      -1.128885 0.3023195 1.290775e-05 2.693898e-04
## STEAP4       42.571884      -1.877242 1.2130531 1.124957e-03 9.443768e-03
## STON2        27.252268      -1.810697 0.9032067 8.365084e-04 7.436767e-03
## SULT4A1      10.016764      -2.927633 1.1051590 3.564845e-04 5.018121e-03
## SYNE3      2188.475595      -1.599019 0.2377249 9.169335e-13 8.290865e-11
## SYT17        24.852105      -1.961232 0.7099494 1.826412e-04 2.687496e-03
## TAMALIN      52.325812      -1.515523 0.4892315 8.570893e-05 9.638035e-04
## TBX18      1537.116322      -1.216247 0.2697481 4.286408e-07 1.285260e-05
## TBX4         31.692058      -1.979394 0.6318390 6.732103e-05 8.185293e-04
## TBXA2R      121.644245      -1.114572 0.3415366 7.645719e-05 1.050237e-03
## TCEA3      1084.677786      -1.408992 0.2178703 7.309766e-12 6.539070e-10
## TCTE1         9.299801      -1.473041 0.9884020 4.170272e-03 3.482488e-02
## TENT5C      203.497481      -1.180133 0.3065061 7.952180e-06 1.638912e-04
## TFF3         22.382272      -1.091838 0.8283281 5.905046e-03 4.186652e-02
## THBD         95.982937      -1.979329 0.5257878 6.005290e-06 1.900877e-04
## THBS2      3095.012700      -2.919494 0.4918931 2.942617e-11 1.686657e-09
## THBS4       105.207575      -2.090875 1.0393777 5.490718e-04 5.325202e-03
## THRB        310.067738      -1.691076 0.2916382 3.570349e-10 2.288043e-08
## TIMP3     19456.848976      -1.585971 0.5181764 7.297752e-05 6.971286e-04
## TIMP4       172.168087      -1.130937 0.4604204 6.809296e-04 9.568344e-03
## TJP2       1395.943044      -1.331902 0.2594287 1.855182e-08 8.162626e-07
## TMEM119      77.169656      -3.608046 0.7617036 6.841188e-08 2.241274e-06
## TMEM150C     68.088867      -1.268193 0.5347302 8.620463e-04 8.012121e-03
## TMEM151A     32.796145      -1.028650 0.6911394 5.703328e-03 3.833624e-02
## TMEM26      797.699944      -1.646437 0.6069331 1.701520e-04 1.788150e-03
## TMEM266      96.860109      -1.433141 0.3248623 5.852296e-07 1.731620e-05
## TMEM30B    1917.311476      -1.396335 0.2839094 5.474437e-08 1.662356e-06
## TMIE         29.153782      -1.928045 0.4362153 5.571299e-07 1.394366e-05
## TNNC1        75.894571      -2.067310 0.6417377 4.234055e-05 6.413267e-04
## TNNC2        26.976095      -1.768501 0.6732211 3.261178e-04 2.913235e-03
## TNNI1         9.352788      -4.663926 1.4614749 3.737693e-05 7.179114e-04
## TNNT2        49.381924      -4.177151 1.2614402 1.517377e-06 4.313403e-05
## TNNT3        68.816333      -4.421658 1.2181412 3.998043e-06 9.038945e-05
## TNXB       2780.828372      -2.578383 0.5888893 2.674004e-07 6.652388e-06
## TOX         597.807341      -1.832693 0.2550538 3.092682e-14 4.256985e-12
## TPD52L1     956.492987      -1.727535 0.3675668 1.150466e-07 3.657712e-06
## TREX2        82.239249      -1.812191 0.4021003 3.411894e-07 1.236881e-05
## TRIB3      1726.801770      -1.766124 0.4398060 2.287277e-06 5.392204e-05
## TRIM29      369.293476      -1.082409 0.8017046 3.632078e-03 2.491220e-02
## TRIM7        98.675952      -1.281488 0.3620580 2.414507e-05 4.528941e-04
## TRMT9B      137.106152      -1.130167 0.4168283 3.956117e-04 4.281300e-03
## TSC22D3    2094.003100      -1.390666 0.2434542 6.999684e-10 3.650479e-08
## TSHR         59.499284      -1.625285 0.4818002 3.592829e-05 4.615630e-04
## TSPOAP1     388.653378      -1.042831 0.2168593 1.314401e-07 4.643291e-06
## TTC21A      200.930070      -1.056095 0.2744469 9.482389e-06 2.818597e-04
## TTC22        10.088937      -2.207397 1.1975855 3.083984e-03 2.760174e-02
## TTC9        564.656035      -1.184114 0.2904250 2.895816e-06 6.560441e-05
## TTLL9        12.952202      -3.007666 0.9246130 8.037530e-05 1.360717e-03
## TXLNB        21.860723      -1.764167 1.1109646 1.751452e-03 1.747335e-02
## ULBP1       106.521617      -1.287640 0.5315969 7.541028e-04 6.838382e-03
## UNC5CL       30.390153      -1.565238 0.6321671 4.662200e-04 4.076324e-03
## VSIR       3607.232637      -1.185813 0.2426363 6.120407e-08 1.689726e-06
## VWA3A        13.417398      -1.720729 1.4093738 3.532259e-03 3.075140e-02
## VWA7        124.440342      -1.143820 0.4778830 8.398994e-04 7.848568e-03
## WNT9A       305.365558      -1.308239 0.3240479 2.792862e-06 6.236045e-05
## WSCD2       221.008205      -3.542004 0.8847838 2.516624e-07 8.445981e-06
## ZFP36      1341.134892      -1.599692 0.1988275 4.894174e-17 9.547561e-15
## ZNF185      198.557620      -1.443093 0.2934068 5.474695e-08 2.450062e-06
## ZNF442       67.350676      -1.010853 0.4222064 1.095673e-03 9.236041e-03
## ZNF704      683.877892      -1.301101 0.4605183 2.063401e-04 2.315377e-03
## remove NA values from results
library(EnhancedVolcano)
res <- results(dds, alpha=0.05, c('condition','healthy_cytokine','healthy_control'))
res1 <- na.omit(res)

## calculate min/max axis values for plot (optional)
min_width <- min(res1$log2FoldChange)
max_width <- max(res1$log2FoldChange)
max_height <- -log10(min(res1[res1$pvalue>0, 5]))

## Grab top 10 up-reg genes for plot
up <- subset(res1, res1$log2FoldChange > 1 & res1$pvalue <= 0.05)
up <- up[order(-up$log2FoldChange),]
up_list <- head(rownames(up), n=10L)
up_list
##  [1] "CXCL6"    "CXCL5"    "CXCL8"    "C15orf48" "IL6"      "MARCOL"  
##  [7] "KDR"      "CXCL3"    "CSF3"     "CSF2"
## Grab top 10 down-reg genes for plot
down <- subset(res1, res1$log2FoldChange < -1 & res1$pvalue <= 0.05)
down <- down[order(down$log2FoldChange),]
down_list <- head(rownames(down), n=10L)
down_list
##  [1] "KRT223P"     "INO80B-WBP1" "FAM90A15P"   "C1QTNF8"     "FRMD7"      
##  [6] "MFNG"        "C1QTNF7"     "CSPG4P13"    "KRT4"        "KRT24"
## place top 20 DE genes in vector (optinal...)
plot_top_20 <- c(up_list, down_list)
plot_top_20
##  [1] "CXCL6"       "CXCL5"       "CXCL8"       "C15orf48"    "IL6"        
##  [6] "MARCOL"      "KDR"         "CXCL3"       "CSF3"        "CSF2"       
## [11] "KRT223P"     "INO80B-WBP1" "FAM90A15P"   "C1QTNF8"     "FRMD7"      
## [16] "MFNG"        "C1QTNF7"     "CSPG4P13"    "KRT4"        "KRT24"
EnhancedVolcano(res1,
                lab=rownames(res1),
                x="log2FoldChange",
                y="pvalue",
                selectLab=plot_top_20,
                drawConnectors=TRUE,
                legendPosition = "none",
                FCcutoff=1.0,
                pCutoff=0.05,
                title="Volcano Plot",
                subtitle="Healthy Cytokine vs Healthy Control",
                caption = paste0('Total Genes = ', nrow(res1)),
                xlim=c(-10, 10),
                ylim=c(0, max_height))
## Warning: ggrepel: 9 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps

# without apeglm - not shrinkage
plotMA(h_con_v_h_cyto, ylim=c(-10,10))

# with shrinkage estimator - keep this plot
plotMA(res1, ylim=c(-10,10))

heatmap

# index must match samples you qre plotting
subset <- rld[, 7:12]

# now select de_up, de_down, i.e DE genes that passed the filtering our function produced
up <- rownames(de_up)
down <- rownames(de_down)

# subset matrix to include only DE genes
key <- c(up, down)
subset <- subset[which(rownames(subset) %in% key),]

# scale and center the values
mat <- as.matrix(scale(t(subset), center = T))

# basic plot to check we're plotting something sensible
#pheatmap(t(mat))

# spruce it up a bit..
ann <- data.frame(Condition = c(rep("Healthy_control", 3), rep("Healthy_cytokine", 3)))
rownames(ann) <- rownames(mat)
col <- c("forestgreen","blue")
names(col) <- c("Healthy_cytokine", "Healthy_control")
ann_col <- list(Condition = col)

pheatmap(t(mat), 
         show_rownames = FALSE,
         annotation_col = ann,
         annotation_colors = ann_col,
         
         color = hcl.colors(100, "PRGn",rev=F))

heatmap for top20

subset <- rld[, 7:12]

# now select de_up, de_down, i.e DE genes that passed the filtering our function produced
up <- rownames(de_up)
down <- rownames(de_down)

# subset matrix to include only DE genes
key <- c(up, down)
subset <- subset[which(rownames(subset) %in% key),]

mat <- t(subset)
mat <- scale(mat, center=T, scale=T)
mat <- t(mat)
mat <- na.omit(mat)

plot_top_20<-c(up_list,down_list)

top_genes <- mat[which(rownames(mat) %in% plot_top_20),]
# make group 
rownames(ann) == rownames(top_genes)
## Warning in rownames(ann) == rownames(top_genes): longer object length is not a
## multiple of shorter object length
##  [1] FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE FALSE
## [13] FALSE
#pheatmap::pheatmap(top_genes,
                   #show_rownames = T,
                   #annotation_col = ann,
                   #annotation_colors = ann_col,
                   #annotation_legend = TRUE,
                  #legend = TRUE,
                   #legend_title = "z-score",
                   #color=hcl.colors(100, 'PRGn',rev=F))

ComplexHeatmap::pheatmap(top_genes,
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        legend = TRUE,
                       heatmap_legend_param =list(title="z-score",at=c (-1.5,-1,-0.5,0,0.5,1,1.5)),
        color=hcl.colors(100, 'PRGn',rev=F))

##GO Pathway Read GMT file

# read in gmt file
pathway <- gmtPathways("/Users/aungphyo/Downloads/c5.all.v2023.1.Hs.symbols.gmt.txt")
head(pathway, 1)
## $GOBP_MITOCHONDRIAL_GENOME_MAINTENANCE
##  [1] "AKT3"     "PPARGC1A" "POLG2"    "PARP1"    "DNA2"     "TYMP"    
##  [7] "FLCN"     "PRIMPOL"  "ENDOG"    "STOX1"    "SLC25A4"  "LIG3"    
## [13] "MEF2A"    "MPV17"    "OPA1"     "RRM2B"    "POLG"     "SLC25A36"
## [19] "TWNK"     "RRM1"     "METTL4"   "SSBP1"    "TOP3A"    "TP53"    
## [25] "TEFM"     "PIF1"     "SESN2"    "SLC25A33" "DNAJA3"   "MGME1"   
## [31] "LONP1"

Create ranked gene list

Extract the gene names and associated log2FoldChanges from our healthy cytokine vs healthy control study to generate a ranked gene list.

## convert result object to dataframe
res <- as.data.frame(res1)
res$hgnc_symbol <- rownames(res)

# compute summary stat
fgsea_rank <- res %>%
              dplyr::select(hgnc_symbol, log2FoldChange) %>%
              na.omit() %>%
              distinct() %>%
              group_by(hgnc_symbol) %>%
              summarize(log2foldchange=mean(log2FoldChange))

fgsea_rank
## # A tibble: 16,478 × 2
##    hgnc_symbol log2foldchange
##    <chr>                <dbl>
##  1 ""                 -0.0811
##  2 "A1BG"              0.178 
##  3 "A1CF"              0.807 
##  4 "A2M"               0.690 
##  5 "A2ML1"            -0.669 
##  6 "A2MP1"             0.232 
##  7 "A4GALT"            0.921 
##  8 "A4GNT"            -0.651 
##  9 "AAAS"             -0.282 
## 10 "AACS"              0.124 
## # ℹ 16,468 more rows

Convert to a named list

rank <- deframe(fgsea_rank)
head(rank, 20)
##                    A1BG        A1CF         A2M       A2ML1       A2MP1 
## -0.08106658  0.17779131  0.80699938  0.69022080 -0.66934621  0.23223054 
##      A4GALT       A4GNT        AAAS        AACS       AADAT       AAGAB 
##  0.92105758 -0.65100877 -0.28201115  0.12395885 -0.68486107  0.36251058 
##        AAK1       AAMDC        AAMP       AANAT        AAR2        AARD 
##  0.06013558 -0.29388262  0.10425325  0.16858497  0.05793644  0.77611830 
##       AARS1       AARS2 
## -0.66925235  0.04273303

Run fgsea

# run fgsea
fgsea <- fgsea(pathways=pathway, stats=rank, nperm=1000)

fgseaResTidy <- fgsea %>%
  as_tibble() %>%
  arrange(desc(NES))

# Show in a nice table:
fgseaResTidy %>%
  dplyr::select(-leadingEdge, -ES, -nMoreExtreme) %>%
  arrange(padj) %>%
  DT::datatable()

Cluster Profiler of GO Pathway

df <- as.data.frame(res1)
df$hgnc_symbol <- rownames(df)
info <- getBM(attributes=c("hgnc_symbol",
                           "entrezgene_id"),
                  filters = c("hgnc_symbol"),
                  values = df$hgnc_symbol,
                  mart = mart,
                  useCache=FALSE)
tmp <- merge(df, info, by="hgnc_symbol")

# subset the dataframe to include only stat sig genes
tmp <- tmp[tmp$padj < 0.05,]
OrgDb <- org.Hs.eg.db

geneList <- as.vector(tmp$log2FoldChange)
names(geneList) <- as.character(tmp$entrezgene_id)
gene <- na.omit(as.character(tmp$entrezgene_id))
gene_list<-sort(geneList,decreasing = TRUE)

# GO over-representation test
ego <- clusterProfiler::enrichGO(gene          = gene,
                                 OrgDb         = OrgDb,
                                 ont           = "ALL",
                                 pAdjustMethod = "BH",
                                 pvalueCutoff  = 0.05,
                                 qvalueCutoff  = 0.01,
                                 readable      = TRUE)

#GO gene set enrichment test
#ego3 <- gseGO(geneList     = gene_list,
              #OrgDb        = OrgDb,
              #ont          = "ALL",
             # minGSSize    = 100,
             #maxGSSize    = 500,
             # pvalueCutoff = 0.05,
            # verbose      = FALSE,
              #by="fgsea")
#summary(ego3)
summary(ego)
## Warning in summary(ego): summary method to convert the object to data.frame is
## deprecated, please use as.data.frame instead.
##            ONTOLOGY         ID
## GO:0006091       BP GO:0006091
## GO:0045333       BP GO:0045333
## GO:0015980       BP GO:0015980
## GO:0046034       BP GO:0046034
## GO:0009060       BP GO:0009060
## GO:0006119       BP GO:0006119
## GO:0030198       BP GO:0030198
## GO:0043062       BP GO:0043062
## GO:0045229       BP GO:0045229
## GO:0022900       BP GO:0022900
## GO:0022904       BP GO:0022904
## GO:0042773       BP GO:0042773
## GO:0042775       BP GO:0042775
## GO:0033108       BP GO:0033108
## GO:0019646       BP GO:0019646
## GO:0006120       BP GO:0006120
## GO:0003018       BP GO:0003018
## GO:0032496       BP GO:0032496
## GO:0010257       BP GO:0010257
## GO:0032981       BP GO:0032981
## GO:0006790       BP GO:0006790
## GO:0009259       BP GO:0009259
## GO:0009117       BP GO:0009117
## GO:0009150       BP GO:0009150
## GO:0006753       BP GO:0006753
## GO:0061448       BP GO:0061448
## GO:0006163       BP GO:0006163
## GO:0019693       BP GO:0019693
## GO:0002237       BP GO:0002237
## GO:1903829       BP GO:1903829
## GO:0009100       BP GO:0009100
## GO:0051223       BP GO:0051223
## GO:0062197       BP GO:0062197
## GO:0071453       BP GO:0071453
## GO:0006090       BP GO:0006090
## GO:0044272       BP GO:0044272
## GO:0051216       BP GO:0051216
## GO:0034976       BP GO:0034976
## GO:1903510       BP GO:1903510
## GO:1904951       BP GO:1904951
## GO:0070482       BP GO:0070482
## GO:0072521       BP GO:0072521
## GO:0010506       BP GO:0010506
## GO:0071496       BP GO:0071496
## GO:0072594       BP GO:0072594
## GO:0033157       BP GO:0033157
## GO:0009101       BP GO:0009101
## GO:0016236       BP GO:0016236
## GO:0071472       BP GO:0071472
## GO:0071384       BP GO:0071384
## GO:2001233       BP GO:2001233
## GO:0006979       BP GO:0006979
## GO:0036293       BP GO:0036293
## GO:1901653       BP GO:1901653
## GO:0060348       BP GO:0060348
## GO:0097191       BP GO:0097191
## GO:0001666       BP GO:0001666
## GO:0052548       BP GO:0052548
## GO:1901652       BP GO:1901652
## GO:0036294       BP GO:0036294
## GO:0002931       BP GO:0002931
## GO:0007249       BP GO:0007249
## GO:0071456       BP GO:0071456
## GO:1901654       BP GO:1901654
## GO:0019751       BP GO:0019751
## GO:0046031       BP GO:0046031
## GO:0097193       BP GO:0097193
## GO:2001236       BP GO:2001236
## GO:0055119       BP GO:0055119
## GO:1903522       BP GO:1903522
## GO:0071549       BP GO:0071549
## GO:0030199       BP GO:0030199
## GO:0032386       BP GO:0032386
## GO:0045862       BP GO:0045862
## GO:0032092       BP GO:0032092
## GO:0071222       BP GO:0071222
## GO:0051881       BP GO:0051881
## GO:0051222       BP GO:0051222
## GO:1900180       BP GO:1900180
## GO:1901617       BP GO:1901617
## GO:0071375       BP GO:0071375
## GO:1900182       BP GO:1900182
## GO:0030203       BP GO:0030203
## GO:0006486       BP GO:0006486
## GO:0043413       BP GO:0043413
## GO:0051767       BP GO:0051767
## GO:0051769       BP GO:0051769
## GO:0052547       BP GO:0052547
## GO:0071385       BP GO:0071385
## GO:0045444       BP GO:0045444
## GO:0006022       BP GO:0006022
## GO:0071219       BP GO:0071219
## GO:0070997       BP GO:0070997
## GO:0090316       BP GO:0090316
## GO:0071621       BP GO:0071621
## GO:0006936       BP GO:0006936
## GO:0046165       BP GO:0046165
## GO:0046173       BP GO:0046173
## GO:0043467       BP GO:0043467
## GO:0001819       BP GO:0001819
## GO:0016241       BP GO:0016241
## GO:0055076       BP GO:0055076
## GO:0034350       BP GO:0034350
## GO:0008637       BP GO:0008637
## GO:0051235       BP GO:0051235
## GO:0003012       BP GO:0003012
## GO:0015986       BP GO:0015986
## GO:0071383       BP GO:0071383
## GO:1901655       BP GO:1901655
## GO:0009135       BP GO:0009135
## GO:0009179       BP GO:0009179
## GO:0006096       BP GO:0006096
## GO:0070085       BP GO:0070085
## GO:0045936       BP GO:0045936
## GO:0009260       BP GO:0009260
## GO:1905952       BP GO:1905952
## GO:0042063       BP GO:0042063
## GO:0010508       BP GO:0010508
## GO:0035966       BP GO:0035966
## GO:0009165       BP GO:0009165
## GO:0010563       BP GO:0010563
## GO:0035296       BP GO:0035296
## GO:0097746       BP GO:0097746
## GO:0031668       BP GO:0031668
## GO:0010498       BP GO:0010498
## GO:2001234       BP GO:2001234
## GO:0061037       BP GO:0061037
## GO:0071548       BP GO:0071548
## GO:0006757       BP GO:0006757
## GO:0043434       BP GO:0043434
## GO:0030595       BP GO:0030595
## GO:0035150       BP GO:0035150
## GO:0090066       BP GO:0090066
## GO:0048545       BP GO:0048545
## GO:0046390       BP GO:0046390
## GO:0003015       BP GO:0003015
## GO:1901293       BP GO:1901293
## GO:0060047       BP GO:0060047
## GO:0072503       BP GO:0072503
## GO:0002062       BP GO:0002062
## GO:0006457       BP GO:0006457
## GO:0046916       BP GO:0046916
## GO:0030593       BP GO:0030593
## GO:0016055       BP GO:0016055
## GO:0097530       BP GO:0097530
## GO:2000116       BP GO:2000116
## GO:0007517       BP GO:0007517
## GO:0010950       BP GO:0010950
## GO:0046513       BP GO:0046513
## GO:0006023       BP GO:0006023
## GO:0198738       BP GO:0198738
## GO:0010038       BP GO:0010038
## GO:0009185       BP GO:0009185
## GO:0071216       BP GO:0071216
## GO:0006024       BP GO:0006024
## GO:0071470       BP GO:0071470
## GO:0050900       BP GO:0050900
## GO:0009152       BP GO:0009152
## GO:0001655       BP GO:0001655
## GO:1904062       BP GO:1904062
## GO:0009612       BP GO:0009612
## GO:0030099       BP GO:0030099
## GO:0032526       BP GO:0032526
## GO:0098657       BP GO:0098657
## GO:0006164       BP GO:0006164
## GO:0010952       BP GO:0010952
## GO:0060485       BP GO:0060485
## GO:0001836       BP GO:0001836
## GO:0050878       BP GO:0050878
## GO:0048705       BP GO:0048705
## GO:0072001       BP GO:0072001
## GO:0032527       BP GO:0032527
## GO:0034764       BP GO:0034764
## GO:0048762       BP GO:0048762
## GO:0006066       BP GO:0006066
## GO:0007033       BP GO:0007033
## GO:0010232       BP GO:0010232
## GO:0150104       BP GO:0150104
## GO:0090257       BP GO:0090257
## GO:1904851       BP GO:1904851
## GO:0006986       BP GO:0006986
## GO:0046661       BP GO:0046661
## GO:0042776       BP GO:0042776
## GO:0006487       BP GO:0006487
## GO:0071260       BP GO:0071260
## GO:0010876       BP GO:0010876
## GO:0006970       BP GO:0006970
## GO:0044106       BP GO:0044106
## GO:0006972       BP GO:0006972
## GO:0034349       BP GO:0034349
## GO:0071474       BP GO:0071474
## GO:0009267       BP GO:0009267
## GO:0019221       BP GO:0019221
## GO:0009308       BP GO:0009308
## GO:0009615       BP GO:0009615
## GO:0034599       BP GO:0034599
## GO:0008016       BP GO:0008016
## GO:0008654       BP GO:0008654
## GO:0042326       BP GO:0042326
## GO:0060349       BP GO:0060349
## GO:0070555       BP GO:0070555
## GO:0106106       BP GO:0106106
## GO:0120161       BP GO:0120161
## GO:0006734       BP GO:0006734
## GO:0051099       BP GO:0051099
## GO:0032331       BP GO:0032331
## GO:0034312       BP GO:0034312
## GO:0043122       BP GO:0043122
## GO:0072522       BP GO:0072522
## GO:1905954       BP GO:1905954
## GO:0071300       BP GO:0071300
## GO:0034612       BP GO:0034612
## GO:0043457       BP GO:0043457
## GO:1901214       BP GO:1901214
## GO:0010001       BP GO:0010001
## GO:0006165       BP GO:0006165
## GO:0031669       BP GO:0031669
## GO:0032368       BP GO:0032368
## GO:0006767       BP GO:0006767
## GO:1990266       BP GO:1990266
## GO:0048872       BP GO:0048872
## GO:0051403       BP GO:0051403
## GO:1902600       BP GO:1902600
## GO:0018126       BP GO:0018126
## GO:2001014       BP GO:2001014
## GO:0062012       BP GO:0062012
## GO:0060326       BP GO:0060326
## GO:0046939       BP GO:0046939
## GO:0031032       BP GO:0031032
## GO:0050920       BP GO:0050920
## GO:0006099       BP GO:0006099
## GO:0034311       BP GO:0034311
## GO:0006576       BP GO:0006576
## GO:0006672       BP GO:0006672
## GO:1902903       BP GO:1902903
## GO:0043270       BP GO:0043270
## GO:0048771       BP GO:0048771
## GO:0120163       BP GO:0120163
## GO:1990845       BP GO:1990845
## GO:0031098       BP GO:0031098
## GO:0051770       BP GO:0051770
## GO:0090075       BP GO:0090075
## GO:0051346       BP GO:0051346
## GO:0016266       BP GO:0016266
## GO:0042401       BP GO:0042401
## GO:0031331       BP GO:0031331
## GO:0044089       BP GO:0044089
## GO:0070203       BP GO:0070203
## GO:1904869       BP GO:1904869
## GO:1904871       BP GO:1904871
## GO:0006596       BP GO:0006596
## GO:0030007       BP GO:0030007
## GO:0098760       BP GO:0098760
## GO:0098761       BP GO:0098761
## GO:0045017       BP GO:0045017
## GO:0046890       BP GO:0046890
## GO:0016311       BP GO:0016311
## GO:0032370       BP GO:0032370
## GO:0032231       BP GO:0032231
## GO:0018208       BP GO:0018208
## GO:0051492       BP GO:0051492
## GO:0110053       BP GO:0110053
## GO:0042060       BP GO:0042060
## GO:0045785       BP GO:0045785
## GO:0000422       BP GO:0000422
## GO:0061726       BP GO:0061726
## GO:0070588       BP GO:0070588
## GO:0044262       BP GO:0044262
## GO:0071731       BP GO:0071731
## GO:0009309       BP GO:0009309
## GO:0061035       BP GO:0061035
## GO:0006839       BP GO:0006839
## GO:0010638       BP GO:0010638
## GO:0001659       BP GO:0001659
## GO:0097529       BP GO:0097529
## GO:0045926       BP GO:0045926
## GO:0002064       BP GO:0002064
## GO:0006754       BP GO:0006754
## GO:0038066       BP GO:0038066
## GO:0060350       BP GO:0060350
## GO:0035107       BP GO:0035107
## GO:0035108       BP GO:0035108
## GO:0010822       BP GO:0010822
## GO:0022411       BP GO:0022411
## GO:0032970       BP GO:0032970
## GO:0006493       BP GO:0006493
## GO:0009199       BP GO:0009199
## GO:0043281       BP GO:0043281
## GO:0006595       BP GO:0006595
## GO:0042339       BP GO:0042339
## GO:0034767       BP GO:0034767
## GO:0046467       BP GO:0046467
## GO:0006874       BP GO:0006874
## GO:0032412       BP GO:0032412
## GO:0055072       BP GO:0055072
## GO:0048538       BP GO:0048538
## GO:0021602       BP GO:0021602
## GO:0032869       BP GO:0032869
## GO:0071559       BP GO:0071559
## GO:0055074       BP GO:0055074
## GO:0042176       BP GO:0042176
## GO:0030178       BP GO:0030178
## GO:0043254       BP GO:0043254
## GO:0008207       BP GO:0008207
## GO:0045454       BP GO:0045454
## GO:0098798       CC GO:0098798
## GO:0005743       CC GO:0005743
## GO:0098800       CC GO:0098800
## GO:0000502       CC GO:0000502
## GO:1905369       CC GO:1905369
## GO:0070469       CC GO:0070469
## GO:0005746       CC GO:0005746
## GO:0098803       CC GO:0098803
## GO:1905368       CC GO:1905368
## GO:0005839       CC GO:0005839
## GO:0005788       CC GO:0005788
## GO:1990204       CC GO:1990204
## GO:0005747       CC GO:0005747
## GO:0030964       CC GO:0030964
## GO:0045271       CC GO:0045271
## GO:0019867       CC GO:0019867
## GO:0062023       CC GO:0062023
## GO:0016469       CC GO:0016469
## GO:0031300       CC GO:0031300
## GO:0031968       CC GO:0031968
## GO:0005741       CC GO:0005741
## GO:0005759       CC GO:0005759
## GO:0031301       CC GO:0031301
## GO:0019774       CC GO:0019774
## GO:0005604       CC GO:0005604
## GO:0140534       CC GO:0140534
## GO:0031228       CC GO:0031228
## GO:0022624       CC GO:0022624
## GO:0005753       CC GO:0005753
## GO:0030173       CC GO:0030173
## GO:0045259       CC GO:0045259
## GO:0042383       CC GO:0042383
## GO:0005838       CC GO:0005838
## GO:0015629       CC GO:0015629
## GO:1990351       CC GO:1990351
## GO:0033177       CC GO:0033177
## GO:0042470       CC GO:0042470
## GO:0048770       CC GO:0048770
## GO:0033176       CC GO:0033176
## GO:0005774       CC GO:0005774
## GO:0005581       CC GO:0005581
## GO:0034774       CC GO:0034774
## GO:0005758       CC GO:0005758
## GO:0060205       CC GO:0060205
## GO:0031970       CC GO:0031970
## GO:0045121       CC GO:0045121
## GO:0031983       CC GO:0031983
## GO:0098857       CC GO:0098857
## GO:0001726       CC GO:0001726
## GO:0098573       CC GO:0098573
## GO:0033178       CC GO:0033178
## GO:1904813       CC GO:1904813
## GO:0005832       CC GO:0005832
## GO:0045277       CC GO:0045277
## GO:0005751       CC GO:0005751
## GO:0016471       CC GO:0016471
## GO:1902495       CC GO:1902495
## GO:0098644       CC GO:0098644
## GO:0005766       CC GO:0005766
## GO:0042582       CC GO:0042582
## GO:0000314       CC GO:0000314
## GO:0005763       CC GO:0005763
## GO:0070069       CC GO:0070069
## GO:0005938       CC GO:0005938
## GO:0031227       CC GO:0031227
## GO:0032592       CC GO:0032592
## GO:0015399       MF GO:0015399
## GO:0009055       MF GO:0009055
## GO:0015453       MF GO:0015453
## GO:0016655       MF GO:0016655
## GO:0005201       MF GO:0005201
## GO:0003954       MF GO:0003954
## GO:0008137       MF GO:0008137
## GO:0050136       MF GO:0050136
## GO:0003955       MF GO:0003955
## GO:0022804       MF GO:0022804
## GO:0004298       MF GO:0004298
## GO:0016651       MF GO:0016651
## GO:0015036       MF GO:0015036
## GO:0016667       MF GO:0016667
## GO:0015078       MF GO:0015078
## GO:0008201       MF GO:0008201
## GO:0019829       MF GO:0019829
## GO:0015035       MF GO:0015035
## GO:0070003       MF GO:0070003
## GO:0030020       MF GO:0030020
## GO:0016853       MF GO:0016853
## GO:0046933       MF GO:0046933
## GO:0005539       MF GO:0005539
## GO:0016829       MF GO:0016829
## GO:0016758       MF GO:0016758
## GO:0042626       MF GO:0042626
##                                                                                    Description
## GO:0006091                                      generation of precursor metabolites and energy
## GO:0045333                                                                cellular respiration
## GO:0015980                                 energy derivation by oxidation of organic compounds
## GO:0046034                                                               ATP metabolic process
## GO:0009060                                                                 aerobic respiration
## GO:0006119                                                           oxidative phosphorylation
## GO:0030198                                                   extracellular matrix organization
## GO:0043062                                                extracellular structure organization
## GO:0045229                                       external encapsulating structure organization
## GO:0022900                                                            electron transport chain
## GO:0022904                                                respiratory electron transport chain
## GO:0042773                                            ATP synthesis coupled electron transport
## GO:0042775                              mitochondrial ATP synthesis coupled electron transport
## GO:0033108                                    mitochondrial respiratory chain complex assembly
## GO:0019646                                                    aerobic electron transport chain
## GO:0006120                                mitochondrial electron transport, NADH to ubiquinone
## GO:0003018                                              vascular process in circulatory system
## GO:0032496                                                      response to lipopolysaccharide
## GO:0010257                                                 NADH dehydrogenase complex assembly
## GO:0032981                                  mitochondrial respiratory chain complex I assembly
## GO:0006790                                                   sulfur compound metabolic process
## GO:0009259                                                    ribonucleotide metabolic process
## GO:0009117                                                        nucleotide metabolic process
## GO:0009150                                             purine ribonucleotide metabolic process
## GO:0006753                                              nucleoside phosphate metabolic process
## GO:0061448                                                       connective tissue development
## GO:0006163                                                 purine nucleotide metabolic process
## GO:0019693                                                  ribose phosphate metabolic process
## GO:0002237                                            response to molecule of bacterial origin
## GO:1903829                                         positive regulation of protein localization
## GO:0009100                                                      glycoprotein metabolic process
## GO:0051223                                                     regulation of protein transport
## GO:0062197                                                cellular response to chemical stress
## GO:0071453                                                  cellular response to oxygen levels
## GO:0006090                                                          pyruvate metabolic process
## GO:0044272                                                sulfur compound biosynthetic process
## GO:0051216                                                               cartilage development
## GO:0034976                                            response to endoplasmic reticulum stress
## GO:1903510                                                mucopolysaccharide metabolic process
## GO:1904951                        positive regulation of establishment of protein localization
## GO:0070482                                                           response to oxygen levels
## GO:0072521                                        purine-containing compound metabolic process
## GO:0010506                                                             regulation of autophagy
## GO:0071496                                              cellular response to external stimulus
## GO:0072594                                  establishment of protein localization to organelle
## GO:0033157                                       regulation of intracellular protein transport
## GO:0009101                                                   glycoprotein biosynthetic process
## GO:0016236                                                                      macroautophagy
## GO:0071472                                                    cellular response to salt stress
## GO:0071384                                        cellular response to corticosteroid stimulus
## GO:2001233                                           regulation of apoptotic signaling pathway
## GO:0006979                                                        response to oxidative stress
## GO:0036293                                                 response to decreased oxygen levels
## GO:1901653                                                        cellular response to peptide
## GO:0060348                                                                    bone development
## GO:0097191                                               extrinsic apoptotic signaling pathway
## GO:0001666                                                                 response to hypoxia
## GO:0052548                                                regulation of endopeptidase activity
## GO:1901652                                                                 response to peptide
## GO:0036294                                        cellular response to decreased oxygen levels
## GO:0002931                                                                response to ischemia
## GO:0007249                                                 I-kappaB kinase/NF-kappaB signaling
## GO:0071456                                                        cellular response to hypoxia
## GO:1901654                                                                  response to ketone
## GO:0019751                                                            polyol metabolic process
## GO:0046031                                                               ADP metabolic process
## GO:0097193                                               intrinsic apoptotic signaling pathway
## GO:2001236                                 regulation of extrinsic apoptotic signaling pathway
## GO:0055119                                                        relaxation of cardiac muscle
## GO:1903522                                                     regulation of blood circulation
## GO:0071549                                         cellular response to dexamethasone stimulus
## GO:0030199                                                        collagen fibril organization
## GO:0032386                                               regulation of intracellular transport
## GO:0045862                                                  positive regulation of proteolysis
## GO:0032092                                              positive regulation of protein binding
## GO:0071222                                             cellular response to lipopolysaccharide
## GO:0051881                                      regulation of mitochondrial membrane potential
## GO:0051222                                            positive regulation of protein transport
## GO:1900180                                       regulation of protein localization to nucleus
## GO:1901617                                       organic hydroxy compound biosynthetic process
## GO:0071375                                       cellular response to peptide hormone stimulus
## GO:1900182                              positive regulation of protein localization to nucleus
## GO:0030203                                                 glycosaminoglycan metabolic process
## GO:0006486                                                               protein glycosylation
## GO:0043413                                                         macromolecule glycosylation
## GO:0051767                                          nitric-oxide synthase biosynthetic process
## GO:0051769                            regulation of nitric-oxide synthase biosynthetic process
## GO:0052547                                                    regulation of peptidase activity
## GO:0071385                                        cellular response to glucocorticoid stimulus
## GO:0045444                                                            fat cell differentiation
## GO:0006022                                                       aminoglycan metabolic process
## GO:0071219                                   cellular response to molecule of bacterial origin
## GO:0070997                                                                        neuron death
## GO:0090316                              positive regulation of intracellular protein transport
## GO:0071621                                                              granulocyte chemotaxis
## GO:0006936                                                                  muscle contraction
## GO:0046165                                                        alcohol biosynthetic process
## GO:0046173                                                         polyol biosynthetic process
## GO:0043467                        regulation of generation of precursor metabolites and energy
## GO:0001819                                          positive regulation of cytokine production
## GO:0016241                                                        regulation of macroautophagy
## GO:0055076                                                    transition metal ion homeostasis
## GO:0034350                                          regulation of glial cell apoptotic process
## GO:0008637                                                     apoptotic mitochondrial changes
## GO:0051235                                                             maintenance of location
## GO:0003012                                                               muscle system process
## GO:0015986                                            proton motive force-driven ATP synthesis
## GO:0071383                                       cellular response to steroid hormone stimulus
## GO:1901655                                                         cellular response to ketone
## GO:0009135                                     purine nucleoside diphosphate metabolic process
## GO:0009179                                 purine ribonucleoside diphosphate metabolic process
## GO:0006096                                                                  glycolytic process
## GO:0070085                                                                       glycosylation
## GO:0045936                                  negative regulation of phosphate metabolic process
## GO:0009260                                                 ribonucleotide biosynthetic process
## GO:1905952                                                    regulation of lipid localization
## GO:0042063                                                                         gliogenesis
## GO:0010508                                                    positive regulation of autophagy
## GO:0035966                                         response to topologically incorrect protein
## GO:0009165                                                     nucleotide biosynthetic process
## GO:0010563                                 negative regulation of phosphorus metabolic process
## GO:0035296                                                         regulation of tube diameter
## GO:0097746                                                   blood vessel diameter maintenance
## GO:0031668                                         cellular response to extracellular stimulus
## GO:0010498                                               proteasomal protein catabolic process
## GO:2001234                                  negative regulation of apoptotic signaling pathway
## GO:0061037                                        negative regulation of cartilage development
## GO:0071548                                                           response to dexamethasone
## GO:0006757                                                             ATP generation from ADP
## GO:0043434                                                         response to peptide hormone
## GO:0030595                                                                leukocyte chemotaxis
## GO:0035150                                                             regulation of tube size
## GO:0090066                                             regulation of anatomical structure size
## GO:0048545                                                         response to steroid hormone
## GO:0046390                                               ribose phosphate biosynthetic process
## GO:0003015                                                                       heart process
## GO:1901293                                           nucleoside phosphate biosynthetic process
## GO:0060047                                                                   heart contraction
## GO:0072503                                      cellular divalent inorganic cation homeostasis
## GO:0002062                                                         chondrocyte differentiation
## GO:0006457                                                                     protein folding
## GO:0046916                                           cellular transition metal ion homeostasis
## GO:0030593                                                               neutrophil chemotaxis
## GO:0016055                                                               Wnt signaling pathway
## GO:0097530                                                               granulocyte migration
## GO:2000116                                  regulation of cysteine-type endopeptidase activity
## GO:0007517                                                            muscle organ development
## GO:0010950                                       positive regulation of endopeptidase activity
## GO:0046513                                                       ceramide biosynthetic process
## GO:0006023                                                    aminoglycan biosynthetic process
## GO:0198738                                                          cell-cell signaling by wnt
## GO:0010038                                                               response to metal ion
## GO:0009185                                        ribonucleoside diphosphate metabolic process
## GO:0071216                                                cellular response to biotic stimulus
## GO:0006024                                              glycosaminoglycan biosynthetic process
## GO:0071470                                                 cellular response to osmotic stress
## GO:0050900                                                                 leukocyte migration
## GO:0009152                                          purine ribonucleotide biosynthetic process
## GO:0001655                                                       urogenital system development
## GO:1904062                                        regulation of cation transmembrane transport
## GO:0009612                                                     response to mechanical stimulus
## GO:0030099                                                        myeloid cell differentiation
## GO:0032526                                                           response to retinoic acid
## GO:0098657                                                                    import into cell
## GO:0006164                                              purine nucleotide biosynthetic process
## GO:0010952                                           positive regulation of peptidase activity
## GO:0060485                                                              mesenchyme development
## GO:0001836                                           release of cytochrome c from mitochondria
## GO:0050878                                                     regulation of body fluid levels
## GO:0048705                                                       skeletal system morphogenesis
## GO:0072001                                                            renal system development
## GO:0032527                                             protein exit from endoplasmic reticulum
## GO:0034764                                      positive regulation of transmembrane transport
## GO:0048762                                                    mesenchymal cell differentiation
## GO:0006066                                                           alcohol metabolic process
## GO:0007033                                                                vacuole organization
## GO:0010232                                                                  vascular transport
## GO:0150104                                                transport across blood-brain barrier
## GO:0090257                                                 regulation of muscle system process
## GO:1904851            positive regulation of establishment of protein localization to telomere
## GO:0006986                                                        response to unfolded protein
## GO:0046661                                                            male sex differentiation
## GO:0042776                              proton motive force-driven mitochondrial ATP synthesis
## GO:0006487                                                      protein N-linked glycosylation
## GO:0071260                                            cellular response to mechanical stimulus
## GO:0010876                                                                  lipid localization
## GO:0006970                                                          response to osmotic stress
## GO:0044106                                                    cellular amine metabolic process
## GO:0006972                                                               hyperosmotic response
## GO:0034349                                                        glial cell apoptotic process
## GO:0071474                                                      cellular hyperosmotic response
## GO:0009267                                                     cellular response to starvation
## GO:0019221                                                 cytokine-mediated signaling pathway
## GO:0009308                                                             amine metabolic process
## GO:0009615                                                                   response to virus
## GO:0034599                                               cellular response to oxidative stress
## GO:0008016                                                     regulation of heart contraction
## GO:0008654                                                   phospholipid biosynthetic process
## GO:0042326                                              negative regulation of phosphorylation
## GO:0060349                                                                  bone morphogenesis
## GO:0070555                                                           response to interleukin-1
## GO:0106106                                                          cold-induced thermogenesis
## GO:0120161                                            regulation of cold-induced thermogenesis
## GO:0006734                                                              NADH metabolic process
## GO:0051099                                                      positive regulation of binding
## GO:0032331                                  negative regulation of chondrocyte differentiation
## GO:0034312                                                           diol biosynthetic process
## GO:0043122                                   regulation of I-kappaB kinase/NF-kappaB signaling
## GO:0072522                                     purine-containing compound biosynthetic process
## GO:1905954                                           positive regulation of lipid localization
## GO:0071300                                                  cellular response to retinoic acid
## GO:0034612                                                   response to tumor necrosis factor
## GO:0043457                                                  regulation of cellular respiration
## GO:1901214                                                          regulation of neuron death
## GO:0010001                                                          glial cell differentiation
## GO:0006165                                              nucleoside diphosphate phosphorylation
## GO:0031669                                                cellular response to nutrient levels
## GO:0032368                                                       regulation of lipid transport
## GO:0006767                                             water-soluble vitamin metabolic process
## GO:1990266                                                                neutrophil migration
## GO:0048872                                                      homeostasis of number of cells
## GO:0051403                                                       stress-activated MAPK cascade
## GO:1902600                                                      proton transmembrane transport
## GO:0018126                                                               protein hydroxylation
## GO:2001014                                  regulation of skeletal muscle cell differentiation
## GO:0062012                                      regulation of small molecule metabolic process
## GO:0060326                                                                     cell chemotaxis
## GO:0046939                                                          nucleotide phosphorylation
## GO:0031032                                                   actomyosin structure organization
## GO:0050920                                                            regulation of chemotaxis
## GO:0006099                                                            tricarboxylic acid cycle
## GO:0034311                                                              diol metabolic process
## GO:0006576                                           cellular biogenic amine metabolic process
## GO:0006672                                                          ceramide metabolic process
## GO:1902903                                     regulation of supramolecular fiber organization
## GO:0043270                                                positive regulation of ion transport
## GO:0048771                                                                   tissue remodeling
## GO:0120163                                   negative regulation of cold-induced thermogenesis
## GO:1990845                                                              adaptive thermogenesis
## GO:0031098                                   stress-activated protein kinase signaling cascade
## GO:0051770                   positive regulation of nitric-oxide synthase biosynthetic process
## GO:0090075                                                                relaxation of muscle
## GO:0051346                                           negative regulation of hydrolase activity
## GO:0016266                                                                 O-glycan processing
## GO:0042401                                        cellular biogenic amine biosynthetic process
## GO:0031331                                   positive regulation of cellular catabolic process
## GO:0044089                                positive regulation of cellular component biogenesis
## GO:0070203                     regulation of establishment of protein localization to telomere
## GO:1904869                                    regulation of protein localization to Cajal body
## GO:1904871                           positive regulation of protein localization to Cajal body
## GO:0006596                                                      polyamine biosynthetic process
## GO:0030007                                                  cellular potassium ion homeostasis
## GO:0098760                                                           response to interleukin-7
## GO:0098761                                                  cellular response to interleukin-7
## GO:0045017                                                   glycerolipid biosynthetic process
## GO:0046890                                            regulation of lipid biosynthetic process
## GO:0016311                                                                   dephosphorylation
## GO:0032370                                              positive regulation of lipid transport
## GO:0032231                                        regulation of actin filament bundle assembly
## GO:0018208                                                       peptidyl-proline modification
## GO:0051492                                                 regulation of stress fiber assembly
## GO:0110053                                           regulation of actin filament organization
## GO:0042060                                                                       wound healing
## GO:0045785                                                positive regulation of cell adhesion
## GO:0000422                                                          autophagy of mitochondrion
## GO:0061726                                                           mitochondrion disassembly
## GO:0070588                                                 calcium ion transmembrane transport
## GO:0044262                                             cellular carbohydrate metabolic process
## GO:0071731                                                            response to nitric oxide
## GO:0009309                                                          amine biosynthetic process
## GO:0061035                                                 regulation of cartilage development
## GO:0006839                                                             mitochondrial transport
## GO:0010638                                       positive regulation of organelle organization
## GO:0001659                                                             temperature homeostasis
## GO:0097529                                                         myeloid leukocyte migration
## GO:0045926                                                       negative regulation of growth
## GO:0002064                                                         epithelial cell development
## GO:0006754                                                            ATP biosynthetic process
## GO:0038066                                                                     p38MAPK cascade
## GO:0060350                                                     endochondral bone morphogenesis
## GO:0035107                                                             appendage morphogenesis
## GO:0035108                                                                  limb morphogenesis
## GO:0010822                                   positive regulation of mitochondrion organization
## GO:0022411                                                      cellular component disassembly
## GO:0032970                                          regulation of actin filament-based process
## GO:0006493                                                      protein O-linked glycosylation
## GO:0009199                                       ribonucleoside triphosphate metabolic process
## GO:0043281    regulation of cysteine-type endopeptidase activity involved in apoptotic process
## GO:0006595                                                         polyamine metabolic process
## GO:0042339                                                   keratan sulfate metabolic process
## GO:0034767                                  positive regulation of ion transmembrane transport
## GO:0046467                                                 membrane lipid biosynthetic process
## GO:0006874                                                    cellular calcium ion homeostasis
## GO:0032412                                regulation of ion transmembrane transporter activity
## GO:0055072                                                                iron ion homeostasis
## GO:0048538                                                                  thymus development
## GO:0021602                                                         cranial nerve morphogenesis
## GO:0032869                                               cellular response to insulin stimulus
## GO:0071559                                         response to transforming growth factor beta
## GO:0055074                                                             calcium ion homeostasis
## GO:0042176                                             regulation of protein catabolic process
## GO:0030178                                        negative regulation of Wnt signaling pathway
## GO:0043254                                   regulation of protein-containing complex assembly
## GO:0008207                                               C21-steroid hormone metabolic process
## GO:0045454                                                              cell redox homeostasis
## GO:0098798                                            mitochondrial protein-containing complex
## GO:0005743                                                        mitochondrial inner membrane
## GO:0098800                                        inner mitochondrial membrane protein complex
## GO:0000502                                                                  proteasome complex
## GO:1905369                                                               endopeptidase complex
## GO:0070469                                                                         respirasome
## GO:0005746                                                           mitochondrial respirasome
## GO:0098803                                                           respiratory chain complex
## GO:1905368                                                                   peptidase complex
## GO:0005839                                                             proteasome core complex
## GO:0005788                                                         endoplasmic reticulum lumen
## GO:1990204                                                              oxidoreductase complex
## GO:0005747                                           mitochondrial respiratory chain complex I
## GO:0030964                                                          NADH dehydrogenase complex
## GO:0045271                                                         respiratory chain complex I
## GO:0019867                                                                      outer membrane
## GO:0062023                                            collagen-containing extracellular matrix
## GO:0016469                                       proton-transporting two-sector ATPase complex
## GO:0031300                                           intrinsic component of organelle membrane
## GO:0031968                                                            organelle outer membrane
## GO:0005741                                                        mitochondrial outer membrane
## GO:0005759                                                                mitochondrial matrix
## GO:0031301                                            integral component of organelle membrane
## GO:0019774                                       proteasome core complex, beta-subunit complex
## GO:0005604                                                                   basement membrane
## GO:0140534                                    endoplasmic reticulum protein-containing complex
## GO:0031228                                               intrinsic component of Golgi membrane
## GO:0022624                                                        proteasome accessory complex
## GO:0005753                              mitochondrial proton-transporting ATP synthase complex
## GO:0030173                                                integral component of Golgi membrane
## GO:0045259                                            proton-transporting ATP synthase complex
## GO:0042383                                                                          sarcolemma
## GO:0005838                                                      proteasome regulatory particle
## GO:0015629                                                                  actin cytoskeleton
## GO:1990351                                                                 transporter complex
## GO:0033177           proton-transporting two-sector ATPase complex, proton-transporting domain
## GO:0042470                                                                          melanosome
## GO:0048770                                                                     pigment granule
## GO:0033176                                           proton-transporting V-type ATPase complex
## GO:0005774                                                                   vacuolar membrane
## GO:0005581                                                                     collagen trimer
## GO:0034774                                                             secretory granule lumen
## GO:0005758                                                   mitochondrial intermembrane space
## GO:0060205                                                           cytoplasmic vesicle lumen
## GO:0031970                                                            organelle envelope lumen
## GO:0045121                                                                       membrane raft
## GO:0031983                                                                       vesicle lumen
## GO:0098857                                                                membrane microdomain
## GO:0001726                                                                              ruffle
## GO:0098573                                       intrinsic component of mitochondrial membrane
## GO:0033178                     proton-transporting two-sector ATPase complex, catalytic domain
## GO:1904813                                                        ficolin-1-rich granule lumen
## GO:0005832                                                     chaperonin-containing T-complex
## GO:0045277                                                        respiratory chain complex IV
## GO:0005751                                          mitochondrial respiratory chain complex IV
## GO:0016471                                  vacuolar proton-transporting V-type ATPase complex
## GO:1902495                                                   transmembrane transporter complex
## GO:0098644                                                         complex of collagen trimers
## GO:0005766                                                                    primary lysosome
## GO:0042582                                                                   azurophil granule
## GO:0000314                                                  organellar small ribosomal subunit
## GO:0005763                                               mitochondrial small ribosomal subunit
## GO:0070069                                                                  cytochrome complex
## GO:0005938                                                                         cell cortex
## GO:0031227                               intrinsic component of endoplasmic reticulum membrane
## GO:0032592                                        integral component of mitochondrial membrane
## GO:0015399                                   primary active transmembrane transporter activity
## GO:0009055                                                          electron transfer activity
## GO:0015453                     oxidoreduction-driven active transmembrane transporter activity
## GO:0016655 oxidoreductase activity, acting on NAD(P)H, quinone or similar compound as acceptor
## GO:0005201                                         extracellular matrix structural constituent
## GO:0003954                                                         NADH dehydrogenase activity
## GO:0008137                                            NADH dehydrogenase (ubiquinone) activity
## GO:0050136                                               NADH dehydrogenase (quinone) activity
## GO:0003955                                            NAD(P)H dehydrogenase (quinone) activity
## GO:0022804                                           active transmembrane transporter activity
## GO:0004298                                               threonine-type endopeptidase activity
## GO:0016651                                          oxidoreductase activity, acting on NAD(P)H
## GO:0015036                                                   disulfide oxidoreductase activity
## GO:0016667                         oxidoreductase activity, acting on a sulfur group of donors
## GO:0015078                                           proton transmembrane transporter activity
## GO:0008201                                                                     heparin binding
## GO:0019829                            ATPase-coupled cation transmembrane transporter activity
## GO:0015035                                                protein-disulfide reductase activity
## GO:0070003                                                   threonine-type peptidase activity
## GO:0030020             extracellular matrix structural constituent conferring tensile strength
## GO:0016853                                                                  isomerase activity
## GO:0046933                     proton-transporting ATP synthase activity, rotational mechanism
## GO:0005539                                                           glycosaminoglycan binding
## GO:0016829                                                                      lyase activity
## GO:0016758                                                         hexosyltransferase activity
## GO:0042626                                   ATPase-coupled transmembrane transporter activity
##            GeneRatio   BgRatio       pvalue     p.adjust       qvalue
## GO:0006091  152/2840 494/18800 3.830606e-19 2.371528e-15 1.894739e-15
## GO:0045333   87/2840 231/18800 2.702577e-17 8.365827e-14 6.683900e-14
## GO:0015980  108/2840 321/18800 5.827814e-17 1.202667e-13 9.608737e-14
## GO:0046034   94/2840 273/18800 1.187700e-15 1.838263e-12 1.468685e-12
## GO:0009060   71/2840 187/18800 1.400398e-14 1.733972e-11 1.385362e-11
## GO:0006119   57/2840 139/18800 1.219898e-13 1.258732e-10 1.005667e-10
## GO:0030198   95/2840 307/18800 1.306356e-12 1.155379e-09 9.230931e-10
## GO:0043062   95/2840 308/18800 1.613309e-12 1.248499e-09 9.974917e-10
## GO:0045229   95/2840 310/18800 2.449928e-12 1.685278e-09 1.346457e-09
## GO:0022900   61/2840 167/18800 6.952868e-12 4.304521e-09 3.439108e-09
## GO:0022904   46/2840 113/18800 3.738928e-11 2.104337e-08 1.681265e-08
## GO:0042773   39/2840  92/18800 2.698347e-10 1.285036e-07 1.026683e-07
## GO:0042775   39/2840  92/18800 2.698347e-10 1.285036e-07 1.026683e-07
## GO:0033108   39/2840  94/18800 5.807184e-10 2.568020e-07 2.051726e-07
## GO:0019646   36/2840  84/18800 9.034636e-10 3.728895e-07 2.979211e-07
## GO:0006120   26/2840  51/18800 2.100121e-09 8.126155e-07 6.492413e-07
## GO:0003018   76/2840 263/18800 6.972898e-09 2.539365e-06 2.028833e-06
## GO:0032496   90/2840 333/18800 1.128920e-08 3.882857e-06 3.102219e-06
## GO:0010257   27/2840  58/18800 1.306827e-08 3.951698e-06 3.157220e-06
## GO:0032981   27/2840  58/18800 1.306827e-08 3.951698e-06 3.157220e-06
## GO:0006790   91/2840 339/18800 1.340424e-08 3.951698e-06 3.157220e-06
## GO:0009259   99/2840 384/18800 2.912965e-08 8.197348e-06 6.549293e-06
## GO:0009117  119/2840 487/18800 3.294772e-08 8.868668e-06 7.085645e-06
## GO:0009150   95/2840 366/18800 3.886585e-08 1.002577e-05 8.010115e-06
## GO:0006753  120/2840 495/18800 4.626431e-08 1.145689e-05 9.153515e-06
## GO:0061448   73/2840 260/18800 5.072346e-08 1.207804e-05 9.649780e-06
## GO:0006163  100/2840 394/18800 5.751441e-08 1.271685e-05 1.016016e-05
## GO:0019693  100/2840 394/18800 5.751441e-08 1.271685e-05 1.016016e-05
## GO:0002237   92/2840 354/18800 5.956940e-08 1.271704e-05 1.016031e-05
## GO:1903829  110/2840 446/18800 6.478431e-08 1.336932e-05 1.068146e-05
## GO:0009100   98/2840 386/18800 7.660987e-08 1.529973e-05 1.222376e-05
## GO:0051223  119/2840 495/18800 8.566081e-08 1.657269e-05 1.324079e-05
## GO:0062197   87/2840 332/18800 9.079842e-08 1.703433e-05 1.360963e-05
## GO:0071453   52/2840 166/18800 9.781751e-08 1.781142e-05 1.423048e-05
## GO:0006090   38/2840 106/18800 1.078953e-07 1.908513e-05 1.524812e-05
## GO:0044272   48/2840 149/18800 1.160604e-07 1.995917e-05 1.594643e-05
## GO:0051216   58/2840 195/18800 1.388323e-07 2.323002e-05 1.855969e-05
## GO:0034976   71/2840 257/18800 1.539454e-07 2.508095e-05 2.003849e-05
## GO:1903510   33/2840  88/18800 2.169648e-07 3.444177e-05 2.751734e-05
## GO:1904951   81/2840 309/18800 2.456534e-07 3.731412e-05 2.981222e-05
## GO:0070482   84/2840 324/18800 2.471134e-07 3.731412e-05 2.981222e-05
## GO:0072521  102/2840 416/18800 2.618103e-07 3.859209e-05 3.083325e-05
## GO:0010506   86/2840 336/18800 3.249244e-07 4.678155e-05 3.737625e-05
## GO:0071496   80/2840 309/18800 5.030124e-07 7.077613e-05 5.654677e-05
## GO:0072594  103/2840 431/18800 8.404994e-07 1.154102e-04 9.220727e-05
## GO:0033157   62/2840 224/18800 8.575138e-07 1.154102e-04 9.220727e-05
## GO:0009101   80/2840 316/18800 1.318709e-06 1.728127e-04 1.380692e-04
## GO:0016236   78/2840 306/18800 1.339850e-06 1.728127e-04 1.380692e-04
## GO:0071472    9/2840  11/18800 1.665984e-06 2.104920e-04 1.681732e-04
## GO:0071384   24/2840  59/18800 1.766999e-06 2.187899e-04 1.748027e-04
## GO:2001233   90/2840 370/18800 1.862212e-06 2.260579e-04 1.806095e-04
## GO:0006979  102/2840 433/18800 1.905727e-06 2.268915e-04 1.812755e-04
## GO:0036293   76/2840 299/18800 2.042664e-06 2.386062e-04 1.906351e-04
## GO:1901653   88/2840 361/18800 2.196146e-06 2.491296e-04 1.990428e-04
## GO:0060348   61/2840 225/18800 2.213234e-06 2.491296e-04 1.990428e-04
## GO:0097191   60/2840 221/18800 2.541527e-06 2.809748e-04 2.244856e-04
## GO:0001666   73/2840 286/18800 2.737474e-06 2.973281e-04 2.375510e-04
## GO:0052548  100/2840 426/18800 2.822214e-06 3.012470e-04 2.406821e-04
## GO:1901652  112/2840 491/18800 3.136115e-06 3.216840e-04 2.570103e-04
## GO:0036294   45/2840 151/18800 3.167834e-06 3.216840e-04 2.570103e-04
## GO:0002931   22/2840  53/18800 3.169556e-06 3.216840e-04 2.570103e-04
## GO:0007249   73/2840 288/18800 3.590480e-06 3.585268e-04 2.864460e-04
## GO:0071456   43/2840 143/18800 4.020494e-06 3.856275e-04 3.080981e-04
## GO:1901654   53/2840 190/18800 4.043033e-06 3.856275e-04 3.080981e-04
## GO:0019751   37/2840 116/18800 4.091306e-06 3.856275e-04 3.080981e-04
## GO:0046031   31/2840  90/18800 4.111034e-06 3.856275e-04 3.080981e-04
## GO:0097193   74/2840 295/18800 4.632847e-06 4.199925e-04 3.355541e-04
## GO:2001236   45/2840 153/18800 4.664559e-06 4.199925e-04 3.355541e-04
## GO:0055119   11/2840  17/18800 4.680905e-06 4.199925e-04 3.355541e-04
## GO:1903522   67/2840 260/18800 4.886942e-06 4.295145e-04 3.431617e-04
## GO:0071549   14/2840  26/18800 4.968478e-06 4.295145e-04 3.431617e-04
## GO:0030199   24/2840  62/18800 4.995161e-06 4.295145e-04 3.431617e-04
## GO:0032386   81/2840 332/18800 5.292326e-06 4.488327e-04 3.585961e-04
## GO:0045862   88/2840 369/18800 5.641421e-06 4.719735e-04 3.770845e-04
## GO:0032092   29/2840  83/18800 6.032704e-06 4.979796e-04 3.978621e-04
## GO:0071222   58/2840 217/18800 6.270172e-06 5.107715e-04 4.080822e-04
## GO:0051881   26/2840  71/18800 6.793098e-06 5.461827e-04 4.363741e-04
## GO:0051222   73/2840 293/18800 6.932409e-06 5.475790e-04 4.374897e-04
## GO:1900180   40/2840 132/18800 6.987359e-06 5.475790e-04 4.374897e-04
## GO:1901617   63/2840 243/18800 7.501616e-06 5.805313e-04 4.638170e-04
## GO:0071375   73/2840 294/18800 7.880594e-06 5.960450e-04 4.762117e-04
## GO:1900182   29/2840  84/18800 7.894635e-06 5.960450e-04 4.762117e-04
## GO:0030203   37/2840 120/18800 9.818877e-06 7.224725e-04 5.772213e-04
## GO:0006486   59/2840 225/18800 9.919263e-06 7.224725e-04 5.772213e-04
## GO:0043413   59/2840 225/18800 9.919263e-06 7.224725e-04 5.772213e-04
## GO:0051767   12/2840  21/18800 1.064854e-05 7.577598e-04 6.054142e-04
## GO:0051769   12/2840  21/18800 1.064854e-05 7.577598e-04 6.054142e-04
## GO:0052547  103/2840 456/18800 1.200183e-05 8.443557e-04 6.746002e-04
## GO:0071385   21/2840  53/18800 1.260899e-05 8.771041e-04 7.007647e-04
## GO:0045444   61/2840 237/18800 1.323350e-05 9.103177e-04 7.273007e-04
## GO:0006022   39/2840 131/18800 1.433221e-05 9.750626e-04 7.790288e-04
## GO:0071219   59/2840 229/18800 1.760869e-05 1.184950e-03 9.467188e-04
## GO:0070997   83/2840 353/18800 1.796442e-05 1.195889e-03 9.554589e-04
## GO:0090316   44/2840 156/18800 1.902158e-05 1.252794e-03 1.000923e-03
## GO:0071621   38/2840 128/18800 1.968613e-05 1.282914e-03 1.024988e-03
## GO:0006936   82/2840 349/18800 2.069000e-05 1.334289e-03 1.066034e-03
## GO:0046165   41/2840 143/18800 2.365542e-05 1.509801e-03 1.206260e-03
## GO:0046173   23/2840  63/18800 2.405678e-05 1.519751e-03 1.214209e-03
## GO:0043467   39/2840 134/18800 2.546308e-05 1.592343e-03 1.272206e-03
## GO:0001819  105/2840 475/18800 2.597984e-05 1.608412e-03 1.285045e-03
## GO:0016241   44/2840 158/18800 2.681812e-05 1.634989e-03 1.306279e-03
## GO:0055076   40/2840 139/18800 2.693731e-05 1.634989e-03 1.306279e-03
## GO:0034350    8/2840  11/18800 2.884893e-05 1.707277e-03 1.364033e-03
## GO:0008637   33/2840 107/18800 2.887308e-05 1.707277e-03 1.364033e-03
## GO:0051235   78/2840 331/18800 2.919551e-05 1.707277e-03 1.364033e-03
## GO:0003012  100/2840 449/18800 2.923135e-05 1.707277e-03 1.364033e-03
## GO:0015986   13/2840  26/18800 3.096786e-05 1.785208e-03 1.426296e-03
## GO:0071383   53/2840 203/18800 3.114237e-05 1.785208e-03 1.426296e-03
## GO:1901655   30/2840  94/18800 3.182284e-05 1.797795e-03 1.436353e-03
## GO:0009135   32/2840 103/18800 3.223312e-05 1.797795e-03 1.436353e-03
## GO:0009179   32/2840 103/18800 3.223312e-05 1.797795e-03 1.436353e-03
## GO:0006096   27/2840  81/18800 3.290472e-05 1.818867e-03 1.453189e-03
## GO:0070085   61/2840 244/18800 3.407275e-05 1.866765e-03 1.491457e-03
## GO:0045936   98/2840 440/18800 3.490050e-05 1.891220e-03 1.510995e-03
## GO:0009260   49/2840 184/18800 3.513007e-05 1.891220e-03 1.510995e-03
## GO:1905952   43/2840 155/18800 3.636414e-05 1.930327e-03 1.542240e-03
## GO:0042063   70/2840 291/18800 3.651281e-05 1.930327e-03 1.542240e-03
## GO:0010508   39/2840 136/18800 3.679188e-05 1.930327e-03 1.542240e-03
## GO:0035966   44/2840 160/18800 3.744982e-05 1.933620e-03 1.544871e-03
## GO:0009165   63/2840 255/18800 3.756503e-05 1.933620e-03 1.544871e-03
## GO:0010563   98/2840 441/18800 3.833284e-05 1.933620e-03 1.544871e-03
## GO:0035296   40/2840 141/18800 3.857641e-05 1.933620e-03 1.544871e-03
## GO:0097746   40/2840 141/18800 3.857641e-05 1.933620e-03 1.544871e-03
## GO:0031668   61/2840 245/18800 3.878874e-05 1.933620e-03 1.544871e-03
## GO:0010498  108/2840 496/18800 3.904095e-05 1.933620e-03 1.544871e-03
## GO:2001234   58/2840 230/18800 4.028706e-05 1.979502e-03 1.581528e-03
## GO:0061037   14/2840  30/18800 4.112524e-05 2.004775e-03 1.601720e-03
## GO:0071548   17/2840  41/18800 4.202493e-05 2.007788e-03 1.604128e-03
## GO:0006757   27/2840  82/18800 4.206490e-05 2.007788e-03 1.604128e-03
## GO:0043434   91/2840 404/18800 4.215999e-05 2.007788e-03 1.604128e-03
## GO:0030595   59/2840 236/18800 4.542018e-05 2.146537e-03 1.714981e-03
## GO:0035150   40/2840 142/18800 4.597310e-05 2.156208e-03 1.722708e-03
## GO:0090066  106/2840 487/18800 4.660411e-05 2.158058e-03 1.724186e-03
## GO:0048545   77/2840 330/18800 4.670970e-05 2.158058e-03 1.724186e-03
## GO:0046390   50/2840 191/18800 4.773725e-05 2.180189e-03 1.741868e-03
## GO:0003015   63/2840 257/18800 4.824517e-05 2.180189e-03 1.741868e-03
## GO:1901293   63/2840 257/18800 4.824517e-05 2.180189e-03 1.741868e-03
## GO:0060047   61/2840 247/18800 5.006999e-05 2.246256e-03 1.794652e-03
## GO:0072503  107/2840 494/18800 5.301173e-05 2.361119e-03 1.886423e-03
## GO:0002062   33/2840 110/18800 5.355617e-05 2.368330e-03 1.892184e-03
## GO:0006457   54/2840 212/18800 5.463394e-05 2.398856e-03 1.916573e-03
## GO:0046916   34/2840 115/18800 5.772259e-05 2.516624e-03 2.010663e-03
## GO:0030593   32/2840 106/18800 6.033786e-05 2.612250e-03 2.087064e-03
## GO:0016055   99/2840 452/18800 6.356099e-05 2.732681e-03 2.183283e-03
## GO:0097530   42/2840 154/18800 6.842421e-05 2.921478e-03 2.334123e-03
## GO:2000116   57/2840 229/18800 6.895322e-05 2.923900e-03 2.336057e-03
## GO:0007517   77/2840 334/18800 7.146546e-05 3.009814e-03 2.404699e-03
## GO:0010950   46/2840 174/18800 7.269126e-05 3.040754e-03 2.429419e-03
## GO:0046513   23/2840  67/18800 7.369079e-05 3.061877e-03 2.446295e-03
## GO:0006023   26/2840  80/18800 7.427995e-05 3.065781e-03 2.449414e-03
## GO:0198738   99/2840 454/18800 7.591649e-05 3.112576e-03 2.486801e-03
## GO:0010038   80/2840 351/18800 7.868282e-05 3.204772e-03 2.560461e-03
## GO:0009185   33/2840 112/18800 7.931545e-05 3.209425e-03 2.564178e-03
## GO:0071216   62/2840 256/18800 8.029382e-05 3.227916e-03 2.578952e-03
## GO:0006024   25/2840  76/18800 8.127182e-05 3.246154e-03 2.593523e-03
## GO:0071470   16/2840  39/18800 8.208572e-05 3.257646e-03 2.602704e-03
## GO:0050900   86/2840 384/18800 8.357473e-05 3.282733e-03 2.622748e-03
## GO:0009152   45/2840 170/18800 8.377835e-05 3.282733e-03 2.622748e-03
## GO:0001655   80/2840 352/18800 8.701870e-05 3.367080e-03 2.690137e-03
## GO:1904062   80/2840 352/18800 8.701870e-05 3.367080e-03 2.690137e-03
## GO:0009612   51/2840 201/18800 9.639366e-05 3.706446e-03 2.961275e-03
## GO:0030099   87/2840 391/18800 9.698664e-05 3.706446e-03 2.961275e-03
## GO:0032526   32/2840 109/18800 1.089684e-04 4.138793e-03 3.306699e-03
## GO:0098657   58/2840 238/18800 1.119013e-04 4.166365e-03 3.328728e-03
## GO:0006164   49/2840 192/18800 1.121294e-04 4.166365e-03 3.328728e-03
## GO:0010952   49/2840 192/18800 1.121294e-04 4.166365e-03 3.328728e-03
## GO:0060485   70/2840 301/18800 1.123862e-04 4.166365e-03 3.328728e-03
## GO:0001836   20/2840  56/18800 1.145647e-04 4.221845e-03 3.373055e-03
## GO:0050878   85/2840 382/18800 1.158087e-04 4.224692e-03 3.375329e-03
## GO:0048705   56/2840 228/18800 1.165497e-04 4.224692e-03 3.375329e-03
## GO:0072001   72/2840 312/18800 1.166891e-04 4.224692e-03 3.375329e-03
## GO:0032527   18/2840  48/18800 1.212040e-04 4.362639e-03 3.485542e-03
## GO:0034764   53/2840 213/18800 1.227061e-04 4.388075e-03 3.505864e-03
## GO:0048762   59/2840 244/18800 1.234657e-04 4.388075e-03 3.505864e-03
## GO:0006066   81/2840 361/18800 1.240370e-04 4.388075e-03 3.505864e-03
## GO:0007033   48/2840 188/18800 1.294996e-04 4.555296e-03 3.639466e-03
## GO:0010232   27/2840  87/18800 1.320333e-04 4.592236e-03 3.668979e-03
## GO:0150104   27/2840  87/18800 1.320333e-04 4.592236e-03 3.668979e-03
## GO:0090257   60/2840 250/18800 1.356007e-04 4.689965e-03 3.747060e-03
## GO:1904851    7/2840  10/18800 1.402011e-04 4.800496e-03 3.835369e-03
## GO:0006986   38/2840 139/18800 1.403472e-04 4.800496e-03 3.835369e-03
## GO:0046661   43/2840 164/18800 1.501289e-04 5.106858e-03 4.080138e-03
## GO:0042776   10/2840  19/18800 1.510479e-04 5.110042e-03 4.082682e-03
## GO:0006487   23/2840  70/18800 1.573891e-04 5.267005e-03 4.208088e-03
## GO:0071260   23/2840  70/18800 1.573891e-04 5.267005e-03 4.208088e-03
## GO:0010876   96/2840 446/18800 1.592621e-04 5.301031e-03 4.235272e-03
## GO:0006970   25/2840  79/18800 1.637034e-04 5.419719e-03 4.330099e-03
## GO:0044106   33/2840 116/18800 1.666273e-04 5.473807e-03 4.373313e-03
## GO:0006972   12/2840  26/18800 1.671054e-04 5.473807e-03 4.373313e-03
## GO:0034349    9/2840  16/18800 1.680782e-04 5.476696e-03 4.375621e-03
## GO:0071474    8/2840  13/18800 1.691290e-04 5.482080e-03 4.379923e-03
## GO:0009267   42/2840 160/18800 1.732163e-04 5.544795e-03 4.430028e-03
## GO:0019221  103/2840 486/18800 1.735378e-04 5.544795e-03 4.430028e-03
## GO:0009308   34/2840 121/18800 1.737506e-04 5.544795e-03 4.430028e-03
## GO:0009615   86/2840 392/18800 1.758920e-04 5.584346e-03 4.461628e-03
## GO:0034599   66/2840 284/18800 1.773550e-04 5.602065e-03 4.475785e-03
## GO:0008016   52/2840 211/18800 1.830079e-04 5.751279e-03 4.594999e-03
## GO:0008654   61/2840 258/18800 1.862328e-04 5.823066e-03 4.652354e-03
## GO:0042326   84/2840 382/18800 1.918775e-04 5.958121e-03 4.760256e-03
## GO:0060349   29/2840  98/18800 1.926660e-04 5.958121e-03 4.760256e-03
## GO:0070555   38/2840 141/18800 1.934392e-04 5.958121e-03 4.760256e-03
## GO:0106106   39/2840 146/18800 1.963065e-04 5.977520e-03 4.775756e-03
## GO:0120161   39/2840 146/18800 1.963065e-04 5.977520e-03 4.775756e-03
## GO:0006734   13/2840  30/18800 1.969656e-04 5.977520e-03 4.775756e-03
## GO:0051099   44/2840 171/18800 2.004659e-04 6.054071e-03 4.836916e-03
## GO:0032331   11/2840  23/18800 2.117748e-04 6.333804e-03 5.060410e-03
## GO:0034312   11/2840  23/18800 2.117748e-04 6.333804e-03 5.060410e-03
## GO:0043122   60/2840 254/18800 2.147384e-04 6.374225e-03 5.092704e-03
## GO:0072522   50/2840 202/18800 2.151854e-04 6.374225e-03 5.092704e-03
## GO:1905954   28/2840  94/18800 2.181387e-04 6.430937e-03 5.138014e-03
## GO:0071300   22/2840  67/18800 2.192486e-04 6.433025e-03 5.139683e-03
## GO:0034612   59/2840 249/18800 2.211778e-04 6.434784e-03 5.141088e-03
## GO:0043457   18/2840  50/18800 2.213873e-04 6.434784e-03 5.141088e-03
## GO:1901214   71/2840 313/18800 2.239534e-04 6.478952e-03 5.176376e-03
## GO:0010001   53/2840 218/18800 2.298040e-04 6.617287e-03 5.286899e-03
## GO:0006165   29/2840  99/18800 2.336753e-04 6.697609e-03 5.351072e-03
## GO:0031669   52/2840 213/18800 2.348430e-04 6.700060e-03 5.353030e-03
## GO:0032368   33/2840 118/18800 2.366508e-04 6.720666e-03 5.369493e-03
## GO:0006767   21/2840  63/18800 2.390085e-04 6.756629e-03 5.398227e-03
## GO:1990266   35/2840 128/18800 2.510358e-04 7.064375e-03 5.644101e-03
## GO:0048872   65/2840 282/18800 2.524235e-04 7.071284e-03 5.649621e-03
## GO:0051403   58/2840 245/18800 2.551001e-04 7.114077e-03 5.683810e-03
## GO:1902600   36/2840 133/18800 2.564301e-04 7.119098e-03 5.687822e-03
## GO:0018126   12/2840  27/18800 2.596099e-04 7.175201e-03 5.732645e-03
## GO:2001014   10/2840  20/18800 2.612528e-04 7.188515e-03 5.743283e-03
## GO:0062012   76/2840 342/18800 2.698733e-04 7.392856e-03 5.906542e-03
## GO:0060326   71/2840 315/18800 2.730653e-04 7.447346e-03 5.950077e-03
## GO:0046939   29/2840 100/18800 2.822620e-04 7.632766e-03 6.098218e-03
## GO:0031032   49/2840 199/18800 2.823297e-04 7.632766e-03 6.098218e-03
## GO:0050920   54/2840 225/18800 2.850325e-04 7.672330e-03 6.129828e-03
## GO:0006099   13/2840  31/18800 2.925653e-04 7.807207e-03 6.237589e-03
## GO:0034311   13/2840  31/18800 2.925653e-04 7.807207e-03 6.237589e-03
## GO:0006576   30/2840 105/18800 2.973884e-04 7.868084e-03 6.286226e-03
## GO:0006672   30/2840 105/18800 2.973884e-04 7.868084e-03 6.286226e-03
## GO:1902903   82/2840 376/18800 2.999539e-04 7.894358e-03 6.307218e-03
## GO:0043270   63/2840 273/18800 3.009318e-04 7.894358e-03 6.307218e-03
## GO:0048771   44/2840 174/18800 3.033853e-04 7.925141e-03 6.331813e-03
## GO:0120163   17/2840  47/18800 3.080028e-04 7.945474e-03 6.348057e-03
## GO:1990845   41/2840 159/18800 3.090809e-04 7.945474e-03 6.348057e-03
## GO:0031098   59/2840 252/18800 3.092206e-04 7.945474e-03 6.348057e-03
## GO:0051770    9/2840  17/18800 3.092972e-04 7.945474e-03 6.348057e-03
## GO:0090075   14/2840  35/18800 3.115839e-04 7.971141e-03 6.368564e-03
## GO:0051346   81/2840 371/18800 3.135588e-04 7.988652e-03 6.382554e-03
## GO:0016266   16/2840  43/18800 3.168700e-04 8.039927e-03 6.423521e-03
## GO:0042401   15/2840  39/18800 3.188517e-04 8.057188e-03 6.437311e-03
## GO:0031331   95/2840 449/18800 3.227478e-04 8.122486e-03 6.489482e-03
## GO:0044089  103/2840 494/18800 3.246977e-04 8.138475e-03 6.502256e-03
## GO:0070203    7/2840  11/18800 3.350673e-04 8.297607e-03 6.629395e-03
## GO:1904869    7/2840  11/18800 3.350673e-04 8.297607e-03 6.629395e-03
## GO:1904871    7/2840  11/18800 3.350673e-04 8.297607e-03 6.629395e-03
## GO:0006596    8/2840  14/18800 3.422940e-04 8.343080e-03 6.665726e-03
## GO:0030007    8/2840  14/18800 3.422940e-04 8.343080e-03 6.665726e-03
## GO:0098760    8/2840  14/18800 3.422940e-04 8.343080e-03 6.665726e-03
## GO:0098761    8/2840  14/18800 3.422940e-04 8.343080e-03 6.665726e-03
## GO:0045017   59/2840 253/18800 3.449396e-04 8.366691e-03 6.684590e-03
## GO:0046890   44/2840 175/18800 3.469905e-04 8.366691e-03 6.684590e-03
## GO:0016311   90/2840 422/18800 3.473170e-04 8.366691e-03 6.684590e-03
## GO:0032370   22/2840  69/18800 3.510864e-04 8.424713e-03 6.730947e-03
## GO:0032231   30/2840 106/18800 3.556937e-04 8.502316e-03 6.792948e-03
## GO:0018208   19/2840  56/18800 3.610155e-04 8.596334e-03 6.868063e-03
## GO:0051492   27/2840  92/18800 3.653097e-04 8.665259e-03 6.923132e-03
## GO:0110053   62/2840 270/18800 3.845298e-04 9.086351e-03 7.259564e-03
## GO:0042060   91/2840 429/18800 3.901428e-04 9.183933e-03 7.337527e-03
## GO:0045785   94/2840 446/18800 3.969895e-04 9.309705e-03 7.438013e-03
## GO:0000422   26/2840  88/18800 4.148108e-04 9.654488e-03 7.713479e-03
## GO:0061726   26/2840  88/18800 4.148108e-04 9.654488e-03 7.713479e-03
## GO:0070588   70/2840 314/18800 4.186492e-04 9.707330e-03 7.755697e-03
## GO:0044262   65/2840 287/18800 4.212004e-04 9.730043e-03 7.773843e-03
## GO:0071731   10/2840  21/18800 4.314306e-04 9.929320e-03 7.933056e-03
## GO:0009309   15/2840  40/18800 4.395202e-04 1.004871e-02 8.028443e-03
## GO:0061035   22/2840  70/18800 4.398643e-04 1.004871e-02 8.028443e-03
## GO:0006839   45/2840 182/18800 4.439909e-04 1.010569e-02 8.073968e-03
## GO:0010638  101/2840 487/18800 4.489543e-04 1.016645e-02 8.122509e-03
## GO:0001659   44/2840 177/18800 4.513772e-04 1.016645e-02 8.122509e-03
## GO:0097529   54/2840 229/18800 4.515866e-04 1.016645e-02 8.122509e-03
## GO:0045926   57/2840 245/18800 4.579583e-04 1.027254e-02 8.207269e-03
## GO:0002064   49/2840 203/18800 4.617786e-04 1.029685e-02 8.226699e-03
## GO:0006754   19/2840  57/18800 4.656952e-04 1.029685e-02 8.226699e-03
## GO:0038066   19/2840  57/18800 4.656952e-04 1.029685e-02 8.226699e-03
## GO:0060350   19/2840  57/18800 4.656952e-04 1.029685e-02 8.226699e-03
## GO:0035107   37/2840 142/18800 4.770525e-04 1.047316e-02 8.367562e-03
## GO:0035108   37/2840 142/18800 4.770525e-04 1.047316e-02 8.367562e-03
## GO:0010822   23/2840  75/18800 4.881530e-04 1.067899e-02 8.532010e-03
## GO:0022411   96/2840 460/18800 4.922712e-04 1.073117e-02 8.573693e-03
## GO:0032970   84/2840 393/18800 4.994210e-04 1.084883e-02 8.667698e-03
## GO:0006493   26/2840  89/18800 5.029692e-04 1.084976e-02 8.668448e-03
## GO:0009199   26/2840  89/18800 5.029692e-04 1.084976e-02 8.668448e-03
## GO:0043281   49/2840 204/18800 5.202081e-04 1.118267e-02 8.934421e-03
## GO:0006595    9/2840  18/18800 5.358398e-04 1.141598e-02 9.120828e-03
## GO:0042339    9/2840  18/18800 5.358398e-04 1.141598e-02 9.120828e-03
## GO:0034767   41/2840 163/18800 5.365935e-04 1.141598e-02 9.120828e-03
## GO:0046467   38/2840 148/18800 5.499117e-04 1.165926e-02 9.315195e-03
## GO:0006874   95/2840 456/18800 5.577857e-04 1.178584e-02 9.416328e-03
## GO:0032412   60/2840 263/18800 5.641012e-04 1.187874e-02 9.490552e-03
## GO:0055072   25/2840  85/18800 5.720268e-04 1.198358e-02 9.574309e-03
## GO:0048538   16/2840  45/18800 5.729508e-04 1.198358e-02 9.574309e-03
## GO:0021602   12/2840  29/18800 5.776743e-04 1.204169e-02 9.620738e-03
## GO:0032869   49/2840 205/18800 5.851480e-04 1.211468e-02 9.679057e-03
## GO:0071559   59/2840 258/18800 5.855662e-04 1.211468e-02 9.679057e-03
## GO:0055074   97/2840 468/18800 5.883659e-04 1.211468e-02 9.679057e-03
## GO:0042176   84/2840 395/18800 5.890033e-04 1.211468e-02 9.679057e-03
## GO:0030178   43/2840 174/18800 5.937644e-04 1.217217e-02 9.724987e-03
## GO:0043254   85/2840 401/18800 6.094368e-04 1.237443e-02 9.886585e-03
## GO:0008207   14/2840  37/18800 6.096271e-04 1.237443e-02 9.886585e-03
## GO:0045454   14/2840  37/18800 6.096271e-04 1.237443e-02 9.886585e-03
## GO:0098798  108/2979 281/19594 1.039090e-21 7.616530e-19 6.201727e-19
## GO:0005743  154/2979 491/19594 5.734252e-20 2.101603e-17 1.711222e-17
## GO:0098800   68/2979 155/19594 1.106679e-17 2.703985e-15 2.201708e-15
## GO:0000502   37/2979  59/19594 1.230118e-16 2.254191e-14 1.835465e-14
## GO:1905369   41/2979  79/19594 2.830803e-14 4.149958e-12 3.379085e-12
## GO:0070469   46/2979 101/19594 3.817257e-13 4.663415e-11 3.797166e-11
## GO:0005746   43/2979  94/19594 1.843601e-12 1.930513e-10 1.571912e-10
## GO:0098803   42/2979  91/19594 2.303293e-12 2.110392e-10 1.718378e-10
## GO:1905368   47/2979 111/19594 5.467479e-12 4.452958e-10 3.625802e-10
## GO:0005839   17/2979  20/19594 8.557908e-12 6.272946e-10 5.107720e-10
## GO:0005788   92/2979 311/19594 6.782873e-11 4.519860e-09 3.680277e-09
## GO:1990204   46/2979 120/19594 5.140589e-10 3.140043e-08 2.556766e-08
## GO:0005747   26/2979  49/19594 7.791469e-10 3.807431e-08 3.100184e-08
## GO:0030964   26/2979  49/19594 7.791469e-10 3.807431e-08 3.100184e-08
## GO:0045271   26/2979  49/19594 7.791469e-10 3.807431e-08 3.100184e-08
## GO:0019867   72/2979 234/19594 1.196039e-09 5.241518e-08 4.267883e-08
## GO:0062023  113/2979 429/19594 1.215632e-09 5.241518e-08 4.267883e-08
## GO:0016469   26/2979  50/19594 1.388516e-09 5.654347e-08 4.604028e-08
## GO:0031300  109/2979 412/19594 1.825553e-09 7.042791e-08 5.734563e-08
## GO:0031968   71/2979 232/19594 2.014341e-09 7.382561e-08 6.011218e-08
## GO:0005741   64/2979 205/19594 5.193588e-09 1.812810e-07 1.476072e-07
## GO:0005759  117/2979 473/19594 3.053727e-08 9.853277e-07 8.022989e-07
## GO:0031301   99/2979 382/19594 3.091751e-08 9.853277e-07 8.022989e-07
## GO:0019774   10/2979  11/19594 6.178659e-08 1.887066e-06 1.536535e-06
## GO:0005604   35/2979  95/19594 1.843881e-07 5.406259e-06 4.402023e-06
## GO:0140534   42/2979 125/19594 2.309768e-07 6.511769e-06 5.302180e-06
## GO:0031228   27/2979  67/19594 5.794959e-07 1.573224e-05 1.280991e-05
## GO:0022624   14/2979  23/19594 7.154572e-07 1.872965e-05 1.525054e-05
## GO:0005753   13/2979  21/19594 1.377805e-06 3.482521e-05 2.835628e-05
## GO:0030173   25/2979  62/19594 1.485583e-06 3.629775e-05 2.955529e-05
## GO:0045259   13/2979  22/19594 2.897474e-06 6.851123e-05 5.578498e-05
## GO:0042383   40/2979 131/19594 6.690907e-06 1.532636e-04 1.247942e-04
## GO:0005838   11/2979  19/19594 2.267545e-05 5.036698e-04 4.101110e-04
## GO:0015629  110/2979 499/19594 2.557244e-05 5.513117e-04 4.489032e-04
## GO:1990351   91/2979 399/19594 3.313791e-05 6.767623e-04 5.510508e-04
## GO:0033177   13/2979  26/19594 3.323798e-05 6.767623e-04 5.510508e-04
## GO:0042470   33/2979 109/19594 4.996153e-05 9.637316e-04 7.847143e-04
## GO:0048770   33/2979 109/19594 4.996153e-05 9.637316e-04 7.847143e-04
## GO:0033176   13/2979  27/19594 5.519069e-05 1.037302e-03 8.446187e-04
## GO:0005774   99/2979 449/19594 6.291472e-05 1.152912e-03 9.387539e-04
## GO:0005581   27/2979  86/19594 1.187551e-04 2.123110e-03 1.728733e-03
## GO:0034774   74/2979 322/19594 1.340810e-04 2.340032e-03 1.905361e-03
## GO:0005758   26/2979  83/19594 1.640218e-04 2.796000e-03 2.276631e-03
## GO:0060205   74/2979 325/19594 1.816523e-04 3.026162e-03 2.464039e-03
## GO:0031970   28/2979  93/19594 1.997515e-04 3.197202e-03 2.603308e-03
## GO:0045121   74/2979 326/19594 2.006430e-04 3.197202e-03 2.603308e-03
## GO:0031983   74/2979 327/19594 2.214239e-04 3.381327e-03 2.753231e-03
## GO:0098857   74/2979 327/19594 2.214239e-04 3.381327e-03 2.753231e-03
## GO:0001726   45/2979 177/19594 2.659333e-04 3.965333e-03 3.228755e-03
## GO:0098573   27/2979  90/19594 2.746477e-04 3.965333e-03 3.228755e-03
## GO:0033178   10/2979  20/19594 2.758963e-04 3.965333e-03 3.228755e-03
## GO:1904813   34/2979 124/19594 3.266677e-04 4.604758e-03 3.749405e-03
## GO:0005832    7/2979  11/19594 3.491881e-04 4.829338e-03 3.932267e-03
## GO:0045277   12/2979  28/19594 4.169617e-04 5.659869e-03 4.608524e-03
## GO:0005751   11/2979  25/19594 5.517829e-04 7.222444e-03 5.880844e-03
## GO:0016471   11/2979  25/19594 5.517829e-04 7.222444e-03 5.880844e-03
## GO:1902495   81/2979 377/19594 6.459555e-04 8.306760e-03 6.763744e-03
## GO:0098644   10/2979  22/19594 7.212728e-04 9.115396e-03 7.422172e-03
## GO:0005766   39/2979 155/19594 8.160566e-04 9.763975e-03 7.950275e-03
## GO:0042582   39/2979 155/19594 8.160566e-04 9.763975e-03 7.950275e-03
## GO:0000314   11/2979  26/19594 8.258751e-04 9.763975e-03 7.950275e-03
## GO:0005763   11/2979  26/19594 8.258751e-04 9.763975e-03 7.950275e-03
## GO:0070069   15/2979  42/19594 8.578520e-04 9.981040e-03 8.127019e-03
## GO:0005938   68/2979 310/19594 9.508911e-04 1.089067e-02 8.867685e-03
## GO:0031227   42/2979 172/19594 1.008340e-03 1.137097e-02 9.258762e-03
## GO:0032592   25/2979  88/19594 1.100590e-03 1.222322e-02 9.952705e-03
## GO:0015399   61/2917 162/18410 1.209625e-11 1.392279e-08 1.240184e-08
## GO:0009055   49/2917 125/18410 2.427010e-10 1.396744e-07 1.244162e-07
## GO:0015453   33/2917  72/18410 1.890931e-09 7.254872e-07 6.462339e-07
## GO:0016655   28/2917  57/18410 4.563929e-09 1.192731e-06 1.062436e-06
## GO:0005201   58/2917 172/18410 5.181283e-09 1.192731e-06 1.062436e-06
## GO:0003954   24/2917  45/18410 7.078297e-09 1.219371e-06 1.086165e-06
## GO:0008137   23/2917  42/18410 7.415811e-09 1.219371e-06 1.086165e-06
## GO:0050136   23/2917  43/18410 1.355269e-08 1.949893e-06 1.736884e-06
## GO:0003955   23/2917  45/18410 4.197461e-08 5.368087e-06 4.781669e-06
## GO:0022804  103/2917 404/18410 3.152201e-07 3.628183e-05 3.231835e-05
## GO:0004298   11/2917  14/18410 3.543179e-07 3.707454e-05 3.302447e-05
## GO:0016651   33/2917  88/18410 6.670602e-07 6.398219e-05 5.699269e-05
## GO:0015036   20/2917  42/18410 1.375347e-06 1.217711e-04 1.084687e-04
## GO:0016667   24/2917  57/18410 2.009876e-06 1.652405e-04 1.471894e-04
## GO:0015078   39/2917 120/18410 4.441813e-06 3.408351e-04 3.036018e-04
## GO:0008201   49/2917 168/18410 9.067883e-06 6.523209e-04 5.810604e-04
## GO:0019829   19/2917  44/18410 1.495375e-05 9.902063e-04 8.820348e-04
## GO:0015035   17/2917  37/18410 1.548542e-05 9.902063e-04 8.820348e-04
## GO:0070003   13/2917  24/18410 1.707639e-05 1.034470e-03 9.214629e-04
## GO:0030020   18/2917  41/18410 1.898403e-05 1.092531e-03 9.731815e-04
## GO:0016853   44/2917 155/18410 5.212730e-05 2.857072e-03 2.544962e-03
## GO:0046933   10/2917  17/18410 6.498973e-05 3.400144e-03 3.028708e-03
## GO:0005539   60/2917 234/18410 7.250557e-05 3.628431e-03 3.232056e-03
## GO:0016829   51/2917 195/18410 1.434196e-04 6.878164e-03 6.126784e-03
## GO:0016758   51/2917 198/18410 2.152362e-04 9.695705e-03 8.636532e-03
## GO:0042626   28/2917  90/18410 2.190168e-04 9.695705e-03 8.636532e-03
##                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              geneID
## GO:0006091                                                                                                         ACO1/ACO2/ADPGK/AIFM2/AK4/AKR1B1/ALDH1L2/ALDH2/ALDOA/AOC2/ARL2/ASPH/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5IF1/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/BNIP3/CHCHD2/CISD1/COA6/COQ10B/COX17/COX4I1/COX5A/COX5B/COX6C/COX7A2/COX7C/CYB5A/CYCS/DDIT4/DLAT/DMGDH/DNAJC15/DYRK2/ENO1/ENO2/ENO4/GAPDH/GFPT2/GLRX2/GPD2/GPI/GSR/GYS1/HDAC4/HIF1A/HK2/IDH3A/IFNAR1/IFNLR1/IL10RB/IRS1/KHK/LDHA/MAOB/MDH1/MDH1B/MDH2/MRAP2/MTOR/MYBBP1A/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/NOS2/NR1D1/NR4A3/OGT/P2RX7/PARK7/PDHB/PDIA5/PER2/PFKL/PFKP/PGAM1/PGAM2/PGK1/PHGDH/PHKA1/PHKA2/PHKG1/PHKG2/PID1/PKM/PLEC/POLG2/PPIF/PPP1R3B/PPP1R3C/PRDM16/PRKAA2/PRKAG2/PSEN1/QDPR/RHOA/RUBCNL/SCO2/SDHA/SDHAF2/SDHC/SELENOS/SIRT3/SLC25A23/SLC25A25/SLC2A6/SOD2/SRD5A1/STEAP4/SUCLA2/SUCLG2/TALDO1/TIGAR/TPI1/UGP2/UQCC2/UQCR11/UQCRC1/UQCRFS1/UQCRQ/VCP
## GO:0045333                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ACO1/ACO2/AIFM2/AK4/ARL2/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/BNIP3/CHCHD2/CISD1/COA6/COQ10B/COX4I1/COX5A/COX5B/COX7A2/COX7C/CYCS/DLAT/DNAJC15/GPD2/HIF1A/IDH3A/IFNAR1/IFNLR1/IL10RB/MDH1/MDH1B/MDH2/MYBBP1A/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/NOS2/NR4A3/PARK7/PDHB/PLEC/POLG2/PPIF/PRDM16/RHOA/SCO2/SDHA/SDHAF2/SDHC/SIRT3/SLC25A23/SLC25A25/SOD2/SUCLA2/SUCLG2/UQCC2/UQCRC1/UQCRFS1/UQCRQ/VCP
## GO:0015980                                                                                                                                                                                                                                                                                                                                                                        ACO1/ACO2/AIFM2/AK4/ARL2/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/BNIP3/CHCHD2/CISD1/COA6/COQ10B/COX4I1/COX5A/COX5B/COX7A2/COX7C/CYCS/DLAT/DNAJC15/DYRK2/GFPT2/GPD2/GYS1/HIF1A/IDH3A/IFNAR1/IFNLR1/IL10RB/IRS1/KHK/MDH1/MDH1B/MDH2/MRAP2/MTOR/MYBBP1A/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/NOS2/NR1D1/NR4A3/PARK7/PDHB/PER2/PHKA1/PHKA2/PHKG1/PHKG2/PID1/PLEC/POLG2/PPIF/PPP1R3B/PPP1R3C/PRDM16/PRKAG2/RHOA/RUBCNL/SCO2/SDHA/SDHAF2/SDHC/SELENOS/SIRT3/SLC25A23/SLC25A25/SOD2/SUCLA2/SUCLG2/TIGAR/UGP2/UQCC2/UQCRC1/UQCRFS1/UQCRQ/VCP
## GO:0046034                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ADPGK/AK2/AK4/ALDOA/ARL2/ATP1A2/ATP1B1/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5IF1/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/BID/CHCHD2/COA6/COX4I1/COX5A/COX5B/COX7A2/COX7C/CYCS/DDIT4/DNAJC15/ENO1/ENO2/ENO4/GAPDH/GPI/HDAC4/HIF1A/HK2/LDHA/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/OGT/OLA1/P2RX7/PARK7/PFKL/PFKP/PGAM1/PGAM2/PGK1/PID1/PKM/PPIF/PRKAA2/PRKAG2/PSEN1/RHOA/SDHA/SDHAF2/SDHC/SLC25A23/SLC25A25/SLC2A6/TIGAR/TPI1/UQCC2/UQCRC1/UQCRFS1/UQCRQ/VCP
## GO:0009060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ACO1/ACO2/AK4/ARL2/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/BNIP3/CHCHD2/COA6/COX4I1/COX5A/COX5B/COX7A2/COX7C/CYCS/DLAT/DNAJC15/HIF1A/IDH3A/MDH1/MDH1B/MDH2/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PARK7/PDHB/PPIF/RHOA/SDHA/SDHAF2/SDHC/SIRT3/SLC25A23/SUCLA2/SUCLG2/UQCC2/UQCRC1/UQCRFS1/UQCRQ/VCP
## GO:0006119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          AK4/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/CHCHD2/COA6/COX4I1/COX5A/COX5B/COX7A2/COX7C/CYCS/DNAJC15/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PARK7/PPIF/RHOA/SDHA/SDHAF2/SDHC/SLC25A23/UQCC2/UQCRC1/UQCRFS1/UQCRQ/VCP
## GO:0030198                                                                                                                                                                                                                                                                                                                                                                                                                                                       ABL1/ADAMTS1/ADAMTS15/ADAMTS2/ADAMTS6/ADAMTSL2/ADAMTSL3/AEBP1/AGT/ANGPTL7/ANTXR1/B4GALT1/BCL3/BMP1/BMP2/CCDC80/CFLAR/CHADL/CLASP2/COL11A2/COL12A1/COL15A1/COL18A1/COL22A1/COL2A1/COL3A1/COL4A1/COL4A2/COL4A3/COL4A4/COL5A2/COL8A2/COL9A1/COL9A2/COL9A3/COLGALT2/CSGALNACT1/CTSK/CTSS/DDR1/DPT/ELANE/ELF3/ERCC2/ERO1A/FERMT1/FKBP10/FLOT1/FOXC2/FOXF1/FURIN/GAS6/HAS3/IER3IP1/IL6/ITGB1/LAMB1/LAMB3/LAMC1/LOX/LOXL3/LOXL4/LUM/MARCOL/MIA/MMP1/MMP10/MMP12/MMP24/MMP25/MMP3/MPV17/NFKB2/NID2/NTNG2/P3H4/P4HA1/PTX3/PXDN/QSOX1/SFRP2/SH3PXD2B/SLC39A8/SMOC1/SMOC2/SOX9/SPINT1/SULF2/TGFB2/TGFBI/TGFBR1/TNFRSF11B/TNFRSF1B/TNXB/ZNF469
## GO:0043062                                                                                                                                                                                                                                                                                                                                                                                                                                                       ABL1/ADAMTS1/ADAMTS15/ADAMTS2/ADAMTS6/ADAMTSL2/ADAMTSL3/AEBP1/AGT/ANGPTL7/ANTXR1/B4GALT1/BCL3/BMP1/BMP2/CCDC80/CFLAR/CHADL/CLASP2/COL11A2/COL12A1/COL15A1/COL18A1/COL22A1/COL2A1/COL3A1/COL4A1/COL4A2/COL4A3/COL4A4/COL5A2/COL8A2/COL9A1/COL9A2/COL9A3/COLGALT2/CSGALNACT1/CTSK/CTSS/DDR1/DPT/ELANE/ELF3/ERCC2/ERO1A/FERMT1/FKBP10/FLOT1/FOXC2/FOXF1/FURIN/GAS6/HAS3/IER3IP1/IL6/ITGB1/LAMB1/LAMB3/LAMC1/LOX/LOXL3/LOXL4/LUM/MARCOL/MIA/MMP1/MMP10/MMP12/MMP24/MMP25/MMP3/MPV17/NFKB2/NID2/NTNG2/P3H4/P4HA1/PTX3/PXDN/QSOX1/SFRP2/SH3PXD2B/SLC39A8/SMOC1/SMOC2/SOX9/SPINT1/SULF2/TGFB2/TGFBI/TGFBR1/TNFRSF11B/TNFRSF1B/TNXB/ZNF469
## GO:0045229                                                                                                                                                                                                                                                                                                                                                                                                                                                       ABL1/ADAMTS1/ADAMTS15/ADAMTS2/ADAMTS6/ADAMTSL2/ADAMTSL3/AEBP1/AGT/ANGPTL7/ANTXR1/B4GALT1/BCL3/BMP1/BMP2/CCDC80/CFLAR/CHADL/CLASP2/COL11A2/COL12A1/COL15A1/COL18A1/COL22A1/COL2A1/COL3A1/COL4A1/COL4A2/COL4A3/COL4A4/COL5A2/COL8A2/COL9A1/COL9A2/COL9A3/COLGALT2/CSGALNACT1/CTSK/CTSS/DDR1/DPT/ELANE/ELF3/ERCC2/ERO1A/FERMT1/FKBP10/FLOT1/FOXC2/FOXF1/FURIN/GAS6/HAS3/IER3IP1/IL6/ITGB1/LAMB1/LAMB3/LAMC1/LOX/LOXL3/LOXL4/LUM/MARCOL/MIA/MMP1/MMP10/MMP12/MMP24/MMP25/MMP3/MPV17/NFKB2/NID2/NTNG2/P3H4/P4HA1/PTX3/PXDN/QSOX1/SFRP2/SH3PXD2B/SLC39A8/SMOC1/SMOC2/SOX9/SPINT1/SULF2/TGFB2/TGFBI/TGFBR1/TNFRSF11B/TNFRSF1B/TNXB/ZNF469
## GO:0022900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    AIFM2/AKR1B1/ALDH2/AOC2/ASPH/BID/CHCHD2/COA6/COX4I1/COX5A/COX5B/COX7C/CYB5A/CYCS/DMGDH/DNAJC15/GLRX2/GPD2/GSR/MAOB/MYBBP1A/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PARK7/PDIA5/PHGDH/PLEC/POLG2/QDPR/SCO2/SDHA/SDHAF2/SDHC/SOD2/SRD5A1/STEAP4/UQCRFS1/UQCRQ
## GO:0022904                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             AIFM2/BID/CHCHD2/COA6/COX4I1/COX5A/COX5B/COX7C/CYCS/DNAJC15/GPD2/MYBBP1A/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PARK7/PLEC/POLG2/SCO2/SDHA/SDHAF2/SDHC/SOD2/UQCRFS1/UQCRQ
## GO:0042773                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     BID/CHCHD2/COA6/COX4I1/COX5A/COX5B/COX7C/CYCS/DNAJC15/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PARK7/SDHA/SDHAF2/SDHC/UQCRFS1/UQCRQ
## GO:0042775                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     BID/CHCHD2/COA6/COX4I1/COX5A/COX5B/COX7C/CYCS/DNAJC15/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PARK7/SDHA/SDHAF2/SDHC/UQCRFS1/UQCRQ
## GO:0033108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             AIFM1/COA3/COA4/COX14/COX16/COX17/DMAC2/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFAF2/NDUFAF4/NDUFAF8/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS8/PET100/SAMM50/SCO2/SDHAF2/TIMM21/UQCC2/UQCRFS1
## GO:0019646                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     COX4I1/COX5A/COX5B/COX7C/CYCS/DNAJC15/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PARK7/SDHA/SDHAF2/SDHC/UQCRFS1/UQCRQ
## GO:0006120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  DNAJC15/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PARK7
## GO:0003018                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ABCA2/ABCC5/ABL1/ADM/ADORA2A/ADORA2B/AGT/AKAP12/ANGPT1/ATP1A2/ATP2A3/ATP2B4/ATP8A1/BMP6/C2CD4A/C2CD4B/CD38/DBH/DDAH1/DOCK4/DOCK5/EDN1/EDNRA/EDNRB/EXT2/F2R/FOXC2/GCH1/GPER1/GRIP2/GUCY1A1/HRH1/ITGA1/KCNMA1/KCNMB2/KCNMB4/KLF2/MFSD2A/MKKS/MTNR1B/NPR1/NPR3/OXTR/PER2/PLA2G6/PLEC/PTGS2/PTPRJ/RGS2/RHOA/ROCK1/ROCK2/SLC12A2/SLC16A2/SLC19A1/SLC1A4/SLC1A5/SLC24A3/SLC29A1/SLC29A2/SLC2A1/SLC2A13/SLC2A3/SLC38A1/SLC38A2/SLC44A1/SLC6A6/SLC7A2/SLC7A8/SLCO2B1/SLCO3A1/SOD2/TBXA2R/TFRC/TJP1/TJP2
## GO:0032496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ABCA1/ABL1/ADM/AKAP12/BDKRB1/BMP6/CCL2/CCL3/CCL5/CCR7/CD274/CD55/CEBPB/CHMP5/CLDN1/CSF2/CSF3/CTR9/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/EDN1/EDNRB/ELANE/EPHB2/F2R/FGF10/FGFR2/FOS/GCH1/GJB2/GSTP1/HCK/IFNAR1/IL10RA/IL6/IRAK2/LBP/LGALS9/MAOB/MAP2K3/MAPKAPK2/MEF2C/MIF/NFKB1/NFKBIA/NFKBIB/NOD2/NOS2/NR1D1/NR1H3/P2RX7/PCK1/PCK2/PDCD1LG2/PDCD4/PDE4B/PELI1/PF4/PF4V1/PRDX2/PRDX3/PTGER4/PTGFR/PTGS2/RARA/RHOA/RIPK2/SELE/SELENOS/SIRPA/SLPI/SOD2/SPON2/TAB2/TBXA2R/THBD/TIMP4/TNFAIP3/TNFRSF1B/TNIP1/TRIM5/VIM/WNT5A/ZC3H12A/ZFP36
## GO:0010257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       DMAC2/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFAF2/NDUFAF4/NDUFAF8/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS8/TIMM21
## GO:0032981                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       DMAC2/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFAF2/NDUFAF4/NDUFAF8/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS8/TIMM21
## GO:0006790                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  AADAT/ABHD14B/ACLY/ACOT11/ACSBG2/ACSL3/ACSL4/AHCYL1/AMD1/ANGPT1/APIP/B3GNT2/B3GNT7/B4GALT4/B4GAT1/BGN/BHMT/BOLA2/BPNT2/CHPF2/CHST12/CHST2/CHST5/CHST7/CIAO2B/CLIC3/CSAD/CSGALNACT1/DIP2A/DLAT/DSE/DSEL/EDNRA/EDNRB/ELOVL2/ELOVL3/EXT2/FAR1/FITM2/GGT1/GGT5/GLCE/GLO1/GLRX2/GLRX3/GNS/GSR/GSS/GSTM2/GSTM4/GSTO1/GSTP1/GSTZ1/HAGH/HSCB/ISCA1/LYRM4/MAT2A/MCEE/MGST2/MICAL1/MMS19/MTHFD2L/NUDT19/PAPSS1/PAPSS2/PARK7/PDHB/PDHX/PDK1/PDK4/PHGDH/PMVK/PPT1/PPT2/PTGES2/SLC19A2/SLC19A3/SLC35B2/SOD2/SQOR/ST3GAL1/ST3GAL4/STAT5B/SUCLA2/SUCLG2/SULT1C4/SULT4A1/TPST1/UGDH/UST
## GO:0009259                                                                                                                                                                                                                                                                                                                                                                                                                                                                           AADAT/ABHD14B/ACLY/ACOT11/ACSBG2/ACSL3/ACSL4/ADPGK/AK2/AK3/AK4/ALDOA/AMPD3/ARL2/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/CTPS1/DCAKD/DDIT4/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/ENO2/ENO4/ENTPD7/FAR1/FITM2/GAPDH/GPI/GUCY1A1/HDAC4/HIF1A/HK2/LDHA/MCCC2/MCEE/NME1/NPR1/NUDT19/NUDT4/NUDT9/OGT/P2RX7/PAICS/PAPSS1/PAPSS2/PDE10A/PDE4B/PDE4D/PDE5A/PDE7B/PDE8B/PDHB/PDHX/PDK1/PDK4/PFKL/PFKP/PGAM1/PGAM2/PGK1/PID1/PKM/PMVK/PPT1/PPT2/PRKAA2/PRKAG2/PSEN1/RAB23/RFK/RHOA/RORA/SLC2A6/SLC35B2/SUCLA2/SUCLG2/SULT1C4/TIGAR/TJP2/TPI1/TPST1/UCK2/UPP1/VCP
## GO:0009117                                                                                                                                                                                                                                                                                                                                                AADAT/ABHD14B/ACLY/ACOT11/ACSBG2/ACSL3/ACSL4/ADORA2B/ADPGK/AK2/AK3/AK4/ALDOA/AMPD3/ARL2/ASPDH/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/CTPS1/DCAKD/DDIT4/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/ENO2/ENO4/ENTPD7/FAR1/FITM2/FLAD1/GAPDH/GPI/GUCY1A1/HDAC4/HIF1A/HK2/KARS1/KYNU/LACC1/LDHA/MCCC2/MCEE/MTHFD2L/NADK2/NAMPT/NAXD/NEIL1/NME1/NMNAT3/NNMT/NOS2/NPR1/NUDT17/NUDT19/NUDT4/NUDT9/OGT/P2RX7/PAICS/PAPSS1/PAPSS2/PARK7/PDE10A/PDE4B/PDE4D/PDE5A/PDE7B/PDE8B/PDHB/PDHX/PDK1/PDK4/PFKL/PFKP/PGAM1/PGAM2/PGK1/PID1/PKM/PMVK/PPT1/PPT2/PRKAA2/PRKAG2/PRPSAP1/PSEN1/PTGIS/RAB23/RFK/RHOA/RORA/SARM1/SLC2A6/SLC35B2/SUCLA2/SUCLG2/SULT1C4/TIGAR/TJP2/TPI1/TPST1/TYMP/UCK2/UPP1/VCP
## GO:0009150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               AADAT/ABHD14B/ACLY/ACOT11/ACSBG2/ACSL3/ACSL4/ADPGK/AK2/AK3/AK4/ALDOA/AMPD3/ARL2/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/DCAKD/DDIT4/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/ENO2/ENO4/ENTPD7/FAR1/FITM2/GAPDH/GPI/GUCY1A1/HDAC4/HIF1A/HK2/LDHA/MCCC2/MCEE/NME1/NPR1/NUDT19/NUDT4/NUDT9/OGT/P2RX7/PAICS/PAPSS1/PAPSS2/PDE10A/PDE4B/PDE4D/PDE5A/PDE7B/PDE8B/PDHB/PDHX/PDK1/PDK4/PFKL/PFKP/PGAM1/PGAM2/PGK1/PID1/PKM/PMVK/PPT1/PPT2/PRKAA2/PRKAG2/PSEN1/RAB23/RHOA/RORA/SLC2A6/SLC35B2/SUCLA2/SUCLG2/SULT1C4/TIGAR/TJP2/TPI1/TPST1/VCP
## GO:0006753                                                                                                                                                                                                                                                                                                                                        AADAT/ABHD14B/ACLY/ACOT11/ACSBG2/ACSL3/ACSL4/ADORA2B/ADPGK/AK2/AK3/AK4/ALDOA/AMPD3/ARL2/ASPDH/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/CTPS1/DCAKD/DDIT4/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/ENO2/ENO4/ENTPD7/FAR1/FITM2/FLAD1/GAPDH/GPI/GUCY1A1/HDAC4/HIF1A/HK2/KARS1/KYNU/LACC1/LDHA/MCCC2/MCEE/MTHFD2L/NADK2/NAMPT/NAXD/NEIL1/NME1/NMNAT3/NNMT/NOS2/NPR1/NUDT17/NUDT19/NUDT4/NUDT9/OGT/P2RX7/PAICS/PAPSS1/PAPSS2/PARK7/PDE10A/PDE4B/PDE4D/PDE5A/PDE7B/PDE8B/PDHB/PDHX/PDK1/PDK4/PFKL/PFKP/PGAM1/PGAM2/PGK1/PID1/PKM/PMVK/PPT1/PPT2/PRKAA2/PRKAG2/PRPSAP1/PSEN1/PTGIS/RAB23/RFK/RHOA/RORA/SARM1/SLC2A6/SLC35B2/SMPDL3A/SUCLA2/SUCLG2/SULT1C4/TIGAR/TJP2/TPI1/TPST1/TYMP/UCK2/UPP1/VCP
## GO:0061448                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ARRDC3/BGN/BMP1/BMP2/BMP6/BPNT2/CCN3/CCN4/CFLAR/CHADL/CHRDL2/CNMD/COL11A2/COL2A1/COL3A1/CREB3L2/CRIP1/CSF1/CSGALNACT1/CTSK/CYTL1/DDRGK1/DLX2/EDN1/EFEMP1/EGR1/EPYC/FGF18/FGF9/FGFR3/FOXC2/FOXD1/FRZB/GDF7/GLI3/HIF1A/HOXA3/HOXC4/HYAL2/LOX/MAF/MEF2C/MKKS/PKD1/PTH1R/PTPN11/RARA/RARB/RARG/RFLNA/ZNF664-RFLNA/RSPO2/SCIN/SELENOM/SERPINB7/SFRP2/SH3PXD2B/SLC25A25/SLC39A14/SNORC/SOX8/SOX9/SPTLC2/STC1/SULF2/TGFBI/TGFBR1/THBS3/TSKU/WNT2B/WNT5A/WNT9A/ZEB1
## GO:0006163                                                                                                                                                                                                                                                                                                                                                                                                                                                            AADAT/ABHD14B/ACLY/ACOT11/ACSBG2/ACSL3/ACSL4/ADORA2B/ADPGK/AK2/AK3/AK4/ALDOA/AMPD3/ARL2/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/DCAKD/DDIT4/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/ENO2/ENO4/ENTPD7/FAR1/FITM2/GAPDH/GPI/GUCY1A1/HDAC4/HIF1A/HK2/LACC1/LDHA/MCCC2/MCEE/MTHFD2L/NME1/NOS2/NPR1/NUDT19/NUDT4/NUDT9/OGT/P2RX7/PAICS/PAPSS1/PAPSS2/PDE10A/PDE4B/PDE4D/PDE5A/PDE7B/PDE8B/PDHB/PDHX/PDK1/PDK4/PFKL/PFKP/PGAM1/PGAM2/PGK1/PID1/PKM/PMVK/PPT1/PPT2/PRKAA2/PRKAG2/PRPSAP1/PSEN1/RAB23/RHOA/RORA/SLC2A6/SLC35B2/SUCLA2/SUCLG2/SULT1C4/TIGAR/TJP2/TPI1/TPST1/VCP
## GO:0019693                                                                                                                                                                                                                                                                                                                                                                                                                                                                   AADAT/ABHD14B/ACLY/ACOT11/ACSBG2/ACSL3/ACSL4/ADPGK/AK2/AK3/AK4/ALDOA/AMPD3/ARL2/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/CTPS1/DCAKD/DDIT4/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/ENO2/ENO4/ENTPD7/FAR1/FITM2/GAPDH/GPI/GUCY1A1/HDAC4/HIF1A/HK2/LDHA/MCCC2/MCEE/NME1/NPR1/NUDT19/NUDT4/NUDT9/OGT/P2RX7/PAICS/PAPSS1/PAPSS2/PDE10A/PDE4B/PDE4D/PDE5A/PDE7B/PDE8B/PDHB/PDHX/PDK1/PDK4/PFKL/PFKP/PGAM1/PGAM2/PGK1/PID1/PKM/PMVK/PPT1/PPT2/PRKAA2/PRKAG2/PRPSAP1/PSEN1/RAB23/RFK/RHOA/RORA/SLC2A6/SLC35B2/SUCLA2/SUCLG2/SULT1C4/TIGAR/TJP2/TPI1/TPST1/UCK2/UPP1/VCP
## GO:0002237                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ABCA1/ABL1/ADM/AKAP12/B2M/BDKRB1/BMP6/CCL2/CCL3/CCL5/CCR7/CD274/CD55/CEBPB/CHMP5/CLDN1/CSF2/CSF3/CTR9/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/EDN1/EDNRB/ELANE/EPHB2/F2R/FGF10/FGFR2/FOS/GCH1/GJB2/GSTP1/HCK/IFNAR1/IL10RA/IL6/IRAK2/LBP/LGALS9/MAOB/MAP2K3/MAPKAPK2/MEF2C/MIF/NFKB1/NFKBIA/NFKBIB/NOD2/NOS2/NR1D1/NR1H3/P2RX7/PCK1/PCK2/PDCD1LG2/PDCD4/PDE4B/PELI1/PF4/PF4V1/PRDX2/PRDX3/PTGER4/PTGFR/PTGS2/RARA/RHOA/RIPK2/SELE/SELENOS/SIRPA/SIRT2/SLPI/SOD2/SPON2/TAB2/TBXA2R/THBD/TIMP4/TNFAIP3/TNFRSF1B/TNIP1/TRIM5/VIM/WNT5A/ZC3H12A/ZFP36
## GO:1903829                                                                                                                                                                                                                                                                                                                                                                                ABHD17B/ACSL3/ACSL4/ADORA2A/ANG/ANK3/APBB3/ATP2B4/BMP6/C1QTNF3/C2CD2L/C2CD5/CARD10/CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/CD38/CDK5/CDK5RAP3/CHP1/CORO2B/CSNK2A2/DDRGK1/DOC2B/EDEM2/MMP24-AS1-EDEM2/EPB41/EPHB2/ERBB2/EXOC1/EXPH5/FYN/GAS6/GLI3/GLIS2/GNAI1/GPD1L/GPER1/HIF1A/HPS4/HYAL2/ICE1/IER3IP1/IPO5/ITGB1/JUP/KCNN4/LAMTOR5/LEPROT/LIF/MESD/MFF/MYO18A/MYO1C/NKX6-1/NLGN2/NR1H2/NUMA1/OAZ1/OAZ2/P2RX7/PARD6A/PARK7/PCK2/PCM1/PCNT/PDCD5/PDZK1/PGRMC1/PLA2G6/PLK3/PRKAA2/PRKCD/PRKCH/PRKCI/PRKCZ/PRKD1/PRR5L/PSEN1/PSMD9/PTGS2/RAB29/RANGRF/RAPGEF3/RBM22/ROCK2/SAR1B/SEC16B/CRYZL2P-SEC16B/SESN2/SOX4/TCF7L2/TCP1/TFRC/TGFB2/TGFB3/TMEM30A/TMEM30B/TNFAIP6/TOMM7/TRIM8/UBL5/WNT5A/YAP1/ZC3H12A/ZDHHC5/ZIC1
## GO:0009100                                                                                                                                                                                                                                                                                                                                                                                                                             ABCA2/ALG2/ALG3/ALG5/ALG8/ALG9/B3GALT1/B3GALT2/B3GNT2/B3GNT7/B4GALT1/B4GALT4/B4GALT5/B4GAT1/BGN/BMP2/BPNT2/C1GALT1/C1GALT1C1/C1GALT1C1L/CCR7/CHP1/CHPF2/CHST10/CHST12/CHST7/CNMD/COL2A1/CSGALNACT1/CYTL1/DOLK/DPAGT1/DSE/DSEL/EDEM2/MMP24-AS1-EDEM2/EDEM3/ERP44/EXT2/FKTN/FOXL1/FUT11/GAL3ST2/GALNT16/GALNT2/GALNT5/GALNT8/GCNT3/GFPT2/GLCE/GNPTAB/HIF1A/HS6ST1/IL15/IL33/ITM2A/MAN1A1/MAN1C1/MAN2B1/MGAT1/MGAT4A/MGAT5/MLEC/MMP12/NCCRP1/NCSTN/NUS1/OGA/OGT/OSTC/PARK7/PCSK6/PHLDA1/POFUT1/POGLUT1/POGLUT2/POMGNT1/POMT2/PORCN/PSEN1/PTX3/RAMP1/RPN1/RPN2/SLC39A8/ST3GAL1/ST3GAL4/ST3GAL5/ST6GALNAC4/STT3B/SULF2/TCF7L2/TMEM165/TMTC3/TNIP1/UGDH/UST/XXYLT1
## GO:0051223                                                                                                                                                                                                                                                                                                                   ACSL3/ACSL4/ADORA2A/ANG/ANGPT1/ANK3/APBB3/ATP5IF1/BAG4/BMP6/C1QTNF3/C2CD2L/C2CD5/CCL5/CCN3/CD38/CDK5/CHP1/CSNK2A2/DERL2/DNAJA1/DNAJC1/DOC2B/EDEM2/MMP24-AS1-EDEM2/EIPR1/ERBB2/ERLEC1/EXOC1/EXPH5/F2R/FERMT1/FYN/GAS6/GLI3/GPER1/HIF1A/HPS4/HYAL2/ICE1/IER3IP1/IFI27/IL6/IPO5/IRS1/JAGN1/JUP/KCNN4/LEPROT/LLGL2/MFF/MTNR1B/MYO18A/MYO1C/NDUFAF2/NKX6-1/NLGN2/NOLC1/NOS2/NR1D1/NR1H2/NR1H3/OAZ1/OAZ2/P2RX7/PARD6A/PARK7/PCK2/PCM1/PCNT/PDCD5/PDZK1/PER2/PFKL/PLA2G6/PLK3/PRKCD/PRKCZ/PRKD1/PRR5L/PSEN1/PSMD9/PTGS2/PTPN1/PTPN11/RAB11FIP5/RAB23/RAB29/RANGAP1/RAPGEF3/RBM22/RHBDD3/RHBDF1/SAA1/SAR1B/SEC16B/CRYZL2P-SEC16B/SELENOK/SFRP1/SH3TC2/SLC12A2/SOX4/SSTR5/STXBP5/SUFU/TAMALIN/TCF7L2/TCIRG1/TGFB2/TGFB3/TMEM30A/TMEM30B/TOMM7/TXN/UBL5/UHMK1/UQCC2/ZC3H12A/ZIC1
## GO:0062197                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ABL1/AIFM1/AIFM2/AKR1B1/AKR1C3/AQP1/ARHGEF2/ATG7/ATM/ATP2A2/BECN1/BNIP3/BRF2/CAPN3/CHCHD2/CHUK/DDIT3/DNAJA1/EDN1/EDNRA/EFHD1/EIF2S1/ENDOG/EPAS1/FAS/FOS/FOXO1/FYN/GCH1/GJB2/GLRX2/GPR37L1/GSR/HIF1A/HSPB1/IL6/KLF2/LETM1/LRRC8C/LRRC8D/MAP3K5/MAPKAP1/MGST1/MMP3/MPV17/NCOA7/NOL3/NR4A2/NR4A3/P4HB/PARK7/PDK1/PLA2R1/PLEC/PLEKHA1/PNPLA8/PPIF/PRDX1/PRDX2/PRDX3/PRKAA2/PRKCD/PRKD1/PRODH/PRR5L/PTGS2/PTPRK/PYCR1/PYCR2/RELB/ROMO1/SELENOS/SESN2/SIRPA/SIRT2/SLC12A6/SLC25A23/SLC2A1/SOD2/STK39/TNFAIP3/TPM1/TXN/VNN1/XRCC5/ZC3H12A/ZFP36L1
## GO:0071453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 AIFM1/AJUBA/AK4/AQP1/AQP3/ATG7/ATP6AP1/ATP6V0D1/ATP6V1G1/BNIP3/CCDC115/CFLAR/CHCHD2/CITED2/DDAH1/EDN1/EEF2K/EGLN1/EGLN3/EGR1/ENDOG/ENO1/EPAS1/ERO1A/FAM162A/FAS/FOXO1/HIF1A/HILPDA/HYOU1/LMNA/MTOR/NKX3-1/NOL3/P4HB/PCK1/PDK1/PGK1/PIK3CB/PLK3/PTGIS/PTGS2/ROCK2/RORA/SFRP1/SIRT2/SLC29A1/SLC8A3/STC1/STC2/TIGAR/ZFP36L1
## GO:0006090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ADPGK/ALDOA/ARL2/DDIT4/DLAT/ENO1/ENO2/ENO4/GAPDH/GPI/HDAC4/HIF1A/HK2/LDHA/LDHB/NR4A3/OGT/P2RX7/PC/PCK1/PCK2/PDHB/PDHX/PDK1/PDK4/PFKL/PFKP/PGAM1/PGAM2/PGK1/PKM/PRKAA2/PRKAG2/PSEN1/SLC2A6/TIGAR/TPI1/VDAC1
## GO:0044272                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ACLY/ACSBG2/ACSL3/ACSL4/AMD1/ANGPT1/APIP/B3GNT2/B3GNT7/B4GALT4/B4GAT1/BHMT/CHPF2/CHST12/CHST2/CHST5/CHST7/CSAD/CSGALNACT1/DIP2A/DLAT/DSE/DSEL/ELOVL2/ELOVL3/EXT2/GGT1/GGT5/GLCE/GSS/GSTP1/HAGH/MAT2A/MGST2/MTHFD2L/PAPSS1/PAPSS2/PDHB/PDHX/PDK1/PDK4/PPT1/PPT2/SLC35B2/ST3GAL1/ST3GAL4/UGDH/UST
## GO:0051216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               BGN/BMP1/BMP2/BMP6/BPNT2/CCN3/CCN4/CHADL/CHRDL2/CNMD/COL11A2/COL2A1/COL3A1/CREB3L2/CSGALNACT1/CTSK/CYTL1/DDRGK1/DLX2/EDN1/EFEMP1/EPYC/FGF18/FGF9/FGFR3/FRZB/GLI3/HIF1A/HOXA3/HOXC4/HYAL2/MAF/MEF2C/MKKS/PKD1/PTH1R/PTPN11/RARA/RARB/RARG/RFLNA/ZNF664-RFLNA/RSPO2/SCIN/SFRP2/SLC39A14/SNORC/SOX9/STC1/SULF2/TGFBI/TGFBR1/THBS3/TSKU/WNT2B/WNT5A/WNT9A/ZEB1
## GO:0034976                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ABL1/AIFM1/ATP2A2/ATP2A3/ATXN3/AUP1/BAK1/BCL2L1/BOK/CDK5RAP3/CEBPB/CERT1/CREB3L2/CXCL8/DDIT3/DDRGK1/DERL1/DERL2/DNAJC3/EDEM2/MMP24-AS1-EDEM2/EDEM3/EIF2S1/ERLEC1/ERO1A/ERP44/FICD/FLOT1/GRINA/HM13/HYOU1/JKAMP/LPCAT3/MAN1A1/MANF/MAP3K5/MBTPS2/NCCRP1/NIBAN1/NR1H2/NR1H3/P4HB/PARK7/PDIA3/PDIA4/PLA2G6/PPP1R15A/PPP2CB/PTPN1/RNF121/SEC61B/SELENOK/SELENOS/SESN2/STC2/STT3B/THBS4/TMEM259/TMEM33/TMTC3/TNFRSF10B/TOR1A/TRAF2/TRIB3/UBE4B/UBQLN2/UFD1/USP14/USP25/VAPB/VCP
## GO:1903510                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ABCC5/ANGPT1/B3GNT2/B3GNT7/B4GALT4/B4GAT1/BGN/BPNT2/CEMIP2/CHPF2/CHST12/CHST2/CHST5/CHST7/CSGALNACT1/DSE/DSEL/EDNRA/EDNRB/EXT2/GLCE/GNS/HAS3/HYAL2/IL15/ITIH3/ITIH5/NFKB1/ST3GAL1/ST3GAL4/TNFAIP6/UGDH/UST
## GO:1904951                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ACSL3/ACSL4/ADORA2A/ANG/ANK3/APBB3/BMP6/C1QTNF3/C2CD2L/C2CD5/CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/CD38/CDK5/CHP1/CORO2B/CSNK2A2/DOC2B/EDEM2/MMP24-AS1-EDEM2/ERBB2/EXOC1/EXPH5/FYN/GAS6/GLI3/GPER1/HIF1A/HPS4/HYAL2/ICE1/IER3IP1/IPO5/JUP/KCNN4/LEPROT/MFF/MYO18A/MYO1C/NKX6-1/NLGN2/NR1H2/OAZ1/OAZ2/P2RX7/PARD6A/PCK2/PCM1/PCNT/PDCD5/PDZK1/PLA2G6/PLK3/PRKCD/PRKCZ/PRKD1/PRR5L/PSEN1/PSMD9/PTGS2/RAB29/RAPGEF3/RBM22/SAR1B/SEC16B/CRYZL2P-SEC16B/SOX4/TCF7L2/TCP1/TGFB2/TGFB3/TMEM30A/TMEM30B/TOMM7/UBL5/ZC3H12A/ZIC1
## GO:0070482                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ADM/AGTRAP/AIFM1/AJUBA/AK4/ANG/ANGPTL4/AQP1/AQP3/ATG7/ATM/ATP1B1/ATP6AP1/ATP6V0D1/ATP6V1G1/BECN1/BMP2/BNIP3/CA9/CCDC115/CD38/CFLAR/CHCHD2/CHRNA7/CITED2/CRYAB/DDAH1/DDIT4/EDN1/EDNRA/EEF2K/EGLN1/EGLN3/EGR1/ENDOG/ENO1/EPAS1/ERO1A/FAM162A/FAS/FOXO1/GUCY1A1/HIF1A/HILPDA/HK2/HYOU1/KCNMA1/LMNA/MTOR/NKX3-1/NOL3/NOS2/NR4A2/OXTR/P4HB/PCK1/PDK1/PGK1/PIK3CB/PLAT/PLK3/PLOD1/PLOD2/PTGIS/PTGS2/RHOA/ROCK2/RORA/SCAP/SFRP1/SIRT2/SLC11A2/SLC29A1/SLC2A1/SLC8A3/SOD2/STC1/STC2/TFRC/TGFB2/TGFB3/TIGAR/TXN2/ZFP36L1
## GO:0072521                                                                                                                                                                                                                                                                                                                                                                                                                                               AADAT/ABHD14B/ACLY/ACOT11/ACSBG2/ACSL3/ACSL4/ADORA2B/ADPGK/AK2/AK3/AK4/ALDOA/AMD1/AMPD3/ARL2/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/DCAKD/DDIT4/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/ENO2/ENO4/ENTPD7/FAR1/FITM2/GAPDH/GPI/GUCY1A1/HDAC4/HIF1A/HK2/LACC1/LDHA/MACROD1/MCCC2/MCEE/MTHFD2L/NME1/NOS2/NPR1/NUDT19/NUDT4/NUDT9/OGT/P2RX7/PAICS/PAPSS1/PAPSS2/PDE10A/PDE4B/PDE4D/PDE5A/PDE7B/PDE8B/PDHB/PDHX/PDK1/PDK4/PFKL/PFKP/PGAM1/PGAM2/PGK1/PID1/PKM/PMVK/PPT1/PPT2/PRKAA2/PRKAG2/PRPSAP1/PSEN1/RAB23/RHOA/RORA/SLC2A6/SLC35B2/SUCLA2/SUCLG2/SULT1C4/TIGAR/TJP2/TPI1/TPST1/VCP
## GO:0010506                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ABL1/ABL2/ATG14/ATG7/ATM/ATP6V0B/ATP6V0C/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1G1/ATP6V1G2/ATP6V1H/BECN1/BMF/BNIP3/BOK/CDK5/CHMP4B/CISD1/CISD2/CSNK2A2/DAPK2/DDIT3/DEPP1/DHRSX/DRAM1/ENDOG/EXOC1/EXOC7/FOXO1/GAPDH/GPR137/GPSM1/HIF1A/HSPB1/IFI16/IKBKG/IL10RA/KDR/LAMP3/LRSAM1/MAPK15/MTOR/NOD2/OPTN/OSBPL7/PAFAH1B2/PARK7/PHF23/PIK3CB/PIM2/PLEKHF1/PLK3/PRKAA2/PRKD1/QSOX1/RAB39B/RAB3GAP1/RIPK2/RNF152/ROCK1/SCOC/SEC22B/SESN2/SESN3/SIRT2/SLC25A5/SMG1/SNX30/SPTLC2/STING1/TAB2/TFEB/TIGAR/TP53INP2/TPCN1/TRIB3/TRIM5/TRIM8/UBQLN2/VDAC1/VPS13C/WDR6/WIPI1/ZC3H12A
## GO:0071496                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ADORA2B/AGT/AIFM1/AKR1C3/AQP1/AQP3/ATG14/ATG7/ATP1A2/BAK1/BECN1/BMP6/BNIP3/CDKN2B/CYP24A1/DNAJC15/EIF2S1/FADD/FAM107A/FAS/FBXO22/FES/FOS/FOXO1/GABARAPL1/GABARAPL2/GAS6/GLRX2/HABP4/IFI16/IL15/IRF1/JMY/KCNJ2/KIF26A/MAP1LC3C/MAP3K14/MAP3K5/MFSD2A/MTOR/MYBBP1A/NFKB1/NR4A2/NUAK2/P2RX7/PCK1/PCSK9/PDK4/PLEC/PRKAA2/PRKAG2/PRKD1/PTGER4/PTGS2/RNF152/SESN2/SESN3/SFRP1/SFRP2/SIK1/SIK2/SLC2A1/SLC38A2/SLC39A4/SNW1/SOX9/SRD5A1/TFEB/TLE5/TMEM150C/TNFRSF10B/TNFRSF8/TNFSF14/TXN2/UCN2/UPP1/WDR45B/WIPI1/WNT2B/ZC3H12A
## GO:0072594                                                                                                                                                                                                                                                                                                                                                                                                                            AGT/AIFM1/ANGPT1/APPL1/APPL2/ATP5IF1/BAG4/BCL3/BID/CACNG4/CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/CHMP4B/CHP1/CSNK2A2/DDIT3/DNAJA1/DNAJC15/E2F3/FERMT1/FGF9/GLI3/GNPTAB/GRPEL1/HK2/HPS4/HSPA4/HYAL2/IL10RA/IPO5/JUP/KPNA3/LAMP3/LAMP5/LAPTM5/LEPROT/LMNA/LRSAM1/MAN1A1/MFF/MFN2/MMP12/NCOA4/NDUFA13/NFKBIA/NOLC1/NXT2/PDCD5/PEX14/PEX2/PIH1D1/PRKCD/PRKD1/PSEN1/PTGS2/RAB23/RAB3GAP1/RALA/RANGRF/RBM22/RNF215/ROMO1/SAMM50/SCARB2/SEC61B/SEC61G/SMURF1/SNF8/SPCS1/SPCS3/SRP14/SRP19/SRPRA/SRPRB/SSR3/SUFU/TCP1/TIMM10B/TIMM13/TIMM17A/TIMM21/TIMM22/TIMM23/TIMM8B/TNFAIP3/TOMM40/TOMM5/TOMM7/TRAF3IP2/TRAM2/UBL5/VPS13A/VPS13C/VPS25/VPS36/VPS37C/ZC3H12A/ZFAND2B/ZIC1
## GO:0033157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ANGPT1/ANK3/ATP5IF1/BAG4/C2CD5/CDK5/CHP1/CSNK2A2/DERL2/EDEM2/MMP24-AS1-EDEM2/ERBB2/ERLEC1/FERMT1/FYN/GAS6/GLI3/HPS4/HYAL2/ICE1/IFI27/IPO5/JUP/LEPROT/MFF/MYO1C/NOLC1/OAZ1/OAZ2/PARK7/PCM1/PCNT/PDCD5/PDZK1/PLK3/PRKCD/PRKD1/PRR5L/PSEN1/PTGS2/PTPN1/PTPN11/RAB23/RAB29/RANGAP1/RAPGEF3/RBM22/SAR1B/SEC16B/CRYZL2P-SEC16B/SH3TC2/SUFU/TAMALIN/TCF7L2/TMEM30A/TMEM30B/TOMM7/TXN/UBL5/UHMK1/ZC3H12A/ZIC1
## GO:0009101                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ABCA2/ALG2/ALG3/ALG5/ALG8/ALG9/B3GALT1/B3GALT2/B3GNT2/B3GNT7/B4GALT1/B4GALT4/B4GALT5/B4GAT1/C1GALT1/C1GALT1C1/C1GALT1C1L/CCR7/CHP1/CHPF2/CHST10/CHST12/CHST7/CSGALNACT1/CYTL1/DOLK/DPAGT1/DSE/DSEL/EDEM3/EXT2/FKTN/FOXL1/FUT11/GAL3ST2/GALNT16/GALNT2/GALNT5/GALNT8/GCNT3/GFPT2/GLCE/HS6ST1/IL15/IL33/ITM2A/MAN1A1/MAN1C1/MGAT1/MGAT4A/MGAT5/MLEC/NCSTN/NUS1/OGA/OGT/OSTC/PHLDA1/POFUT1/POGLUT1/POGLUT2/POMGNT1/POMT2/PSEN1/RAMP1/RPN1/RPN2/SLC39A8/ST3GAL1/ST3GAL4/ST3GAL5/ST6GALNAC4/STT3B/TCF7L2/TMEM165/TMTC3/TNIP1/UGDH/UST/XXYLT1
## GO:0016236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ATG14/ATG3/ATG7/ATP2A2/ATP6V0B/ATP6V0C/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1G1/ATP6V1G2/ATP6V1H/AUP1/BECN1/BNIP3/CDK5/CHMP1B/CHMP4B/CHMP5/DDRGK1/EMC6/EPG5/EXOC1/EXOC7/GABARAPL1/GABARAPL2/GAPDH/GPSM1/HDAC10/HIF1A/IKBKG/KDR/LRSAM1/MAP1LC3C/MCOLN1/MFN2/MTOR/NOD2/OPTN/PAFAH1B2/PHF23/PRKAA2/PSEN1/QSOX1/RAB23/RAB33B/RAB3GAP1/RIPK2/RUBCNL/SCOC/SEC22B/SESN2/SESN3/SLC25A5/SMG1/SMURF1/SNF8/SNX30/SPTLC2/STAM2/STING1/TBC1D12/TCIRG1/TIGAR/TOMM7/TP53INP2/UBQLN2/UBXN2B/VCP/VDAC1/VMP1/VPS13C/VPS25/VPS36/VPS37C/WDFY3/WDR45B/WIPI1
## GO:0071472                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             AKR1B1/AQP1/CAPN3/EFHD1/LETM1/SLC12A6/SLC25A23/XRCC5/ZFP36L1
## GO:0071384                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       AIFM1/AKR1C3/AQP1/ATP5F1A/CFLAR/DDIT4/EDN1/EIF4E/FAM107A/FBXO32/GJB2/GPER1/KLF9/MSTN/NR3C1/PCK1/PCK2/PLAT/SERPINF1/SRD5A1/SSTR5/STC1/ZFP36/ZFP36L1
## GO:2001233                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ADORA2A/AGT/ARHGEF2/ASAH2/BCL2L1/BCL2L2/BDNF/BECN1/BID/BOK/CFLAR/COL2A1/CSF2/CSNK2A2/CYLD/DAPK2/DBH/DDIT3/DEPTOR/DNAJA1/EIF5A/ELL3/ENO1/EYA2/FADD/FAIM2/FAS/FBH1/FEM1B/FGF10/G0S2/GPER1/GRINA/GSTP1/HDAC1/HIF1A/HSPB1/HYAL2/HYOU1/ICAM1/IFI6/IL7/INHBA/ITGAV/ITPRIP/LMNA/MIF/NDUFA13/NKX3-1/NOC2L/NOL3/NR4A2/P4HB/PARK7/PDIA3/PF4/PIH1D1/PIK3CB/PLEKHF1/PPIF/PPP2R1B/PRDX2/PRKCD/PSEN1/PSMD10/PSME3/PTGS2/PTPMT1/PTPN1/SCG2/SELENOS/SFRP1/SFRP2/SIAH1/SIAH2/SLC25A5/SOD2/STYXL1/TCF7L2/TGFBR1/TIMP3/TNFAIP3/TNFSF10/TNFSF12/TPD52L1/TRAF2/VDAC2/VNN1/YAP1/ZNF385A
## GO:0006979                                                                                                                                                                                                                                                                                                                                                                                                                                                               ABL1/AIFM1/AIFM2/AKR1C3/ANGPTL7/AQP1/ATOX1/ATP2A2/BAK1/BECN1/BNIP3/BRF2/CA3/CD38/CHCHD2/CHUK/CRYAB/CYB5B/CYP2E1/DHCR24/EDN1/EDNRA/EIF2S1/ENDOG/EPAS1/ERCC2/ERO1A/FOS/FOXO1/FYN/GCH1/GJB2/GLRX2/GPR37L1/GSR/GSS/GSTP1/HIF1A/HSPB1/HYAL2/IL6/KLF2/MAP3K5/MAPKAP1/MCTP1/MGST1/MMP3/MPV17/NCOA7/NDUFB4/NDUFS8/NEIL1/NOL3/NR4A2/NR4A3/P4HB/PARK7/PDK1/PLA2R1/PLEKHA1/PLK3/PNPLA8/PON2/PPIF/PPP2CB/PRDX1/PRDX2/PRDX3/PRKAA2/PRKCD/PRKD1/PRODH/PRR5L/PSEN1/PSIP1/PSMB5/PTGS1/PTGS2/PTPRK/PXDN/PYCR1/PYCR2/RBPMS/RCAN1/ROMO1/SELENOK/SELENOS/SESN2/SESN3/SGK2/SIRPA/SIRT2/SOD2/STAT1/STC2/TNFAIP3/TOR1A/TPM1/TXN/TXN2/VNN1/ZC3H12A
## GO:0036293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ADM/AGTRAP/AIFM1/AJUBA/AK4/ANG/ANGPTL4/AQP1/AQP3/ATM/ATP1B1/BECN1/BMP2/BNIP3/CA9/CD38/CFLAR/CHCHD2/CHRNA7/CITED2/CRYAB/DDAH1/DDIT4/EDN1/EDNRA/EEF2K/EGLN1/EGLN3/EGR1/ENDOG/ENO1/EPAS1/ERO1A/FAM162A/HIF1A/HILPDA/HK2/HYOU1/KCNMA1/LMNA/MTOR/NKX3-1/NOL3/NOS2/NR4A2/OXTR/P4HB/PCK1/PDK1/PGK1/PIK3CB/PLAT/PLK3/PLOD1/PLOD2/PTGIS/PTGS2/RHOA/ROCK2/RORA/SCAP/SFRP1/SIRT2/SLC11A2/SLC29A1/SLC2A1/SLC8A3/SOD2/STC1/STC2/TFRC/TGFB2/TGFB3/TIGAR/TXN2/ZFP36L1
## GO:1901653                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ADIPOR1/AGT/AGTRAP/AHCYL1/AP3S1/APPL1/APPL2/ARHGEF2/ATP1A3/BCL2L2/C2CD5/CA2/CACNB1/CAMK2A/CCND3/CDK5/CFLAR/CHMP5/EDN1/EDNRA/EEF2K/EPHB2/EPRS1/FBN1/FOXC2/FOXO1/FYN/GAB1/GDF15/GJA1/GJB2/GLP2R/GPER1/GRB10/HDAC5/ICAM1/INSIG2/IRS1/KLF2/LEPROT/LEPROTL1/LPIN1/MAP1B/MSTN/MYO1C/NFKB1/NKX6-1/NOD2/NR4A2/NR4A3/OGT/OSBPL8/PCK1/PCK2/PCSK9/PDE3B/PDK4/PID1/PIK3R3/PKM/PLAT/PRKCD/PRKCI/PRKCZ/PSEN1/PTPN1/PTPN11/PTPRE/RAB13/RANGAP1/RIPK2/ROCK1/ROCK2/SELENOS/SESN3/SIK2/SLC29A2/SLC39A14/SRD5A1/STAT1/STAT5B/TNS2/TRIB3/TSHR/VIM/YWHAG/ZFP36L1/ZNF106
## GO:0060348                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ATP6AP1/BGN/BMP2/BMP6/BPNT2/CCDC154/CCN4/CHAD/CITED2/COL2A1/COL3A1/CSGALNACT1/CTC1/EPYC/EXT2/FBN1/FGF18/FGFR2/FGFR3/FLI1/FOXN3/GJA1/GLI3/INSIG2/KDR/LOX/MAP2K6/MAPK11/MBTPS2/MCPH1/MEF2C/MEGF8/MPIG6B/MYOC/NAB1/NAB2/PAPSS2/PTGER4/PTPN11/RAB23/RARA/RARB/RARG/RFLNA/ZNF664-RFLNA/RHOA/SFRP2/SH3PXD2B/SKI/SOX9/SRD5A1/STC1/SULF2/TGFB3/THBS3/TMEM119/TSKU/TTC9/TULP3/WASF2/ZNF385A
## GO:0097191                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               AGT/ARHGEF2/BAK1/BCL2A1/BCL2L1/BCL2L2/BID/BOK/CFLAR/COL2A1/CSF2/CYLD/DBH/DDX47/DEPTOR/EYA2/FADD/FAIM2/FAS/FEM1B/FGF10/FGFR3/G0S2/GPER1/GSTP1/HYAL2/ICAM1/IFI27/IFI6/IL7/INHBA/ITGAV/ITPRIP/KITLG/LMNA/MLLT11/NDUFA13/NOL3/P2RX7/PARK7/PDIA3/PF4/PPP2R1B/PRDX2/PSME3/SCG2/SFRP1/SFRP2/SIAH2/TCF7L2/TGFB2/TGFBR1/TIMP3/TNFAIP3/TNFRSF10B/TNFRSF1B/TNFSF10/TNFSF12/TRAF2/YAP1
## GO:0001666                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ADM/AGTRAP/AJUBA/AK4/ANG/ANGPTL4/AQP1/AQP3/ATM/ATP1B1/BECN1/BMP2/BNIP3/CA9/CD38/CFLAR/CHCHD2/CHRNA7/CITED2/CRYAB/DDAH1/DDIT4/EDN1/EDNRA/EGLN1/EGLN3/EGR1/ENDOG/ENO1/EPAS1/ERO1A/FAM162A/HIF1A/HILPDA/HK2/HYOU1/KCNMA1/LMNA/MTOR/NKX3-1/NOL3/NOS2/NR4A2/P4HB/PCK1/PDK1/PGK1/PIK3CB/PLAT/PLK3/PLOD1/PLOD2/PTGIS/PTGS2/RHOA/ROCK2/RORA/SCAP/SFRP1/SIRT2/SLC11A2/SLC29A1/SLC2A1/SLC8A3/SOD2/STC1/STC2/TFRC/TGFB2/TGFB3/TIGAR/TXN2/ZFP36L1
## GO:0052548                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ABCA2/ADORA2A/ADRM1/AGT/AIFM1/AQP1/ASPH/ATP2A3/BAK1/BID/BIRC3/BOK/BST2/C3/C5/CD109/CFLAR/COL4A3/COL7A1/CPAMD8/CRYAB/CST6/CYCS/DHCR24/DLC1/EGLN3/F2R/F3/FADD/FAM162A/FAS/FURIN/FYN/GAPDH/GAS6/GPER1/GPI/GSN/HDAC1/HSPE1/IFI16/IFI6/IGBP1/ITIH3/ITIH5/LAMP3/LAMTOR5/LAPTM5/LGALS9/MAP3K5/MBP/MICAL1/MTCH1/MUL1/NCSTN/NDUFA13/NKX3-1/NOL3/PARK7/PDCD5/PERP/PI3/PIH1D1/PRDX3/PROS1/PSMA3/PSMB8/PSMB9/PSMD14/PSME1/PSME2/PSME3/PTGS2/RHOA/RIPK2/ROCK1/ROCK2/SERPINB7/SERPINE2/SERPINF1/SERPINI1/SFRP2/SIAH2/SLPI/SPINK13/SPINK6/SPINT1/TBC1D10A/TFPI/TFPI2/TIMP2/TIMP3/TIMP4/TNFSF10/TNFSF14/UACA/USP14/VCP/VSIR/WFDC1
## GO:1901652                                                                                                                                                                                                                                                                                                                                                                                      ADIPOR1/ADM/AGT/AGTRAP/AHCYL1/AP3S1/APPL1/APPL2/ARHGEF2/ATP1A3/BCL2L2/C2CD5/CA2/CACNB1/CAMK2A/CCND3/CDK5/CFLAR/CHMP5/CHRNA7/COL3A1/CREB1/EDN1/EDNRA/EDNRB/EEF2K/EGR1/EPHB2/EPRS1/FBN1/FOXC2/FOXO1/FYN/GAB1/GDF15/GJA1/GJB2/GLP2R/GNAI1/GPER1/GRB10/HDAC5/ICAM1/INSIG2/IRS1/KHK/KLF2/LEPROT/LEPROTL1/LPIN1/MAP1B/MMP12/MMP3/MSTN/MTOR/MYO1C/NFKB1/NFKBIA/NKX6-1/NOD2/NR4A2/NR4A3/OGT/OSBPL8/OXTR/PCK1/PCK2/PCSK9/PDE3B/PDK4/PID1/PIK3R3/PKM/PLAT/PRKCD/PRKCI/PRKCZ/PSEN1/PTGS2/PTPN1/PTPN11/PTPRE/RAB13/RANGAP1/RIPK2/ROCK1/ROCK2/SCAP/SELENOS/SERPINF1/SESN2/SESN3/SIK2/SLC29A2/SLC2A1/SLC39A14/SRD5A1/STAT1/STAT4/STAT5B/STC2/TIMP4/TNFAIP3/TNS2/TRIB3/TRIM16/TSHR/VIM/VPS13C/YWHAG/ZFP36L1/ZNF106
## GO:0036294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  AIFM1/AJUBA/AK4/AQP1/AQP3/BNIP3/CFLAR/CHCHD2/CITED2/DDAH1/EDN1/EEF2K/EGLN1/EGLN3/EGR1/ENDOG/ENO1/EPAS1/ERO1A/FAM162A/HIF1A/HILPDA/HYOU1/LMNA/MTOR/NKX3-1/NOL3/P4HB/PCK1/PDK1/PGK1/PIK3CB/PLK3/PTGIS/PTGS2/ROCK2/RORA/SFRP1/SIRT2/SLC29A1/SLC8A3/STC1/STC2/TIGAR/ZFP36L1
## GO:0002931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        AIFM1/BCL2L2/CAMK2A/CSF1/EEF2K/EGR1/FAIM2/GJB2/HK2/HYOU1/MAP2K3/MAP2K6/MAP3K5/NOL3/P2RX7/PANX1/PER2/PIK3CB/PPIF/RCAN1/ROCK2/TIGAR
## GO:0007249                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ABL1/AJUBA/ANGPT1/BCL3/BIRC3/BST2/CAPN3/CCR7/CFLAR/CHUK/DDRGK1/EDN1/EDNRA/EDNRB/F2R/FADD/FKBP1A/FYN/GAPDH/GJA1/GSTP1/HDAC1/HSPB1/IFIT5/IKBKG/IRAK1BP1/IRAK2/IRAK4/LAMTOR5/LGALS9/LIME1/LURAP1L/MAP3K14/MAP3K3/MUL1/MYO18A/NFKBIA/NFKBIB/NKIRAS2/NOD2/NR1D1/OPTN/PELI1/PIM2/PRKD1/RELB/RHOA/RIPK2/ROCK1/ROCK2/RORA/SHISA5/SIRPA/SLC35B2/STAT1/TAB2/TFG/TFRC/TIFA/TLE1/TNFAIP3/TNFRSF10B/TNFSF10/TNIP1/TRAF2/TRAF3/TRAF3IP2/TRIM5/TRIM8/UBE2N/UNC5CL/WNT5A/ZC3H12A
## GO:0071456                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              AJUBA/AK4/AQP1/AQP3/BNIP3/CFLAR/CHCHD2/CITED2/DDAH1/EDN1/EGLN1/EGLN3/EGR1/ENDOG/ENO1/EPAS1/ERO1A/FAM162A/HIF1A/HILPDA/HYOU1/LMNA/MTOR/NKX3-1/NOL3/P4HB/PCK1/PDK1/PGK1/PIK3CB/PLK3/PTGIS/PTGS2/ROCK2/RORA/SFRP1/SIRT2/SLC29A1/SLC8A3/STC1/STC2/TIGAR/ZFP36L1
## GO:1901654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ABHD2/AIFM1/AKR1C2/AKR1C3/AQP1/ATP5F1A/BCL2L1/CA9/CCR7/CD38/CFLAR/CLDN1/DDIT4/EDN1/EIF4E/F5/FBXO32/FIBIN/FOS/FOSB/GAS6/GJB2/GNAI1/GPI/HOXA13/IGFBP7/KLF2/KLF9/MAOB/MBP/MSTN/NCOA4/NKX3-1/NR1H3/NR3C1/OXTR/P2RY6/PARK7/PCK1/PCK2/PLAT/PRKAA2/PTGER4/PTGFR/ROCK2/SERPINF1/SFRP1/SPP1/SRD5A1/TBXA2R/TGFB2/TGFB3/YAP1
## GO:0019751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ABCA2/ACER3/ADCYAP1R1/ASAH1/ASAH2/ASAH2B/BPNT2/COQ2/DEGS2/GCH1/GK/GPD2/GPER1/HRH1/IP6K1/IPMK/IPPK/ISYNA1/ITPK1/MINPP1/NAAA/NUDT4/OCRL/P2RY6/PCK1/PCK2/PLA2G4A/PPIP5K2/PTH1R/PTS/QDPR/SORD/SPTLC2/SPTSSA/SPTSSB/TKFC/TPI1
## GO:0046031                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ADPGK/AK2/AK3/AK4/ALDOA/ARL2/DDIT4/ENO1/ENO2/ENO4/GAPDH/GPI/HDAC4/HIF1A/HK2/LDHA/NUDT9/OGT/P2RX7/PFKL/PFKP/PGAM1/PGAM2/PGK1/PKM/PRKAA2/PRKAG2/PSEN1/SLC2A6/TIGAR/TPI1
## GO:0097193                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ABL1/AEN/AIFM1/ARHGEF2/ATM/ATP2A3/BAK1/BCL2A1/BCL2L1/BCL2L2/BCL3/BECN1/BID/BNIP3/BOK/CEBPB/CHEK2/CRIP1/CYLD/DAPK2/DDIT3/DDIT4/DDX5/DNAJA1/DYRK2/EIF5A/ELL3/ENO1/ERO1A/FBH1/GRINA/HDAC1/HIF1A/HSPB1/HYOU1/IFI16/IFI6/JMY/MAP3K5/MIF/MLLT11/MYBBP1A/NDUFA13/NKX3-1/NOC2L/NOL3/P4HB/PARK7/PDK1/PERP/PIK3CB/PLEKHF1/PPIF/PPP1R15A/PRKCD/PRODH/PTGS2/PTPMT1/PTPN1/SELENOK/SELENOS/SFRP2/SHISA5/SIAH1/SNW1/SOD2/STYXL1/TNFRSF10B/TNFRSF1B/TRAF2/TRIB3/VDAC2/VNN1/ZNF385A
## GO:2001236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                AGT/ARHGEF2/BCL2L1/BID/CFLAR/COL2A1/CSF2/CYLD/DBH/DEPTOR/EYA2/FADD/FAIM2/FEM1B/FGF10/G0S2/GPER1/GSTP1/HYAL2/ICAM1/IFI6/IL7/INHBA/ITGAV/ITPRIP/LMNA/NOL3/PARK7/PDIA3/PF4/PPP2R1B/PRDX2/PSME3/SCG2/SFRP1/SFRP2/SIAH2/TCF7L2/TGFBR1/TIMP3/TNFAIP3/TNFSF10/TNFSF12/TRAF2/YAP1
## GO:0055119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ATP1A1/ATP1A2/ATP1B1/CAMK2D/GSN/GSTM2/KCNJ2/PDE4B/PDE4D/PDE5A/RGS2
## GO:1903522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ABL1/ADM/ADM2/AGT/APLN/ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/CACNA1C/CAMK2D/CD38/CORIN/DBH/DES/DMPK/DOCK4/DOCK5/EDN1/EDNRA/EDNRB/EPAS1/F2R/FXYD1/GCH1/GJA1/GJD3/GLRX3/GPD1L/GSTM2/GSTO1/HRH1/HSPB7/JUP/KCND3/KCNE4/KCNJ2/KCNMB2/KCNMB4/MEF2A/MTNR1B/OXTR/PDE4B/PDE4D/PDE5A/PER2/PTGS2/RANGRF/RGS2/RHOA/SCN2B/SCN4B/SEMA3A/SLC8A3/SPX/STC1/TBX18/TBXA2R/TGFB2/THRB/TNNT2/TPM1/ZC3H12A
## GO:0071549                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     AQP1/ATP5F1A/CFLAR/DDIT4/EIF4E/FBXO32/GJB2/MSTN/NR3C1/PCK1/PCK2/PLAT/SERPINF1/SRD5A1
## GO:0030199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ADAMTS2/AEBP1/BMP1/CHADL/COL11A2/COL12A1/COL2A1/COL3A1/COL5A2/COLGALT2/DPT/FKBP10/FOXC2/LOX/LOXL3/LOXL4/LUM/P3H4/P4HA1/PXDN/SFRP2/TGFB2/TGFBR1/TNXB
## GO:0032386                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ABCA2/ANGPT1/ANK3/ARHGAP1/ATP5IF1/ATP9A/BAG4/C2CD5/CDK5/CHP1/CRYAB/CSNK2A2/DERL2/EDEM2/MMP24-AS1-EDEM2/EHD1/EIPR1/ERBB2/ERLEC1/FERMT1/FYN/GAS1/GAS6/GLI3/HPS4/HYAL2/ICE1/IFI27/IPO5/JUP/LEPROT/MAP1B/MAP2K1/MAPK15/MFF/MYO1C/NOLC1/NUMA1/NUS1/OAZ1/OAZ2/PARK7/PCM1/PCNT/PCSK9/PDCD5/PDZK1/PLK3/PRKCD/PRKD1/PRR5L/PSEN1/PTGS2/PTPN1/PTPN11/RAB23/RAB29/RANGAP1/RAPGEF3/RBM22/RBM4/REEP5/REEP6/SAR1B/SEC16B/CRYZL2P-SEC16B/SH3TC2/SUFU/TAMALIN/TCF7L2/TMEM30A/TMEM30B/TNNC1/TNNT2/TOMM7/TXN/UBL5/UHMK1/WWC1/ZC3H12A/ZIC1
## GO:0045862                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ADRM1/AIFM1/ANTXR1/ASPH/ATP2A3/ATP5IF1/ATXN3/AURKAIP1/BAG2/BAK1/BID/BOK/CAPN3/CFLAR/CLEC3B/COL4A3/CSNK1D/CSNK1E/CYCS/DDA1/DDRGK1/DLC1/EGLN3/ENO1/F2R/F3/FADD/FAM162A/FAS/FBXO22/FURIN/FYN/GPER1/GSN/HSPE1/IFI16/LAPTM5/LGALS9/LPCAT3/MAGEF1/MAP3K5/MBP/MTCH1/MUL1/NCSTN/NDUFA13/NKX3-1/OGT/OSBPL7/PCOLCE/PDCD5/PERP/PIAS1/PLGRKT/PLK3/PSEN1/PSMC4/PSMC5/PSMD10/PSMD14/PSME1/PSME2/PSME3/RAD23A/RGMA/RHOA/RIPK2/RNF180/RNF19A/ROCK2/SFRP2/SH3RF2/SIRT2/SMURF1/SNX9/SPON1/TBC1D10A/TMEM259/TMTC3/TNFRSF1B/TNFSF10/TNIP1/TRIB3/UACA/UBQLN2/VCP/VSIR/ZC3H12A
## GO:0032092                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ABL1/ADD1/AKTIP/B2M/BAMBI/BDNF/BMP2/CAPRIN2/CDK5/CSF3/DERL1/EPB41/EPB41L5/FKBP1A/FLOT1/LFNG/MFNG/PKD1/PLCL1/PPP2CB/PSEN1/RFNG/RIPK2/SPAG8/SPON1/STING1/TCF7L2/TRIB3/WNT5A
## GO:0071222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ABCA1/ABL1/BMP6/CCL2/CCL3/CCL5/CD274/CD55/CEBPB/CHMP5/CSF2/CSF3/CTR9/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/EDNRB/EPHB2/GSTP1/HCK/IL6/IRAK2/LBP/MAP2K3/MEF2C/MIF/NFKB1/NFKBIA/NFKBIB/NOD2/NOS2/NR1D1/NR1H3/PDCD1LG2/PDCD4/PDE4B/PF4/PF4V1/PRDX2/RARA/RHOA/RIPK2/SELENOS/SIRPA/SPON2/TBXA2R/TNFAIP3/TNFRSF1B/TNIP1/TRIM5/VIM/WNT5A/ZC3H12A/ZFP36
## GO:0051881                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ABL1/ADORA2A/ATP5IF1/BAK1/BCL2L1/BID/BNIP3/BOK/CCN6/IFI6/KDR/MLLT11/MUL1/MYOC/NDUFS1/P2RX7/PARK7/PID1/PPA2/PRDX3/PYCR1/RNF122/RTL10/SOD2/TUSC2/VCP
## GO:0051222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ACSL3/ACSL4/ADORA2A/ANG/ANK3/APBB3/BMP6/C1QTNF3/C2CD2L/C2CD5/CD38/CDK5/CHP1/CSNK2A2/DOC2B/EDEM2/MMP24-AS1-EDEM2/ERBB2/EXOC1/EXPH5/FYN/GAS6/GLI3/GPER1/HIF1A/HPS4/HYAL2/ICE1/IER3IP1/IPO5/JUP/KCNN4/LEPROT/MFF/MYO18A/MYO1C/NKX6-1/NLGN2/NR1H2/OAZ1/OAZ2/P2RX7/PARD6A/PCK2/PCM1/PCNT/PDCD5/PDZK1/PLA2G6/PLK3/PRKCD/PRKCZ/PRKD1/PRR5L/PSEN1/PSMD9/PTGS2/RAB29/RAPGEF3/RBM22/SAR1B/SEC16B/CRYZL2P-SEC16B/SOX4/TCF7L2/TGFB2/TGFB3/TMEM30A/TMEM30B/TOMM7/UBL5/ZC3H12A/ZIC1
## GO:1900180                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ANGPT1/BYSL/CARD10/CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/CDK5RAP3/CHP1/DCLK1/FERMT1/FYN/GLI3/GLIS2/HYAL2/IPO5/JUP/LAMTOR5/LIF/LMNA/LZTS2/NOLC1/PARK7/PRKCD/PRKD1/PSEN1/PTGS2/RAB23/RBM22/SESN2/SUFU/TCP1/TFRC/TRIM29/TRIM8/YAP1/ZC3H12A/ZIC1
## GO:1901617                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ABCA2/ACER3/ACLY/ADCYAP1R1/AKR1C3/ALDH2/APPL1/ASAH1/ASAH2/ASAH2B/BMP2/BMP6/CH25H/CYP7B1/DBH/DCT/DDT/DHCR24/DHCR7/DKK3/FAXDC2/GATA3/GCH1/GPER1/HRH1/HSD17B10/HSD3B7/INSIG2/IP6K1/IPMK/IPPK/ISYNA1/LPCAT3/LSS/MBTPS2/MFSD12/NFKB1/NR1D1/NR4A2/NUS1/OSBPL3/OSBPL7/OSBPL9/P2RY6/PARK7/PCK1/PCK2/PER2/PMVK/PPIP5K2/PRKAA2/PRKAG2/PTH1R/PTS/QDPR/SCAP/SEC14L2/SPTLC2/SPTSSA/SPTSSB/SQLE/TGFB2/WNT5A
## GO:0071375                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ADIPOR1/AGT/AGTRAP/AHCYL1/AP3S1/APPL1/APPL2/C2CD5/CA2/CAMK2A/CCND3/CFLAR/EDN1/EDNRA/EEF2K/EPRS1/FBN1/FOXC2/FOXO1/GAB1/GDF15/GJB2/GLP2R/GPER1/GRB10/HDAC5/INSIG2/IRS1/LEPROT/LEPROTL1/LPIN1/MAP1B/MSTN/MYO1C/NFKB1/NKX6-1/NR4A2/NR4A3/OGT/OSBPL8/PCK1/PCK2/PCSK9/PDE3B/PDK4/PID1/PIK3R3/PKM/PLAT/PRKCD/PRKCI/PRKCZ/PTPN1/PTPN11/PTPRE/RAB13/RANGAP1/ROCK1/ROCK2/SELENOS/SESN3/SIK2/SLC29A2/SLC39A14/SRD5A1/STAT1/STAT5B/TNS2/TRIB3/TSHR/YWHAG/ZFP36L1/ZNF106
## GO:1900182                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     CARD10/CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/CDK5RAP3/FYN/GLI3/GLIS2/HYAL2/IPO5/JUP/LAMTOR5/LIF/PARK7/PRKCD/PRKD1/PSEN1/PTGS2/RBM22/SESN2/TCP1/TFRC/TRIM8/YAP1/ZC3H12A/ZIC1
## GO:0030203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ABCC5/ANGPT1/B3GNT2/B3GNT7/B4GALT4/B4GAT1/BGN/BPNT2/CEMIP2/CHPF2/CHST12/CHST2/CHST5/CHST7/CSGALNACT1/DSE/DSEL/EDNRA/EDNRB/EXT2/GALNT5/GLCE/GNS/HAS3/HEXB/HS3ST3A1/HS6ST1/HYAL2/IL15/ITIH3/ITIH5/NFKB1/ST3GAL1/ST3GAL4/TNFAIP6/UGDH/UST
## GO:0006486                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ABCA2/ALG2/ALG3/ALG5/ALG8/ALG9/B3GALT1/B3GALT2/B3GNT2/B3GNT7/B4GALT1/B4GALT4/B4GALT5/B4GAT1/C1GALT1/C1GALT1C1/C1GALT1C1L/CHP1/DOLK/DPAGT1/EDEM3/EXT2/FKTN/FUT11/GALNT16/GALNT2/GALNT5/GALNT8/GCNT3/GFPT2/IL15/MAN1A1/MAN1C1/MGAT1/MGAT4A/MGAT5/MLEC/NUS1/OGA/OGT/OSTC/POFUT1/POGLUT1/POGLUT2/POMGNT1/POMT2/PSEN1/RAMP1/RPN1/RPN2/SLC39A8/ST3GAL1/ST3GAL4/ST3GAL5/ST6GALNAC4/STT3B/TMEM165/TMTC3/XXYLT1
## GO:0043413                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ABCA2/ALG2/ALG3/ALG5/ALG8/ALG9/B3GALT1/B3GALT2/B3GNT2/B3GNT7/B4GALT1/B4GALT4/B4GALT5/B4GAT1/C1GALT1/C1GALT1C1/C1GALT1C1L/CHP1/DOLK/DPAGT1/EDEM3/EXT2/FKTN/FUT11/GALNT16/GALNT2/GALNT5/GALNT8/GCNT3/GFPT2/IL15/MAN1A1/MAN1C1/MGAT1/MGAT4A/MGAT5/MLEC/NUS1/OGA/OGT/OSTC/POFUT1/POGLUT1/POGLUT2/POMGNT1/POMT2/PSEN1/RAMP1/RPN1/RPN2/SLC39A8/ST3GAL1/ST3GAL4/ST3GAL5/ST6GALNAC4/STT3B/TMEM165/TMTC3/XXYLT1
## GO:0051767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   AKAP12/CCL2/EDN1/GSTP1/IL33/KDR/MAP2K3/MAP2K6/NAMPT/NOD2/SELENOS/STAT1
## GO:0051769                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   AKAP12/CCL2/EDN1/GSTP1/IL33/KDR/MAP2K3/MAP2K6/NAMPT/NOD2/SELENOS/STAT1
## GO:0052547                                                                                                                                                                                                                                                                                                                                                                                                                                                   ABCA2/ADORA2A/ADRM1/AGT/AIFM1/ANTXR1/AQP1/ASPH/ATP2A3/BAK1/BID/BIRC3/BOK/BST2/C3/C5/CD109/CFLAR/COL4A3/COL7A1/CPAMD8/CRYAB/CST6/CYCS/DDRGK1/DHCR24/DLC1/EGLN3/F2R/F3/FADD/FAM162A/FAS/FURIN/FYN/GAPDH/GAS6/GPER1/GPI/GSN/HDAC1/HSPE1/IFI16/IFI6/IGBP1/ITIH3/ITIH5/LAMP3/LAMTOR5/LAPTM5/LGALS9/MAP3K5/MBP/MICAL1/MTCH1/MUL1/NCSTN/NDUFA13/NKX3-1/NOL3/PARK7/PCOLCE/PDCD5/PERP/PI3/PIH1D1/PRDX3/PROS1/PSMA3/PSMB8/PSMB9/PSMD14/PSME1/PSME2/PSME3/PTGS2/RHOA/RIPK2/ROCK1/ROCK2/SERPINB7/SERPINE2/SERPINF1/SERPINI1/SFRP2/SIAH2/SLPI/SPINK13/SPINK6/SPINT1/TBC1D10A/TFPI/TFPI2/TIMP2/TIMP3/TIMP4/TNFSF10/TNFSF14/UACA/USP14/VCP/VSIR/WFDC1
## GO:0071385                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          AQP1/ATP5F1A/CFLAR/DDIT4/EDN1/EIF4E/FAM107A/FBXO32/GJB2/KLF9/MSTN/NR3C1/PCK1/PCK2/PLAT/SERPINF1/SRD5A1/SSTR5/STC1/ZFP36/ZFP36L1
## GO:0045444                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ADIRF/ALOXE3/ATF5/BBS9/BMP2/BNIP3/C1QTNF3/CCN4/CEBPB/CEBPD/CMKLR1/CREB1/CREBL2/DDIT3/ERO1A/FABP3/FGF10/FOXO1/FRZB/GATA3/GPER1/GRK5/IL11/IL6/JDP2/KLF5/LAMB3/LRRC8C/MEDAG/MKKS/NR1D1/NR4A2/NR4A3/OSBPL8/PER2/PIAS1/PLAC8/PRDM16/PSMB8/PTGS2/RGS2/RORA/SDF4/SFRP1/SFRP2/SIRT2/SIX1/SOD2/SOX8/STEAP4/TCF7L2/TMEM64/TRIB3/TTC8/WIF1/WNT5A/YAP1/ZC3H12A/ZFP36/ZFP36L1/ZNF385A
## GO:0006022                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ABCC5/ANGPT1/B3GNT2/B3GNT7/B4GALT4/B4GALT5/B4GAT1/BGN/BPNT2/CEMIP2/CHI3L2/CHPF2/CHST12/CHST2/CHST5/CHST7/CSGALNACT1/DSE/DSEL/EDNRA/EDNRB/EXT2/GALNT5/GLCE/GNS/HAS3/HEXB/HS3ST3A1/HS6ST1/HYAL2/IL15/ITIH3/ITIH5/NFKB1/ST3GAL1/ST3GAL4/TNFAIP6/UGDH/UST
## GO:0071219                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ABCA1/ABL1/BMP6/CCL2/CCL3/CCL5/CD274/CD55/CEBPB/CHMP5/CSF2/CSF3/CTR9/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/EDNRB/EPHB2/GSTP1/HCK/IL6/IRAK2/LBP/MAP2K3/MEF2C/MIF/NFKB1/NFKBIA/NFKBIB/NOD2/NOS2/NR1D1/NR1H3/PDCD1LG2/PDCD4/PDE4B/PF4/PF4V1/PRDX2/RARA/RHOA/RIPK2/SELENOS/SIRPA/SIRT2/SPON2/TBXA2R/TNFAIP3/TNFRSF1B/TNIP1/TRIM5/VIM/WNT5A/ZC3H12A/ZFP36
## GO:0070997                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                AARS1/ABL1/ADARB1/ADORA2A/AIFM1/AKT1S1/ANGPT1/ATM/BCL2L1/BDNF/BID/BNIP3/BOK/BTBD10/CCL2/CCL3/CCL5/CDK5/CEBPB/CHMP4B/CHP1/CHRNA7/CLCF1/CSF1/CSF3/DDIT3/DDIT4/DHCR24/DNAJC5/EGLN3/EGR1/EIF2S1/ENDOG/ENO2/EPHB1/F2R/FADD/FAIM2/FAM162A/FAS/FOS/FYN/GAPDH/GATA3/GPI/GPNMB/HDGF/HIF1A/HYOU1/IKBKG/ITGA1/MAP3K5/MEF2C/MTNR1B/NCOA7/NCSTN/NR4A2/NR4A3/PARK7/PCSK9/PPT1/PRKCI/PSEN1/RAB29/RASA1/RHOA/ROCK1/SARM1/SERPINF1/SIAH1/SIX1/SIX4/SOD2/TGFB2/TGFB3/THRB/TIGAR/TMEM259/TNFRSF1B/TNFRSF21/TRAF2/UBE2M/WNT5A
## GO:0090316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ANK3/C2CD5/CDK5/CHP1/CSNK2A2/EDEM2/MMP24-AS1-EDEM2/ERBB2/FYN/GAS6/GLI3/HPS4/HYAL2/ICE1/IPO5/JUP/LEPROT/MFF/MYO1C/OAZ1/OAZ2/PCM1/PCNT/PDCD5/PDZK1/PLK3/PRKCD/PRKD1/PRR5L/PSEN1/PTGS2/RAB29/RAPGEF3/RBM22/SAR1B/SEC16B/CRYZL2P-SEC16B/TCF7L2/TMEM30A/TMEM30B/TOMM7/UBL5/ZC3H12A/ZIC1
## GO:0071621                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               AKIRIN1/C1QBP/CAMK1D/CCL11/CCL2/CCL20/CCL3/CCL5/CCL7/CCL8/CCR7/CMKLR1/CSF1/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/DAPK2/EDN1/HRH1/IL23A/ITGA1/LBP/MSTN/NOD2/PDE4B/PF4/PF4V1/PIK3CD/SAA1/SCG2/TGFB2/THBS4/TNFAIP6/TREM1
## GO:0006936                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ADORA2B/AGT/ALDOA/ASPH/ATP1A1/ATP1A2/ATP1B1/ATP2A2/ATP2B4/CACNA1C/CAMK2D/CD38/CERT1/CHRNE/CRYAB/DES/DMPK/DOCK4/DOCK5/EDN1/EDNRA/EDNRB/ENO1/F2R/FXYD1/GJA1/GPD1L/GPER1/GRIP2/GSN/GSTM2/GSTO1/GUCY1A1/HSBP1/JUP/KCNA1/KCND3/KCNE4/KCNJ2/KCNMA1/MAP2K3/MAP2K6/MKKS/MTOR/MYL5/MYL6/MYL6B/OXTR/P2RX6/PDE4B/PDE4D/PDE5A/PGAM2/PLA2G6/PPP1R12B/PTGS2/RANGRF/RGS2/RHOA/ROCK1/ROCK2/SCN2B/SCN4B/SGCA/SLC8A3/SNTB1/SPX/SSPN/STC1/SULF2/SYNM/TBXA2R/TMOD4/TNNC1/TNNC2/TNNI1/TNNT2/TNNT3/TPM1/TPM2/UTRN/ZC3H12A
## GO:0046165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ABCA2/ACER3/ACLY/ADCYAP1R1/ASAH1/ASAH2/ASAH2B/BMP2/BMP6/DBH/DHCR24/DHCR7/DKK3/GCH1/GPER1/HRH1/INSIG2/IP6K1/IPMK/IPPK/ISYNA1/LPCAT3/LSS/MBTPS2/NFKB1/NUS1/P2RY6/PARK7/PCK1/PCK2/PMVK/PPIP5K2/PRKAA2/PTH1R/PTS/QDPR/SCAP/SEC14L2/SPTLC2/SPTSSA/SPTSSB
## GO:0046173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ABCA2/ACER3/ADCYAP1R1/ASAH1/ASAH2/ASAH2B/GCH1/GPER1/HRH1/IP6K1/IPMK/IPPK/ISYNA1/P2RY6/PCK1/PCK2/PPIP5K2/PTH1R/PTS/QDPR/SPTLC2/SPTSSA/SPTSSB
## GO:0043467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       AK4/ARL2/BNIP3/CHCHD2/CISD1/COX17/COX7A2/DDIT4/DNAJC15/DYRK2/HDAC4/HIF1A/IFNAR1/IFNLR1/IL10RB/IRS1/KHK/NDUFA4/NOS2/OGT/P2RX7/PARK7/PGAM1/PHKG2/PPIF/PPP1R3B/PPP1R3C/PRDM16/PRKAA2/PRKAG2/PSEN1/RHOA/RUBCNL/SELENOS/SLC25A23/SLC2A6/TIGAR/UQCC2/VCP
## GO:0001819                                                                                                                                                                                                                                                                                                                                                                                                                                                     ABL1/ADORA2B/AGT/AKAP12/APPL1/ARHGEF2/B2M/BATF/BCL3/BTN3A2/C1QTNF3/C3/C5/CCL3/CCR7/CD274/CD55/CD83/CEBPB/CEBPG/CHUK/CSF2/DDIT3/DDT/EGR1/ELANE/EPHB2/F2R/F3/FADD/FERMT1/FLOT1/FURIN/G3BP1/GAPDH/GATA3/HIF1A/HILPDA/HLA-A/HSPB1/HYAL2/IFI16/IFNGR1/IL15/IL16/IL23A/IL26/IL33/IL6/IL7/IRF1/ISG15/LACC1/LAMTOR5/LAPTM5/LBP/LGALS9/LUM/MAPK11/MAPKAPK2/MBP/MCOLN2/MIF/MMP12/NOD2/NOS2/NR4A3/OAS1/P2RX7/PANX1/PARK7/PDE4B/PDE4D/PELI1/PF4/PHB1/PIK3CD/PLA2R1/POU2F2/PRKCZ/PSEN1/PTGER4/PTGS2/PTPN11/PTPRJ/RAB7B/RARA/RASGRP1/RIPK2/ROCK2/RORA/SAA1/SELENOK/SERPINB7/SPON2/STAT1/STAT5B/STING1/STMP1/SULF2/TNFRSF8/TRAF2/TRIM16/TUSC2/WNT5A
## GO:0016241                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ATG14/ATP6V0B/ATP6V0C/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1G1/ATP6V1G2/ATP6V1H/BECN1/BNIP3/CDK5/CHMP4B/EXOC1/EXOC7/GAPDH/GPSM1/HIF1A/IKBKG/KDR/LRSAM1/MTOR/NOD2/OPTN/PAFAH1B2/PHF23/PRKAA2/QSOX1/RAB3GAP1/RIPK2/SCOC/SEC22B/SESN2/SESN3/SLC25A5/SMG1/SNX30/SPTLC2/STING1/TIGAR/UBQLN2/VDAC1/VPS13C/WIPI1
## GO:0055076                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ACO1/ANKRD9/ARF1/ATOX1/ATP6AP1/ATP6V0D1/ATP6V1G1/ATP7B/B2M/BMP6/BOLA2/CCDC115/CYB561A3/CYBRD1/EPAS1/FTH1/GLRX3/HIF1A/HYAL2/LCN2/MT1E/MT1F/MT1G/MT1X/MT2A/NCOA4/SCO2/SLC11A2/SLC25A28/SLC30A1/SLC30A4/SLC39A10/SLC39A14/SLC39A4/SLC39A7/SLC39A8/SOD2/STEAP1/STEAP4/TFRC
## GO:0034350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            AKAP12/CCL2/CDK5/GAS6/PRKCD/PRKCH/PRKCI/TRAF2
## GO:0008637                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       AIFM2/ATG3/ATP5IF1/BAK1/BCL2L1/BCL2L2/BID/BMF/BNIP3/BOK/CAMK2A/EYA2/FAM162A/GPER1/HK2/IFI6/LMNA/MFF/MLLT11/MUL1/NDUFS1/NOL3/NPTX1/PDCD5/PLA2G6/PPIF/PPP2CB/PSMD10/RTL10/SLC25A5/SOD2/TNFSF10/VDAC2
## GO:0051235                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ABCA1/ABHD5/ABL1/AKAP6/ANK3/ARHGAP21/ARL2/ATP1A2/ATP7B/AUP1/B4GALNT1/BDKRB1/C3/CACNA1C/CAMK2D/CAPN3/CCL3/CCR7/CDK5/CXCL10/DDIT3/EHD1/ERO1A/F2R/FBN1/FBN2/FITM2/FKBP1A/FTH1/GP1BB/GPER1/GSN/GSTM2/GSTO1/HEXB/HILPDA/HK2/IL6/INSIG2/ITGAV/LCN2/LETM1/LIME1/LTBP1/MCOLN1/MCOLN2/MEST/NFKB1/NFKBIA/NFKBIB/NFKBIE/NOL3/NR1H2/NR1H3/OSBPL8/P2RX7/P2RY6/PARK7/PDE4D/PKD1/PRKD1/PSEN1/PSMD10/RANGAP1/RASA3/SCIN/SKP1/SLC25A23/SLC30A4/SQLE/STAT5B/SUFU/SUN1/TPCN1/TXN/VPS13A/VPS13C/ZC3H12A
## GO:0003012                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ADORA2B/AGT/AKAP6/ALDOA/ASPH/ATP1A1/ATP1A2/ATP1B1/ATP2A2/ATP2B4/BECN1/CACNA1C/CAMK2D/CAMTA2/CD38/CERT1/CFLAR/CHRNE/CRYAB/DES/DMPK/DOCK4/DOCK5/EDN1/EDNRA/EDNRB/ENO1/F2R/FBXO32/FOXO1/FXYD1/GJA1/GLRX3/GPD1L/GPER1/GRIP2/GSN/GSTM2/GSTO1/GUCY1A1/HDAC4/HSBP1/IL15/JUP/KCNA1/KCND3/KCNE4/KCNJ2/KCNMA1/LMCD1/LMNA/MAP2K3/MAP2K6/MEF2A/MKKS/MSTN/MTOR/MYL5/MYL6/MYL6B/MYOC/NOL3/NR4A3/OXTR/P2RX6/PDE4B/PDE4D/PDE5A/PGAM2/PLA2G6/PPP1R12B/PTGS2/RANGRF/RGS2/RHOA/ROCK1/ROCK2/SCN2B/SCN4B/SCO2/SGCA/SLC8A3/SNTB1/SPX/SSPN/STC1/SULF2/SYNM/TBXA2R/TMOD4/TNFRSF1B/TNNC1/TNNC2/TNNI1/TNNT2/TNNT3/TPM1/TPM2/UTRN/ZC3H12A
## GO:0015986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT
## GO:0071383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ABHD2/AIFM1/AKR1C3/AQP1/ATP1A1/ATP1A2/ATP1A3/ATP5F1A/CALCOCO1/CFLAR/CNOT2/CYP7B1/DDIT4/DDRGK1/DDX17/DDX5/DNAAF4/EDN1/EIF4E/FAM107A/FBXO32/FKBP4/GJB2/GPER1/HDAC1/KLF9/MSTN/NCOA4/NKX3-1/NR1D1/NR3C1/NR3C2/NR4A3/PAQR8/PARK7/PCK1/PCK2/PHB1/PLAT/PMEPA1/PRMT2/RHOA/SAFB/SERPINF1/SFRP1/SRD5A1/SSTR5/STC1/TCF21/TFPI/YAP1/ZFP36/ZFP36L1
## GO:1901655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     AIFM1/AKR1C2/AKR1C3/AQP1/ATP5F1A/CFLAR/DDIT4/EIF4E/FBXO32/GAS6/GJB2/GNAI1/KLF2/KLF9/MSTN/NCOA4/NR3C1/P2RY6/PARK7/PCK1/PCK2/PLAT/PRKAA2/PTGER4/PTGFR/ROCK2/SERPINF1/SFRP1/SPP1/SRD5A1
## GO:0009135                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ADPGK/AK2/AK3/AK4/ALDOA/ARL2/DDIT4/ENO1/ENO2/ENO4/GAPDH/GPI/HDAC4/HIF1A/HK2/LDHA/NUDT9/OGT/P2RX7/PFKL/PFKP/PGAM1/PGAM2/PGK1/PKM/PRKAA2/PRKAG2/PSEN1/SLC2A6/TIGAR/TJP2/TPI1
## GO:0009179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ADPGK/AK2/AK3/AK4/ALDOA/ARL2/DDIT4/ENO1/ENO2/ENO4/GAPDH/GPI/HDAC4/HIF1A/HK2/LDHA/NUDT9/OGT/P2RX7/PFKL/PFKP/PGAM1/PGAM2/PGK1/PKM/PRKAA2/PRKAG2/PSEN1/SLC2A6/TIGAR/TJP2/TPI1
## GO:0006096                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ADPGK/ALDOA/ARL2/DDIT4/ENO1/ENO2/ENO4/GAPDH/GPI/HDAC4/HIF1A/HK2/LDHA/OGT/P2RX7/PFKL/PFKP/PGAM1/PGAM2/PGK1/PKM/PRKAA2/PRKAG2/PSEN1/SLC2A6/TIGAR/TPI1
## GO:0070085                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ABCA2/ALG2/ALG3/ALG5/ALG8/ALG9/B3GALT1/B3GALT2/B3GNT2/B3GNT7/B4GALNT1/B4GALT1/B4GALT4/B4GALT5/B4GAT1/C1GALT1/C1GALT1C1/C1GALT1C1L/CHP1/DOLK/DPAGT1/EDEM3/EXT2/FKTN/FUT11/GALNT16/GALNT2/GALNT5/GALNT8/GCNT3/GFPT2/IL15/MAN1A1/MAN1C1/MGAT1/MGAT4A/MGAT5/MLEC/NUS1/OGA/OGT/OSTC/PIGV/POFUT1/POGLUT1/POGLUT2/POMGNT1/POMT2/PSEN1/RAMP1/RPN1/RPN2/SLC39A8/ST3GAL1/ST3GAL4/ST3GAL5/ST6GALNAC4/STT3B/TMEM165/TMTC3/XXYLT1
## GO:0045936                                                                                                                                                                                                                                                                                                                                                                                                                                   ABCA2/ABL1/ADARB1/ADORA2A/AGT/AJUBA/AKT1S1/ANGPT1/ANKLE2/ATG14/BAG4/BAK1/BDKRB1/BMP2/CD109/CDK5RAP1/CDK5RAP3/CDKN2B/CHP1/CTDSP2/CTDSPL/DBNDD2/DDIT4/DEPTOR/DNAJA1/DNAJC3/DUSP1/DUSP16/DUSP3/EPHB2/FKBP1A/GADD45B/GPD1L/GPRC5A/GRB10/GSTP1/HDAC4/HSPB1/HYAL2/INHA/INHBA/IPO5/IQGAP1/KIRREL1/LDLRAD4/LPCAT1/LPIN1/MGAT5/MICAL1/MLLT1/MSTN/MYADM/NIBAN1/PARD6A/PARK7/PDCD4/PDE4D/PID1/PIK3CB/PLEC/PMEPA1/PPM1E/PPP1R15A/PPP1R26/PPP2R5A/PPP4R2/PPP4R4/PRDX3/PRKAG2/PRKCD/PRKCZ/PRR5L/PSEN1/PTPN1/PTPN13/PTPRJ/RABGEF1/RGS2/ROCK1/ROCK2/RTRAF/SFRP1/SFRP2/SIRPA/SIRT2/SLC8A3/SNX25/SPAG9/STYXL1/SWAP70/TGFB2/TIGAR/TNFAIP3/TRIB3/VPS25/WARS1/YWHAG/ZC3H12A
## GO:0009260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ACLY/ACSBG2/ACSL3/ACSL4/AK2/AK3/AK4/ALDOA/AMPD3/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/CTPS1/DCAKD/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/GUCY1A1/NME1/NPR1/PAICS/PAPSS1/PAPSS2/PDHB/PDHX/PDK1/PDK4/PID1/PPT1/PPT2/PRKAG2/RFK/SLC35B2/UCK2/UPP1/VCP
## GO:1905952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ABCA1/ABCA2/ABCA3/ABHD5/AGT/ATP8A1/BMP6/C1QTNF1/C3/DENND5B/EDN1/EHD1/EPRS1/FABP3/FITM2/FURIN/HILPDA/IL6/ITGAV/LIPG/LPCAT3/MAP2K6/MIF/NFKB1/NFKBIA/NKX3-1/NR1H2/NR1H3/NUS1/OSBPL8/P2RX7/PCSK9/PLA2G4A/PLA2G6/PLA2R1/PRKCD/PTGES/PTPN11/SAR1B/SPP1/SURF4/TMEM30A/ZC3H12A
## GO:0042063                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ABCA2/ABL1/ADORA2A/APCDD1/ARHGEF10/B4GALT5/BMP2/BNIP3/BOK/CCL2/CCL3/CD9/CDH2/CDK5/CDK6/CDKN2B/CLCF1/CSF1/CSPG4/DLX2/DNER/DUSP15/ERBB2/ERCC2/FGF10/GAP43/GJC2/GLI3/GPR37L1/HDAC1/HEXB/IFNGR1/IL6/LAMB1/LIF/LRP8/MAP2K1/MBOAT7/MMP24/MTOR/MXRA8/MYOC/NAB1/NAB2/NCSTN/NKX6-1/NR1D1/PHGDH/PLEC/PRKCH/PRKCI/PSEN1/PTPN11/RHOA/SERPINE2/SH3TC2/SIRT2/SKI/SLC8A3/SOX4/SOX8/SOX9/SPINT1/SRGAP2/SUN1/TGFB2/TNFRSF1B/TNFRSF21/TSPAN2/VIM
## GO:0010508                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   BECN1/BNIP3/DHRSX/ENDOG/FOXO1/GPSM1/HIF1A/IKBKG/KDR/LRSAM1/NOD2/OPTN/PAFAH1B2/PARK7/PIK3CB/PIM2/PLEKHF1/PLK3/PRKAA2/PRKD1/RAB3GAP1/RIPK2/RNF152/ROCK1/SCOC/SESN2/SESN3/SLC25A5/SNX30/SPTLC2/STING1/TFEB/TP53INP2/TPCN1/TRIM5/TRIM8/VDAC1/WIPI1/ZC3H12A
## GO:0035966                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ATXN3/AUP1/BAK1/BOK/CDK5RAP3/CREB3L2/DDIT3/DDRGK1/DERL1/DERL2/DNAJA1/DNAJC3/EDEM2/MMP24-AS1-EDEM2/EDEM3/EIF2S1/ERLEC1/ERO1A/ERP44/FICD/HSPA4/HSPA4L/HSPB1/HSPB2/HSPB7/HSPE1/JKAMP/MANF/MBTPS2/MFN2/OPTN/PPP1R15A/PTPN1/RNF126/SELENOS/STC2/STT3B/THBS4/TMEM33/TOR1A/UBE2W/UFD1/VAPB/VCP
## GO:0009165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ACLY/ACSBG2/ACSL3/ACSL4/ADORA2B/AK2/AK3/AK4/ALDOA/AMPD3/ASPDH/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/CTPS1/DCAKD/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/FLAD1/GUCY1A1/KARS1/KYNU/MTHFD2L/NADK2/NAMPT/NAXD/NME1/NMNAT3/NNMT/NOS2/NPR1/PAICS/PAPSS1/PAPSS2/PDHB/PDHX/PDK1/PDK4/PID1/PPT1/PPT2/PRKAG2/PRPSAP1/PTGIS/RFK/SLC35B2/UCK2/UPP1/VCP
## GO:0010563                                                                                                                                                                                                                                                                                                                                                                                                                                   ABCA2/ABL1/ADARB1/ADORA2A/AGT/AJUBA/AKT1S1/ANGPT1/ANKLE2/ATG14/BAG4/BAK1/BDKRB1/BMP2/CD109/CDK5RAP1/CDK5RAP3/CDKN2B/CHP1/CTDSP2/CTDSPL/DBNDD2/DDIT4/DEPTOR/DNAJA1/DNAJC3/DUSP1/DUSP16/DUSP3/EPHB2/FKBP1A/GADD45B/GPD1L/GPRC5A/GRB10/GSTP1/HDAC4/HSPB1/HYAL2/INHA/INHBA/IPO5/IQGAP1/KIRREL1/LDLRAD4/LPCAT1/LPIN1/MGAT5/MICAL1/MLLT1/MSTN/MYADM/NIBAN1/PARD6A/PARK7/PDCD4/PDE4D/PID1/PIK3CB/PLEC/PMEPA1/PPM1E/PPP1R15A/PPP1R26/PPP2R5A/PPP4R2/PPP4R4/PRDX3/PRKAG2/PRKCD/PRKCZ/PRR5L/PSEN1/PTPN1/PTPN13/PTPRJ/RABGEF1/RGS2/ROCK1/ROCK2/RTRAF/SFRP1/SFRP2/SIRPA/SIRT2/SLC8A3/SNX25/SPAG9/STYXL1/SWAP70/TGFB2/TIGAR/TNFAIP3/TRIB3/VPS25/WARS1/YWHAG/ZC3H12A
## GO:0035296                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ABL1/ADM/ADORA2A/ADORA2B/AGT/ATP1A2/CD38/DBH/DOCK4/DOCK5/EDN1/EDNRA/EDNRB/EXT2/F2R/FOXC2/GCH1/GPER1/GRIP2/GUCY1A1/HRH1/ITGA1/KCNMA1/KCNMB2/KCNMB4/KLF2/MKKS/MTNR1B/NPR1/NPR3/OXTR/PER2/PLA2G6/PTGS2/RGS2/RHOA/ROCK1/ROCK2/SOD2/TBXA2R
## GO:0097746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ABL1/ADM/ADORA2A/ADORA2B/AGT/ATP1A2/CD38/DBH/DOCK4/DOCK5/EDN1/EDNRA/EDNRB/EXT2/F2R/FOXC2/GCH1/GPER1/GRIP2/GUCY1A1/HRH1/ITGA1/KCNMA1/KCNMB2/KCNMB4/KLF2/MKKS/MTNR1B/NPR1/NPR3/OXTR/PER2/PLA2G6/PTGS2/RGS2/RHOA/ROCK1/ROCK2/SOD2/TBXA2R
## GO:0031668                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ADORA2B/AIFM1/AKR1C3/AQP3/ATG14/ATG7/BECN1/CDKN2B/CYP24A1/DNAJC15/EIF2S1/FAM107A/FAS/FBXO22/FES/FOS/FOXO1/GABARAPL1/GABARAPL2/GAS6/GLRX2/IFI16/IL15/JMY/KIF26A/MAP1LC3C/MAP3K5/MFSD2A/MTOR/MYBBP1A/NR4A2/NUAK2/P2RX7/PCK1/PCSK9/PDK4/PLEC/PRKAA2/PRKAG2/PRKD1/RNF152/SESN2/SESN3/SFRP1/SFRP2/SIK1/SIK2/SLC2A1/SLC38A2/SLC39A4/SNW1/SRD5A1/TFEB/TLE5/TXN2/UCN2/UPP1/WDR45B/WIPI1/WNT2B/ZC3H12A
## GO:0010498                                                                                                                                                                                                                                                                                                                                                                            ANAPC4/ANKRD9/ARAF/AREL1/ATXN3/AUP1/BAG2/CSNK1D/CSNK1E/DDA1/DDIT3/DDRGK1/DERL1/DERL2/DMAC2/DNAAF4/ECRG4/EDEM2/MMP24-AS1-EDEM2/EDEM3/ERLEC1/FBXL16/FBXL18/FBXO22/FBXO33/FBXW5/FEM1B/GABARAPL2/HECW1/HM13/IFI27/JKAMP/LAMP3/LTN1/MAN1A1/NCCRP1/NHLRC3/NR1D1/OGT/OPHN1/OSBPL7/PARK7/PELI1/PIAS1/PKD1/PLK3/PPP2CB/PSEN1/PSMA1/PSMA2/PSMA3/PSMA4/PSMA5/PSMA6/PSMA7/PSMB1/PSMB10/PSMB2/PSMB3/PSMB4/PSMB5/PSMB6/PSMB7/PSMB8/PSMB9/PSMC4/PSMC5/PSMD1/PSMD10/PSMD14/PSMD2/PSMD4/PSMD7/PSME1/PSME2/PSME3/RAD23A/RHBDF1/RNF121/RNF122/RNF126/RNF180/RNF19A/SEC61B/SELENOS/SH3RF2/SIAH1/SIAH2/SIRT2/SKP1/SMURF1/STT3B/TMEM259/TMTC3/TOR1A/TRIB3/UBE2H/UBE2W/UBE4B/UBQLN2/UBXN11/UBXN2B/UFD1/USP14/USP25/VCP/ZFAND2B/ZNRF1
## GO:2001234                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ARHGEF2/ASAH2/BCL2L1/BCL2L2/BDNF/BID/BOK/CFLAR/COL2A1/CSF2/CSNK2A2/DNAJA1/ELL3/ENO1/EYA2/FAIM2/FGF10/GRINA/GSTP1/HDAC1/HIF1A/HSPB1/HYOU1/ICAM1/IFI6/IL7/ITGAV/ITPRIP/LMNA/MIF/NDUFA13/NOC2L/NOL3/NR4A2/PARK7/PF4/PIH1D1/PIK3CB/PPIF/PRDX2/PSEN1/PSMD10/PSME3/PTGS2/PTPN1/SCG2/SELENOS/SFRP2/SIAH2/SLC25A5/SOD2/TCF7L2/TGFBR1/TNFAIP3/VDAC2/VNN1/YAP1/ZNF385A
## GO:0061037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   CCN4/CHADL/CTSK/EFEMP1/FRZB/PTPN11/RARA/RARB/RARG/RFLNA/ZNF664-RFLNA/SOX9/TGFBR1/WNT9A
## GO:0071548                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    AQP1/ATP5F1A/CFLAR/CLDN1/DDIT4/EDN1/EIF4E/FBXO32/FIBIN/GJB2/MSTN/NR3C1/PCK1/PCK2/PLAT/SERPINF1/SRD5A1
## GO:0006757                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ADPGK/ALDOA/ARL2/DDIT4/ENO1/ENO2/ENO4/GAPDH/GPI/HDAC4/HIF1A/HK2/LDHA/OGT/P2RX7/PFKL/PFKP/PGAM1/PGAM2/PGK1/PKM/PRKAA2/PRKAG2/PSEN1/SLC2A6/TIGAR/TPI1
## GO:0043434                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ADIPOR1/ADM/AGT/AGTRAP/AHCYL1/AP3S1/APPL1/APPL2/C2CD5/CA2/CAMK2A/CCND3/CFLAR/COL3A1/CREB1/EDN1/EDNRA/EDNRB/EEF2K/EGR1/EPRS1/FBN1/FOXC2/FOXO1/GAB1/GDF15/GJB2/GLP2R/GNAI1/GPER1/GRB10/HDAC5/INSIG2/IRS1/KHK/LEPROT/LEPROTL1/LPIN1/MAP1B/MSTN/MTOR/MYO1C/NFKB1/NKX6-1/NR4A2/NR4A3/OGT/OSBPL8/OXTR/PCK1/PCK2/PCSK9/PDE3B/PDK4/PID1/PIK3R3/PKM/PLAT/PRKCD/PRKCI/PRKCZ/PTGS2/PTPN1/PTPN11/PTPRE/RAB13/RANGAP1/ROCK1/ROCK2/SCAP/SELENOS/SESN2/SESN3/SIK2/SLC29A2/SLC2A1/SLC39A14/SRD5A1/STAT1/STAT4/STAT5B/STC2/TIMP4/TNS2/TRIB3/TRIM16/TSHR/VPS13C/YWHAG/ZFP36L1/ZNF106
## GO:0030595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       AKIRIN1/C1QBP/C5/CAMK1D/CCL11/CCL2/CCL20/CCL3/CCL5/CCL7/CCL8/CCN3/CCR7/CH25H/CMKLR1/CSF1/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/CYP7B1/DAPK2/DDT/DUSP1/EDN1/EDNRB/GAS6/HRH1/HSD3B7/IL16/IL23A/IL6/ITGA1/LBP/LGALS9/MIF/MSMP/MSTN/NINJ1/NOD2/PDE4B/PF4/PF4V1/PIK3CD/PLEC/SAA1/SCG2/SLC12A2/STK39/SWAP70/TGFB2/THBS4/TNFAIP6/TNFSF14/TREM1/WNT5A
## GO:0035150                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ABL1/ADM/ADORA2A/ADORA2B/AGT/ATP1A2/CD38/DBH/DOCK4/DOCK5/EDN1/EDNRA/EDNRB/EXT2/F2R/FOXC2/GCH1/GPER1/GRIP2/GUCY1A1/HRH1/ITGA1/KCNMA1/KCNMB2/KCNMB4/KLF2/MKKS/MTNR1B/NPR1/NPR3/OXTR/PER2/PLA2G6/PTGS2/RGS2/RHOA/ROCK1/ROCK2/SOD2/TBXA2R
## GO:0090066                                                                                                                                                                                                                                                                                                                                                                                                                                         ABL1/ADD1/ADD3/ADM/ADORA2A/ADORA2B/AGT/AKT1S1/AQP1/ATP1A2/AVIL/BAG4/BDNF/BRK1/CAPG/CAPZA2/CAPZB/CCL11/CCR7/CD38/CDK5/CFL2/COTL1/CRABP2/CRACD/CREB1/CSF3/DBH/DEPTOR/DIP2B/DOCK4/DOCK5/DSTN/E2F4/EDN1/EDNRA/EDNRB/EXT2/F2R/FCHSD1/FCHSD2/FHOD3/FOXC2/GCH1/GPER1/GRIP2/GSN/GUCY1A1/HCK/HRH1/IL7R/ITGA1/KCNMA1/KCNMB2/KCNMB4/KCNN4/KIRREL1/KLF2/LAMTOR5/MAP1B/MAP3K13/MEGF8/MKKS/MTNR1B/MTOR/MYADM/NKX6-1/NPR1/NPR3/OXTR/P2RX7/PDXP/PER2/PLA2G6/PLXNA3/PLXNA4/PPP1R15A/PRKCD/PTGS2/RAB3B/RARG/RASA1/RGS2/RHOA/ROCK1/ROCK2/SCIN/SEMA3A/SEMA3B/SEMA3D/SEMA4A/SEMA5B/SLC12A2/SLC12A6/SNX9/SOD2/SPP1/SPTB/SPTBN5/SSH2/SSH3/SWAP70/TBXA2R/TMOD4/WAS/WNT5A
## GO:0048545                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ABCA2/ABCA3/ABHD2/ADM/AIFM1/AKR1C3/AQP1/ATP1A1/ATP1A2/ATP1A3/ATP5F1A/BMP6/CALCOCO1/CD38/CFLAR/CLDN1/CNOT2/CYP7B1/DDIT4/DDRGK1/DDX17/DDX5/DNAAF4/EDN1/EIF4E/FAM107A/FBXO32/FIBIN/FKBP4/FOS/FOSB/GJB2/GPER1/GPI/HDAC1/IGFBP7/IL6/KLF9/LOX/MAOB/MBP/MSTN/NCOA4/NKX3-1/NR1D1/NR1H3/NR3C1/NR3C2/NR4A3/OXTR/PAPPA/PAQR8/PARK7/PCK1/PCK2/PHB1/PLAT/PMEPA1/PRMT2/PTGS2/PTPRU/RHOA/SAFB/SERPINF1/SFRP1/SPP1/SRD5A1/SST/SSTR5/STC1/TCF21/TFPI/TGFB2/TGFB3/YAP1/ZFP36/ZFP36L1
## GO:0046390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ACLY/ACSBG2/ACSL3/ACSL4/AK2/AK3/AK4/ALDOA/AMPD3/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/CTPS1/DCAKD/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/GUCY1A1/NME1/NPR1/PAICS/PAPSS1/PAPSS2/PDHB/PDHX/PDK1/PDK4/PID1/PPT1/PPT2/PRKAG2/PRPSAP1/RFK/SLC35B2/UCK2/UPP1/VCP
## GO:0003015                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ACTC1/ADM/ADM2/AGT/APLN/ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/CACNA1C/CAMK2D/CORIN/DES/DMPK/EDN1/EDNRA/EDNRB/EPAS1/EXT2/FXYD1/FYN/GCH1/GJA1/GJD3/GLRX3/GPD1L/GSN/GSTM2/GSTO1/HSPB7/JUP/KCND3/KCNE4/KCNJ2/MAP2K3/MAP2K6/MEF2A/MTOR/PDE4B/PDE4D/PDE5A/RANGRF/RGS2/SCN2B/SCN4B/SEMA3A/SGCG/SLC8A3/SPX/STC1/TBX18/TGFB2/THRB/TNNC1/TNNI1/TNNT2/TPM1/YAP1/ZC3H12A
## GO:1901293                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ACLY/ACSBG2/ACSL3/ACSL4/ADORA2B/AK2/AK3/AK4/ALDOA/AMPD3/ASPDH/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/CTPS1/DCAKD/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/FLAD1/GUCY1A1/KARS1/KYNU/MTHFD2L/NADK2/NAMPT/NAXD/NME1/NMNAT3/NNMT/NOS2/NPR1/PAICS/PAPSS1/PAPSS2/PDHB/PDHX/PDK1/PDK4/PID1/PPT1/PPT2/PRKAG2/PRPSAP1/PTGIS/RFK/SLC35B2/UCK2/UPP1/VCP
## GO:0060047                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ACTC1/ADM/ADM2/AGT/APLN/ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/CACNA1C/CAMK2D/CORIN/DES/DMPK/EDN1/EDNRA/EDNRB/EPAS1/EXT2/FXYD1/GCH1/GJA1/GJD3/GLRX3/GPD1L/GSN/GSTM2/GSTO1/HSPB7/JUP/KCND3/KCNE4/KCNJ2/MAP2K3/MAP2K6/MEF2A/MTOR/PDE4B/PDE4D/PDE5A/RANGRF/RGS2/SCN2B/SCN4B/SEMA3A/SGCG/SLC8A3/SPX/STC1/TBX18/TGFB2/THRB/TNNC1/TNNI1/TNNT2/TPM1/ZC3H12A
## GO:0072503                                                                                                                                                                                                                                                                                                                                                                                               ABL1/ABL2/ADCYAP1R1/ADM/AGT/AKAP6/ATP13A3/ATP1A2/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/ATP7B/BAK1/BDKRB1/BNIP3/BOK/C1QTNF1/CACNA1C/CAMK2D/CAPN3/CCL11/CCL28/CCL3/CCL5/CCL7/CCL8/CCR7/CD38/CD55/CDK5/CHRNA7/CIB2/CMKLR1/CXCL10/DDIT3/DMPK/EDN1/EDNRA/EDNRB/ELANE/ERO1A/F2R/FKBP1A/FYN/GP1BB/GPER1/GRINA/GSTM2/GSTO1/HEXB/ITGAV/LETM1/LIME1/MCOLN1/MCOLN2/MT1E/MT1F/MT1G/MT1X/MT2A/MTNR1B/NOL3/OPRL1/OXTR/P2RX7/P2RY6/PDE4D/PDZD8/PIK3CB/PKD1/PLA2G6/PRKD1/PSEN1/PTGER4/PTGFR/PTH1R/RASA3/RMDN3/S1PR3/SAA1/SELENOK/SLC24A3/SLC25A23/SLC30A1/SLC30A4/SLC35G1/SLC39A10/SLC39A14/SLC39A4/SLC39A7/SLC39A8/SLC8A3/STC1/STC2/SWAP70/TBXA2R/TCIRG1/THADA/TMEM165/TMEM64/TPCN1/TRPM7/TSPOAP1/VAPB/WNT5A
## GO:0002062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                BMP2/BMP6/BPNT2/CCN3/CCN4/CHADL/COL2A1/COL3A1/CREB3L2/CYTL1/EFEMP1/FGF18/FGF9/FGFR3/GLI3/MAF/MEF2C/PTH1R/PTPN11/RARB/RARG/RFLNA/ZNF664-RFLNA/SCIN/SFRP2/SLC39A14/SOX9/SULF2/TGFBI/TGFBR1/TSKU/WNT2B/WNT9A
## GO:0006457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ARL2/B2M/BAG1/BAG2/BAG4/CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/CRYAB/DNAJA1/DNAJB11/DNAJC1/DNAJC25/DNAJC3/DNAJC5/ERO1A/ERP44/FKBP11/FKBP1A/FKBP2/FKBP4/GRPEL1/HSPA4/HSPA4L/HSPB1/HSPB2/HSPB6/HSPE1/MESD/MKKS/NKTR/P4HB/PDCD5/PDIA3/PDIA4/PDIA5/PDRG1/PFDN2/PFDN6/PPIF/PPIL1/PPIL3/PPIL6/QSOX1/SDF2/SELENOF/SIL1/TBCA/TCP1/TOR1A/TXNDC9
## GO:0046916                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ACO1/ANKRD9/ARF1/ATOX1/ATP6AP1/ATP6V0D1/ATP6V1G1/ATP7B/BMP6/BOLA2/CCDC115/CYB561A3/CYBRD1/FTH1/GLRX3/HIF1A/LCN2/MT1E/MT1F/MT1G/MT1X/MT2A/NCOA4/SCO2/SLC11A2/SLC30A1/SLC30A4/SLC39A10/SLC39A14/SLC39A4/SLC39A7/SLC39A8/STEAP4/TFRC
## GO:0030593                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  C1QBP/CAMK1D/CCL11/CCL2/CCL20/CCL3/CCL5/CCL7/CCL8/CCR7/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/DAPK2/EDN1/IL23A/ITGA1/LBP/NOD2/PDE4B/PF4/PF4V1/PIK3CD/SAA1/TGFB2/THBS4/TNFAIP6/TREM1
## GO:0016055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ABL1/AMOTL1/AMOTL2/APCDD1/ATP6V0C/BAMBI/BCL9L/BMP2/CALCOCO1/CAPRIN2/CCN4/CCNE1/CDH2/CSNK1D/CSNK1E/CSNK2A2/CTR9/CXXC4/CYLD/DAAM1/DACT3/DDIT3/DIXDC1/DKK3/EDN1/EDNRA/EDNRB/EGR1/FERMT1/FGF10/FGF9/FGFR2/FOXL1/FOXO1/FRZB/G3BP1/GATA3/GLI3/GPC4/GRB10/GRK5/HDAC1/HECW1/IGFBP4/IGFBP6/JADE1/JRK/JUP/LGR4/LGR5/LZTS2/MCC/MESD/MKS1/MYOC/NDRG2/NFATC1/NFKB1/NR4A2/NXN/PKD1/PLEKHA4/PORCN/PRKAA2/PSEN1/PTPRU/RARG/RHOA/RSPO2/RSPO3/SDHAF2/SFRP1/SFRP2/SHISA2/SHISA6/SIAH2/SKI/SMURF1/SOX4/SOX9/SULF2/TBX18/TCF7L2/TLE1/TLE2/TLE5/TMEM237/TMEM64/TNFAIP3/TNKS/TRABD2B/TSKU/VCP/WIF1/WNT2B/WNT5A/WNT9A/YAP1/ZNF703
## GO:0097530                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     AKIRIN1/C1QBP/CAMK1D/CCL11/CCL2/CCL20/CCL3/CCL5/CCL7/CCL8/CCR7/CMKLR1/CSF1/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/DAPK2/EDN1/HRH1/IL23A/IRAK4/ITGA1/JAGN1/LBP/MCOLN2/MSTN/NOD2/PDE4B/PF4/PF4V1/PIK3CD/PTGER4/SAA1/SCG2/TGFB2/THBS4/TNFAIP6/TREM1
## GO:2000116                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ADORA2A/AIFM1/AQP1/ASPH/ATP2A3/BAK1/BID/BIRC3/BOK/CFLAR/COL4A3/CRYAB/CYCS/DHCR24/DLC1/EGLN3/F2R/F3/FADD/FAM162A/FAS/FYN/GAS6/GPER1/GPI/GSN/HSPE1/IFI16/IFI6/IGBP1/LAMP3/LAMTOR5/LAPTM5/LGALS9/MAP3K5/MICAL1/MTCH1/MUL1/NDUFA13/NKX3-1/NOL3/PARK7/PDCD5/PERP/PIH1D1/PRDX3/PSMB9/PTGS2/RHOA/RIPK2/SFRP2/SIAH2/TBC1D10A/TNFSF10/TNFSF14/UACA/VCP
## GO:0007517                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ACTC1/ADARB1/AKIRIN1/BASP1/BMP2/CAPN3/CDK5/CFL2/CFLAR/CHODL/CITED2/COL3A1/COPRS/CREB1/CRYAB/CTF1/CXCL10/DDX17/DDX5/DES/DNER/EDNRA/EGR1/EPHB1/FBXO22/FGFR2/FHL1/FKBP1A/FKTN/FLOT1/FOS/FOXC2/FOXN2/FXR1/GJA1/HLF/ID3/ITGA11/KLF5/LAMA2/LIF/LOX/MAFF/MEF2A/MEF2C/MEGF10/MEOX2/MKX/MSTN/MYL6/MYL6B/MYORG/NIBAN2/PLEC/RBFOX1/RCAN1/RHOA/SGCA/SGCB/SGCG/SIRT2/SIX1/SIX4/SKI/SOX15/SOX8/SRPK3/TCF21/TGFB2/TGFBR1/TNNC1/TNNI1/TNNT2/TPM1/UQCC2/UTRN/WNT5A
## GO:0010950                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ADRM1/AIFM1/ASPH/ATP2A3/BAK1/BID/BOK/CFLAR/COL4A3/CYCS/DLC1/EGLN3/F2R/F3/FADD/FAM162A/FAS/FYN/GPER1/GSN/HSPE1/IFI16/LAPTM5/LGALS9/MAP3K5/MBP/MTCH1/MUL1/NCSTN/NDUFA13/NKX3-1/PDCD5/PERP/PSMD14/PSME1/PSME2/PSME3/RHOA/RIPK2/ROCK2/SFRP2/TBC1D10A/TNFSF10/UACA/VCP/VSIR
## GO:0046513                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ALOXE3/ASAH1/ASAH2/B3GALT1/B3GALT2/B4GALNT1/B4GALT4/B4GALT5/CERS6/DEGS2/ORMDL2/P2RX7/PLA2G6/PRKCD/SGMS2/SIRT3/SMPD2/SPTLC2/SPTSSA/SPTSSB/ST3GAL1/ST3GAL5/ST6GALNAC4
## GO:0006023                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ABCC5/ANGPT1/B3GNT2/B3GNT7/B4GALT4/B4GALT5/B4GAT1/CHPF2/CHST12/CHST2/CHST5/CHST7/CSGALNACT1/DSE/DSEL/EXT2/GALNT5/GLCE/HAS3/HS3ST3A1/HS6ST1/NFKB1/ST3GAL1/ST3GAL4/UGDH/UST
## GO:0198738                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ABL1/AMOTL1/AMOTL2/APCDD1/ATP6V0C/BAMBI/BCL9L/BMP2/CALCOCO1/CAPRIN2/CCN4/CCNE1/CDH2/CSNK1D/CSNK1E/CSNK2A2/CTR9/CXXC4/CYLD/DAAM1/DACT3/DDIT3/DIXDC1/DKK3/EDN1/EDNRA/EDNRB/EGR1/FERMT1/FGF10/FGF9/FGFR2/FOXL1/FOXO1/FRZB/G3BP1/GATA3/GLI3/GPC4/GRB10/GRK5/HDAC1/HECW1/IGFBP4/IGFBP6/JADE1/JRK/JUP/LGR4/LGR5/LZTS2/MCC/MESD/MKS1/MYOC/NDRG2/NFATC1/NFKB1/NR4A2/NXN/PKD1/PLEKHA4/PORCN/PRKAA2/PSEN1/PTPRU/RARG/RHOA/RSPO2/RSPO3/SDHAF2/SFRP1/SFRP2/SHISA2/SHISA6/SIAH2/SKI/SMURF1/SOX4/SOX9/SULF2/TBX18/TCF7L2/TLE1/TLE2/TLE5/TMEM237/TMEM64/TNFAIP3/TNKS/TRABD2B/TSKU/VCP/WIF1/WNT2B/WNT5A/WNT9A/YAP1/ZNF703
## GO:0010038                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ACO1/ADD1/AHCYL1/AKR1C3/ALG2/ANK3/AQP1/AQP3/ATF1/ATP7B/B2M/BECN1/BMP6/BNIP3/CAMK2D/CAPN3/CHUK/CLDN1/CLIC4/CPNE5/CPOX/CREB1/CRIP1/CUTA/CYBRD1/EDN1/EEF2K/EIF2S1/ENDOG/FIBIN/FOS/FOSB/GPI/GSS/HIF1A/IQGAP1/KCNA1/KCNMA1/KCNMB2/KCNMB4/KHK/MAOB/MBP/MCOLN1/MEF2A/MEF2C/MT1E/MT1F/MT1G/MT1X/MT2A/NCSTN/NEK7/NPTX1/P2RX7/PARK7/PGAM2/PPIF/PPP2CB/PRKAA2/PTGS2/RASA4/RASA4B/SEC31A/SERPINF1/SLC11A2/SLC12A2/SLC25A23/SLC30A1/SLC30A4/SOD2/SORD/SYT17/TCIRG1/TFRC/TIGAR/TNFRSF11B/TNNC1/TNNT2/WNT5A
## GO:0009185                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ADPGK/AK2/AK3/AK4/ALDOA/ARL2/DDIT4/ENO1/ENO2/ENO4/ENTPD7/GAPDH/GPI/HDAC4/HIF1A/HK2/LDHA/NUDT9/OGT/P2RX7/PFKL/PFKP/PGAM1/PGAM2/PGK1/PKM/PRKAA2/PRKAG2/PSEN1/SLC2A6/TIGAR/TJP2/TPI1
## GO:0071216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ABCA1/ABL1/BMP6/CCL2/CCL3/CCL5/CD274/CD55/CEBPB/CHMP5/CSF2/CSF3/CTR9/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/DDIT3/EDNRB/EPHB2/FBH1/GSTP1/HCK/IL6/IRAK2/LBP/MAP2K3/MEF2C/MIF/NFKB1/NFKBIA/NFKBIB/NOD2/NOS2/NR1D1/NR1H3/PDCD1LG2/PDCD4/PDE4B/PF4/PF4V1/PRDX2/RARA/RHOA/RIPK2/SELENOS/SIRPA/SIRT2/SPON2/TBXA2R/TIGAR/TNFAIP3/TNFRSF1B/TNIP1/TRIM5/VIM/WNT5A/ZC3H12A/ZFP36
## GO:0006024                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ABCC5/ANGPT1/B3GNT2/B3GNT7/B4GALT4/B4GAT1/CHPF2/CHST12/CHST2/CHST5/CHST7/CSGALNACT1/DSE/DSEL/EXT2/GALNT5/GLCE/HAS3/HS3ST3A1/HS6ST1/NFKB1/ST3GAL1/ST3GAL4/UGDH/UST
## GO:0071470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               AKR1B1/AQP1/ARHGEF2/CAPN3/EFHD1/LETM1/LRRC8C/LRRC8D/PTGS2/RELB/SLC12A6/SLC25A23/SLC2A1/STK39/XRCC5/ZFP36L1
## GO:0050900                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     AKIRIN1/B4GALT1/BDKRB1/C1QBP/C5/CAMK1D/CCL11/CCL2/CCL20/CCL28/CCL3/CCL5/CCL7/CCL8/CCN3/CCR7/CD9/CH25H/CHST2/CMKLR1/CSF1/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/CYP7B1/DAPK2/DBH/DDT/DUSP1/EDN1/EDNRB/ELANE/FADD/FYN/GAS6/GATA3/HCK/HRH1/HSD3B7/ICAM1/IL16/IL23A/IL6/IRAK4/ITGA1/ITGB1/JAGN1/KITLG/LBP/LGALS9/MCOLN2/MIA3/MIF/MSMP/MSTN/NINJ1/NOD2/PDE4B/PF4/PF4V1/PIK3CD/PLEC/PTGER4/RABGEF1/RHOA/ROCK1/SAA1/SCG2/SELE/SELENOK/SIRPA/SLC12A2/ST3GAL4/STAT5B/STK39/SWAP70/TGFB2/THBS4/TNFAIP6/TNFSF14/TREM1/WNT5A
## GO:0009152                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ACLY/ACSBG2/ACSL3/ACSL4/AK2/AK3/AK4/ALDOA/AMPD3/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/DCAKD/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/GUCY1A1/NME1/NPR1/PAICS/PAPSS1/PAPSS2/PDHB/PDHX/PDK1/PDK4/PID1/PPT1/PPT2/PRKAG2/SLC35B2/VCP
## GO:0001655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ACVR2B/ADAMTS1/ADAMTS6/AGT/AHI1/AKR1B1/ANGPT1/AP1B1/BASP1/BMP2/BMP6/C1GALT1/CFLAR/COL4A1/COL4A3/COL4A4/CRIP1/CYP7B1/EDNRA/EDNRB/EGR1/EPHB2/FADD/FBN1/FEM1B/FGF10/FGFR2/FKBP4/FOXC2/FOXD1/FOXF1/FRAS1/GATA3/GCNT3/GFRA1/GLI3/GLIS2/HOXA13/HYAL2/ID3/IQGAP1/KIRREL3/LGR4/LGR5/LIF/LZTS2/MEF2C/MPV17/MTSS1/NKX3-1/PCSK5/PCSK9/PKD1/PODXL/RARA/RARB/RARG/RHOA/ROBO2/SERPINB7/SERPINF1/SFRP1/SIX1/SIX4/SOX4/SOX8/SOX9/SRD5A1/STAT1/SULF2/TBX18/TCF21/TGFB2/TGFBR1/TNS2/TRAF3IP2/TTC8/WNT2B/WNT5A/YAP1
## GO:1904062                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ABL1/AGT/AHNAK/AKAP6/ANK3/ATP1A2/ATP1B1/ATP1B3/ATP2B4/ATPSCKMT/BDKRB1/C4orf3/CACNA1C/CACNB1/CACNG4/CAMK2D/CAPN3/CCL2/CDK5/CHP1/COX17/CTSS/CXCL10/EDN1/EDNRA/EPHB2/F2R/FGF11/FHL1/FKBP1A/FXYD1/FXYD5/FYN/GJC2/GLRX/GNB5/GPD1L/GPER1/GSTM2/GSTO1/HECW1/IFNGR2/ITGB1/KCNA1/KCNE4/KCNIP1/KCNJ2/KCNN4/LIME1/LRRC55/MEF2C/MINK1/MTNR1B/NDUFA4/NLGN2/NLGN3/OPRL1/P2RY6/PARK7/PCSK9/PDE4B/PDE4D/PDZK1/PLA2G6/PPIF/PRKD1/RANGRF/RGS2/SCN2B/SCN4B/SHISA6/SLC30A1/SLC43A2/STIMATE/STK39/TCIRG1/THADA/UTRN/VDAC1/VMP1
## GO:0009612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ABHD12/AGT/AQP1/ATP1A2/BAK1/BDKRB1/BMP6/BNIP3/CDH2/CITED2/CXCL10/EDN1/ENDOG/FADD/FAS/FOS/FOSB/FYN/GPI/GSN/HABP4/IRF1/JUP/KCNA1/KCNJ2/MAP1B/MAP3K14/MEIS2/MKKS/NFKB1/NFKBIA/NRXN2/P2RX7/PDZD7/PHF24/PKD1/PLEC/PPL/PTGER4/PTGS2/RHOA/SERPINE2/SLC2A1/SLC38A2/SOX9/STAT1/STRC/TMEM150C/TNFRSF10B/TNFRSF8/TNFSF14
## GO:0030099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ATP5IF1/ATP6AP1/B2M/BATF/CCL3/CCN4/CCR7/CD109/CDIN1/CDK5RAP3/CDK6/CDKN2B/CEBPB/CEBPG/CITED2/CREB1/CSF1/CSF2/CSF3/CTR9/EPAS1/ERCC2/FADD/FAXDC2/FBN1/FES/FLI1/FOS/FSTL3/GATA3/GLO1/GPR137/H4C12/H4C15/HIF1A/HOXA9/IFI16/IL11/IL15/IL23A/INHA/INHBA/ISG15/JAGN1/KITLG/KLF13/KLF2/L3MBTL1/LIF/LOX/MEF2C/MEIS2/MPIG6B/MT1G/MTOR/NBEAL2/NFKBIA/OSTM1/PABPC4/PF4/PIAS3/PIK3CD/PRDX3/PRMT1/PSEN1/PTPN11/RAB7B/RARA/RARG/RELB/SCIN/SFRP1/SFXN1/SLC11A2/SLC25A5/STAT1/STAT5B/TCIRG1/TFRC/TMEM64/TNFAIP6/TSPAN2/WASF2/ZBTB46/ZFP36/ZFP36L1/ZNF385A
## GO:0032526                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ABCA1/ABL2/AQP1/AQP3/ATM/BMP6/BRINP2/CD38/CREB1/FGFR2/GJB2/HOXA2/HSD17B2/IGF2R/IGFBP7/LTK/NDUFA13/PCK1/RARA/RARG/RORB/SERPINF1/SLC10A3/SNW1/SOX9/TEAD2/TFRC/TRIM16/WNT5A/WNT9A/YAP1/ZNF35
## GO:0098657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ACSL3/AGT/ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP1B3/ATP2B4/CACNA1C/CYBRD1/EPRS1/FABP3/FLOT1/FYN/IL10RA/ITGB1/KCNJ2/LRRC8C/LRSAM1/MAPK15/PARK7/PER2/PLPPR4/PSEN1/RAB3B/RGS2/SCNN1A/SCNN1D/SLC11A2/SLC12A2/SLC12A6/SLC15A3/SLC15A4/SLC16A2/SLC19A1/SLC1A4/SLC1A5/SLC29A1/SLC29A2/SLC2A1/SLC2A3/SLC30A1/SLC36A4/SLC38A1/SLC39A10/SLC39A14/SLC39A4/SLC39A8/SLC43A2/SLC6A6/SLC7A2/SLC7A8/SLC8A3/SLC9A3/SLC9A9/SPX/STEAP4/TOR1A
## GO:0006164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ACLY/ACSBG2/ACSL3/ACSL4/ADORA2B/AK2/AK3/AK4/ALDOA/AMPD3/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/DCAKD/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/GUCY1A1/MTHFD2L/NME1/NOS2/NPR1/PAICS/PAPSS1/PAPSS2/PDHB/PDHX/PDK1/PDK4/PID1/PPT1/PPT2/PRKAG2/PRPSAP1/SLC35B2/VCP
## GO:0010952                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ADRM1/AIFM1/ANTXR1/ASPH/ATP2A3/BAK1/BID/BOK/CFLAR/COL4A3/CYCS/DDRGK1/DLC1/EGLN3/F2R/F3/FADD/FAM162A/FAS/FYN/GPER1/GSN/HSPE1/IFI16/LAPTM5/LGALS9/MAP3K5/MBP/MTCH1/MUL1/NCSTN/NDUFA13/NKX3-1/PCOLCE/PDCD5/PERP/PSMD14/PSME1/PSME2/PSME3/RHOA/RIPK2/ROCK2/SFRP2/TBC1D10A/TNFSF10/UACA/VCP/VSIR
## GO:0060485                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ACTC1/ADIPOR1/AKNA/BAMBI/BASP1/BCL9L/BMP2/CDH2/CITED2/CLASP2/DACT3/DDX17/DDX5/EDN1/EDNRA/EDNRB/ELL3/EPB41L5/FGF10/FGF9/FGFR2/FOXC2/FOXD1/FOXF1/FRZB/GATA3/GLIPR2/HIF1A/HNRNPAB/IL17RD/IL6/KITLG/LDLRAD4/LOXL3/MEF2C/MTOR/NOLC1/NRP2/NRTN/PDCD4/POGLUT1/ROBO2/ROCK1/ROCK2/SDHAF2/SEMA3A/SEMA3B/SEMA3D/SEMA4A/SEMA5B/SFRP1/SFRP2/SIX1/SIX4/SOX8/SOX9/STAT1/TASOR/TCF21/TCF7L2/TEAD2/TGFB2/TGFB3/TGFBR1/TMEM100/WNT5A/YAP1/ZFP36L1/ZFP64/ZNF703
## GO:0001836                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       BAK1/BCL2L1/BCL2L2/BID/BMF/BNIP3/BOK/FAM162A/GPER1/IFI6/LMNA/MFF/MLLT11/NOL3/PDCD5/PLA2G6/PPIF/PSMD10/SOD2/TNFSF10
## GO:0050878                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ADM/ADORA2A/AK3/AKR1B1/ALOXE3/APLN/AQP1/AQP3/ATP7B/C1GALT1C1/C1QTNF1/CD9/CLDN1/COL3A1/CORO2B/CREB1/CSRP1/DDR1/DGKA/DGKD/DGKH/EDN1/EDNRB/EMP2/EPHB2/EXT2/F13A1/F2R/F3/F5/FGF10/FLI1/FUNDC2/GAS6/GJA1/GP1BB/GPI/HIF1A/HK2/HPS4/HPS5/HSPB1/HYAL2/IL6/ITPK1/KCNN4/KRT16/MPIG6B/MYO5B/NME1/NPR1/NPR3/NR1H2/NR1H3/OPRL1/OXTR/PABPC4/PAPSS2/PF4/PF4V1/PIK3CB/PLA2G4A/PLAT/PLEC/PRDX2/PRKCD/PRL/PROS1/RAB27A/RAP2B/SAA1/SCNN1A/SERPINE2/SLC29A1/SLC29A2/ST3GAL4/STAT5B/STK39/TBXA2R/TFPI/TFPI2/THBD/TRAF3IP2/WAS/ZNF385A
## GO:0048705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ACVR2B/BMP1/BMP6/BPNT2/CHAD/CITED2/COL2A1/COL3A1/CSGALNACT1/CSRNP1/DLX2/EXT2/FBN2/FGF18/FGFR2/FGFR3/FOXC2/FOXN3/GLI3/HOXA2/HOXA3/HOXA6/HOXA9/HOXC4/HYAL2/INSIG2/MEF2C/MEGF8/NAB1/NAB2/P2RX7/PKD1/PLEKHA1/PSEN1/RAB23/RAB33B/RARA/RARB/RARG/RFLNA/ZNF664-RFLNA/SFRP1/SFRP2/SIX1/SIX4/SKI/SOX9/STC1/TBX4/TGFB3/TGFBR1/THBS3/TMEM119/TSKU/TULP3/ZEB1
## GO:0072001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ACVR2B/ADAMTS1/ADAMTS6/AGT/AHI1/AKR1B1/ANGPT1/AP1B1/BASP1/BMP2/BMP6/C1GALT1/CFLAR/COL4A1/COL4A3/COL4A4/EDNRA/EDNRB/EGR1/FADD/FBN1/FGF10/FGFR2/FOXC2/FOXD1/FOXF1/FRAS1/GATA3/GCNT3/GFRA1/GLI3/GLIS2/HYAL2/ID3/IQGAP1/KIRREL3/LGR4/LGR5/LIF/LZTS2/MEF2C/MPV17/MTSS1/NKX3-1/PCSK5/PCSK9/PKD1/PODXL/RARA/RARB/RHOA/ROBO2/SERPINB7/SERPINF1/SFRP1/SIX1/SIX4/SOX4/SOX8/SOX9/STAT1/SULF2/TBX18/TCF21/TGFB2/TGFBR1/TNS2/TRAF3IP2/TTC8/WNT2B/WNT5A/YAP1
## GO:0032527                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   AUP1/DERL1/DERL2/EDEM2/MMP24-AS1-EDEM2/ERLEC1/HM13/MAP1LC3C/RANGRF/SAR1B/SEC16B/CRYZL2P-SEC16B/SEC61B/SELENOS/TMEM30A/TMEM30B/UFD1/VCP
## GO:0034764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ABL1/AGT/AKAP6/ANK3/APPL1/ATP1B1/ATP1B3/ATPSCKMT/AZIN1/BDKRB1/C2CD5/C3/CA2/CACNG4/CAPN3/CCL2/CDK5/CHP1/COX17/CREBL2/CTSS/CXCL10/EDN1/EDNRA/EPHB2/F2R/FXYD1/GJC2/GLRX/GPER1/GSTM2/GSTO1/IFNGR2/IRS1/ITGB1/KCNA1/KCNJ2/KCNN4/LRRC55/MEF2A/NDUFA4/NLGN3/NR4A3/OSBPL8/P2RX7/P2RY6/PDZK1/PRKCI/PSEN1/PTPN11/STIMATE/STK39/VMP1
## GO:0048762                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ADIPOR1/AKNA/BAMBI/BCL9L/BMP2/CDH2/CITED2/CLASP2/DACT3/DDX17/DDX5/EDN1/EDNRA/EDNRB/ELL3/EPB41L5/FGF10/FGFR2/FOXC2/FRZB/GATA3/GLIPR2/HIF1A/HNRNPAB/IL17RD/IL6/KITLG/LDLRAD4/LOXL3/MEF2C/MTOR/NOLC1/NRP2/NRTN/PDCD4/ROCK1/ROCK2/SDHAF2/SEMA3A/SEMA3B/SEMA3D/SEMA4A/SEMA5B/SFRP1/SFRP2/SIX1/SOX8/SOX9/STAT1/TASOR/TCF21/TCF7L2/TGFB2/TGFB3/TGFBR1/TMEM100/WNT5A/ZFP64/ZNF703
## GO:0006066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ABCA1/ABCA2/ACER3/ACLY/ACO2/ADCYAP1R1/AKR1B1/AKR1C1/AKR1C2/AKR1C3/ALDH1B1/ALDH2/APOL2/ASAH1/ASAH2/ASAH2B/BMP2/BMP6/BPNT2/CH25H/COQ2/CYP27C1/CYP7B1/DBH/DEGS2/DHCR24/DHCR7/DHRS13/DKK3/DPAGT1/EDNRB/FMO5/GCH1/GDE1/GK/GPD2/GPER1/HRH1/IDH3A/INSIG2/IP6K1/IPMK/IPPK/ISYNA1/ITPK1/LPCAT3/LSS/MBTPS2/MINPP1/NAAA/NFKB1/NUDT4/NUS1/OCRL/P2RY6/PARK7/PCK1/PCK2/PCSK9/PLA2G4A/PMVK/PPIP5K2/PRKAA2/PTH1R/PTS/QDPR/RDH11/RDH5/SCAP/SEC14L2/SOAT2/SORD/SPTLC2/SPTSSA/SPTSSB/SQLE/SULT1C4/TKFC/TPI1/TSKU/VLDLR
## GO:0007033                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ABCA1/ACP2/AKTIP/ATG14/ATG3/ATG7/ATP2A2/BECN1/CCDC115/CHMP4B/EMC6/FHIP1B/GABARAPL1/GABARAPL2/GNPTAB/HEXB/HOOK2/HPS4/LAMTOR1/LAPTM5/LRSAM1/MAP1LC3C/MFN2/MTOR/P2RX7/PHF23/PPT1/PSEN1/RAB23/RAB33B/RAB3GAP1/RAB7B/SCARB2/SEC22B/SMURF1/SNX30/STING1/TBC1D12/TCIRG1/TFEB/TMEM165/TMEM175/TP53INP2/UBQLN2/UBXN2B/VMP1/WDR45B/WIPI1
## GO:0010232                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ABCA2/ABCC5/ATP1A2/ATP2A3/ATP2B4/ATP8A1/MFSD2A/SLC12A2/SLC16A2/SLC19A1/SLC1A4/SLC1A5/SLC24A3/SLC29A1/SLC29A2/SLC2A1/SLC2A13/SLC2A3/SLC38A1/SLC38A2/SLC44A1/SLC6A6/SLC7A2/SLC7A8/SLCO2B1/SLCO3A1/TFRC
## GO:0150104                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ABCA2/ABCC5/ATP1A2/ATP2A3/ATP2B4/ATP8A1/MFSD2A/SLC12A2/SLC16A2/SLC19A1/SLC1A4/SLC1A5/SLC24A3/SLC29A1/SLC29A2/SLC2A1/SLC2A13/SLC2A3/SLC38A1/SLC38A2/SLC44A1/SLC6A6/SLC7A2/SLC7A8/SLCO2B1/SLCO3A1/TFRC
## GO:0090257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ADORA2B/AGT/AKAP6/ATP1A1/ATP1A2/ATP1B1/ATP2A2/ATP2B4/BECN1/CACNA1C/CAMK2D/DMPK/DOCK4/DOCK5/EDN1/ENO1/F2R/FBXO32/FOXO1/GLRX3/GPER1/GSTM2/GSTO1/GUCY1A1/HDAC4/JUP/KCNA1/KCNJ2/KCNMA1/LMCD1/LMNA/MEF2A/MSTN/MYL5/NOL3/NR4A3/OXTR/PDE4B/PDE4D/PDE5A/PPP1R12B/PTGS2/RANGRF/RGS2/RHOA/ROCK1/ROCK2/SGCA/SLC8A3/SPX/STC1/TBXA2R/TNFRSF1B/TNNC1/TNNC2/TNNI1/TNNT2/TNNT3/TPM1/ZC3H12A
## GO:1904851                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/TCP1
## GO:0006986                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     BAK1/BOK/CDK5RAP3/CREB3L2/DDIT3/DDRGK1/DERL1/DERL2/DNAJA1/DNAJC3/EDEM2/MMP24-AS1-EDEM2/EDEM3/EIF2S1/ERLEC1/ERO1A/ERP44/FICD/HSPA4/HSPA4L/HSPB1/HSPB2/HSPB7/HSPE1/JKAMP/MANF/MBTPS2/MFN2/OPTN/PPP1R15A/PTPN1/SELENOS/STC2/STT3B/THBS4/TMEM33/VAPB/VCP
## GO:0046661                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    AKR1C3/BCL2L1/BCL2L2/BMP6/BOK/CITED2/COL9A3/DHCR24/DHX37/FGF10/FGF9/FKBP4/FNDC3A/GATA3/GFRA1/GJA1/HOXA13/INHA/INHBA/KITLG/LGR4/MAMLD1/NCOA4/NKX3-1/PLEKHA1/RAB13/RARA/RNF38/SEMA3A/SFRP1/SFRP2/SIX4/SOX15/SOX8/SOX9/SRD5A1/STAT5B/TCF21/TFPT/TGFB2/TGFBR1/WNT2B/WNT5A
## GO:0042776                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT
## GO:0006487                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ALG2/ALG3/ALG5/ALG8/ALG9/B4GALT1/DOLK/DPAGT1/EXT2/GFPT2/MAN1C1/MGAT1/MGAT4A/MGAT5/MLEC/NUS1/OSTC/RPN1/RPN2/SLC39A8/ST3GAL1/STT3B/TMEM165
## GO:0071260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         AGT/AQP1/ATP1A2/BAK1/BMP6/BNIP3/FADD/FAS/HABP4/IRF1/KCNJ2/MAP3K14/NFKB1/PLEC/PTGER4/PTGS2/SLC2A1/SLC38A2/SOX9/TMEM150C/TNFRSF10B/TNFRSF8/TNFSF14
## GO:0010876                                                                                                                                                                                                                                                                                                                                                                                                                                                          ABCA1/ABCA2/ABCA3/ABCD4/ABHD5/ACSL3/AGT/AKR1C1/ANO9/APOL2/APOO/ATP10A/ATP8A1/ATP8B1/ATP8B4/ATP9A/AUP1/B4GALNT1/BMP6/C1QTNF1/C2CD2L/C3/CERT1/CRABP2/DENND5B/EDN1/EHD1/EPRS1/ESYT1/FABP3/FITM2/FURIN/HEXB/HILPDA/IL6/INHBA/ITGAV/KCNN4/LBP/LIPG/LPCAT3/LRP10/MAP2K6/MEST/MFSD2A/MIF/NFKB1/NFKBIA/NKX3-1/NOS2/NR1H2/NR1H3/NUS1/OSBPL3/OSBPL7/OSBPL8/OSBPL9/P2RX7/PCSK9/PDZD8/PITPNC1/PITPNM1/PLA2G4A/PLA2G6/PLA2R1/PLPPR4/PNPLA8/PRELID3A/PRKCD/PROCA1/PTGES/PTPN11/RBP7/SAR1B/SCARB2/SELENOM/SLC10A3/SLC27A3/SLC2A1/SLCO1A2/SLCO2B1/SLCO3A1/SOAT2/SPP1/SPX/SQLE/STARD5/STAT5B/SURF4/TMEM30A/TMEM30B/TTPA/VLDLR/VMP1/VPS51/ZC3H12A
## GO:0006970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       AKR1B1/AQP1/ARHGEF2/CAPN3/CLDN1/EFHD1/ICOSLG/KCNMA1/LETM1/LRRC8C/LRRC8D/NOLC1/PLK3/PTGS2/RELB/SLC12A2/SLC12A6/SLC25A23/SLC2A1/SORD/SST/STK39/TSC22D3/XRCC5/ZFP36L1
## GO:0044106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ALDH2/AMD1/AOC2/ATP2B4/AZIN1/BHMT/DBH/DMGDH/EDNRA/EPAS1/GATA3/GCH1/GDE1/HDAC10/HNMT/IL4I1/KYNU/MAOA/MAOB/NAAA/NNMT/NPR1/NR4A2/OAZ1/OAZ2/PARK7/RNF180/SAT1/SLC44A1/SLC7A7/SMOX/SRM/TGFB2
## GO:0006972                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           AKR1B1/AQP1/ARHGEF2/CLDN1/EFHD1/ICOSLG/LETM1/SLC12A2/SLC25A23/SLC2A1/SST/XRCC5
## GO:0034349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   AKAP12/CCL2/CDK5/GAS6/PRKCD/PRKCH/PRKCI/TNFRSF21/TRAF2
## GO:0071474                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    AKR1B1/AQP1/ARHGEF2/EFHD1/LETM1/SLC25A23/SLC2A1/XRCC5
## GO:0009267                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           AKR1C3/ATG14/ATG7/BECN1/DNAJC15/EIF2S1/FAS/FBXO22/FOXO1/GABARAPL1/GABARAPL2/GAS6/IFI16/JMY/MAP1LC3C/MAP3K5/MFSD2A/MTOR/MYBBP1A/NUAK2/PCK1/PCSK9/PDK4/PRKAA2/PRKAG2/PRKD1/RNF152/SESN2/SESN3/SFRP1/SIK1/SIK2/SLC2A1/SLC38A2/SLC39A4/SRD5A1/TFEB/UPP1/WDR45B/WIPI1/WNT2B/ZC3H12A
## GO:0019221                                                                                                                                                                                                                                                                                                                                                                                                                                                       ADIPOR1/ANGPT1/APPL1/APPL2/BIRC3/CCL11/CCL2/CCL20/CCL3/CCL5/CCL7/CCL8/CCR7/CHUK/CLCF1/CMKLR1/CSF1/CSF2/CSF3/CTR9/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/CYLD/EDN1/EGR1/EIF5A/F3/FADD/FAS/GAS6/GSTP1/HCK/HIF1A/IFI27/IFNAR1/IFNAR2/IFNGR1/IFNGR2/IFNLR1/IL10RA/IL10RB/IL11RA/IL15/IL15RA/IL17RD/IL17RE/IL33/IL3RA/IL6/IL7/IL7R/IRAK2/IRAK4/IRF1/ISG15/JAGN1/LAPTM5/LRP8/MKKS/MMP12/MUL1/NFKBIA/NKIRAS2/NOL3/NR1H2/NR1H3/NUMBL/OAS1/OASL/OSMR/P4HB/PF4/PF4V1/PIAS3/PLP2/PPP2CB/PTPN1/PTPN11/PTPRJ/PXDN/RABGEF1/RIPK2/STAT1/STAT4/STAT5B/STING1/STK39/TNFAIP3/TNFRSF1B/TRAF2/TRAF3/TRAF3IP2/TXNDC17/USP18/USP27X/WBP1L/WNT5A/YAP1
## GO:0009308                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ALDH2/AMD1/AOC2/AOC3/ATP2B4/AZIN1/BHMT/DBH/DMGDH/EDNRA/EPAS1/GATA3/GCH1/GDE1/HDAC10/HNMT/IL4I1/KYNU/MAOA/MAOB/NAAA/NNMT/NPR1/NR4A2/OAZ1/OAZ2/PARK7/RNF180/SAT1/SLC44A1/SLC7A7/SMOX/SRM/TGFB2
## GO:0009615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ADARB1/ARF1/ATAD3A/ATG7/AUP1/BCL2L1/BCL3/BECN1/BIRC3/BNIP3/BST2/C1QBP/CCL11/CCL5/CCL8/CCT5/CDK6/CHUK/CXCL10/DCLK1/DDIT4/DDX17/DNAJC3/EIF5A/ENO1/EXOC1/EXOSC4/FADD/G3BP1/GATA3/GBP1/GPATCH3/HIF1A/HSPB1/HYAL2/IFI16/IFI27/IFI44L/IFI6/IFIT5/IFNAR1/IFNAR2/IFNGR1/IFNGR2/IFNLR1/IKBKG/IL10RB/IL15/IL23A/IL6/IRF1/IRF2/ISG15/LAMTOR5/LGALS9/MAP3K14/MAPK11/MMP12/MOV10/MUL1/NDUFAF4/NFKB1/OAS1/OASL/PHB1/PIM2/POLR3K/POU2F2/PSMA2/RTP4/SELENOK/SENP7/SERINC5/SPON2/STAT1/STING1/TKFC/TNFAIP3/TRAF3/TRAF3IP2/TRIM5/TRIM8/UFD1/UNC13D/USP27X/ZC3H12A
## GO:0034599                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ABL1/AIFM1/AIFM2/AKR1C3/AQP1/ATP2A2/BECN1/BNIP3/BRF2/CHCHD2/CHUK/EDN1/EDNRA/EIF2S1/ENDOG/EPAS1/FOS/FOXO1/FYN/GCH1/GJB2/GLRX2/GPR37L1/GSR/HIF1A/HSPB1/IL6/KLF2/MAP3K5/MAPKAP1/MGST1/MMP3/MPV17/NCOA7/NOL3/NR4A2/NR4A3/P4HB/PARK7/PDK1/PLA2R1/PLEKHA1/PNPLA8/PPIF/PRDX1/PRDX2/PRDX3/PRKAA2/PRKCD/PRKD1/PRODH/PRR5L/PTPRK/PYCR1/PYCR2/ROMO1/SELENOS/SESN2/SIRPA/SIRT2/SOD2/TNFAIP3/TPM1/TXN/VNN1/ZC3H12A
## GO:0008016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ADM/ADM2/AGT/APLN/ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/CACNA1C/CAMK2D/CORIN/DES/DMPK/EDN1/EDNRA/EDNRB/EPAS1/FXYD1/GCH1/GJA1/GJD3/GLRX3/GPD1L/GSTM2/GSTO1/HSPB7/JUP/KCND3/KCNE4/KCNJ2/MEF2A/PDE4B/PDE4D/PDE5A/RANGRF/RGS2/SCN2B/SCN4B/SEMA3A/SLC8A3/SPX/STC1/TBX18/TGFB2/THRB/TNNT2/TPM1/ZC3H12A
## GO:0008654                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ABCA2/ABHD4/ABHD5/ACSL3/AGPAT3/AGPAT4/AJUBA/ATG14/ATM/BECN1/BPNT2/CHP1/CHPT1/DGKA/DGKD/DGKH/DOLK/ETNK2/FABP3/FAR1/FITM2/HDHD5/HEXB/FAM126A/IP6K1/IPMK/ISYNA1/LPCAT1/LPCAT3/LPCAT4/LPIN1/MBOAT1/MBOAT7/MFSD2A/NUS1/OCRL/PGAP2/PI4K2A/PI4KA/PIGL/PIGO/PIGS/PIGU/PIGV/PIK3CB/PIK3CD/PIK3R3/PITPNM1/PLA2G4A/PLA2G6/PLD1/PLD2/PMVK/PTPMT1/SELENOI/SERINC5/SGMS2/SLC44A1/SLC44A3/SMG1/SPTLC2
## GO:0042326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ABL1/ADARB1/ADORA2A/AGT/AJUBA/AKT1S1/ANGPT1/ANKLE2/ATG14/BAK1/BDKRB1/BMP2/CD109/CDK5RAP1/CDK5RAP3/CDKN2B/CHP1/CTDSP2/CTDSPL/DBNDD2/DDIT4/DEPTOR/DNAJA1/DNAJC3/DUSP1/DUSP16/DUSP3/EPHB2/GADD45B/GPD1L/GPRC5A/GRB10/GSTP1/HDAC4/HSPB1/HYAL2/INHA/INHBA/IPO5/KIRREL1/LDLRAD4/MICAL1/MLLT1/MSTN/MYADM/NIBAN1/PARD6A/PARK7/PDCD4/PDE4D/PID1/PIK3CB/PLEC/PMEPA1/PPM1E/PPP2R5A/PPP4R2/PRDX3/PRKAG2/PRKCD/PRKCZ/PRR5L/PSEN1/PTPN1/PTPN13/PTPRJ/RABGEF1/RGS2/ROCK1/RTRAF/SFRP1/SFRP2/SIRPA/SIRT2/SLC8A3/SNX25/SPAG9/TIGAR/TNFAIP3/TRIB3/VPS25/WARS1/YWHAG/ZC3H12A
## GO:0060349                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              BMP6/BPNT2/CITED2/COL2A1/COL3A1/CSGALNACT1/EXT2/FGF18/FGFR2/FGFR3/FOXN3/GLI3/INSIG2/MEF2C/MEGF8/NAB1/NAB2/RAB23/RARA/RARB/RARG/SFRP2/SKI/SOX9/STC1/TGFB3/THBS3/TMEM119/TSKU
## GO:0070555                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 AKAP12/CCL11/CCL2/CCL20/CCL3/CCL5/CCL7/CCL8/CD38/CEBPB/CXCL8/EDN1/EGR1/GBP1/HDAC4/HIF1A/HYAL2/IGBP1/IL6/IRAK2/IRAK4/KLF2/LGALS9/MAPK11/NFKB1/NKX3-1/NR1D1/PCK1/PRKCI/PTGIS/RIPK2/RORA/SELE/SFRP1/SIRPA/SOX9/TLE5/ZC3H12A
## GO:0106106                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ABHD6/ACOT11/ACVR2B/ADIPOR1/APPL2/ARRDC3/CEBPB/CMKLR1/DBH/DDIT3/DECR1/ELOVL3/EPAS1/FOXC2/G0S2/GJA1/GRB10/IL15/IP6K1/KSR2/LAMA4/LCN2/LGR4/LPIN1/MAP2K6/MFN2/NPR3/NR1D1/NR1H2/NR1H3/OGT/OXTR/PER2/PLAC8/PLCL1/PRDM16/SCD/TSHR/ZNF423
## GO:0120161                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ABHD6/ACOT11/ACVR2B/ADIPOR1/APPL2/ARRDC3/CEBPB/CMKLR1/DBH/DDIT3/DECR1/ELOVL3/EPAS1/FOXC2/G0S2/GJA1/GRB10/IL15/IP6K1/KSR2/LAMA4/LCN2/LGR4/LPIN1/MAP2K6/MFN2/NPR3/NR1D1/NR1H2/NR1H3/OGT/OXTR/PER2/PLAC8/PLCL1/PRDM16/SCD/TSHR/ZNF423
## GO:0006734                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ENO1/ENO2/GPD2/HK2/MDH1/MDH1B/MDH2/NUDT17/PCK2/PFKL/PFKP/TIGAR/VCP
## GO:0051099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ABL1/ADD1/AKTIP/B2M/BAMBI/BDNF/BMP2/CAPRIN2/CDK5/CEBPG/CSF3/DDRGK1/DERL1/EDF1/EIF2S1/EPB41/EPB41L5/ERCC2/FKBP1A/FLOT1/GATA3/GPSM1/LAMTOR5/LFNG/MFNG/NIBAN2/NME1/PARK7/PKD1/PLCL1/PPP2CB/PSEN1/RARA/RFNG/RIPK2/SIRT2/SKI/SPAG8/SPON1/STING1/TCF7L2/TRIB3/TXN/WNT5A
## GO:0032331                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  CCN4/CHADL/EFEMP1/PTPN11/RARB/RARG/RFLNA/ZNF664-RFLNA/SOX9/TGFBR1/WNT9A
## GO:0034312                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ABCA2/ACER3/ASAH1/ASAH2/ASAH2B/GCH1/PTS/QDPR/SPTLC2/SPTSSA/SPTSSB
## GO:0043122                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ABL1/AJUBA/ANGPT1/BIRC3/BST2/CAPN3/CCR7/CFLAR/CHUK/F2R/FADD/FKBP1A/FYN/GAPDH/GJA1/GSTP1/HDAC1/HSPB1/IFIT5/IKBKG/IRAK4/LAMTOR5/LGALS9/LIME1/LURAP1L/MAP3K14/MAP3K3/MUL1/NFKBIB/NKIRAS2/NOD2/NR1D1/OPTN/PELI1/PIM2/PRKD1/RHOA/RIPK2/RORA/SHISA5/SLC35B2/STAT1/TAB2/TFG/TFRC/TIFA/TLE1/TNFAIP3/TNFRSF10B/TNFSF10/TNIP1/TRAF2/TRAF3/TRAF3IP2/TRIM5/TRIM8/UBE2N/UNC5CL/WNT5A/ZC3H12A
## GO:0072522                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ACLY/ACSBG2/ACSL3/ACSL4/ADORA2B/AK2/AK3/AK4/ALDOA/AMD1/AMPD3/ATIC/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/DCAKD/DIP2A/DLAT/ELOVL2/ELOVL3/ENO1/GUCY1A1/MTHFD2L/NME1/NOS2/NPR1/PAICS/PAPSS1/PAPSS2/PDHB/PDHX/PDK1/PDK4/PID1/PPT1/PPT2/PRKAG2/PRPSAP1/SLC35B2/VCP
## GO:1905954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ABCA3/ATP8A1/BMP6/C1QTNF1/C3/DENND5B/EDN1/EHD1/FABP3/FITM2/HILPDA/LIPG/LPCAT3/MAP2K6/MIF/NFKB1/NKX3-1/NR1H2/NR1H3/P2RX7/PLA2G4A/PLA2G6/PLA2R1/PRKCD/PTGES/SPP1/TMEM30A/ZC3H12A
## GO:0071300                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ABCA1/ABL2/AQP1/ATM/BRINP2/CREB1/FGFR2/HOXA2/LTK/NDUFA13/PCK1/RARA/RARG/RORB/SERPINF1/SNW1/SOX9/TEAD2/WNT5A/WNT9A/YAP1/ZNF35
## GO:0034612                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     AFF3/AKAP12/ARHGEF2/ASAH1/BAG4/BIRC3/CCL11/CCL2/CCL20/CCL3/CCL5/CCL7/CCL8/CHUK/CLDN1/CXCL8/CYLD/EDN1/EIF5A/ENDOG/FAS/GAS6/GATA3/GBP1/GCH1/GPER1/GSTP1/HYAL2/IGBP1/KLF2/LAPTM5/MAP3K5/MBP/NFKB1/NFKBIA/NKIRAS2/NKX3-1/NOL3/NR1D1/PCK1/PCK2/PIAS3/PID1/PPP2CB/PTGS2/RORA/SELE/SFRP1/STAT1/TNFAIP3/TNFRSF1B/TNFRSF21/TRAF2/TRAF3/TRAF3IP2/TXNDC17/ZC3H12A/ZFP36/ZFP36L1
## GO:0043457                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            AK4/ARL2/BNIP3/CISD1/COX7A2/DNAJC15/HIF1A/IFNAR1/IFNLR1/IL10RB/NOS2/PARK7/PPIF/PRDM16/RHOA/SLC25A23/UQCC2/VCP
## GO:1901214                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        AARS1/ABL1/ADORA2A/AIFM1/AKT1S1/ANGPT1/ATM/BCL2L1/BDNF/BOK/BTBD10/CCL2/CCL3/CCL5/CDK5/CEBPB/CHMP4B/CHP1/CHRNA7/CLCF1/CSF1/CSF3/DDIT3/DDIT4/DHCR24/DNAJC5/EGLN3/EGR1/EIF2S1/ENO2/EPHB1/F2R/FAIM2/FOS/FYN/GATA3/GPI/GPNMB/HDGF/HIF1A/HYOU1/IKBKG/ITGA1/MAP3K5/MEF2C/MTNR1B/NCOA7/NR4A2/NR4A3/PARK7/PCSK9/PPT1/PRKCI/PSEN1/RAB29/RASA1/RHOA/ROCK1/SARM1/SERPINF1/SIX1/SIX4/SOD2/TGFB2/TGFB3/TIGAR/TMEM259/TNFRSF1B/TRAF2/UBE2M/WNT5A
## GO:0010001                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ABCA2/ABL1/ADORA2A/ARHGEF10/B4GALT5/BMP2/BNIP3/BOK/CDH2/CDK5/CDK6/CLCF1/DLX2/DNER/DUSP15/ERBB2/ERCC2/FGF10/GAP43/GLI3/GPR37L1/HDAC1/IFNGR1/IL6/LIF/MAP2K1/MMP24/MTOR/MXRA8/MYOC/NAB1/NAB2/NCSTN/NKX6-1/NR1D1/PHGDH/PLEC/PSEN1/PTPN11/RHOA/SERPINE2/SH3TC2/SIRT2/SKI/SLC8A3/SOX4/SOX8/SOX9/SPINT1/TNFRSF1B/TNFRSF21/TSPAN2/VIM
## GO:0006165                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ADPGK/AK4/ALDOA/ARL2/DDIT4/ENO1/ENO2/ENO4/GAPDH/GPI/HDAC4/HIF1A/HK2/LDHA/NME1/OGT/P2RX7/PFKL/PFKP/PGAM1/PGAM2/PGK1/PKM/PRKAA2/PRKAG2/PSEN1/SLC2A6/TIGAR/TPI1
## GO:0031669                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 AIFM1/AKR1C3/AQP3/ATG14/ATG7/BECN1/CDKN2B/CYP24A1/DNAJC15/EIF2S1/FAM107A/FAS/FBXO22/FES/FOXO1/GABARAPL1/GABARAPL2/GAS6/IFI16/IL15/JMY/MAP1LC3C/MAP3K5/MFSD2A/MTOR/MYBBP1A/NUAK2/PCK1/PCSK9/PDK4/PRKAA2/PRKAG2/PRKD1/RNF152/SESN2/SESN3/SFRP1/SIK1/SIK2/SLC2A1/SLC38A2/SLC39A4/SNW1/SRD5A1/TFEB/TXN2/UCN2/UPP1/WDR45B/WIPI1/WNT2B/ZC3H12A
## GO:0032368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ABCA2/ABCA3/AGT/ATP8A1/BMP6/C1QTNF1/DENND5B/EDN1/EPRS1/FABP3/FURIN/ITGAV/LIPG/LPCAT3/MAP2K6/MIF/NFKB1/NKX3-1/NR1H2/NR1H3/NUS1/P2RX7/PCSK9/PLA2G4A/PLA2G6/PLA2R1/PRKCD/PTGES/PTPN11/SAR1B/SPP1/SURF4/TMEM30A
## GO:0006767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ABCD4/ALDH1L2/CLYBL/FLAD1/FPGS/GSTO1/MMADHC/MTHFD2L/MTHFS/NNMT/PDXP/RFK/SLC19A1/SLC19A2/SLC19A3/SLC25A32/SLC2A1/SLC2A3/SLC52A2/VNN1/VNN2
## GO:1990266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               C1QBP/CAMK1D/CCL11/CCL2/CCL20/CCL3/CCL5/CCL7/CCL8/CCR7/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/DAPK2/EDN1/IL23A/IRAK4/ITGA1/JAGN1/LBP/MCOLN2/NOD2/PDE4B/PF4/PF4V1/PIK3CD/SAA1/TGFB2/THBS4/TNFAIP6/TREM1
## GO:0048872                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ABL1/ARMCX1/ATP5IF1/B2M/BAK1/CCN3/CCR7/CDH2/CDIN1/CDK5RAP3/CDK6/CEBPG/CITED2/CSF1/CXCL6/EPAS1/ERCC2/F2R/FADD/FAS/FSTL1/GATA3/GLIS2/GPI/HIF1A/IL6/IL7/IL7R/INHA/INHBA/ISG15/KITLG/KLF13/KLF2/LGALS9/LGR4/LPCAT3/MEF2C/MIF/MPIG6B/NCSTN/P2RX7/PDE4B/PIK3CB/PIK3CD/PRDX1/PRDX2/PRMT1/PTPN11/SFXN1/SLC11A2/SLC15A4/SLC25A5/SOS2/SOX4/SOX9/STAT1/STAT5B/TCIRG1/TNFAIP3/TNFSF14/TRAF3IP2/TSC22D3/ZFP36/ZFP36L1
## GO:0051403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ADORA2B/AGT/ARHGEF6/BMP2/CCR7/CRYAB/CYLD/DIXDC1/DNAJA1/DUSP1/DUSP15/DUSP16/DUSP3/EPHB1/FAS/FKTN/FOXO1/GADD45B/GSTP1/IGBP1/IGFBP6/IL26/IRAK4/LGALS9/MAP2K1/MAP2K3/MAP2K6/MAP3K13/MAP3K3/MAP3K5/MAPK11/MAPKAPK2/MINK1/NFKB1/NOD2/PDCD4/PHLPP1/PRDX1/PRMT1/PTGER4/RASGRP1/RELL1/RIPK2/SEMA3A/SFRP1/SFRP2/SH3RF2/SIRPA/STK39/TGFB2/TPD52L1/TRAF2/TRAF3/UNC5CL/WNT5A/ZC3H12A/ZFP36/ZFP36L1
## GO:1902600                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ATP1A1/ATP1A2/ATP1A3/ATP5F1B/ATP5MF/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1F/ATP6V1G1/ATP6V1G2/ATP6V1H/ATPSCKMT/CHP1/COX17/COX4I1/COX5A/COX5B/COX6B1/COX7B/CYB5A/MFSD3/NDUFA4/PARK7/PPIF/RNASEK/SLC11A2/SLC15A3/SLC15A4/SLC25A3/SLC25A5/SLC9A3/SLC9A9/TCIRG1/UQCRC1/UQCRFS1
## GO:0018126                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ASPH/EGLN1/EGLN3/ERO1A/FKBP10/OGFOD1/P3H4/P4HA1/P4HA3/P4HB/PLOD1/PLOD2
## GO:2001014                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               AKIRIN1/DDX17/DDX5/EPHB1/MEF2C/MSTN/RBFOX1/SIX1/SIX4/UQCC2
## GO:0062012                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ADCYAP1R1/ADIPOR1/ADM/ADORA2B/AK4/AKR1C3/APPL2/ARL2/ATP2B4/ATPSCKMT/BHMT/BMP2/BMP6/C1QTNF1/C1QTNF3/CLYBL/DDIT4/DHCR7/DKK3/DYRK2/EGR1/ENO1/FABP3/FMO5/FOXO1/GPER1/HDAC4/HIF1A/HRH1/IGFBP4/INSIG2/IRS1/KHK/LACC1/LPCAT3/MBTPS2/MFSD2A/MST1/NFKB1/NNMT/NOS2/NR1D1/NR1H2/NR1H3/NR4A3/OGT/P2RX7/P2RY6/PARK7/PDK1/PDK4/PGAM1/PHKG2/PID1/PPP1R3B/PPP1R3C/PPTC7/PRKAA2/PRKAG2/PSEN1/PTGS2/PTH1R/RORA/RUBCNL/SCAP/SEC14L2/SELENOS/SESN2/SIK1/SLC2A6/SLC7A7/SOX9/TFF3/TIGAR/TRIB3/VCP
## GO:0060326                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    AKIRIN1/C1QBP/C5/CAMK1D/CCL11/CCL2/CCL20/CCL28/CCL3/CCL5/CCL7/CCL8/CCN3/CCR7/CH25H/CMKLR1/CSF1/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/CYP7B1/DAPK2/DDT/DOCK4/DUSP1/EDN1/EDNRB/EPHB1/FGF18/GAB1/GAS6/HRH1/HSD3B7/HSPB1/IL16/IL23A/IL6/ITGA1/KDR/LBP/LGALS9/LOX/MIF/MSMP/MSTN/NINJ1/NOD2/PDE4B/PF4/PF4V1/PIK3CD/PLEC/PRKCD/PRKD1/RAB13/SAA1/SCG2/SLC12A2/SMOC2/STK39/SWAP70/TGFB2/THBS4/TNFAIP6/TNFSF14/TREM1/WNT5A
## GO:0046939                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ADPGK/AK4/ALDOA/ARL2/DDIT4/ENO1/ENO2/ENO4/GAPDH/GPI/HDAC4/HIF1A/HK2/LDHA/NME1/OGT/P2RX7/PFKL/PFKP/PGAM1/PGAM2/PGK1/PKM/PRKAA2/PRKAG2/PSEN1/SLC2A6/TIGAR/TPI1
## GO:0031032                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ABL1/ACTC1/ARHGEF10/BAG4/CAPN3/CFL2/CFLAR/CGNL1/CLASP2/CORO2B/CSRP1/DLC1/EDN1/EPB41/EPB41L3/EPB41L4B/EPB41L5/FHOD3/FRMD7/ITGB1/MEF2A/MKKS/MTOR/MYO18A/MYOC/MYPN/PGM5/PLEC/PPFIA1/PPM1E/PTGER4/RAPGEF3/RHOA/RHPN1/ROCK1/ROCK2/SFRP1/SIX4/TGFB3/TGFBR1/TJP1/TMOD4/TNNT2/TNNT3/TPM1/TRPM7/TTC8/WAS/WASF2
## GO:0050920                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                AKIRIN1/C1QBP/C5/CAMK1D/CCL2/CCL3/CCL5/CCL7/CCN3/CCR7/CMKLR1/CSF1/CXCL10/CXCL8/DAPK2/DDT/DUSP1/DUSP3/EDN1/ELANE/F3/FGF10/FGF18/GAS6/HSPB1/IL16/IL23A/IL6/KDR/LBP/LGALS9/MEGF8/MIF/MSTN/NOD2/PLXNA3/PLXNA4/PRKD1/ROBO2/SCG2/SEMA3A/SEMA3B/SEMA3D/SEMA4A/SEMA5B/SMOC2/STK39/SWAP70/THBS4/TNFAIP6/TNFSF14/TUBB2B/USP14/WNT5A
## GO:0006099                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ACO1/ACO2/DLAT/IDH3A/MDH1/MDH1B/MDH2/PDHB/SDHA/SDHAF2/SDHC/SUCLA2/SUCLG2
## GO:0034311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ABCA2/ACER3/ASAH1/ASAH2/ASAH2B/DEGS2/GCH1/NAAA/PTS/QDPR/SPTLC2/SPTSSA/SPTSSB
## GO:0006576                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ALDH2/AMD1/AOC2/AZIN1/DBH/DMGDH/EDNRA/EPAS1/GATA3/GCH1/GDE1/HDAC10/HNMT/IL4I1/KYNU/MAOA/MAOB/NAAA/NNMT/NPR1/NR4A2/OAZ1/OAZ2/PARK7/RNF180/SAT1/SLC44A1/SMOX/SRM/TGFB2
## GO:0006672                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ABCA2/ACER3/ALOXE3/ASAH1/ASAH2/ASAH2B/B3GALT1/B3GALT2/B4GALNT1/B4GALT4/B4GALT5/CERS6/CERT1/DEGS2/GLA/HEXB/NEU1/ORMDL2/P2RX7/PLA2G6/PRKCD/SGMS2/SIRT3/SMPD2/SPTLC2/SPTSSA/SPTSSB/ST3GAL1/ST3GAL5/ST6GALNAC4
## GO:1902903                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ABL1/ADD1/ADD3/AEBP1/ARF1/ARHGEF10/ARHGEF2/ARL2/AVIL/BAG4/BRK1/CAPG/CAPZA2/CAPZB/CCL11/CCR7/CFL2/CGNL1/CHADL/CHRNA7/CLASP2/CORO2B/COTL1/CRACD/CRYAB/CSF3/DLC1/DSTN/EDN1/EML2/FCHSD1/FCHSD2/FES/FHOD3/FKBP4/FRMD7/GSN/HCK/KIRREL1/MAP1B/MAP6D1/MKKS/MTOR/MTSS1/MYADM/MYOC/NUMA1/PARK7/PDXP/PFDN2/PFDN6/PPFIA1/PPM1E/PRKCD/PSEN1/PTGER4/RANGRF/RAPGEF3/RASA1/RHOA/RHPN1/ROCK1/ROCK2/SCIN/SFRP1/SNX9/SPTB/SPTBN5/SSH2/SSH3/SWAP70/SYNPO/TGFB3/TGFBR1/TJP1/TMOD4/TNXB/TOGARAM1/TPM1/TTC8/WAS/WASF2
## GO:0043270                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ABL1/ADCYAP1R1/ADORA2A/AGT/AHCYL1/AKAP6/ANK3/ATP1B1/ATP1B3/ATPSCKMT/BAK1/BDKRB1/CACNG4/CAMK2A/CAPN3/CCL2/CCL3/CCL5/CDK5/CEBPB/CHP1/COX17/CTSS/CXCL10/EDN1/EDNRA/EPHB2/F2R/FHL1/FXYD1/GJC2/GLRX/GPD1L/GPER1/GSTM2/GSTO1/IFNGR2/ITGB1/KCNA1/KCNJ2/KCNN4/LRRC55/MAP2K6/MIF/NDUFA4/NLGN3/ORAI1/P2RX7/P2RY6/PDZK1/PLA2G4A/PLA2G6/PLA2R1/PSEN1/PTGES/RAB3B/RAB3GAP1/SCN4B/SLC12A2/STC1/STIMATE/STK39/VMP1
## GO:0048771                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ACVR2B/AGT/BAK1/CCDC154/CD38/CSPG4/CTSK/DBH/EDNRA/ELF3/EPAS1/F2R/FGF10/FOXC2/GJA1/GPNMB/GPR137/HIF1A/HOXA3/IL15/IL23A/IL6/IL7/LGR4/LIF/MEF2C/NOL3/P2RX7/P3H4/PDK4/PTH1R/ROCK1/ROCK2/RSPO3/SFRP1/SPP1/TCIRG1/TFRC/TGFB3/THBS4/TMEM119/TMEM64/TNFAIP3/TNFRSF11B
## GO:0120163                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ABHD6/ACOT11/ACVR2B/ARRDC3/DDIT3/FOXC2/IL15/IP6K1/LAMA4/LGR4/MAP2K6/NPR3/NR1D1/NR1H2/NR1H3/PLCL1/ZNF423
## GO:1990845                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ABHD6/ACOT11/ACVR2B/ADIPOR1/APPL2/ARRDC3/CEBPB/CMKLR1/DBH/DDIT3/DECR1/ELOVL3/EPAS1/FOXC2/G0S2/GJA1/GRB10/IL15/IP6K1/KSR2/LAMA4/LCN2/LGR4/LPIN1/MAP2K6/MFN2/NPR3/NR1D1/NR1H2/NR1H3/OGT/OXTR/PER2/PLAC8/PLCL1/PRDM16/SCD/SLC25A5/THADA/TSHR/ZNF423
## GO:0031098                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ADORA2B/AGT/ARHGEF6/BMP2/CCR7/CRYAB/CYLD/DIXDC1/DNAJA1/DUSP1/DUSP15/DUSP16/DUSP3/EPHB1/FAS/FKTN/FOXO1/GADD45B/GSTP1/IGBP1/IGFBP6/IL26/IRAK4/LGALS9/MAP2K1/MAP2K3/MAP2K6/MAP3K13/MAP3K3/MAP3K5/MAPK11/MAPKAPK2/MINK1/NFKB1/NOD2/PDCD4/PHLPP1/PRDX1/PRMT1/PTGER4/RASGRP1/RELL1/RHOA/RIPK2/SEMA3A/SFRP1/SFRP2/SH3RF2/SIRPA/STK39/TGFB2/TPD52L1/TRAF2/TRAF3/UNC5CL/WNT5A/ZC3H12A/ZFP36/ZFP36L1
## GO:0051770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      AKAP12/CCL2/IL33/KDR/MAP2K3/MAP2K6/NAMPT/NOD2/STAT1
## GO:0090075                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ADORA2B/ATP1A1/ATP1A2/ATP1B1/CAMK2D/GSN/GSTM2/GUCY1A1/KCNJ2/KCNMA1/PDE4B/PDE4D/PDE5A/RGS2
## GO:0051346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ABL1/ADORA2A/AGT/ANGPTL4/AQP1/ARL2/ATP5IF1/BAG4/BIRC3/BST2/C3/C5/CAMK2A/CD109/CHP1/COL4A3/COL7A1/CPAMD8/CRYAB/CST6/DHCR24/EGLN1/FICD/FKBP1A/FURIN/GAPDH/GAS6/GCHFR/GPI/GPSM1/IFI16/IFI6/IGBP1/ITIH3/ITIH5/LAMP3/LAMTOR5/LPIN1/MGAT5/MICAL1/MKKS/NEIL1/NOL3/PARK7/PI3/PIH1D1/PLA2R1/PPP1R15A/PPP1R26/PPP4R4/PRDX3/PRKCZ/PROS1/PTGS2/PTX3/RASA4/RGS2/ROCK1/ROCK2/SERPINB7/SERPINE2/SERPINF1/SERPINI1/SFRP2/SIAH2/SLC39A14/SLPI/SPINK13/SPINK6/SPINT1/STYXL1/TFPI/TFPI2/TGFB2/TIMP2/TIMP3/TIMP4/TNFSF14/TTC8/USP14/WFDC1
## GO:0016266                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           B3GNT2/B3GNT7/B4GALT5/C1GALT1/C1GALT1C1/C1GALT1C1L/GALNT2/GALNT5/GALNT8/GCNT3/POFUT1/POMGNT1/ST3GAL1/ST3GAL4/ST6GALNAC4/XXYLT1
## GO:0042401                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ALDH2/AMD1/AZIN1/DBH/GATA3/GCH1/NNMT/NR4A2/OAZ1/OAZ2/PARK7/SAT1/SMOX/SRM/TGFB2
## GO:0031331                                                                                                                                                                                                                                                                                                                                                                                                                                                                ABCA2/ABHD5/ATM/ATP5IF1/ATXN3/BAG2/BECN1/BNIP3/CNOT2/CNOT8/CSNK1D/CSNK1E/DDA1/DDRGK1/DHRSX/ENDOG/EXOSC2/EXOSC9/FBXO22/FOXO1/FURIN/GPSM1/HIF1A/IKBKG/IL6/IRS1/KDR/LAPTM5/LRSAM1/MAGEF1/MOV10/NANOS1/NOD2/OPTN/OSBPL7/P2RX7/PAFAH1B2/PAIP1/PAN2/PARK7/PCSK9/PHKG2/PIAS1/PIK3CB/PIM2/PLEKHF1/PLK3/PRKAA2/PRKCD/PRKD1/PRR5L/PSEN1/PSMC4/PSMC5/PSMD10/PTPN1/RAB3GAP1/RAD23A/RGMA/RIPK2/RNF128/RNF152/RNF180/RNF19A/ROCK1/ROCK2/SCOC/SESN2/SESN3/SH3RF2/SIRT2/SLC25A5/SMURF1/SNX30/SNX9/SPTLC2/STING1/TFEB/TMEM259/TMTC3/TNFAIP3/TNFRSF1B/TP53INP2/TPCN1/TRIB3/TRIM5/TRIM8/UBQLN2/VCP/VDAC1/WIPI1/ZC3H12A/ZC3H12D/ZFP36/ZFP36L1
## GO:0044089                                                                                                                                                                                                                                                                                                                                                                                                                                                         ABCA1/ABCA3/ABL1/AGRN/AGT/AJUBA/AKIRIN1/ARHGEF10/ARL2/ASAP1/ATM/ATR/AVIL/BAG4/BAK1/BDNF/BECN1/BID/BMF/BRK1/CCL11/CCR7/CLASP2/CLDN1/CLSTN1/CLSTN2/CNOT2/CRACD/CSF2/CSF3/EEF2K/EPB41L5/EPHB1/EPHB2/FCHSD1/FCHSD2/FERMT1/FES/FLOT1/FRMD7/G3BP1/HAS3/HCK/ICE1/ISG15/KDR/KIRREL1/LRRN3/LRSAM1/MAP1B/MAPK15/MIEN1/MMP1/MMP3/MPHOSPH8/MSTN/MTOR/MTSS1/MYOC/NEK7/NLGN2/NLGN3/NR1H2/NUMA1/OXTR/P2RX7/PAN2/PARK7/PIH1D1/PPM1E/PPP2R5B/PSMC5/PTPRJ/RAB3GAP1/RALA/RAPGEF3/RHOA/ROCK1/ROCK2/SEMA4A/SEPTIN7/SFRP1/SLF2/SNF8/SNX30/SNX9/SOX9/SRPX2/STMP1/SWAP70/SYNPO/TASOR/TFRC/TGFB3/TGFBR1/THBS2/TOGARAM1/TPM1/TRABD2B/VCP/WARS1/WASF2/WIPI1
## GO:0070203                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/TCP1
## GO:1904869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/TCP1
## GO:1904871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/TCP1
## GO:0006596                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  AMD1/AZIN1/NNMT/OAZ1/OAZ2/SAT1/SMOX/SRM
## GO:0030007                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP1B3/KCNJ2/KCNMA1/SLC12A2
## GO:0098760                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ATIC/ATP5F1B/HDGF/IL7R/LSP1/P4HB/PDIA3/STIP1
## GO:0098761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ATIC/ATP5F1B/HDGF/IL7R/LSP1/P4HB/PDIA3/STIP1
## GO:0045017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ABHD4/ABHD5/ACSL3/AGPAT3/AGPAT4/AJUBA/ANG/ATG14/ATM/AVIL/BECN1/BPNT2/C3/CHPT1/DGKA/DGKD/DGKH/ETNK2/FABP3/FAR1/FITM2/GK/HDHD5/FAM126A/IP6K1/IPMK/LPCAT1/LPCAT3/LPCAT4/LPIN1/MBOAT7/MFSD2A/NR1H2/NR1H3/OCRL/PCK1/PCK2/PGAP2/PI4K2A/PI4KA/PIGL/PIGO/PIGS/PIGU/PIGV/PIK3CB/PIK3CD/PIK3R3/PITPNM1/PLA2G4A/PLA2G6/PLD1/PLD2/PTPMT1/SELENOI/SIK1/SLC44A1/SLC44A3/SMG1
## GO:0046890                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ABCA2/ABCA3/ABHD6/ACSL3/ADM/AKR1C3/ASAH1/ATP1A1/AVIL/BMP2/BMP6/C3/CHP1/CREB1/CREBL2/DHCR7/DKK3/EGR1/FABP3/FITM2/GPER1/IGFBP7/INSIG2/LPCAT1/LPCAT3/LPIN1/MBTPS2/MFSD2A/MTOR/NFKB1/NR1D1/NR1H2/NR1H3/ORMDL2/PCK1/PDK4/PLA2G6/PRKCD/PTGS2/SCAP/SEC14L2/SIK1/SIRT3/TRIB3
## GO:0016311                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ACP2/ANKLE2/ATP1A1/ATP1A2/BAG4/BMP2/BPNT2/CA3/CDK5RAP3/CHP1/CTDSP2/CTDSPL/CTTNBP2NL/DLC1/DUSP1/DUSP15/DUSP16/DUSP18/DUSP3/DUSP4/DUSP5/EYA2/FKBP1A/G6PC3/HDHD2/IGBP1/IQGAP1/ITGA1/LPIN1/LRRC2/MEF2C/MGAT5/MINPP1/MTMR10/MTMR11/MTOR/NCEH1/NT5DC1/NT5DC3/OCRL/PALD1/PDP1/PDXP/PFKFB4/PHLPP1/PHPT1/PLPPR2/PPA2/PPM1E/PPM1K/PPM1M/PPP1R15A/PPP1R26/PPP1R3B/PPP1R3C/PPP2CB/PPP2R1B/PPP2R5A/PPP2R5B/PPP4R2/PPP4R4/PPP6R1/PPTC7/PRKCD/PTBP1/PTP4A1/PTP4A2/PTPMT1/PTPN1/PTPN11/PTPN13/PTPN18/PTPN21/PTPRE/PTPRJ/PTPRK/PTPRU/RCAN1/ROCK1/ROCK2/SDHAF2/SLC39A10/SMG7/SSH2/SSH3/STYXL1/SWAP70/TGFB2/TIGAR/TNS2
## GO:0032370                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ABCA3/ATP8A1/BMP6/C1QTNF1/DENND5B/EDN1/FABP3/LIPG/LPCAT3/MAP2K6/MIF/NKX3-1/NR1H2/NR1H3/P2RX7/PLA2G4A/PLA2G6/PLA2R1/PRKCD/PTGES/SPP1/TMEM30A
## GO:0032231                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ABL1/ARHGEF10/BAG4/CGNL1/CLASP2/CORO2B/DLC1/FRMD7/MKKS/MTOR/MTSS1/MYOC/PPFIA1/PPM1E/PTGER4/RAPGEF3/RHOA/RHPN1/ROCK1/ROCK2/SFRP1/SWAP70/SYNPO/TGFB3/TGFBR1/TJP1/TPM1/TTC8/WAS/WASF2
## GO:0018208                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      EGLN1/EGLN3/ERO1A/FKBP10/FKBP11/FKBP14/FKBP1A/FKBP2/FKBP4/NKTR/OGFOD1/P4HA1/P4HA3/P4HB/PPIF/PPIL1/PPIL3/PPIL6/PPWD1
## GO:0051492                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ABL1/ARHGEF10/BAG4/CGNL1/CLASP2/CORO2B/DLC1/FRMD7/MKKS/MTOR/MYOC/PPFIA1/PPM1E/PTGER4/RAPGEF3/RHOA/RHPN1/ROCK1/ROCK2/SFRP1/TGFB3/TGFBR1/TJP1/TPM1/TTC8/WAS/WASF2
## GO:0110053                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ABL1/ADD1/ADD3/ARF1/ARHGEF10/AVIL/BAG4/BRK1/CAPG/CAPZA2/CAPZB/CCL11/CCR7/CFL2/CGNL1/CLASP2/CORO2B/COTL1/CRACD/CSF3/DLC1/DSTN/FCHSD1/FCHSD2/FHOD3/FRMD7/GSN/HCK/KIRREL1/MKKS/MTOR/MTSS1/MYADM/MYOC/PDXP/PPFIA1/PPM1E/PRKCD/PTGER4/RAPGEF3/RASA1/RHOA/RHPN1/ROCK1/ROCK2/SCIN/SFRP1/SNX9/SPTB/SPTBN5/SSH2/SSH3/SWAP70/SYNPO/TGFB3/TGFBR1/TJP1/TMOD4/TPM1/TTC8/WAS/WASF2
## GO:0042060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            ADORA2A/AJUBA/AK3/ARHGAP24/B4GALT1/C1GALT1C1/C1QTNF1/CCN4/CD109/CD9/CFLAR/CHMP1B/CHMP4B/CHMP5/CLASP2/CLDN1/COL3A1/CSRP1/DDR1/DGKA/DGKD/DGKH/DYSF/EDN1/EPB41L4B/EPHB2/EPPK1/ERBB2/F13A1/F2R/F3/F5/FERMT1/FGF10/FGFR2/FKBP10/FOXC2/FUNDC2/GAS6/GLI3/GP1BB/HIF1A/HPS4/HPS5/HSPB1/IL6/ITGB1/ITPK1/KDR/LOX/MAP3K5/MIA3/MMP12/MPIG6B/MRTFA/MTOR/PABPC4/PAPSS2/PF4/PF4V1/PIK3CB/PLA2G4A/PLAT/PLEC/PPL/PRDX2/PRKCD/PROS1/RAB27A/RAP2B/RHOA/SAA1/SERPINE2/SLC12A2/SMOC2/ST3GAL4/TBXA2R/TFPI/TFPI2/TGFB2/TGFB3/TGFBR1/THBD/TNFAIP3/TOR1A/TPM1/TSKU/WAS/WFDC1/WNT5A/YAP1
## GO:0045785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ABL1/ANGPT1/ANK3/ARL2/ATM/B2M/BAG4/BTN2A2/C1QBP/CCDC80/CCL2/CCL28/CCL5/CCR7/CD274/CD55/CD83/CDK6/CHRD/CHST2/CITED2/COL26A1/CSF1/CYTH3/DOCK5/ELANE/EMP2/EPB41L4B/EPB41L5/ERBB2/FADD/FERMT1/FLOT1/FOXC2/FOXF1/FSTL3/FYN/GATA3/GLI3/HLA-A/ICOSLG/IL15/IL23A/IL4I1/IL6/IL7/IL7R/ITGAV/JUP/KDR/LGALS9/LIF/MAP3K8/MEGF10/MYADM/MYO10/MYOC/NFKBIZ/NOD2/NR4A3/P4HB/PCK1/PDCD1LG2/PODXL/PRKCZ/PTPN11/PTPRJ/PTPRU/RARA/RASGRP1/RHOA/RIPK2/ROCK1/SAA1/SELE/SELENOK/SFRP1/SFRP2/SIRPA/SOX4/ST3GAL4/STAT5B/TFRC/TGFB2/TJP1/TNFSF14/TNFSF9/TPM1/UNC13D/UTRN/VNN1/VSIR/VWC2/WNT5A
## GO:0000422                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ATG14/ATG3/ATG7/ATP5IF1/BECN1/BNIP3/CISD2/CSNK2A2/CTSK/FUNDC2/GABARAPL1/GABARAPL2/HIF1A/HK2/MAP1LC3C/MFN2/MUL1/OPTN/PARK7/SLC25A5/TIGAR/TOMM7/VDAC1/VPS13C/WDR45B/WIPI1
## GO:0061726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ATG14/ATG3/ATG7/ATP5IF1/BECN1/BNIP3/CISD2/CSNK2A2/CTSK/FUNDC2/GABARAPL1/GABARAPL2/HIF1A/HK2/MAP1LC3C/MFN2/MUL1/OPTN/PARK7/SLC25A5/TIGAR/TOMM7/VDAC1/VPS13C/WDR45B/WIPI1
## GO:0070588                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ABL1/AHNAK/AKAP6/ATP1A2/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/BDKRB1/C4orf3/CACNA1C/CACNB1/CACNG4/CAMK2D/CAPN3/CATSPER1/CCL3/CCR7/CDK5/CHRNA7/CXCL10/DDIT3/EDN1/EDNRA/EDNRB/ERO1A/F2R/FKBP1A/FYN/GAS6/GJC2/GNB5/GP1BB/GPER1/GRIN3A/GSTM2/GSTO1/ITGAV/LETM1/LIME1/MCOLN1/MCOLN2/NOL3/OPRL1/ORAI1/P2RX7/P2RY6/PANX1/PDE4B/PDE4D/PKD1/PLA2G6/PRKD1/PSEN1/RASA3/SLC24A3/SLC25A23/SLC25A25/SLC35G1/SLC8A3/STIMATE/THADA/TMEM165/TMEM37/TPCN1/TRPM3/TRPM7/VDAC1/VMP1
## GO:0044262                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ADCYAP1R1/ADIPOR1/B3GNT2/B3GNT7/B4GALT1/B4GALT5/BPNT2/C1QTNF1/C1QTNF3/COQ2/CSGALNACT1/DDIT4/DYRK2/EXT2/FOXO1/GK/GNPTAB/GPD2/GPER1/GYS1/HAS3/HDAC4/HK2/HRH1/IGFBP4/IPPK/IRS1/ISYNA1/ITPK1/KHK/MST1/NNMT/NR1D1/OCRL/OGT/P2RY6/PCK1/PCK2/PDK1/PDK4/PER2/PFKFB4/PGAM1/PHKA1/PHKA2/PHKG1/PHKG2/PLA2G4A/PPIP5K2/PPP1R3B/PPP1R3C/PRKAG2/PTH1R/RORA/RUBCNL/SCARB2/SELENOS/SESN2/SIK1/SORD/TFF3/TIGAR/TKFC/TPI1/UGP2
## GO:0071731                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 AIFM1/AQP1/ATP5F1A/CCR7/CFLAR/EGLN1/FOXO1/MMP3/TRAF2/TXN
## GO:0009309                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ALDH2/AMD1/AZIN1/DBH/GATA3/GCH1/NNMT/NR4A2/OAZ1/OAZ2/PARK7/SAT1/SMOX/SRM/TGFB2
## GO:0061035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          BMP1/BMP2/BMP6/CCN4/CHADL/CTSK/EFEMP1/FGF18/FRZB/GLI3/MAF/PTPN11/RARA/RARB/RARG/RFLNA/ZNF664-RFLNA/SCIN/SOX9/TGFBR1/WNT5A/WNT9A
## GO:0006839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 AIFM1/ATP5IF1/BAG4/BAK1/BCL2L1/BCL2L2/BID/BNIP3/BOK/CAMK2A/CSNK2A2/DNAJC15/EYA2/GRPEL1/HK2/HPS4/HSPA4/LEPROT/MFF/MFN2/MTX2/MUL1/NDUFA13/NOL3/NPTX1/PDCD5/PPIF/PSEN1/ROMO1/RTL10/SAMM50/SLC25A30/SLC25A5/TIMM10B/TIMM13/TIMM17A/TIMM21/TIMM22/TIMM23/TIMM8B/TOMM40/TOMM5/TOMM7/UBL5/VDAC2
## GO:0010638                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ABL1/ANAPC4/ARHGEF10/ARL2/ASAP1/ATM/ATP5IF1/ATR/BAG4/BECN1/BID/BMF/BNIP3/BOK/BRK1/C2CD5/CCL11/CCR7/CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/CDK5/CFL2/CNOT2/CRACD/CSF2/CSF3/DOC2B/DSTN/EDN1/ENDOG/FAM162A/FCHSD1/FCHSD2/FES/G3BP1/GPER1/GSN/HCK/HIF1A/HOXA13/KDR/KIRREL1/LRSAM1/MAP1B/MAPK15/MFF/MLLT11/MPHOSPH8/MTOR/MTSS1/MUL1/MYOC/NEK7/NUMA1/P2RX7/PAN2/PARK7/PDCD5/PDXP/PFDN2/PLA2G6/PLXNA3/PPIF/PPM1E/PRRT2/RAB3GAP1/RALA/RAPGEF3/RHOA/ROCK2/SCIN/SEPTIN7/SFRP1/SIRT2/SLC25A5/SLF2/SNX30/SNX9/SPIRE1/SSBP1/SURF4/SWAP70/SYNPO/TASOR/TCP1/TGFB3/TGFBR1/TNFSF10/TNKS/TOGARAM1/TPM1/VDAC1/WAS/WASF2/WIPI1/WNT5A/XRCC5
## GO:0001659                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ABHD6/ACOT11/ACVR2B/ADIPOR1/APPL2/ARRDC3/CEBPB/CMKLR1/DBH/DDIT3/DECR1/EDNRB/EGR1/ELOVL3/EPAS1/FOXC2/FOXO1/G0S2/GJA1/GRB10/IL15/IP6K1/KSR2/LAMA4/LCN2/LGR4/LPIN1/MAP2K6/MFN2/NPR3/NR1D1/NR1H2/NR1H3/OGT/OXTR/PER2/PLAC8/PLCL1/PRDM16/PTGES/PTGS2/SCD/TSHR/ZNF423
## GO:0097529                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        AKIRIN1/C1QBP/C5/CAMK1D/CCL11/CCL2/CCL20/CCL3/CCL5/CCL7/CCL8/CCN3/CCR7/CD9/CMKLR1/CSF1/CXCL1/CXCL10/CXCL2/CXCL3/CXCL5/CXCL6/CXCL8/DAPK2/DDT/DUSP1/EDN1/EDNRB/HRH1/IL23A/IL6/IRAK4/ITGA1/JAGN1/LBP/MCOLN2/MIF/MSMP/MSTN/NOD2/PDE4B/PF4/PF4V1/PIK3CD/PTGER4/SAA1/SCG2/SIRPA/STAT5B/SWAP70/TGFB2/THBS4/TNFAIP6/TREM1
## GO:0045926                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ADIPOR1/AGT/BDKRB1/BST2/CAPRIN2/CCN3/CDK5/CITED2/CRYAB/DACT3/DIP2B/ENO1/FGFR3/FHL1/FRZB/GDF15/GJA1/HIF1A/HYAL2/INHBA/JADE1/MAPK11/MSTN/MT1E/MT1F/MT1G/MT1X/MT2A/MUL1/NDUFA13/NPR1/OSGIN2/PHB1/PLAC8/PLXNA3/PPT1/PTPRJ/RGS2/SEMA3A/SEMA3B/SEMA3D/SEMA4A/SEMA5B/SERPINE2/SERTAD2/SESN2/SFRP1/SFRP2/SMARCA2/SPAG9/SPP1/STC2/TGFB2/TMPRSS4/WFDC1/WNT5A/WWC1
## GO:0002064                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ADD1/AKR1B1/B4GALT1/BMP6/C1GALT1/CDH2/CDK6/CLDN1/CLIC4/COL15A1/COL18A1/COL22A1/E2F4/EDNRA/EDNRB/EPB41L5/EXPH5/FEM1B/FNDC3A/FOXC2/GJA1/HIF1A/HOXA13/ICAM1/IQGAP1/KLF5/MYADM/NKX6-1/PDE4D/PLEC/PODXL/RAB13/RAPGEF3/RARA/RARB/RARG/ROCK1/ROCK2/S1PR3/SHROOM3/SOX8/SOX9/STC1/TIGAR/TJP1/TJP2/VIM/WNT5A/YAP1
## GO:0006754                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       AK4/ALDOA/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/ENO1/PID1/PRKAG2/VCP
## GO:0038066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          BMP2/CYLD/DUSP1/GADD45B/LGALS9/MAP2K3/MAP2K6/MAP3K3/MAP3K5/MAPK11/MAPKAPK2/MINK1/PHLPP1/PRMT1/RELL1/STK39/ZC3H12A/ZFP36/ZFP36L1
## GO:0060350                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         BMP6/BPNT2/COL2A1/COL3A1/CSGALNACT1/EXT2/FGF18/FGFR3/MEF2C/NAB1/NAB2/RARA/RARB/RARG/SOX9/STC1/THBS3/TMEM119/TSKU
## GO:0035107                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   AFF3/ASPH/BAK1/BPNT2/CACNA1C/COL2A1/COL3A1/CRABP2/FBN2/FGF10/FGF9/FGFR2/FRAS1/GJA1/GLI3/HDAC1/HOXA13/INTU/MBNL1/MEGF8/MKS1/PCSK5/PLXNA2/PSEN1/RARB/RARG/RSPO2/SALL4/SFRP2/SKI/SOX4/SOX9/TBX4/TGFB2/TMEM231/TULP3/WNT5A
## GO:0035108                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   AFF3/ASPH/BAK1/BPNT2/CACNA1C/COL2A1/COL3A1/CRABP2/FBN2/FGF10/FGF9/FGFR2/FRAS1/GJA1/GLI3/HDAC1/HOXA13/INTU/MBNL1/MEGF8/MKS1/PCSK5/PLXNA2/PSEN1/RARB/RARG/RSPO2/SALL4/SFRP2/SKI/SOX4/SOX9/TBX4/TGFB2/TMEM231/TULP3/WNT5A
## GO:0010822                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ATP5IF1/BID/BMF/BNIP3/BOK/ENDOG/FAM162A/GPER1/HIF1A/KDR/MFF/MLLT11/MUL1/PARK7/PDCD5/PLA2G6/PPIF/RALA/SLC25A5/SPIRE1/SSBP1/TNFSF10/VDAC1
## GO:0022411                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ADAMTS15/ADD1/ADD3/AIFM1/ARHGEF2/ASPH/ATG14/ATG3/ATG7/ATP2A2/ATP5IF1/AVIL/BECN1/BNIP3/BOK/C3/CAPG/CAPZA2/CAPZB/CDK5/CDK5RAP3/CFL2/CHMP1B/CHMP4B/CHMP5/CISD2/CLASP2/CRACD/CSNK2A2/CTSK/CTSS/DDIT4/DDR1/DDRGK1/DSTN/DUSP3/EIF5A/ELANE/ENDOG/EPG5/ETF1/FLOT1/FUNDC2/FURIN/GABARAPL1/GABARAPL2/GFM2/GPER1/GRWD1/GSN/HIF1A/HK2/IL6/LAMC1/LPIN1/MAP1B/MAP1LC3C/MAP6D1/MAPRE2/MCOLN1/MCTS1/MFN2/MICAL1/MMP1/MMP10/MMP12/MMP3/MUL1/NSF/OGFOD1/OPTN/PARK7/PDXP/PEX14/PHF23/PLK3/RUBCNL/SCIN/SH3PXD2B/SLC25A5/SMARCD2/SPTB/SPTBN5/STING1/SWAP70/TGFB3/TGFBR1/TIGAR/TMOD4/TOMM7/VCP/VDAC1/VMP1/VPS13C/WDR45B/WIPI1
## GO:0032970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ABL1/ABL2/ADD1/ADD3/ARF1/ARHGEF10/ATP1A2/ATP2A2/AVIL/BAG4/BRK1/BST2/CACNA1C/CAMK2D/CAPG/CAPZA2/CAPZB/CCL11/CCR7/CDK5/CFL2/CGNL1/CLASP2/CORO2B/COTL1/CRACD/CSF3/DIXDC1/DLC1/DSTN/EDN1/FAM107A/FCHSD1/FCHSD2/FES/FHOD3/FRMD7/GSN/HCK/IQGAP1/JUP/KCNJ2/KIRREL1/MKKS/MTOR/MTSS1/MYADM/MYOC/PDE4B/PDE4D/PDXP/PHPT1/PPFIA1/PPM1E/PRKCD/PTGER4/RANGRF/RAPGEF3/RASA1/RHOA/RHPN1/RND3/ROCK1/ROCK2/SCIN/SFRP1/SNX9/SPTB/SPTBN5/SSH2/SSH3/STC1/SWAP70/SYNPO/TGFB3/TGFBR1/TJP1/TMOD4/TNNC1/TNNT2/TPM1/TTC8/WAS/WASF2
## GO:0006493                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              B3GNT2/B3GNT7/B4GALT5/B4GAT1/C1GALT1/C1GALT1C1/C1GALT1C1L/FKTN/GALNT16/GALNT2/GALNT5/GALNT8/GCNT3/IL15/OGA/OGT/POFUT1/POGLUT1/POGLUT2/POMGNT1/POMT2/ST3GAL1/ST3GAL4/ST6GALNAC4/TMTC3/XXYLT1
## GO:0009199                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 AK3/AK4/ALDOA/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/CTPS1/ENO1/ENTPD7/NME1/PID1/PRKAG2/RAB23/RHOA/UCK2/VCP
## GO:0043281                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ADORA2A/AIFM1/AQP1/ATP2A3/BAK1/BID/BIRC3/BOK/CFLAR/COL4A3/CRYAB/CYCS/DHCR24/DLC1/EGLN3/F2R/F3/FAM162A/FAS/GAS6/GPER1/GPI/GSN/HSPE1/IFI6/IGBP1/LAMP3/LAMTOR5/LAPTM5/LGALS9/MAP3K5/MICAL1/MTCH1/MUL1/NDUFA13/NKX3-1/NOL3/PARK7/PDCD5/PIH1D1/PRDX3/PTGS2/RHOA/SFRP2/SIAH2/TNFSF10/TNFSF14/UACA/VCP
## GO:0006595                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           AMD1/AZIN1/HDAC10/NNMT/OAZ1/OAZ2/SAT1/SMOX/SRM
## GO:0042339                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             B3GNT2/B3GNT7/B4GALT4/B4GAT1/CHST2/CHST5/GNS/ST3GAL1/ST3GAL4
## GO:0034767                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ABL1/AGT/AKAP6/ANK3/ATP1B1/ATP1B3/ATPSCKMT/BDKRB1/CACNG4/CAPN3/CCL2/CDK5/CHP1/COX17/CTSS/CXCL10/EDN1/EDNRA/EPHB2/F2R/FXYD1/GJC2/GLRX/GPER1/GSTM2/GSTO1/IFNGR2/ITGB1/KCNA1/KCNJ2/KCNN4/LRRC55/NDUFA4/NLGN3/P2RX7/P2RY6/PDZK1/PSEN1/STIMATE/STK39/VMP1
## GO:0046467                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         A4GALT/ABCA2/ACER3/ALOXE3/ASAH1/ASAH2/ASAH2B/B3GALT1/B3GALT2/B4GALNT1/B4GALT4/B4GALT5/CERS6/DEGS2/ELOVL2/ELOVL3/GAL3ST2/ORMDL2/P2RX7/PGAP2/PIGL/PIGO/PIGS/PIGU/PIGV/PLA2G6/PRKCD/PRKD1/SGMS2/SIRT3/SMPD2/SPTLC2/SPTSSA/SPTSSB/ST3GAL1/ST3GAL4/ST3GAL5/ST6GALNAC4
## GO:0006874                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ABL1/ABL2/ADCYAP1R1/ADM/AGT/AKAP6/ATP13A3/ATP1A2/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/ATP7B/BAK1/BDKRB1/BNIP3/BOK/C1QTNF1/CACNA1C/CAMK2D/CAPN3/CCL11/CCL28/CCL3/CCL5/CCL7/CCL8/CCR7/CD38/CD55/CDK5/CHRNA7/CIB2/CMKLR1/CXCL10/DDIT3/DMPK/EDN1/EDNRA/EDNRB/ELANE/ERO1A/F2R/FKBP1A/FYN/GP1BB/GPER1/GRINA/GSTM2/GSTO1/HEXB/ITGAV/LETM1/LIME1/MCOLN1/MCOLN2/MTNR1B/NOL3/OPRL1/OXTR/P2RX7/P2RY6/PDE4D/PDZD8/PIK3CB/PKD1/PLA2G6/PRKD1/PSEN1/PTGER4/PTGFR/PTH1R/RASA3/RMDN3/S1PR3/SAA1/SELENOK/SLC24A3/SLC25A23/SLC30A1/SLC35G1/SLC8A3/STC1/STC2/SWAP70/TBXA2R/TCIRG1/THADA/TMEM165/TMEM64/TPCN1/TSPOAP1/VAPB/WNT5A
## GO:0032412                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          AHCYL1/AHNAK/AKAP6/ANK3/ANO9/ATP1A2/ATP1B1/ATP1B3/ATPSCKMT/C4orf3/CACNB1/CACNG4/CAMK2D/CCL2/CDK5/CHP1/COX17/CTSS/EDN1/EDNRA/EPHB2/FGF11/FHL1/FKBP1A/FXYD1/FXYD5/GLRX/GNB5/GPD1L/GSTM2/GSTO1/HECW1/IFNGR2/ITGB1/KCNA1/KCNE4/LRRC55/MEF2C/MINK1/MTNR1B/NDUFA4/NLGN2/NLGN3/OPRL1/P2RY6/PCSK9/PDE4B/PDE4D/PDZK1/PLA2G6/PPIF/RANGRF/SCN2B/SCN4B/SHISA6/STIMATE/STK39/THADA/UTRN/VMP1
## GO:0055072                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ACO1/ATP6AP1/ATP6V0D1/ATP6V1G1/B2M/BMP6/BOLA2/CCDC115/CYB561A3/CYBRD1/EPAS1/FTH1/GLRX3/HIF1A/HYAL2/LCN2/NCOA4/SLC11A2/SLC25A28/SLC39A14/SLC39A8/SOD2/STEAP1/STEAP4/TFRC
## GO:0048538                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ABL1/ATM/CITED2/CTC1/FADD/FGF10/GATA3/HOXA3/LMO4/MAD1L1/MAP2K1/PRDX2/PSEN1/SIX1/SIX4/TGFBR1
## GO:0021602                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ADARB1/ATP8B1/CITED2/EPHB1/EPHB2/GLI3/HOXA3/NRP2/PLXNA3/PLXNA4/SEMA3A/SIX1
## GO:0032869                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ADIPOR1/AGT/AP3S1/APPL1/APPL2/C2CD5/CCND3/CFLAR/EEF2K/EPRS1/FOXC2/FOXO1/GAB1/GRB10/HDAC5/INSIG2/IRS1/LPIN1/MSTN/MYO1C/OGT/OSBPL8/PCK1/PCK2/PCSK9/PDE3B/PDK4/PID1/PIK3R3/PKM/PRKCD/PRKCI/PRKCZ/PTPN1/PTPN11/PTPRE/RAB13/SELENOS/SESN3/SIK2/SLC29A2/SLC39A14/SRD5A1/STAT1/TNS2/TRIB3/YWHAG/ZFP36L1/ZNF106
## GO:0071559                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ABL1/ADAMTSL2/APPL1/APPL2/BAMBI/BCL9L/BMP2/CD109/CDKN2B/CFLAR/CILP/CITED2/CLDN1/CLEC3B/COL3A1/COL4A2/DKK3/DUSP15/EDN1/EPB41L5/FBN1/FBN2/FERMT1/FGFR2/FKBP1A/FOS/FURIN/FYN/GDF15/HYAL2/IL17RD/LDLRAD4/LOX/LRRC32/LTBP1/MEF2C/MSTN/NR3C1/PDCD5/PMEPA1/PRDM16/PTPRK/ROCK1/ROCK2/SFRP1/SKI/SMAD9/SMURF1/SNW1/SNX25/SOX9/STRAP/TGFB2/TGFB3/TGFBR1/WNT5A/ZEB1/ZFP36L1/ZNF703
## GO:0055074                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ABL1/ABL2/ADCYAP1R1/ADM/AGT/AKAP6/ATP13A3/ATP1A2/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/ATP7B/BAK1/BDKRB1/BNIP3/BOK/C1QTNF1/CACNA1C/CAMK2D/CAPN3/CCL11/CCL28/CCL3/CCL5/CCL7/CCL8/CCR7/CD38/CD55/CDK5/CHRNA7/CIB2/CMKLR1/CXCL10/DDIT3/DMPK/EDN1/EDNRA/EDNRB/ELANE/ERO1A/F2R/FAM20A/FKBP1A/FYN/GP1BB/GPER1/GRINA/GSTM2/GSTO1/HEXB/ITGAV/KDR/LETM1/LIME1/MCOLN1/MCOLN2/MTNR1B/NOL3/OPRL1/OXTR/P2RX7/P2RY6/PDE4D/PDZD8/PIK3CB/PKD1/PLA2G6/PRKD1/PSEN1/PTGER4/PTGFR/PTH1R/RASA3/RMDN3/S1PR3/SAA1/SELENOK/SLC24A3/SLC25A23/SLC30A1/SLC35G1/SLC8A3/STC1/STC2/SWAP70/TBXA2R/TCIRG1/THADA/TMEM165/TMEM64/TPCN1/TSPOAP1/VAPB/WNT5A
## GO:0042176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          ABCA2/ARAF/AREL1/ATG7/ATP5IF1/ATXN3/AZIN1/BAG2/CDK5RAP3/CHEK2/CSNK1D/CSNK1E/CSNK2A2/DDA1/DDRGK1/DNAAF4/FBXO22/FOXO1/FURIN/FYN/GABARAPL2/HECW1/LAMP3/LAPTM5/LPCAT1/MAGEF1/NDUFA13/NOS2/NSF/OAZ1/OAZ2/OGT/OPHN1/OSBPL7/PARK7/PCSK9/PHB1/PIAS1/PKD1/PLK3/PSEN1/PSMC4/PSMC5/PSMD1/PSMD10/PSMD14/PSMD2/PSMD3/PSME1/PSME2/PSME3/QRICH2/RAD23A/RGMA/RHBDD3/RHBDF1/RNF128/RNF180/RNF19A/ROCK1/SEC22B/SERPINE2/SH3RF2/SIRT2/SMURF1/SNF8/SNX9/SOX9/SUFU/TIMP2/TIMP3/TIMP4/TMEM259/TMTC3/TNFAIP3/TNFRSF1B/TNFSF12/TRIB3/UBQLN2/USP14/USP25/VCP/WDR91/WNT5A
## GO:0030178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              APCDD1/BMP2/CDH2/CXXC4/CYLD/DACT3/DDIT3/DKK3/EGR1/FERMT1/FGF9/FOXO1/FRZB/G3BP1/GLI3/GRB10/HDAC1/HECW1/IGFBP4/IGFBP6/JADE1/LZTS2/MCC/NFATC1/NXN/PTPRU/SDHAF2/SFRP1/SFRP2/SHISA2/SHISA6/SIAH2/SOX9/TBX18/TCF7L2/TLE1/TLE2/TLE5/TMEM64/TRABD2B/TSKU/WIF1/WNT5A
## GO:0043254                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ABCA1/ABCA3/ABL1/ADD1/ADD3/AJUBA/ARL2/ASAP1/ATM/ATR/AVIL/BAG4/BAK1/BID/BMF/BRK1/CAPG/CAPZA2/CAPZB/CCL11/CCR7/COTL1/CRACD/CRYAB/CSF2/CSF3/DNAJC15/EML2/FCHSD1/FCHSD2/FERMT1/FES/FHOD3/FKBP4/GSN/HCK/ICE1/ISG15/KIRREL1/LDLRAD4/LMO4/MAP1B/MAPK15/MKKS/MMP1/MMP3/MTOR/MYADM/NCLN/NEK7/NR1H2/NUMA1/PARK7/PIH1D1/PMEPA1/PPP2R5B/PRKCD/PRKCZ/PRRT2/PTGER4/PTPN11/RANGRF/RASA1/RHOA/SAR1B/SCIN/SEPTIN8/SIRT2/SLF2/SNX9/SOX9/SPTB/SPTBN5/SSH2/SSH3/STMP1/STXBP5/TFRC/TMOD4/TOGARAM1/TRABD2B/TRAF2/VCP/VDAC2/WARS1
## GO:0008207                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ADM/AFP/AKR1B1/AKR1C1/AKR1C2/AKR1C3/BMP2/BMP6/DKK3/EDNRB/EGR1/HSD17B10/SRD5A1/STAT5B
## GO:0045454                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          BOLA2/DDIT3/ERO1A/ERP44/GLRX2/GLRX3/GSR/NOS2/PRDX1/PRDX2/PRDX3/SELENOS/TXN/TXN2
## GO:0098798                                                                                                                                                                                                                                                                                                                       APOO/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5MJ/ATP5MK/ATP5PD/ATP5PF/BCKDHA/C15orf48/CHCHD3/COX4I1/COX5A/COX5B/COX6B1/COX6C/COX7A2/COX7B/COX7C/DAP3/DLAT/DNAJC15/GRPEL1/HSD17B10/IDH3A/MCCC2/MICOS10/MRPL12/MRPL14/MRPL16/MRPL17/MRPL18/MRPL27/MRPL32/MRPL33/MRPL34/MRPL42/MRPL44/MRPL47/MRPS10/MRPS11/MRPS12/MRPS15/MRPS16/MRPS24/MRPS33/MRPS5/MRPS7/MTX2/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PDHB/PDHX/PDK1/PHB1/POLG2/PPIF/ROMO1/SAMM50/SDHA/SDHC/SLC25A5/SUCLG2/TIMM10B/TIMM13/TIMM17A/TIMM21/TIMM22/TIMM23/TIMM8B/TOMM40/TOMM5/TOMM7/UQCR11/UQCRC1/UQCRFS1/UQCRQ/VDAC1
## GO:0005743 AIFM1/AIFM3/APOO/ATAD3A/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5MJ/ATP5MK/ATP5PD/ATP5PF/ATPSCKMT/AURKAIP1/BCL2L1/BOK/C15orf48/CHCHD1/CHCHD3/COA3/COQ10B/COQ2/COQ8B/COX16/COX4I1/COX5A/COX5B/COX6B1/COX6C/COX7A2/COX7B/COX7C/CPOX/CYCS/CYP24A1/CYP2E1/DAP3/DHRS13/DNAJC15/DUSP18/EFHD1/ENDOG/FPGS/GCAT/GPD2/GRPEL1/HCCS/HIGD1A/IFI6/LDHB/LDHD/LETM1/LETM2/MICOS10/MPV17/MRPL12/MRPL14/MRPL16/MRPL17/MRPL18/MRPL27/MRPL32/MRPL33/MRPL34/MRPL42/MRPL44/MRPL47/MRPS10/MRPS11/MRPS12/MRPS15/MRPS16/MRPS24/MRPS25/MRPS33/MRPS5/MRPS7/MTFP1/MTHFD2L/MTX2/MYOC/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFAF2/NDUFAF4/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PET100/PHB1/PLA2G4A/PPOX/PRODH/PSEN1/PTPMT1/PTPN1/RAB5IF/ROMO1/SAMM50/SCO2/SDHA/SDHC/SFXN1/SFXN3/SLC22A14/SLC25A11/SLC25A23/SLC25A25/SLC25A28/SLC25A3/SLC25A30/SLC25A32/SLC25A5/SQOR/STMP1/TIMM10B/TIMM13/TIMM17A/TIMM21/TIMM22/TIMM23/TIMM8B/TOMM40/UQCC2/UQCR11/UQCRC1/UQCRFS1/UQCRQ
## GO:0098800                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              APOO/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5MJ/ATP5MK/ATP5PD/ATP5PF/C15orf48/CHCHD3/COX4I1/COX5A/COX5B/COX6B1/COX6C/COX7A2/COX7B/COX7C/DNAJC15/GRPEL1/MICOS10/MTX2/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PHB1/ROMO1/SAMM50/SDHA/SDHC/TIMM10B/TIMM17A/TIMM21/TIMM22/TIMM23/UQCR11/UQCRC1/UQCRFS1/UQCRQ
## GO:0000502                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ADRM1/HSPB1/PSMA1/PSMA2/PSMA3/PSMA4/PSMA5/PSMA6/PSMA7/PSMB1/PSMB10/PSMB2/PSMB3/PSMB4/PSMB5/PSMB6/PSMB7/PSMB8/PSMB9/PSMC4/PSMC5/PSMD1/PSMD10/PSMD11/PSMD14/PSMD2/PSMD3/PSMD4/PSMD7/PSMD9/PSME1/PSME2/PSME3/RAD23A/TXNL1/USP14/VCP
## GO:1905369                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ADRM1/CFH/HSPB1/PIGS/PIGU/PSMA1/PSMA2/PSMA3/PSMA4/PSMA5/PSMA6/PSMA7/PSMB1/PSMB10/PSMB2/PSMB3/PSMB4/PSMB5/PSMB6/PSMB7/PSMB8/PSMB9/PSMC4/PSMC5/PSMD1/PSMD10/PSMD11/PSMD14/PSMD2/PSMD3/PSMD4/PSMD7/PSMD9/PSME1/PSME2/PSME3/RAD23A/THBD/TXNL1/USP14/VCP
## GO:0070469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                C15orf48/COA6/COX4I1/COX5A/COX5B/COX6B1/COX6C/COX7A2/COX7B/COX7C/CYCS/HIGD1A/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/RAB5IF/SDHA/SDHC/STMP1/UQCR11/UQCRC1/UQCRFS1/UQCRQ
## GO:0005746                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 C15orf48/COX4I1/COX5A/COX5B/COX6B1/COX6C/COX7A2/COX7B/COX7C/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/RAB5IF/SDHA/SDHC/STMP1/UQCR11/UQCRC1/UQCRFS1/UQCRQ
## GO:0098803                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         C15orf48/COA6/COX4I1/COX5A/COX5B/COX6B1/COX6C/COX7A2/COX7B/COX7C/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/SDHA/SDHC/UQCR11/UQCRC1/UQCRFS1/UQCRQ
## GO:1905368                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ADRM1/ATXN7L3/CFH/F3/HSPB1/PIGS/PIGU/PSMA1/PSMA2/PSMA3/PSMA4/PSMA5/PSMA6/PSMA7/PSMB1/PSMB10/PSMB2/PSMB3/PSMB4/PSMB5/PSMB6/PSMB7/PSMB8/PSMB9/PSMC4/PSMC5/PSMD1/PSMD10/PSMD11/PSMD14/PSMD2/PSMD3/PSMD4/PSMD7/PSMD9/PSME1/PSME2/PSME3/RAD23A/SEC11C/SPCS1/SPCS3/TAF10/THBD/TXNL1/USP14/VCP
## GO:0005839                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   PSMA1/PSMA2/PSMA3/PSMA4/PSMA5/PSMA6/PSMA7/PSMB1/PSMB10/PSMB2/PSMB3/PSMB4/PSMB5/PSMB6/PSMB7/PSMB8/PSMB9
## GO:0005788                                                                                                                                                                                                                                                                                                                                                                                                                                                                          AFP/ARSJ/B2M/C3/CALU/CDH2/CES2/CKAP4/COL11A2/COL12A1/COL15A1/COL18A1/COL21A1/COL22A1/COL25A1/COL26A1/COL2A1/COL3A1/COL4A1/COL4A2/COL4A3/COL4A4/COL5A2/COL7A1/COL8A2/COL9A1/COL9A2/COL9A3/COLGALT2/CSF1/DNAJB11/DNAJC3/EDEM2/MMP24-AS1-EDEM2/EDEM3/EDN1/ERLEC1/ERO1A/ERP44/F5/FBN1/FKBP10/FKBP14/FSTL1/FSTL3/FUCA2/GAS6/HYOU1/IGFBP4/IGFBP7/IL23A/IL6/KTN1/LAMB1/LAMC1/LTBP1/MANF/MFGE8/MGAT4A/MIA3/MINPP1/MXRA8/P4HA1/P4HA3/P4HB/PCSK9/PDIA3/PDIA4/PDIA5/POGLUT1/POGLUT2/PTGS2/QSOX1/RCN2/RDH5/RNASET2/SCG2/SELENOF/SELENOM/SHISA5/SIL1/SPON1/SPP1/STC2/SUMF2/TGOLN2/TMEM132A/TMEM43/TOR1A/TSPAN5/TXNDC16/WNT5A
## GO:1990204                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             BCKDHA/CYB5B/DLAT/GPD1L/GPD2/IDH3A/LDHA/LDHB/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/NOXA1/P4HA1/P4HB/PDHB/PDHX/PDK1/SDHA/SDHC/UQCR11/UQCRC1/UQCRFS1/UQCRQ
## GO:0005747                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2
## GO:0030964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2
## GO:0045271                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2
## GO:0019867                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ACSL3/ACSL4/AGPAT4/AIFM2/ANKH/APOO/ARMC12/ARMCX1/ARMCX6/ATP5MC3/BAK1/BCL2A1/BCL2L1/BCL2L2/BID/BMF/BNIP3/BOK/BRI3BP/CHCHD3/CISD1/CISD2/CYB5A/CYB5B/DHCR7/DMPK/ENO1/FUNDC2/GK/HK2/IFI27/ITPRIP/LPIN1/LTC4S/MAOA/MAOB/MFF/MFN2/MGST1/MICOS10/MIGA2/MTCH1/MTOR/MTX2/MUL1/MYOC/PGRMC1/PLEC/PPP1R15A/PSEN1/PTGS2/RAB11FIP5/RMDN3/SAMM50/SARM1/SLC11A2/SLC44A1/SLC8A3/SPIRE1/STARD7/STING1/STMP1/SYNE3/TIGAR/TOMM40/TOMM5/TOMM7/VAT1/VDAC1/VDAC2/VPS13A/VPS13C
## GO:0062023                                                                                                                                                                                                                                                                                                                                                                      ACAN/ADAM11/ADAMTS1/ADAMTS15/ADAMTS2/AEBP1/AGRN/AGT/ANG/ANGPT1/ANGPTL4/ANGPTL5/ANGPTL7/ANXA4/BCAM/BGN/CCDC80/CCN3/CDH2/CHADL/CILP/CLEC3B/COL11A2/COL12A1/COL15A1/COL18A1/COL21A1/COL25A1/COL26A1/COL2A1/COL3A1/COL4A1/COL4A2/COL4A3/COL4A4/COL5A2/COL7A1/COL8A2/COL9A1/COL9A2/COL9A3/CSPG4/CTSS/DPT/EFEMP1/ELANE/F13A1/F3/FBN1/FBN2/FGF10/FGFR2/FRAS1/GDF15/GPC4/HDGF/ICAM1/IGFBP7/IL7/ITIH5/LAMA2/LAMA3/LAMA4/LAMB1/LAMB3/LAMC1/LAMC2/LGALS9/LOX/LOXL3/LOXL4/LTBP1/LUM/MATN2/MFAP5/MFGE8/MMRN2/MST1/MYOC/NCAM1/NID2/NTNG2/PCOLCE/PCSK6/PF4/PKM/PODN/PXDN/SEMA3B/SERPINE2/SERPINF1/SFRP1/SFRP2/SLPI/SMOC1/SMOC2/SNORC/SPON1/SRPX2/TGFB2/TGFB3/TGFBI/THBS2/THBS3/THBS4/TIMP2/TIMP3/TINAGL1/TNXB/VWC2/WNT2B/WNT5A/ZP1
## GO:0016469                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5MJ/ATP5MK/ATP5PD/ATP5PF/ATP6AP1/ATP6V0B/ATP6V0C/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1F/ATP6V1G1/ATP6V1G2/ATP6V1H/CCDC115/RNASEK/TCIRG1
## GO:0031300                                                                                                                                                                                                                                                                                                                                                                              A4GALT/ACER3/ANKLE2/APOO/AUP1/B2M/B4GALNT1/B4GAT1/BAK1/BET1/BID/BNIP3/CHCHD3/CHST12/CHST2/CHST5/COA3/COQ2/COX16/CSGALNACT1/CYP2E1/DERL1/DERL2/DHCR7/DMPK/DNAJC5/DOLK/DPAGT1/ELOVL2/ELOVL3/EMC3/EMC6/EMC7/ERGIC1/ESYT1/FAR1/FICD/FITM2/FKTN/FUNDC2/FURIN/GALNT2/HLA-A/HM13/HSD11B1/IER3IP1/INSIG2/KTN1/LFNG/MAN1C1/MFF/MFN2/MFNG/MICOS10/MREG/MTX2/MUL1/P2RX6/P2RX7/PCSK5/PDIA3/PET100/PEX2/PIGS/PIGU/POMGNT1/PORCN/PPOX/QSOX1/RAB27B/RAB3B/RFNG/RNF152/RNF180/SAMM50/SCD/SCO2/SELENOS/SFXN1/SFXN3/SGMS2/SLC15A4/SLC17A7/SLC22A14/SLC25A3/SLC35A1/SLC35A2/SLC35B1/SLC35B2/SLC66A1/SPCS1/SPIRE1/STING1/STX6/SUN1/TAP1/TAP2/TAPBP/TIMM17A/TIMM23/TMEM175/TMEM33/TMEM43/TOMM40/TPST1/TRABD2B/TRAM2/VOPP1/XXYLT1
## GO:0031968                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ACSL3/ACSL4/AGPAT4/AIFM2/APOO/ARMC12/ARMCX1/ARMCX6/ATP5MC3/BAK1/BCL2A1/BCL2L1/BCL2L2/BID/BMF/BNIP3/BOK/BRI3BP/CHCHD3/CISD1/CISD2/CYB5A/CYB5B/DHCR7/DMPK/ENO1/FUNDC2/GK/HK2/IFI27/ITPRIP/LPIN1/LTC4S/MAOA/MAOB/MFF/MFN2/MGST1/MICOS10/MIGA2/MTCH1/MTOR/MTX2/MUL1/MYOC/PGRMC1/PLEC/PPP1R15A/PSEN1/PTGS2/RAB11FIP5/RMDN3/SAMM50/SARM1/SLC11A2/SLC44A1/SLC8A3/SPIRE1/STARD7/STING1/STMP1/SYNE3/TIGAR/TOMM40/TOMM5/TOMM7/VAT1/VDAC1/VDAC2/VPS13A/VPS13C
## GO:0005741                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 ACSL3/ACSL4/AGPAT4/AIFM2/APOO/ARMC12/ARMCX1/ARMCX6/ATP5MC3/BAK1/BCL2A1/BCL2L1/BCL2L2/BID/BMF/BNIP3/BOK/BRI3BP/CHCHD3/CISD1/CISD2/CYB5A/CYB5B/DMPK/FUNDC2/GK/HK2/IFI27/LPIN1/MAOA/MAOB/MFF/MFN2/MGST1/MICOS10/MIGA2/MTCH1/MTOR/MTX2/MUL1/MYOC/PGRMC1/PLEC/PPP1R15A/RAB11FIP5/RMDN3/SAMM50/SARM1/SLC11A2/SLC44A1/SLC8A3/SPIRE1/STARD7/STING1/STMP1/TIGAR/TOMM40/TOMM5/TOMM7/VAT1/VDAC1/VDAC2/VPS13A/VPS13C
## GO:0005759                                                                                                                                                                                                                                                                                                                                AADAT/ACO2/ACOT11/AK3/AK4/ALDH1B1/ALDH1L2/ALDH2/ARL2/ATAD3A/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATXN3/BCKDHA/BCL2L1/C1QBP/CA5B/DAP3/DECR1/DHX30/DLAT/DMGDH/DNAJC15/ECHS1/FAHD1/FASTKD5/FLAD1/FPGS/GFM2/GLRX2/GLS/GRPEL1/GSR/GSTZ1/HAGH/HSD17B10/HSPE1/IDH3A/ISCA1/KARS1/LYRM4/MCCC2/MCEE/MDH2/MRPL12/MRPL14/MRPL16/MRPL17/MRPL18/MRPL27/MRPL32/MRPL33/MRPL34/MRPL42/MRPL44/MRPL47/MRPS10/MRPS11/MRPS12/MRPS15/MRPS16/MRPS24/MRPS33/MRPS5/MRPS7/MTHFD2L/MTHFS/NADK2/NAXD/NDUFA7/NDUFA9/NDUFAB1/NDUFAF1/NDUFB8/NDUFS1/NDUFS8/NMNAT3/NR3C1/NUDT9/PARK7/PC/PCK2/PDHB/PDHX/PDK1/PDK4/PDP1/PHYKPL/POLG2/PPA2/PPIF/PPM1K/PPTC7/PRDX3/PRODH/PTPN1/PYCR1/PYCR2/SARDH/SCO2/SDHAF2/SIRT3/SLC25A5/SOD2/SSBP1/STYXL1/SUCLA2/SUCLG2/TOP1MT/TSFM/TUFM/TXN2/UQCC2/VDAC1/VDAC2
## GO:0031301                                                                                                                                                                                                                                                                                                                                                                                                                                           A4GALT/ACER3/ANKLE2/APOO/AUP1/B2M/B4GALNT1/B4GAT1/BAK1/BET1/BID/BNIP3/CHCHD3/CHST12/COA3/COQ2/COX16/CSGALNACT1/DERL1/DERL2/DHCR7/DMPK/DOLK/DPAGT1/ELOVL2/ELOVL3/EMC3/EMC6/EMC7/ERGIC1/ESYT1/FAR1/FICD/FITM2/FKTN/FUNDC2/FURIN/GALNT2/HLA-A/HM13/HSD11B1/IER3IP1/INSIG2/KTN1/LFNG/MAN1C1/MFF/MFNG/MICOS10/MTX2/MUL1/P2RX6/P2RX7/PCSK5/PDIA3/PET100/PEX2/PIGS/PIGU/POMGNT1/PORCN/QSOX1/RFNG/RNF152/SAMM50/SCD/SCO2/SELENOS/SFXN1/SFXN3/SGMS2/SLC15A4/SLC17A7/SLC22A14/SLC25A3/SLC35A1/SLC35A2/SLC35B1/SLC35B2/SLC66A1/SPCS1/SPIRE1/STING1/STX6/SUN1/TAP1/TAP2/TAPBP/TIMM17A/TIMM23/TMEM175/TMEM33/TMEM43/TOMM40/TPST1/TRABD2B/TRAM2/VOPP1/XXYLT1
## GO:0019774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             PSMB1/PSMB10/PSMB2/PSMB3/PSMB4/PSMB5/PSMB6/PSMB7/PSMB8/PSMB9
## GO:0005604                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ADAMTS1/AGRN/ANG/CCDC80/COL15A1/COL18A1/COL2A1/COL4A1/COL4A2/COL4A3/COL4A4/COL7A1/COL8A2/COL9A1/COL9A3/FBN1/FRAS1/LAMA2/LAMA3/LAMA4/LAMB1/LAMB3/LAMC1/LAMC2/MMRN2/NID2/NTNG2/SERPINF1/SMOC1/SMOC2/TGFBI/THBS2/THBS4/TIMP3/VWC2
## GO:0140534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    AUP1/B2M/DERL1/DERL2/DNAJB11/EMC3/EMC6/EMC7/EXT2/FKBP1A/HLA-A/HM13/HYOU1/INSIG2/MAP3K5/MLEC/ORMDL2/OSTC/P4HA1/P4HB/PDIA3/PIGS/PIGU/RPN1/RPN2/SEC11C/SEC61B/SEC61G/SELENOS/SPCS1/SPCS3/SPTLC2/SPTSSA/SPTSSB/SRPRB/STT3B/TAP1/TAP2/TAPBP/TRAF2/UFD1/VCP
## GO:0031228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   A4GALT/ACER3/B4GALNT1/B4GAT1/BET1/CHST12/CHST2/CHST5/CSGALNACT1/ERGIC1/FKTN/FURIN/GALNT2/IER3IP1/LFNG/MAN1C1/MFNG/PCSK5/POMGNT1/QSOX1/RFNG/SGMS2/SLC35A1/SLC35A2/SLC35B1/SLC35B2/TPST1
## GO:0022624                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    ADRM1/PSMC4/PSMC5/PSMD1/PSMD11/PSMD14/PSMD2/PSMD3/PSMD4/PSMD7/PSMD9/PSME1/PSME2/PSME3
## GO:0005753                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5MJ/ATP5MK/ATP5PD/ATP5PF
## GO:0030173                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               A4GALT/ACER3/B4GALNT1/B4GAT1/BET1/CHST12/CSGALNACT1/ERGIC1/FKTN/FURIN/GALNT2/IER3IP1/LFNG/MAN1C1/MFNG/PCSK5/POMGNT1/QSOX1/RFNG/SGMS2/SLC35A1/SLC35A2/SLC35B1/SLC35B2/TPST1
## GO:0045259                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5MJ/ATP5MK/ATP5PD/ATP5PF
## GO:0042383                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            AHNAK/AHNAK2/AKAP6/ANK3/AQP1/ATP1A1/ATP1A2/ATP1B1/ATP2B4/BGN/CACNA1C/CACNG4/CAMK2D/CAPN3/CDH2/CIB2/DES/DYSF/FLOT1/FXYD1/ITGB1/KCND3/KCNJ2/LAMA2/NCSTN/PGM5/PLEC/PSEN1/SGCA/SGCB/SGCG/SLC2A1/SLC30A1/SLC38A2/SLC8A3/SNTB1/SSPN/SYNM/TGFB3/UTRN
## GO:0005838                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ADRM1/PSMC4/PSMC5/PSMD1/PSMD11/PSMD14/PSMD2/PSMD3/PSMD4/PSMD7/PSMD9
## GO:0015629                                                                                                                                                                                                                                                                                                                                                                                               ABL1/ABL2/ACTC1/ADD1/AFAP1/AHNAK/ALDOA/ALG2/AMPH/ANG/APBB3/ARHGAP21/ARSJ/ASAP1/AVIL/BMF/C10orf90/CAPG/CAPZA2/CAPZB/CD274/CDH2/CFL2/CGN/CGNL1/CIB2/CLIC4/CORIN/CORO2B/COTL1/CRYAB/CTTNBP2NL/DAAM1/DENND2A/DGKH/DLC1/DSTN/DYNLL2/FAM107A/FCHSD1/FLOT1/FYB1/FYN/GBP1/GSN/HCK/HSPB7/IFIT5/IQGAP1/JUP/KALRN/KLHL2/LASP1/LLGL2/LSP1/MICAL1/MPP4/MTSS1/MYADM/MYH7B/MYL5/MYL6/MYL6B/MYO10/MYO18A/MYO1C/MYO1D/MYO5B/MYO5C/OPHN1/PDLIM2/PDLIM4/PDXP/PGM5/PKNOX2/PRKCZ/RAPGEF3/RARA/RFLNA/ZNF664-RFLNA/RINL/SCIN/SCNN1D/SEPTIN11/SEPTIN7/SH3PXD2B/SHROOM3/SIPA1L1/SLC2A1/SNX9/SPTB/SPTBN5/SWAP70/SYNPO/TFPT/TJP1/TMEM63B/TMOD4/TNKS1BP1/TNNC1/TNNC2/TNNI1/TNNT2/TNNT3/TPM1/TPM2/UTRN/WAS/WASF2/ZNF185
## GO:1990351                                                                                                                                                                                                                                                                                                                                                                                                                                             ABCA2/ABCD4/ABHD12/ABHD6/AKAP6/ATP10A/ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP1B3/ATP8A1/ATP8B1/ATP8B4/CACNA1C/CACNB1/CACNG4/CATSPER1/CHRFAM7A/CHRNA7/CHRNE/CLCNKB/CLIC3/CLIC4/FKBP1A/FXYD1/GRIK3/GRIN3A/KCNA1/KCNA4/KCNA6/KCND3/KCNIP1/KCNJ2/KCNMA1/KCNMB2/KCNMB4/KCNN4/LRRC55/LRRC8C/LRRC8D/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/ORAI1/OSTM1/PACC1/PDE4B/PDE4D/PEX14/PKD1/PORCN/SCN2B/SCN4B/SCNN1A/SCNN1D/SHISA6/STXBP5/TIMM10B/TIMM13/TIMM8B/TMEM30A/TMEM30B/UQCR11/UQCRC1/UQCRFS1/UQCRQ/VWC2
## GO:0033177                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0B/ATP6V0C/ATP6V0D1/ATP6V0E1/RNASEK/TCIRG1
## GO:0042470                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ATP1A1/ATP1B3/ATP6V1G2/CALU/CAPG/CCT4/DCT/DNAJC5/FLOT1/GCHFR/GPNMB/HPS4/ITGB1/MFSD12/MREG/NCSTN/P4HB/PDIA3/PDIA4/PRDX1/RAB27A/RAB27B/RAB29/RPN1/SEC22B/SERPINF1/SGSM2/SLC1A4/SLC1A5/SLC2A1/SYTL1/TFRC/TMEM33
## GO:0048770                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ATP1A1/ATP1B3/ATP6V1G2/CALU/CAPG/CCT4/DCT/DNAJC5/FLOT1/GCHFR/GPNMB/HPS4/ITGB1/MFSD12/MREG/NCSTN/P4HB/PDIA3/PDIA4/PRDX1/RAB27A/RAB27B/RAB29/RPN1/SEC22B/SERPINF1/SGSM2/SLC1A4/SLC1A5/SLC2A1/SYTL1/TFRC/TMEM33
## GO:0033176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ATP6AP1/ATP6V0B/ATP6V0C/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1F/ATP6V1G1/ATP6V1G2/ATP6V1H/CCDC115/RNASEK/TCIRG1
## GO:0005774                                                                                                                                                                                                                                                                                                                                                                                             ABCA2/ABCA3/ABCD4/ABHD6/ACP2/AHNAK/AP1B1/ATG14/ATP6V0B/ATP6V0C/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1F/ATP6V1G1/ATP6V1G2/ATP6V1H/ATP8A1/B4GALT1/BST2/CCDC115/CHMP1B/CHMP4B/CHMP5/CKAP4/CLTA/CMTM6/CYB561A3/CYBRD1/DNAJC5/DRAM1/FLOT1/GABARAPL1/GABARAPL2/GNAI1/GNB4/GPR137/GPR137C/HPS4/JMY/LAMP3/LAMP5/LAMTOR1/LAMTOR5/LAPTM5/LPCAT1/MAP1LC3C/MCOLN1/MFSD12/MGST1/MMD/MREG/MTOR/NAPG/NCSTN/NDUFC2/NEU1/NSF/OSTM1/PCSK9/PI4K2A/PLD1/PLEKHF1/PRKD1/PSEN1/RAB37/RNASEK/RNF152/RPN2/RUBCNL/SCARB2/SLC11A2/SLC15A3/SLC15A4/SLC2A6/SLC30A4/SLC39A14/SLC39A8/SLC66A1/SPAG9/STARD3NL/STING1/SURF4/TCIRG1/TFEB/THBD/TM9SF1/TMEM150C/TMEM165/TMEM175/TMEM30A/TOM1/TPCN1/VLDLR/VMP1/VNN1/VPS13A/WDFY3/WIPI1
## GO:0005581                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      C1QTNF1/C1QTNF3/C1QTNF6/C1QTNF7/C1QTNF8/COL11A2/COL12A1/COL15A1/COL18A1/COL21A1/COL22A1/COL25A1/COL26A1/COL2A1/COL3A1/COL4A1/COL4A2/COL4A3/COL4A4/COL5A2/COL7A1/COL8A2/COL9A1/COL9A2/COL9A3/LOX/LUM
## GO:0034774                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ACLY/ALDOA/AMPD3/ATG7/B2M/C3/CCT2/CFD/CLEC3B/COTL1/CXCL1/DBH/DNAJC3/ELANE/ERP44/F13A1/F5/FUCA2/GALNS/GAS6/GLA/GNS/GPI/GSN/GSTP1/HEXB/ISLR/ITIH3/JUP/LCN2/MAN2B1/MIF/NEU1/NFKB1/NHLRC3/NIT2/OLA1/PA2G4/PAFAH1B2/PF4/PFKL/PGAM1/PKM/PLAC8/PRKCD/PROS1/PSMA2/PSMA5/PSMB1/PSMB7/PSMD1/PSMD11/PSMD14/PSMD2/PSMD3/PSMD7/PTGES2/PTX3/QSOX1/RAB27A/RNASET2/ROCK1/SERPINI1/SLPI/SRP14/TGFB2/TGFB3/TIMP2/TIMP3/UNC13D/VAT1/VCP/VPS13A/XRCC5
## GO:0005758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        AIFM1/AK2/ARL2/CHCHD2/COA4/COA6/COX17/CPOX/CYCS/FKBP10/MIX23/MYOC/NDUFA8/NDUFS1/NDUFS5/PARK7/PPOX/PRELID3A/RNASET2/STMP1/THOP1/TIMM10B/TIMM13/TIMM23/TIMM8B/UQCC2
## GO:0060205                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ACLY/ALDOA/AMPD3/ATG7/B2M/C3/CCT2/CFD/CLEC3B/COTL1/CXCL1/DBH/DNAJC3/ELANE/ERP44/F13A1/F5/FUCA2/GALNS/GAS6/GLA/GNS/GPI/GSN/GSTP1/HEXB/ISLR/ITIH3/JUP/LCN2/MAN2B1/MIF/NEU1/NFKB1/NHLRC3/NIT2/OLA1/PA2G4/PAFAH1B2/PF4/PFKL/PGAM1/PKM/PLAC8/PRKCD/PROS1/PSMA2/PSMA5/PSMB1/PSMB7/PSMD1/PSMD11/PSMD14/PSMD2/PSMD3/PSMD7/PTGES2/PTX3/QSOX1/RAB27A/RNASET2/ROCK1/SERPINI1/SLPI/SRP14/TGFB2/TGFB3/TIMP2/TIMP3/UNC13D/VAT1/VCP/VPS13A/XRCC5
## GO:0031970                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            AIFM1/AK2/ARL2/CHCHD2/COA4/COA6/COX17/CPOX/CYCS/FKBP10/IGF2R/MIX23/MYOC/NDUFA8/NDUFS1/NDUFS5/PARK7/PPOX/PRELID3A/PTGES/RNASET2/STMP1/THOP1/TIMM10B/TIMM13/TIMM23/TIMM8B/UQCC2
## GO:0045121                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ABCA1/ADCYAP1R1/AHNAK/AKAP6/ANGPT1/ARID3A/ARID3C/ASAH2/ATP1A1/ATP1A2/ATP1B1/ATP2B4/ATP5F1A/BIRC3/BST2/CD55/CDH2/CFLAR/CHRNA7/DLC1/EDNRB/EMP2/ENO2/EPHB1/F2R/FADD/FAIM2/FAS/FLOT1/FURIN/FXYD1/FYN/GASK1A/GJA1/HCK/HYAL2/ICAM1/IRS1/ITGA1/ITGB1/KCNMA1/KDR/LAMTOR1/LAMTOR5/LDHB/LRP8/MYADM/MYO1C/OLR1/ORAI1/PARK7/PDZK1/PGK1/PI4K2A/PODXL/PPP2R1B/PPT1/PRKCZ/PSEN1/PTGIS/PTGS2/RANGRF/RAP2B/RTN4RL1/SELE/SGCA/SLC25A5/SLC2A1/SMPD2/TFPI/TGFBR1/TNFRSF1B/TRAF2/VDAC1
## GO:0031983                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ACLY/ALDOA/AMPD3/ATG7/B2M/C3/CCT2/CFD/CLEC3B/COTL1/CXCL1/DBH/DNAJC3/ELANE/ERP44/F13A1/F5/FUCA2/GALNS/GAS6/GLA/GNS/GPI/GSN/GSTP1/HEXB/ISLR/ITIH3/JUP/LCN2/MAN2B1/MIF/NEU1/NFKB1/NHLRC3/NIT2/OLA1/PA2G4/PAFAH1B2/PF4/PFKL/PGAM1/PKM/PLAC8/PRKCD/PROS1/PSMA2/PSMA5/PSMB1/PSMB7/PSMD1/PSMD11/PSMD14/PSMD2/PSMD3/PSMD7/PTGES2/PTX3/QSOX1/RAB27A/RNASET2/ROCK1/SERPINI1/SLPI/SRP14/TGFB2/TGFB3/TIMP2/TIMP3/UNC13D/VAT1/VCP/VPS13A/XRCC5
## GO:0098857                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        ABCA1/ADCYAP1R1/AHNAK/AKAP6/ANGPT1/ARID3A/ARID3C/ASAH2/ATP1A1/ATP1A2/ATP1B1/ATP2B4/ATP5F1A/BIRC3/BST2/CD55/CDH2/CFLAR/CHRNA7/DLC1/EDNRB/EMP2/ENO2/EPHB1/F2R/FADD/FAIM2/FAS/FLOT1/FURIN/FXYD1/FYN/GASK1A/GJA1/HCK/HYAL2/ICAM1/IRS1/ITGA1/ITGB1/KCNMA1/KDR/LAMTOR1/LAMTOR5/LDHB/LRP8/MYADM/MYO1C/OLR1/ORAI1/PARK7/PDZK1/PGK1/PI4K2A/PODXL/PPP2R1B/PPT1/PRKCZ/PSEN1/PTGIS/PTGS2/RANGRF/RAP2B/RTN4RL1/SELE/SGCA/SLC25A5/SLC2A1/SMPD2/TFPI/TGFBR1/TNFRSF1B/TRAF2/VDAC1
## GO:0001726                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ABL1/ACAP2/APPL1/APPL2/ARHGEF2/C2CD5/CAPG/CDK6/CLASP2/CSPG4/CYTH3/DLC1/EPB41L5/FAM107A/FERMT1/FGD1/FGD4/FRMD4B/IFIT5/IQGAP1/ITGAV/ITGB1/KLHL2/KSR1/MTSS1/MYADM/MYO10/MYO1C/NME1/PARD6A/PDXP/PLEKHA1/PODXL/PSD2/PSD4/PTPRJ/RASA1/RHOA/RINL/ROCK1/SNX9/TPM1/TRPM7/WASF2/WWC1
## GO:0098573                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      APOO/BAK1/BID/BNIP3/CHCHD3/COA3/COQ2/COX16/DMPK/FUNDC2/MFF/MFN2/MICOS10/MTX2/MUL1/PET100/PPOX/SAMM50/SCO2/SFXN1/SFXN3/SLC22A14/SLC25A3/SPIRE1/TIMM17A/TIMM23/TOMM40
## GO:0033178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP6AP1/ATP6V1E1/ATP6V1F/ATP6V1G1/ATP6V1G2/ATP6V1H
## GO:1904813                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ACLY/ALDOA/AMPD3/ASAH1/ATG7/CFD/COMMD3/COTL1/CTSS/FTH1/GNS/GPI/GSN/GSTP1/JUP/MIF/PAFAH1B2/PFKL/PGAM1/PKM/PLEKHO2/PSMA2/PSMA5/PSMB1/PSMB7/PSMD11/PSMD14/PSMD2/PSMD3/PSMD7/SRP14/TIMP2/TNFAIP6/VCP
## GO:0005832                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      CCT2/CCT3/CCT4/CCT5/CCT6A/CCT7/TCP1
## GO:0045277                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          C15orf48/COA6/COX4I1/COX5A/COX5B/COX6B1/COX6C/COX7A2/COX7B/COX7C/NDUFA4/UQCRFS1
## GO:0005751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               C15orf48/COX4I1/COX5A/COX5B/COX6B1/COX6C/COX7A2/COX7B/COX7C/NDUFA4/UQCRFS1
## GO:0016471                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ATP6V0B/ATP6V0C/ATP6V0D1/ATP6V1E1/ATP6V1F/ATP6V1G1/ATP6V1G2/ATP6V1H/CCDC115/RNASEK/TCIRG1
## GO:1902495                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ABCA2/ABCD4/ABHD12/ABHD6/AKAP6/ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP1B3/CACNA1C/CACNB1/CACNG4/CATSPER1/CHRFAM7A/CHRNA7/CHRNE/CLCNKB/CLIC3/CLIC4/FKBP1A/FXYD1/GRIK3/GRIN3A/KCNA1/KCNA4/KCNA6/KCND3/KCNIP1/KCNJ2/KCNMA1/KCNMB2/KCNMB4/KCNN4/LRRC55/LRRC8C/LRRC8D/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB11/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/ORAI1/OSTM1/PACC1/PDE4B/PDE4D/PKD1/PORCN/SCN2B/SCN4B/SCNN1A/SCNN1D/SHISA6/STXBP5/UQCR11/UQCRC1/UQCRFS1/UQCRQ/VWC2
## GO:0098644                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      COL11A2/COL2A1/COL3A1/COL4A1/COL4A2/COL4A3/COL4A4/COL5A2/COL7A1/LUM
## GO:0005766                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ACLY/ATP6V0C/ATP8A1/B4GALT1/BST2/C3/CCT2/CKAP4/CMTM6/DNAJC3/DNAJC5/ELANE/FUCA2/GALNS/GLA/GNS/HEXB/LAMTOR1/LPCAT1/MAN2B1/MGST1/NCSTN/NDUFC2/NHLRC3/PA2G4/PLAC8/PRKCD/PSEN1/PSMD1/PTGES2/RAB37/RNASET2/SURF4/TMEM30A/TOM1/UNC13D/VAT1/VCP/VNN1
## GO:0042582                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ACLY/ATP6V0C/ATP8A1/B4GALT1/BST2/C3/CCT2/CKAP4/CMTM6/DNAJC3/DNAJC5/ELANE/FUCA2/GALNS/GLA/GNS/HEXB/LAMTOR1/LPCAT1/MAN2B1/MGST1/NCSTN/NDUFC2/NHLRC3/PA2G4/PLAC8/PRKCD/PSEN1/PSMD1/PTGES2/RAB37/RNASET2/SURF4/TMEM30A/TOM1/UNC13D/VAT1/VCP/VNN1
## GO:0000314                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 DAP3/MRPL42/MRPS10/MRPS11/MRPS12/MRPS15/MRPS16/MRPS24/MRPS33/MRPS5/MRPS7
## GO:0005763                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 DAP3/MRPL42/MRPS10/MRPS11/MRPS12/MRPS15/MRPS16/MRPS24/MRPS33/MRPS5/MRPS7
## GO:0070069                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      C15orf48/COA6/COX4I1/COX5A/COX5B/COX6B1/COX6C/COX7A2/COX7B/COX7C/NDUFA4/UQCR11/UQCRC1/UQCRFS1/UQCRQ
## GO:0005938                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ADD3/AGTRAP/AKAP12/ASPH/C2CD2L/C2CD5/CAPZA2/CAPZB/CDH2/CIB2/CLASP2/CLTA/COTL1/CRIP2/CYTIP/DENND2B/DLC1/DSTN/ENO1/ENO2/EPB41/EXOC1/EXOC7/FAM110C/FCHSD1/FGFR2/FLOT1/GLRX3/GNAI1/GPSM1/GSN/IQGAP1/KIAA1614/LAMC2/LASP1/LLGL2/MYADM/MYO10/MYO1D/MYO5B/NOS2/NUMA1/PARD6A/PRKCZ/PRKD1/PSEN1/RAI14/RAPGEF3/RHOA/RIC8B/RND3/SCIN/SELE/SEPTIN10/SEPTIN11/SEPTIN5/SEPTIN7/SEPTIN8/SHROOM3/SLC2A1/SNX9/SPIRE1/SPTB/SPTBN5/STIMATE/TNFAIP2/TRAF2/UTRN
## GO:0031227                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ACER3/ANKLE2/AUP1/B2M/CYP2E1/DERL1/DERL2/DHCR7/DOLK/DPAGT1/ELOVL2/ELOVL3/EMC3/EMC6/EMC7/ERGIC1/ESYT1/FICD/FITM2/HLA-A/HM13/HSD11B1/INSIG2/KTN1/PDIA3/PIGS/PIGU/PORCN/RNF180/SCD/SELENOS/SGMS2/SLC35B1/SLC35B2/SPCS1/STING1/TAP1/TAP2/TAPBP/TMEM33/TRAM2/XXYLT1
## GO:0032592                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                APOO/BAK1/BID/BNIP3/CHCHD3/COA3/COQ2/COX16/DMPK/FUNDC2/MFF/MICOS10/MTX2/MUL1/PET100/SAMM50/SCO2/SFXN1/SFXN3/SLC22A14/SLC25A3/SPIRE1/TIMM17A/TIMM23/TOMM40
## GO:0015399                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           ABCA1/ABCA2/ABCA3/ABCC5/ABCD4/ATP13A3/ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/ATP5F1B/ATP6V0C/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1F/ATP6V1G1/ATP6V1G2/ATP6V1H/ATP7B/ATP8A1/COX4I1/COX5A/COX5B/COX6B1/COX7B/CYB561A3/CYB5A/CYBRD1/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/TAP1/TAP2/TAPBP/UQCRC1/UQCRFS1
## GO:0009055                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           AIFM2/AKR1B1/ALDH2/AOC2/ASPH/COX4I1/COX5A/COX5B/COX6B1/COX7A2/COX7B/CYB5A/CYCS/DMGDH/GLRX2/GSR/MAOB/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PHGDH/QDPR/SDHA/SDHC/SRD5A1/STEAP4/UQCR11/UQCRC1/UQCRFS1
## GO:0015453                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   COX4I1/COX5A/COX5B/COX6B1/COX7B/CYB561A3/CYB5A/CYBRD1/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/UQCRC1/UQCRFS1
## GO:0016655                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        AIFM2/AKR1C1/AKR1C2/AKR1C3/CBR1/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2
## GO:0005201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ACAN/AEBP1/AGRN/BGN/CHADL/CILP/COL11A2/COL12A1/COL15A1/COL18A1/COL21A1/COL22A1/COL25A1/COL2A1/COL3A1/COL4A1/COL4A2/COL4A3/COL4A4/COL5A2/COL7A1/COL8A2/COL9A1/COL9A2/COL9A3/DPT/EFEMP1/FBN1/FBN2/FRAS1/IGFBP7/LAMA2/LAMA3/LAMA4/LAMB1/LAMB3/LAMC1/LAMC2/LTBP1/LUM/MARCOL/MATN2/MFAP5/MFGE8/MMRN2/NID2/PCOLCE/PODN/PXDN/SPON1/SRPX2/TFPI2/TGFBI/THBS2/THBS3/TINAGL1/TNXB/ZP1
## GO:0003954                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  AIFM1/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2
## GO:0008137                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2
## GO:0050136                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2
## GO:0003955                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2
## GO:0022804                                                                                                                                                                                                                                                                                                        ABCA1/ABCA2/ABCA3/ABCC5/ABCD4/ANKH/ATP13A3/ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/ATP5F1B/ATP6V0C/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1F/ATP6V1G1/ATP6V1G2/ATP6V1H/ATP7B/ATP8A1/COX4I1/COX5A/COX5B/COX6B1/COX7B/CYB561A3/CYB5A/CYBRD1/LETM1/MFSD12/MFSD2A/MFSD3/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/SLC10A3/SLC11A2/SLC12A2/SLC12A6/SLC15A3/SLC15A4/SLC16A2/SLC16A3/SLC17A7/SLC19A1/SLC1A4/SLC1A5/SLC20A2/SLC24A3/SLC25A11/SLC25A3/SLC25A30/SLC25A5/SLC26A4/SLC2A13/SLC34A3/SLC35A1/SLC35D1/SLC36A4/SLC38A1/SLC38A2/SLC38A4/SLC39A14/SLC39A8/SLC6A6/SLC7A8/SLC8A3/SLC9A3/SLC9A9/SLCO1A2/SLCO2B1/SLCO3A1/TAP1/TAP2/TAPBP/UQCRC1/UQCRFS1
## GO:0004298                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       PSMA4/PSMB1/PSMB10/PSMB2/PSMB3/PSMB4/PSMB5/PSMB6/PSMB7/PSMB8/PSMB9
## GO:0016651                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         AIFM1/AIFM2/AIFM3/AKR1C1/AKR1C2/AKR1C3/CBR1/CYB5RL/FMO5/MICAL1/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2
## GO:0015036                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             ERO1A/GLRX/GLRX2/GLRX3/GSR/GSTO1/NXN/P4HB/PDIA3/PDIA4/PDIA5/PGK1/QSOX1/SCO2/TMX2/TMX3/TXN/TXN2/TXNDC17/TXNL1
## GO:0016667                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ERO1A/GLRX/GLRX2/GLRX3/GSR/GSTO1/IFI30/NXN/P4HB/PDIA3/PDIA4/PDIA5/PGK1/PRDX3/QSOX1/SCO2/SESN2/SQOR/TMX2/TMX3/TXN/TXN2/TXNDC17/TXNL1
## GO:0015078                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0B/ATP6V0C/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1F/ATP6V1G1/ATP6V1H/COX4I1/COX5A/COX5B/COX6B1/COX7B/CYB5A/LETM1/MFSD3/SLC11A2/SLC15A3/SLC15A4/SLC25A3/SLC25A5/SLC2A13/SLC39A8/SLC9A3/SLC9A9/TCIRG1/UQCRC1/UQCRFS1
## GO:0008201                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ADAMTS1/ADAMTS15/ADAMTSL5/ANG/CCDC80/CCL7/CCL8/CCN3/CCN4/CCN6/CFH/CLEC3B/COL25A1/CXCL10/CXCL6/CXCL8/ELANE/FBLN7/FBN1/FGF10/FGF7/FGF9/FGFBP1/FGFR2/FSTL1/GPNMB/HDGF/LAMC2/LIPG/MPIG6B/MSTN/NRP2/PCOLCE/PCSK6/PDCD5/PF4/PF4V1/RSPO2/RSPO3/RTN4RL1/SAA1/SERPINE2/SFRP1/SMOC1/SMOC2/THBS2/THBS3/THBS4/TNXB
## GO:0019829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         ATP13A3/ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/ATP5F1B/ATP6V0C/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1F/ATP6V1G1/ATP6V1H/ATP7B/ATP8A1
## GO:0015035                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              ERO1A/GLRX/GLRX2/GLRX3/GSR/NXN/P4HB/PDIA3/PDIA4/PDIA5/PGK1/QSOX1/SCO2/TMX3/TXN/TXN2/TXNDC17
## GO:0070003                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             GGT1/GGT5/PSMA4/PSMB1/PSMB10/PSMB2/PSMB3/PSMB4/PSMB5/PSMB6/PSMB7/PSMB8/PSMB9
## GO:0030020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      COL11A2/COL12A1/COL15A1/COL18A1/COL21A1/COL25A1/COL2A1/COL3A1/COL4A1/COL4A2/COL4A3/COL4A4/COL5A2/COL7A1/COL8A2/COL9A1/COL9A2/COL9A3
## GO:0016853                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ALOXE3/DCT/DDT/DDTL/DSE/DSEL/ERP44/FKBP10/FKBP11/FKBP14/FKBP1A/FKBP2/FKBP4/GALM/GLCE/GLRX2/GPI/GSTZ1/HYI/ISYNA1/ITPK1/LSS/MCEE/MIF/NKTR/P4HB/PDIA3/PDIA4/PDIA5/PGAM1/PGAM2/PGM2L1/PPIF/PPIL1/PPIL3/PPWD1/PTGES/PTGES2/PTGIS/QSOX1/TMX3/TOP1/TOP1MT/TPI1
## GO:0046933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C
## GO:0005539                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      ACAN/ADAMTS1/ADAMTS15/ADAMTSL5/AGRN/ANG/BGN/C1QBP/CCDC80/CCL7/CCL8/CCN3/CCN4/CCN6/CFH/CLEC3B/COL25A1/CXCL10/CXCL6/CXCL8/ELANE/EPYC/FBLN7/FBN1/FGF10/FGF7/FGF9/FGFBP1/FGFR2/FSTL1/GNS/GPNMB/HAPLN3/HDGF/HYAL2/LAMC2/LIPG/MPIG6B/MSTN/NOD2/NRP2/PCOLCE/PCSK6/PDCD5/PF4/PF4V1/RSPO2/RSPO3/RTN4RL1/SAA1/SERPINE2/SFRP1/SMOC1/SMOC2/SULF2/THBS2/THBS3/THBS4/TNFAIP6/TNXB
## GO:0016829                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                ACO1/ACO2/ALDOA/ALOXE3/AMD1/APIP/APMAP/ASL/AZIN1/BCKDHA/CA12/CA2/CA3/CA5B/CA8/CA9/CD38/CLYBL/CSAD/DDT/DDTL/ECHDC1/ECHDC2/ECHS1/ENO1/ENO2/ENO4/FAHD1/FAHD2B/GLO1/GSTM4/GUCY1A1/HCCS/LTC4S/MGST2/NAXD/NEIL1/NPR1/PAICS/PARK7/PCK1/PCK2/PHYKPL/PTGES2/PTGIS/PTS/RNASET2/TKFC/TPI1/UXS1/XRCC5
## GO:0016758                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       A4GALT/ALG2/ALG3/ALG5/ALG8/ALG9/B3GALT1/B3GALT2/B3GNT2/B3GNT7/B4GALNT1/B4GALNT3/B4GALT1/B4GALT4/B4GALT5/B4GAT1/C1GALT1/C1GALT1C1/C1GALT1C1L/CHPF2/COLGALT2/CSGALNACT1/EXT2/FUT11/GALNT16/GALNT2/GALNT5/GALNT8/GCNT3/GYS1/HAS3/HEXB/LFNG/MFNG/MGAT1/MGAT4A/MGAT5/OGT/OSTC/PIGV/POFUT1/POGLUT1/POGLUT2/POMGNT1/POMT2/RFNG/RPN1/RPN2/STT3B/TMTC3/TYMP
## GO:0042626                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  ABCA1/ABCA2/ABCA3/ABCC5/ABCD4/ATP13A3/ATP1A1/ATP1A2/ATP1A3/ATP1B1/ATP2A2/ATP2A3/ATP2B3/ATP2B4/ATP5F1B/ATP6V0C/ATP6V0D1/ATP6V0E1/ATP6V1E1/ATP6V1F/ATP6V1G1/ATP6V1G2/ATP6V1H/ATP7B/ATP8A1/TAP1/TAP2/TAPBP
##            Count
## GO:0006091   152
## GO:0045333    87
## GO:0015980   108
## GO:0046034    94
## GO:0009060    71
## GO:0006119    57
## GO:0030198    95
## GO:0043062    95
## GO:0045229    95
## GO:0022900    61
## GO:0022904    46
## GO:0042773    39
## GO:0042775    39
## GO:0033108    39
## GO:0019646    36
## GO:0006120    26
## GO:0003018    76
## GO:0032496    90
## GO:0010257    27
## GO:0032981    27
## GO:0006790    91
## GO:0009259    99
## GO:0009117   119
## GO:0009150    95
## GO:0006753   120
## GO:0061448    73
## GO:0006163   100
## GO:0019693   100
## GO:0002237    92
## GO:1903829   110
## GO:0009100    98
## GO:0051223   119
## GO:0062197    87
## GO:0071453    52
## GO:0006090    38
## GO:0044272    48
## GO:0051216    58
## GO:0034976    71
## GO:1903510    33
## GO:1904951    81
## GO:0070482    84
## GO:0072521   102
## GO:0010506    86
## GO:0071496    80
## GO:0072594   103
## GO:0033157    62
## GO:0009101    80
## GO:0016236    78
## GO:0071472     9
## GO:0071384    24
## GO:2001233    90
## GO:0006979   102
## GO:0036293    76
## GO:1901653    88
## GO:0060348    61
## GO:0097191    60
## GO:0001666    73
## GO:0052548   100
## GO:1901652   112
## GO:0036294    45
## GO:0002931    22
## GO:0007249    73
## GO:0071456    43
## GO:1901654    53
## GO:0019751    37
## GO:0046031    31
## GO:0097193    74
## GO:2001236    45
## GO:0055119    11
## GO:1903522    67
## GO:0071549    14
## GO:0030199    24
## GO:0032386    81
## GO:0045862    88
## GO:0032092    29
## GO:0071222    58
## GO:0051881    26
## GO:0051222    73
## GO:1900180    40
## GO:1901617    63
## GO:0071375    73
## GO:1900182    29
## GO:0030203    37
## GO:0006486    59
## GO:0043413    59
## GO:0051767    12
## GO:0051769    12
## GO:0052547   103
## GO:0071385    21
## GO:0045444    61
## GO:0006022    39
## GO:0071219    59
## GO:0070997    83
## GO:0090316    44
## GO:0071621    38
## GO:0006936    82
## GO:0046165    41
## GO:0046173    23
## GO:0043467    39
## GO:0001819   105
## GO:0016241    44
## GO:0055076    40
## GO:0034350     8
## GO:0008637    33
## GO:0051235    78
## GO:0003012   100
## GO:0015986    13
## GO:0071383    53
## GO:1901655    30
## GO:0009135    32
## GO:0009179    32
## GO:0006096    27
## GO:0070085    61
## GO:0045936    98
## GO:0009260    49
## GO:1905952    43
## GO:0042063    70
## GO:0010508    39
## GO:0035966    44
## GO:0009165    63
## GO:0010563    98
## GO:0035296    40
## GO:0097746    40
## GO:0031668    61
## GO:0010498   108
## GO:2001234    58
## GO:0061037    14
## GO:0071548    17
## GO:0006757    27
## GO:0043434    91
## GO:0030595    59
## GO:0035150    40
## GO:0090066   106
## GO:0048545    77
## GO:0046390    50
## GO:0003015    63
## GO:1901293    63
## GO:0060047    61
## GO:0072503   107
## GO:0002062    33
## GO:0006457    54
## GO:0046916    34
## GO:0030593    32
## GO:0016055    99
## GO:0097530    42
## GO:2000116    57
## GO:0007517    77
## GO:0010950    46
## GO:0046513    23
## GO:0006023    26
## GO:0198738    99
## GO:0010038    80
## GO:0009185    33
## GO:0071216    62
## GO:0006024    25
## GO:0071470    16
## GO:0050900    86
## GO:0009152    45
## GO:0001655    80
## GO:1904062    80
## GO:0009612    51
## GO:0030099    87
## GO:0032526    32
## GO:0098657    58
## GO:0006164    49
## GO:0010952    49
## GO:0060485    70
## GO:0001836    20
## GO:0050878    85
## GO:0048705    56
## GO:0072001    72
## GO:0032527    18
## GO:0034764    53
## GO:0048762    59
## GO:0006066    81
## GO:0007033    48
## GO:0010232    27
## GO:0150104    27
## GO:0090257    60
## GO:1904851     7
## GO:0006986    38
## GO:0046661    43
## GO:0042776    10
## GO:0006487    23
## GO:0071260    23
## GO:0010876    96
## GO:0006970    25
## GO:0044106    33
## GO:0006972    12
## GO:0034349     9
## GO:0071474     8
## GO:0009267    42
## GO:0019221   103
## GO:0009308    34
## GO:0009615    86
## GO:0034599    66
## GO:0008016    52
## GO:0008654    61
## GO:0042326    84
## GO:0060349    29
## GO:0070555    38
## GO:0106106    39
## GO:0120161    39
## GO:0006734    13
## GO:0051099    44
## GO:0032331    11
## GO:0034312    11
## GO:0043122    60
## GO:0072522    50
## GO:1905954    28
## GO:0071300    22
## GO:0034612    59
## GO:0043457    18
## GO:1901214    71
## GO:0010001    53
## GO:0006165    29
## GO:0031669    52
## GO:0032368    33
## GO:0006767    21
## GO:1990266    35
## GO:0048872    65
## GO:0051403    58
## GO:1902600    36
## GO:0018126    12
## GO:2001014    10
## GO:0062012    76
## GO:0060326    71
## GO:0046939    29
## GO:0031032    49
## GO:0050920    54
## GO:0006099    13
## GO:0034311    13
## GO:0006576    30
## GO:0006672    30
## GO:1902903    82
## GO:0043270    63
## GO:0048771    44
## GO:0120163    17
## GO:1990845    41
## GO:0031098    59
## GO:0051770     9
## GO:0090075    14
## GO:0051346    81
## GO:0016266    16
## GO:0042401    15
## GO:0031331    95
## GO:0044089   103
## GO:0070203     7
## GO:1904869     7
## GO:1904871     7
## GO:0006596     8
## GO:0030007     8
## GO:0098760     8
## GO:0098761     8
## GO:0045017    59
## GO:0046890    44
## GO:0016311    90
## GO:0032370    22
## GO:0032231    30
## GO:0018208    19
## GO:0051492    27
## GO:0110053    62
## GO:0042060    91
## GO:0045785    94
## GO:0000422    26
## GO:0061726    26
## GO:0070588    70
## GO:0044262    65
## GO:0071731    10
## GO:0009309    15
## GO:0061035    22
## GO:0006839    45
## GO:0010638   101
## GO:0001659    44
## GO:0097529    54
## GO:0045926    57
## GO:0002064    49
## GO:0006754    19
## GO:0038066    19
## GO:0060350    19
## GO:0035107    37
## GO:0035108    37
## GO:0010822    23
## GO:0022411    96
## GO:0032970    84
## GO:0006493    26
## GO:0009199    26
## GO:0043281    49
## GO:0006595     9
## GO:0042339     9
## GO:0034767    41
## GO:0046467    38
## GO:0006874    95
## GO:0032412    60
## GO:0055072    25
## GO:0048538    16
## GO:0021602    12
## GO:0032869    49
## GO:0071559    59
## GO:0055074    97
## GO:0042176    84
## GO:0030178    43
## GO:0043254    85
## GO:0008207    14
## GO:0045454    14
## GO:0098798   108
## GO:0005743   154
## GO:0098800    68
## GO:0000502    37
## GO:1905369    41
## GO:0070469    46
## GO:0005746    43
## GO:0098803    42
## GO:1905368    47
## GO:0005839    17
## GO:0005788    92
## GO:1990204    46
## GO:0005747    26
## GO:0030964    26
## GO:0045271    26
## GO:0019867    72
## GO:0062023   113
## GO:0016469    26
## GO:0031300   109
## GO:0031968    71
## GO:0005741    64
## GO:0005759   117
## GO:0031301    99
## GO:0019774    10
## GO:0005604    35
## GO:0140534    42
## GO:0031228    27
## GO:0022624    14
## GO:0005753    13
## GO:0030173    25
## GO:0045259    13
## GO:0042383    40
## GO:0005838    11
## GO:0015629   110
## GO:1990351    91
## GO:0033177    13
## GO:0042470    33
## GO:0048770    33
## GO:0033176    13
## GO:0005774    99
## GO:0005581    27
## GO:0034774    74
## GO:0005758    26
## GO:0060205    74
## GO:0031970    28
## GO:0045121    74
## GO:0031983    74
## GO:0098857    74
## GO:0001726    45
## GO:0098573    27
## GO:0033178    10
## GO:1904813    34
## GO:0005832     7
## GO:0045277    12
## GO:0005751    11
## GO:0016471    11
## GO:1902495    81
## GO:0098644    10
## GO:0005766    39
## GO:0042582    39
## GO:0000314    11
## GO:0005763    11
## GO:0070069    15
## GO:0005938    68
## GO:0031227    42
## GO:0032592    25
## GO:0015399    61
## GO:0009055    49
## GO:0015453    33
## GO:0016655    28
## GO:0005201    58
## GO:0003954    24
## GO:0008137    23
## GO:0050136    23
## GO:0003955    23
## GO:0022804   103
## GO:0004298    11
## GO:0016651    33
## GO:0015036    20
## GO:0016667    24
## GO:0015078    39
## GO:0008201    49
## GO:0019829    19
## GO:0015035    17
## GO:0070003    13
## GO:0030020    18
## GO:0016853    44
## GO:0046933    10
## GO:0005539    60
## GO:0016829    51
## GO:0016758    51
## GO:0042626    28
head(summary(ego))
## Warning in summary(ego): summary method to convert the object to data.frame is
## deprecated, please use as.data.frame instead.
##            ONTOLOGY         ID
## GO:0006091       BP GO:0006091
## GO:0045333       BP GO:0045333
## GO:0015980       BP GO:0015980
## GO:0046034       BP GO:0046034
## GO:0009060       BP GO:0009060
## GO:0006119       BP GO:0006119
##                                                    Description GeneRatio
## GO:0006091      generation of precursor metabolites and energy  152/2840
## GO:0045333                                cellular respiration   87/2840
## GO:0015980 energy derivation by oxidation of organic compounds  108/2840
## GO:0046034                               ATP metabolic process   94/2840
## GO:0009060                                 aerobic respiration   71/2840
## GO:0006119                           oxidative phosphorylation   57/2840
##              BgRatio       pvalue     p.adjust       qvalue
## GO:0006091 494/18800 3.830606e-19 2.371528e-15 1.894739e-15
## GO:0045333 231/18800 2.702577e-17 8.365827e-14 6.683900e-14
## GO:0015980 321/18800 5.827814e-17 1.202667e-13 9.608737e-14
## GO:0046034 273/18800 1.187700e-15 1.838263e-12 1.468685e-12
## GO:0009060 187/18800 1.400398e-14 1.733972e-11 1.385362e-11
## GO:0006119 139/18800 1.219898e-13 1.258732e-10 1.005667e-10
##                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      geneID
## GO:0006091 ACO1/ACO2/ADPGK/AIFM2/AK4/AKR1B1/ALDH1L2/ALDH2/ALDOA/AOC2/ARL2/ASPH/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5IF1/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/BNIP3/CHCHD2/CISD1/COA6/COQ10B/COX17/COX4I1/COX5A/COX5B/COX6C/COX7A2/COX7C/CYB5A/CYCS/DDIT4/DLAT/DMGDH/DNAJC15/DYRK2/ENO1/ENO2/ENO4/GAPDH/GFPT2/GLRX2/GPD2/GPI/GSR/GYS1/HDAC4/HIF1A/HK2/IDH3A/IFNAR1/IFNLR1/IL10RB/IRS1/KHK/LDHA/MAOB/MDH1/MDH1B/MDH2/MRAP2/MTOR/MYBBP1A/NDUFA1/NDUFA13/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/NOS2/NR1D1/NR4A3/OGT/P2RX7/PARK7/PDHB/PDIA5/PER2/PFKL/PFKP/PGAM1/PGAM2/PGK1/PHGDH/PHKA1/PHKA2/PHKG1/PHKG2/PID1/PKM/PLEC/POLG2/PPIF/PPP1R3B/PPP1R3C/PRDM16/PRKAA2/PRKAG2/PSEN1/QDPR/RHOA/RUBCNL/SCO2/SDHA/SDHAF2/SDHC/SELENOS/SIRT3/SLC25A23/SLC25A25/SLC2A6/SOD2/SRD5A1/STEAP4/SUCLA2/SUCLG2/TALDO1/TIGAR/TPI1/UGP2/UQCC2/UQCR11/UQCRC1/UQCRFS1/UQCRQ/VCP
## GO:0045333                                                                                                                                                                                                                                                                                                                                                                                              ACO1/ACO2/AIFM2/AK4/ARL2/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/BNIP3/CHCHD2/CISD1/COA6/COQ10B/COX4I1/COX5A/COX5B/COX7A2/COX7C/CYCS/DLAT/DNAJC15/GPD2/HIF1A/IDH3A/IFNAR1/IFNLR1/IL10RB/MDH1/MDH1B/MDH2/MYBBP1A/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/NOS2/NR4A3/PARK7/PDHB/PLEC/POLG2/PPIF/PRDM16/RHOA/SCO2/SDHA/SDHAF2/SDHC/SIRT3/SLC25A23/SLC25A25/SOD2/SUCLA2/SUCLG2/UQCC2/UQCRC1/UQCRFS1/UQCRQ/VCP
## GO:0015980                                                                                                                                                                                                                                                                ACO1/ACO2/AIFM2/AK4/ARL2/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/BNIP3/CHCHD2/CISD1/COA6/COQ10B/COX4I1/COX5A/COX5B/COX7A2/COX7C/CYCS/DLAT/DNAJC15/DYRK2/GFPT2/GPD2/GYS1/HIF1A/IDH3A/IFNAR1/IFNLR1/IL10RB/IRS1/KHK/MDH1/MDH1B/MDH2/MRAP2/MTOR/MYBBP1A/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/NOS2/NR1D1/NR4A3/PARK7/PDHB/PER2/PHKA1/PHKA2/PHKG1/PHKG2/PID1/PLEC/POLG2/PPIF/PPP1R3B/PPP1R3C/PRDM16/PRKAG2/RHOA/RUBCNL/SCO2/SDHA/SDHAF2/SDHC/SELENOS/SIRT3/SLC25A23/SLC25A25/SOD2/SUCLA2/SUCLG2/TIGAR/UGP2/UQCC2/UQCRC1/UQCRFS1/UQCRQ/VCP
## GO:0046034                                                                                                                                                                                                                                                                                                                                                         ADPGK/AK2/AK4/ALDOA/ARL2/ATP1A2/ATP1B1/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5IF1/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATP6V0C/ATPSCKMT/BID/CHCHD2/COA6/COX4I1/COX5A/COX5B/COX7A2/COX7C/CYCS/DDIT4/DNAJC15/ENO1/ENO2/ENO4/GAPDH/GPI/HDAC4/HIF1A/HK2/LDHA/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/OGT/OLA1/P2RX7/PARK7/PFKL/PFKP/PGAM1/PGAM2/PGK1/PID1/PKM/PPIF/PRKAA2/PRKAG2/PSEN1/RHOA/SDHA/SDHAF2/SDHC/SLC25A23/SLC25A25/SLC2A6/TIGAR/TPI1/UQCC2/UQCRC1/UQCRFS1/UQCRQ/VCP
## GO:0009060                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   ACO1/ACO2/AK4/ARL2/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/BNIP3/CHCHD2/COA6/COX4I1/COX5A/COX5B/COX7A2/COX7C/CYCS/DLAT/DNAJC15/HIF1A/IDH3A/MDH1/MDH1B/MDH2/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PARK7/PDHB/PPIF/RHOA/SDHA/SDHAF2/SDHC/SIRT3/SLC25A23/SUCLA2/SUCLG2/UQCC2/UQCRC1/UQCRFS1/UQCRQ/VCP
## GO:0006119                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  AK4/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/CHCHD2/COA6/COX4I1/COX5A/COX5B/COX7A2/COX7C/CYCS/DNAJC15/NDUFA1/NDUFA2/NDUFA3/NDUFA4/NDUFA7/NDUFA8/NDUFA9/NDUFAB1/NDUFAF1/NDUFB1/NDUFB2/NDUFB3/NDUFB4/NDUFB5/NDUFB6/NDUFB8/NDUFB9/NDUFC1/NDUFC2/NDUFS1/NDUFS5/NDUFS6/NDUFS8/NDUFV2/PARK7/PPIF/RHOA/SDHA/SDHAF2/SDHC/SLC25A23/UQCC2/UQCRC1/UQCRFS1/UQCRQ/VCP
##            Count
## GO:0006091   152
## GO:0045333    87
## GO:0015980   108
## GO:0046034    94
## GO:0009060    71
## GO:0006119    57
dotplot(ego,x="GeneRatio",showCategory=20,font.size=6)

#dotplot(ego3,x="GeneRatio",showCategory=20,font.size=6)
ego
## #
## # over-representation test
## #
## #...@organism     Homo sapiens 
## #...@ontology     GOALL 
## #...@keytype      ENTREZID 
## #...@gene     chr [1:3117] "53947" "51166" "79719" "16" "19" "20" "21" "10057" "5826" ...
## #...pvalues adjusted by 'BH' with cutoff <0.05 
## #...397 enriched terms found
## 'data.frame':    397 obs. of  10 variables:
##  $ ONTOLOGY   : chr  "BP" "BP" "BP" "BP" ...
##  $ ID         : chr  "GO:0006091" "GO:0045333" "GO:0015980" "GO:0046034" ...
##  $ Description: chr  "generation of precursor metabolites and energy" "cellular respiration" "energy derivation by oxidation of organic compounds" "ATP metabolic process" ...
##  $ GeneRatio  : chr  "152/2840" "87/2840" "108/2840" "94/2840" ...
##  $ BgRatio    : chr  "494/18800" "231/18800" "321/18800" "273/18800" ...
##  $ pvalue     : num  3.83e-19 2.70e-17 5.83e-17 1.19e-15 1.40e-14 ...
##  $ p.adjust   : num  2.37e-15 8.37e-14 1.20e-13 1.84e-12 1.73e-11 ...
##  $ qvalue     : num  1.89e-15 6.68e-14 9.61e-14 1.47e-12 1.39e-11 ...
##  $ geneID     : chr  "ACO1/ACO2/ADPGK/AIFM2/AK4/AKR1B1/ALDH1L2/ALDH2/ALDOA/AOC2/ARL2/ASPH/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5IF1/ATP"| __truncated__ "ACO1/ACO2/AIFM2/AK4/ARL2/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/BNIP3/"| __truncated__ "ACO1/ACO2/AIFM2/AK4/ARL2/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5ME/ATP5MF/ATP5MG/ATP5PD/ATP5PF/ATPSCKMT/BID/BNIP3/"| __truncated__ "ADPGK/AK2/AK4/ALDOA/ARL2/ATP1A2/ATP1B1/ATP5F1A/ATP5F1B/ATP5F1C/ATP5F1E/ATP5IF1/ATP5MC1/ATP5MC3/ATP5ME/ATP5MF/AT"| __truncated__ ...
##  $ Count      : int  152 87 108 94 71 57 95 95 95 61 ...
## #...Citation
##  T Wu, E Hu, S Xu, M Chen, P Guo, Z Dai, T Feng, L Zhou, W Tang, L Zhan, X Fu, S Liu, X Bo, and G Yu.
##  clusterProfiler 4.0: A universal enrichment tool for interpreting omics data.
##  The Innovation. 2021, 2(3):100141

Category Plot

subset <- ego[ego$Count==152, asis=TRUE]
gen<-ego[ego$Count==152, asis=TRUE]
#sub<- subset.data.frame(ego,Count=5)
#cnetplot(sub,showCategory=5)
cnetplot(gen,layout="gem", cex_category=2,cex_gene=2,cex_label_category=1,foldChange=geneList)
## Scale for size is already present.
## Adding another scale for size, which will replace the existing scale.
## Warning: ggrepel: 51 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps

cnetplot(subset, layout="gem", cex_category=2,cex_gene=2,cex_label_category=1,foldChange=geneList)
## Scale for size is already present.
## Adding another scale for size, which will replace the existing scale.
## Warning: ggrepel: 52 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps

Enrichment plots

I will show you can example of a pathway enriched in our lung samples, and a pathway that is enriched in Control (i.e negative NES score)

filtered_pathway <- subset(fgsea, NES > 2.3)

filt_p <- as.vector(filtered_pathway$pathway)

for (i in filt_p){
    plt <- plotEnrichment(pathway = pathway[[i]],
    gseaParam = 1, ticksSize = 0.5, stats= rank) +
    labs(title=i) + theme(plot.title = element_text(hjust = 0.5, face="bold"))
    print(plt)
}

heatmap genes in GOBP NEUTROPHIL … (Trail Trail)

go_bp_neutrophil_genes = subset(fgsea, fgsea$pathway=="GOBP_NEUTROPHIL_CHEMOTAXIS")
go_bp_neutrophil_genes = unlist(go_bp_neutrophil_genes$leadingEdge)


subset <- rld[go_bp_neutrophil_genes, 7:12]

# scale and center the values
mat <- as.matrix(scale(t(subset), center = T))

# basic plot to check we're plotting something sensible
#pheatmap(t(mat))

# spruce it up a bit..
ann <- data.frame(Condition = c(rep("Healthy_control", 3), rep("Healthy_cytokine", 3)))
rownames(ann) <- rownames(mat)
col <- c( "forestgreen","blue")
names(col) <- c("Healthy_cytokine", "Healthy_control")
ann_col <- list(Condition = col)

#pheatmap(t(mat), 
         #show_rownames = TRUE,
         #annotation_col = ann,
         #annotation_colors = ann_col,
         #main = "GOBP_NEUTROPHIL_CHEMOTAXIS",
         #labels_row = rownames(subset), # figure out remove row labels
         #fontsize_row = 6,
         #color = hcl.colors(100, "PRGn",rev=F))

ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "GOBP_NEUTROPHIL_CHEMOTAXIS",
                        labels_row = rownames(subset),
                        fontsize = 6,
                        legend = TRUE,
                       heatmap_legend_param =list(title="z-score",at=c (-1.5,-1,-0.5,0,0.5,1,1.5)),
        color=hcl.colors(100, 'PRGn',rev=F))

Trial Trial

go_bp_neutrophil_migration = subset(fgsea, fgsea$pathway=="GOBP_NEUTROPHIL_MIGRATION")
go_bp_neutrophil_migration = unlist(go_bp_neutrophil_migration$leadingEdge)


subset <- rld[go_bp_neutrophil_migration, 7:12]

# scale and center the values
mat <- as.matrix(scale(t(subset), center = T))

# basic plot to check we're plotting something sensible
#pheatmap(t(mat))

# spruce it up a bit..
ann <- data.frame(Condition = c(rep("Healthy_control", 3), rep("Healthy_cytokine", 3)))
rownames(ann) <- rownames(mat)
col <- c( "forestgreen","blue")
names(col) <- c("Healthy_cytokine", "Healthy_control")
ann_col <- list(Condition = col)

pheatmap(t(mat), 
         show_rownames = TRUE,
         annotation_col = ann,
         annotation_colors = ann_col,
         main = "GOBP_NEUTROPHIL_MIGRATION",
         labels_row = rownames(subset), # figure out remove row labels
         fontsize_row = 6,
         color = hcl.colors(100, "PRGn",rev=F))

ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "GOBP_NEUTROPHIL_MIGRATION",
                        labels_row = rownames(subset),
                        fontsize = 6,
                        legend = TRUE,
                       heatmap_legend_param =list(title="z-score",at=c (-1.5,-1,-0.5,0,0.5,1,1.5)),
        color=hcl.colors(100, 'PRGn',rev=F))

KEGG Pathway

# read in gmt file
pathway_kegg <- gmtPathways("/Users/aungphyo/Downloads/c2.cp.kegg.v2023.1.Hs.symbols.gmt.txt")
head(pathway_kegg, 1)
## $KEGG_N_GLYCAN_BIOSYNTHESIS
##  [1] "ALG13"   "DOLPP1"  "RPN1"    "ALG14"   "MAN1B1"  "ALG3"    "B4GALT1"
##  [8] "MGAT5"   "RPN2"    "STT3A"   "MGAT3"   "DAD1"    "MGAT2"   "ALG12"  
## [15] "TUSC3"   "MAN1C1"  "DPM2"    "DPM1"    "GANAB"   "ALG1"    "MGAT4A" 
## [22] "ALG10B"  "STT3B"   "MAN1A2"  "ALG10"   "ALG11"   "ALG8"    "ALG2"   
## [29] "DPAGT1"  "RFT1"    "DPM3"    "DDOST"   "MGAT4B"  "ALG6"    "MAN2A2" 
## [36] "MAN1A1"  "MAN2A1"  "ST6GAL1" "B4GALT3" "ALG5"    "B4GALT2" "MGAT5B" 
## [43] "ALG9"    "MOGS"    "FUT8"    "MGAT1"
## convert result object to dataframe
res <- as.data.frame(res1)
res$hgnc_symbol <- rownames(res)

# compute summary stat
fgsea_rank <- res %>%
              dplyr::select(hgnc_symbol, log2FoldChange) %>%
              na.omit() %>%
              distinct() %>%
              group_by(hgnc_symbol) %>%
              summarize(log2foldchange=mean(log2FoldChange))

fgsea_rank
## # A tibble: 16,478 × 2
##    hgnc_symbol log2foldchange
##    <chr>                <dbl>
##  1 ""                 -0.0811
##  2 "A1BG"              0.178 
##  3 "A1CF"              0.807 
##  4 "A2M"               0.690 
##  5 "A2ML1"            -0.669 
##  6 "A2MP1"             0.232 
##  7 "A4GALT"            0.921 
##  8 "A4GNT"            -0.651 
##  9 "AAAS"             -0.282 
## 10 "AACS"              0.124 
## # ℹ 16,468 more rows

create named list

rank <- deframe(fgsea_rank)
head(rank, 20)
##                    A1BG        A1CF         A2M       A2ML1       A2MP1 
## -0.08106658  0.17779131  0.80699938  0.69022080 -0.66934621  0.23223054 
##      A4GALT       A4GNT        AAAS        AACS       AADAT       AAGAB 
##  0.92105758 -0.65100877 -0.28201115  0.12395885 -0.68486107  0.36251058 
##        AAK1       AAMDC        AAMP       AANAT        AAR2        AARD 
##  0.06013558 -0.29388262  0.10425325  0.16858497  0.05793644  0.77611830 
##       AARS1       AARS2 
## -0.66925235  0.04273303
# run fgsea
fgsea_kegg <- fgsea(pathways=pathway_kegg, stats=rank, nperm=1000)

fgseaResTidy_kegg <- fgsea_kegg %>%
  as_tibble() %>%
  arrange(desc(NES))

# Show in a nice table:
fgseaResTidy_kegg %>%
  dplyr::select(-leadingEdge, -ES, -nMoreExtreme) %>%
  arrange(padj) %>%
  DT::datatable()

Cluster Profiler of KEGG Analysis

df <- as.data.frame(res1)
df$hgnc_symbol <- rownames(df)
info <- getBM(attributes=c("hgnc_symbol",
                           "entrezgene_id"),
                  filters = c("hgnc_symbol"),
                  values = df$hgnc_symbol,
                  mart = mart,
                  useCache=FALSE)
tmp <- merge(df, info, by="hgnc_symbol")

# subset the dataframe to include only stat sig genes
tmp <- tmp[tmp$padj < 0.05,]
OrgDb <- org.Hs.eg.db

geneList <- as.vector(tmp$log2FoldChange)
names(geneList) <- as.character(tmp$entrezgene_id)
gene <- na.omit(as.character(tmp$entrezgene_id))
gene_list<-sort(geneList,decreasing = TRUE)
gene_list
##       6372       6374       3576      84419       3569  105378220       3791 
## 11.3322852 10.5889919 10.3238743 10.0963987  9.3848862  9.3296122  9.0184181 
##       2921       1440       1437       4321       5617     388125       2919 
##  8.7271651  8.6261102  8.5513923  8.5204213  8.4051571  8.1954232  8.1130549 
##       4314       1591     404203       6781       3627       2920       2162 
##  8.0982838  8.0938212  7.8361456  7.7369169  7.4591768  7.0021936  6.9134641 
##      83953       6364       4843       3934       3290       6750     440822 
##  6.8709266  6.7990105  6.5621121  6.5347256  6.4864122  6.4816071  6.4510365 
##       6355     169044  100288077       1910      54210     116372      84870 
##  6.3897545  6.3246536  6.2733515  6.0941413  6.0528831  6.0368572  5.9920158 
##        597       5266       6356      56265       4312       4319       1618 
##  5.9566646  5.9114700  5.9100328  5.8557603  5.7857088  5.7080011  5.6116183 
##      25884       2706      26298       6348       5197       4495       6943 
##  5.5273737  5.5165452  5.4802298  5.4679687  5.3995657  5.3445528  5.2017422 
##       5105       3055       5743       1999       6347       2675       6401 
##  5.1978269  5.1810093  5.1177493  5.0960788  4.9730456  4.9084552  4.9022804 
##       6547      54972       7130       7980       6289       8740       6354 
##  4.8464846  4.7225141  4.6939459  4.5768761  4.4773059  4.4741446  4.4142540 
##        768      22917       3589      80319      91584     153218       3294 
##  4.3353112  4.3249605  4.2729790  4.2532467  4.2518811  4.2257611  4.2157939 
##        943       6648        629        718       1520       <NA>       3242 
##  4.1646830  4.1482264  4.1244039  4.0437587  3.9508458  3.9361832  3.8602813 
##     338440       9283      50486      10846      90632      64116      11309 
##  3.8022648  3.7939711  3.7848556  3.7524333  3.7524333  3.6903125  3.6653533 
##       6579     145741     221687        627       9982       5196       3641 
##  3.6501659  3.6454723  3.6012639  3.5963535  3.5653122  3.5553244  3.5466855 
##      64093       6330      10158      91768       8013       8875       2153 
##  3.4989874  3.4928756  3.4925996  3.4476461  3.4450963  3.4429196  3.4386832 
##  100132565      80149       3081       5142       1645       5452       7434 
##  3.4325161  3.4230267  3.3982491  3.3962489  3.3361373  3.3191197  3.3003175 
##       6751       6352      90226       1286       2255       9023       6542 
##  3.2816402  3.2630191  3.2594467  3.2445398  3.2301619  3.2089920  3.2058949 
##        650       6288      90865      55350      54360        684       9308 
##  3.1883131  3.1575477  3.1551867  3.1330152  3.1188584  3.1162908  3.0980438 
##      57795       5742       3976       5997       3038       2643     283455 
##  3.0894214  3.0579256  3.0468740  3.0372230  3.0202993  3.0139610  2.9958830 
##     259307       9568       9630       3759     114897      11197      64127 
##  2.9796812  2.9772037  2.9525460  2.9341891  2.9238018  2.9231634  2.9090356 
##      51561       8876      51655     150094        238       <NA>      29774 
##  2.8620031  2.8579235  2.8536342  2.8504449  2.8459515  2.8436717  2.8436717 
##       3429       7128       2537      11259       8870       8942       4494 
##  2.8383732  2.8337891  2.8219624  2.8123461  2.7949213  2.7924299  2.7899958 
##        174        135       3604      79895      10371       5069       8743 
##  2.7827315  2.7820393  2.7753089  2.7710264  2.7636747  2.7631249  2.7406373 
##       5874       1646     283768      83401     112399      27076       6096 
##  2.7301275  2.7124329  2.7112901  2.6639096  2.6622240  2.6557425  2.6511791 
##     387758        231     283208      84665       4929       9340      10135 
##  2.6425428  2.6422161  2.6081720  2.6031330  2.5918390  2.5756615  2.5544253 
##       9076       1827      10964      58538      27286       5166      27147 
##  2.5541127  2.5388659  2.5291294  2.5251623  2.5198552  2.5172166  2.5097798 
##       4502       9536       7133       5144       2201       7127      55118 
##  2.5093024  2.5029954  2.5028246  2.5000655  2.4903381  2.4875910  2.4851455 
##      64332      79772     375567       3965      92737         19       1435 
##  2.4811601  2.4748258  2.4737595  2.4687556  2.4609747  2.4517134  2.4433189 
##       1294     164781       3575       4501  102725072      80852       3929 
##  2.4324068  2.4251400  2.4116020  2.4073919  2.3977998  2.3949919  2.3892795 
##       <NA>     220441       7482       <NA>        952       2239       <NA> 
##  2.3794832  2.3710273  2.3567491  2.3391900  2.3317742  2.3073166  2.3059965 
##       2152       6422      23516     132332      54674       5270       5734 
##  2.3045770  2.2908049  2.2900139  2.2876031  2.2781503  2.2769559  2.2725327 
##       1604      84251       4792     219527       <NA>       1285     342897 
##  2.2718304  2.2683166  2.2660813  2.2635305  2.2470965  2.2469415  2.2384750 
##      55273      11320       5352       3383      29126      10538      29992 
##  2.2376300  2.2245281  2.2014496  2.2008800  2.1940845  2.1916785  2.1895386 
##        273      84935        760       3656       <NA>      55022      55790 
##  2.1864907  2.1861504  2.1824864  2.1699845  2.1685060  2.1573938  2.1408918 
##       6659        654       8638       3914       5327      10100      26018 
##  2.1332042  2.1279853  2.1272125  2.1255749  2.1241631  2.1219058  2.1135703 
##       7037      80781       1117       7045      22795        771       7803 
##  2.1119885  2.1093371  2.1093205  2.1023253  2.1003911  2.0947372  2.0912521 
##     116843       4121      80704     147495       3600      11174       5971 
##  2.0621979  2.0564523  2.0504095  2.0462249  2.0419582  2.0368682  2.0367339 
##        637       3918      23551       2256       4129      80036      81788 
##  2.0314521  2.0294376  2.0257341  2.0244185  2.0241586  2.0196353  2.0189946 
##       9732       2118       5806       7043      56649      27233     152007 
##  2.0169718  2.0156333  2.0148118  2.0132452  2.0029384  1.9948259  1.9855690 
##       6689      79853      58189      80380       <NA>      79056      26872 
##  1.9823669  1.9775407  1.9713515  1.9659428  1.9606296  1.9510382  1.9436903 
##       2791     387763        330       4791       4128       6303      56243 
##  1.9404240  1.9390971  1.9367922  1.9317821  1.9087179  1.9038197  1.9036220 
##      55332       3574      65108       9890      22822      83648       7474 
##  1.8990243  1.8939961  1.8868972  1.8821501  1.8791618  1.8736684  1.8668802 
##       6590      23308  102723996       5210       3855      57419      56624 
##  1.8612835  1.8492005  1.8492005  1.8475002  1.8438879  1.8389378  1.8266831 
##       8622      56548      10863       2710       5321       4891       8362 
##  1.8148164  1.8033722  1.7941307  1.7939779  1.7864193  1.7860286  1.7851150 
##     554313      51537       4973        284       7857       7035       1906 
##  1.7851150  1.7843375  1.7837884  1.7831801  1.7792871  1.7776906  1.7690311 
##     374286       4493       <NA>       3624      90293       1909       1030 
##  1.7659786  1.7614686  1.7597638  1.7579487  1.7557427  1.7541886  1.7526451 
##      83641       8644       3487      57132       8862        687       9420 
##  1.7440519  1.7397855  1.7373912  1.7369081  1.7344549  1.7290918  1.7203860 
##  100507421      10418       8828       2034       4052       3601       9759 
##  1.7182424  1.7172623  1.7107623  1.6964069  1.6935622  1.6922588  1.6853861 
##  100093631       4824       2678       1282     347148      54898       8869 
##  1.6754818  1.6681137  1.6675961  1.6667105  1.6661434  1.6636443  1.6631794 
##       3887       2687       2202      65249       9388      84951       2294 
##  1.6592847  1.6546677  1.6531009  1.6497228  1.6460622  1.6457923  1.6355201 
##      51286      51129     283209        767       <NA>      27242     388630 
##  1.6287234  1.6280404  1.6240743  1.6170934  1.6149582  1.6140605  1.6116720 
##     723790       <NA>     171546       9123       1236      54757      27115 
##  1.6102223  1.6045521  1.5984626  1.5945833  1.5944411  1.5943513  1.5866145 
##       8838      55959       1004     340152      55092       9201       <NA> 
##  1.5848266  1.5825527  1.5822057  1.5795901  1.5787461  1.5753268  1.5734459 
##       5768        734       6513      57559      25987       9589        133 
##  1.5623333  1.5594443  1.5552638  1.5530608  1.5457205  1.5421650  1.5342329 
##     197021       9510      84879       1675       7804      84466      54498 
##  1.5336724  1.5315296  1.5275744  1.5223747  1.5208158  1.5094201  1.5087733 
##       9052      57561        390       3910      10090         48       1281 
##  1.5026325  1.5020191  1.4961536  1.4913986  1.4895352  1.4863075  1.4860208 
##       5737       3728       3939      23710       6533      80824     387914 
##  1.4840433  1.4830187  1.4723738  1.4708070  1.4705807  1.4650469  1.4604790 
##       4045      85027      10200       2863       2252      23286       6558 
##  1.4595127  1.4579300  1.4528814  1.4506354  1.4362804  1.4339592  1.4327173 
##      10105       9542       8767      23704     441024      55686       5163 
##  1.4324646  1.4317365  1.4314555  1.4283351  1.4281651  1.4237100  1.4221341 
##      63027       4163       4982      56947       8349       4254      79845 
##  1.4134843  1.4130581  1.4125795  1.4075133  1.4058427  1.4043247  1.3981577 
##       5865       4729       2621      85450       4837       3732       4282 
##  1.3978296  1.3903504  1.3877515  1.3874222  1.3846137  1.3798036  1.3760380 
##      79899      11228     388722      26207       3176     118611      94240 
##  1.3756593  1.3692588  1.3675697  1.3654297  1.3424612  1.3395798  1.3384025 
##     220164       5214      80206       1846       5230       3075      26064 
##  1.3346404  1.3320601  1.3319719  1.3281052  1.3280071  1.3269416  1.3223201 
##      84915       1284       2182      10560       7274      64108       6482 
##  1.3206208  1.3193615  1.3175591  1.3132643  1.3127520  1.3062249  1.3040376 
##     399694       2048       3667      55351      84952       7167     220108 
##  1.2968433  1.2929104  1.2854164  1.2834862  1.2793142  1.2743507  1.2698969 
##     256227     401312      57724      92126       2495       8710       1843 
##  1.2674479  1.2674479  1.2647247  1.2623618  1.2604675  1.2580868  1.2495288 
##      23002      83478      10409       9636      10318       9590        664 
##  1.2449698  1.2449071  1.2412186  1.2341711  1.2291271  1.2280323  1.2265814 
##       4938     144811       8503       1820      11200       6775      55274 
##  1.2212766  1.2155913  1.2154699  1.2152698  1.2129297  1.2102059  1.2091983 
##      92610         25       6327      83938       1890      54873      10758 
##  1.2072612  1.2042242  1.2039787  1.2034635  1.1912914  1.1892279  1.1881517 
##        272      23670     387522       8793       8744       2869      26091 
##  1.1878053  1.1862295  1.1856482  1.1848819  1.1790470  1.1790204  1.1779415 
##     135112       1000      23764       5687     221468     149840       9180 
##  1.1723648  1.1689135  1.1669461  1.1626076  1.1577177  1.1570879  1.1542988 
##     116238     255738      55366       1903      11040       8844     140609 
##  1.1540234  1.1532698  1.1481708  1.1479246  1.1474036  1.1444740  1.1441251 
##      63876     404550       6692      80790       1847      28962       1991 
##  1.1433133  1.1412526  1.1411834  1.1382891  1.1355747  1.1307295  1.1289677 
##       6573      10125       6772       2590       5445      55640     126969 
##  1.1270542  1.1249563  1.1193473  1.1161493  1.1153853  1.1137732  1.1115474 
##      57484       5337       3801       5721       <NA>       2597      23531 
##  1.1001710  1.0912916  1.0904274  1.0903880  1.0870239  1.0862643  1.0810351 
##       2633      57552      57718       5563      58472       4794      11118 
##  1.0791153  1.0749112  1.0741555  1.0707376  1.0688687  1.0686707  1.0683455 
##     255231  110599564       3006       4217       2026     153830       5223 
##  1.0681683  1.0667709  1.0650791  1.0639852  1.0616831  1.0575984  1.0558748 
##      84957       2745     147015      64859       5293      84230     728819 
##  1.0548470  1.0499428  1.0458352  1.0449780  1.0448701  1.0434347  1.0423299 
##       8614     169200       2619      60370      57103     114907       5805 
##  1.0416618  1.0416538  1.0413061  1.0395105  1.0382544  1.0376682  1.0368838 
##      84623       3091       8553       9945     347733      57026      29923 
##  1.0346820  1.0337769  1.0337596  1.0322228  1.0314318  1.0270230  1.0242083 
##        602        219      54205       9141       5091       6095       <NA> 
##  1.0227577  1.0191876  1.0141319  1.0131400  1.0121211  1.0091311  1.0083718 
##       4257      90362      55848      55858      60312       7378     115273 
##  1.0034637  1.0029912  1.0001550  0.9980961  0.9972798  0.9956975  0.9919330 
##      91614      10962       5828      54495       1805      57591       1051 
##  0.9890222  0.9871953  0.9865572  0.9861347  0.9850396  0.9846302  0.9829811 
##       9394       1503       2683        226       5507       1513       9056 
##  0.9777741  0.9771920  0.9727527  0.9725197  0.9715234  0.9696171  0.9693096 
##      92565      10437      83874       7088      51015      23432      90874 
##  0.9688442  0.9686821  0.9666586  0.9664371  0.9622668  0.9621481  0.9618497 
##       7050       2821      51099       6617        649        716     115361 
##  0.9611807  0.9599547  0.9583135  0.9582737  0.9558181  0.9557047  0.9481687 
##      79135       4249       4830       5125      10063       5791      64420 
##  0.9444318  0.9433509  0.9405312  0.9403876  0.9383455  0.9371124  0.9337726 
##       <NA>      53373      54541      84695       5033      23158      65062 
##  0.9327869  0.9319708  0.9300922  0.9294691  0.9294613  0.9275247  0.9271610 
##       7046        715      53947       5604       6884       5128      54897 
##  0.9237624  0.9217967  0.9210576  0.9199369  0.9162246  0.9107998  0.9084229 
##       2997      11227      23604        573      55314       5738       3672 
##  0.9074359  0.9071261  0.9062478  0.9057783  0.9029995  0.9026483  0.9008954 
##      10626        898      54502       9955     153769     374882       <NA> 
##  0.8990957  0.8984041  0.8981790  0.8974274  0.8969908  0.8965870  0.8962913 
##       2697     345757       2770      55248       2534       6567      23529 
##  0.8957626  0.8912067  0.8899164  0.8894040  0.8874222  0.8872760  0.8840192 
##      64359       2717      29103        896       3105        586       8407 
##  0.8838166  0.8808455  0.8799451  0.8789563  0.8785815  0.8763523  0.8758880 
##      30001       3097       7837       3017        205       3399       5519 
##  0.8754573  0.8753097  0.8743873  0.8684122  0.8681760  0.8673262  0.8650464 
##      85441     375790        516      64778      23136      54566        567 
##  0.8641717  0.8638651  0.8626703  0.8619314  0.8599478  0.8583834  0.8574400 
##        444      25945       6641       1263      85464       3490       3099 
##  0.8548925  0.8548481  0.8531138  0.8526289  0.8504713  0.8471220  0.8465139 
##      80723       8463       2644      26355        481      56937        217 
##  0.8461682  0.8461562  0.8441329  0.8428476  0.8422648  0.8417471  0.8414897 
##      64951       1326     140885      57085      64651     124935       1052 
##  0.8406767  0.8402766  0.8381766  0.8375952  0.8353920  0.8331214  0.8315714 
##      25850      25841       1662      10678       6892       3912      23406 
##  0.8278220  0.8260184  0.8246940  0.8246398  0.8243235  0.8238489  0.8221168 
##      84937       4883     387521     169792      11182       6891      27122 
##  0.8206232  0.8191299  0.8177965  0.8177714  0.8164435  0.8149869  0.8149316 
##      57106       2774        533       4793       9572      23550       1349 
##  0.8100798  0.8048066  0.8043596  0.8037636  0.8009981  0.7988297  0.7974690 
##        775  100874369      51141     653583      11247      10452      10950 
##  0.7961606  0.7961606  0.7961354  0.7950551  0.7941518  0.7935707  0.7898079 
##      57099       5955       5993      55766     768211       4155      10632 
##  0.7897117  0.7878394  0.7863121  0.7851100  0.7832244  0.7802787  0.7800892 
##      84940        483      11030     388962        136     653308      58476 
##  0.7795785  0.7787263  0.7739462  0.7729190  0.7699651  0.7683068  0.7665214 
##     493856       6888      84300     120103      57222      10272       3052 
##  0.7630854  0.7622574  0.7618316  0.7617046  0.7593177  0.7580779  0.7571075 
##       4047      79888       8795     266812       3455       8848       6319 
##  0.7557889  0.7552539  0.7545885  0.7541296  0.7541287  0.7536711  0.7528341 
##      64928      23480       4709       5699       4790       8702       6515 
##  0.7493184  0.7488785  0.7485480  0.7483724  0.7479659  0.7459784  0.7456293 
##       5351      57537       9562        355      56913       2200      10588 
##  0.7448787  0.7441715  0.7438667  0.7433445  0.7429267  0.7427118  0.7411545 
##       2737     152100       4071       1347       4814       4651      79642 
##  0.7399527  0.7395517  0.7388898  0.7388643  0.7376198  0.7339882  0.7325826 
##      83930       7436      55164      84168       5393       5905       8692 
##  0.7319183  0.7317795  0.7278133  0.7276034  0.7272847  0.7255195  0.7251378 
##       7584      51296       3482        518      50640       2820     375449 
##  0.7234580  0.7229554  0.7227101  0.7207201  0.7205880  0.7186385  0.7170495 
##       7295      11057       1845      80142        623      57213       5606 
##  0.7121677  0.7111608  0.7110419  0.7108439  0.7107934  0.7105530  0.7080622 
##       5211      11120      55008       1465       7168        677       2519 
##  0.7069136  0.7065547  0.7056446  0.7019107  0.7016020  0.7015881  0.7007240 
##       5315      27249      55831       3267      63875      10061       3336 
##  0.6994971  0.6993260  0.6978760  0.6968726  0.6965350  0.6958194  0.6943765 
##     404093       7975       3028      81671      64782     153339       1290 
##  0.6942555  0.6941285  0.6939515  0.6939447  0.6927426  0.6926657  0.6925629 
##      60493      51422     160857      23235      51726         53     729438 
##  0.6909669  0.6895946  0.6888510  0.6883285  0.6878859  0.6871484  0.6869233 
##      56477     140606     548645      27235      23446     283820  102723728 
##  0.6863983  0.6861831  0.6848175  0.6845292  0.6840745  0.6833388  0.6833388 
##      56851       9060     285761      84284       4125      65991       1112 
##  0.6828640  0.6815931  0.6812569  0.6782428  0.6781873  0.6774812  0.6771476 
##      10476      55295      55969      27090     440574      57089     388650 
##  0.6768052  0.6767648  0.6765092  0.6761837  0.6759230  0.6752537  0.6748514 
##     170384      83440       8837      23541      11157      56895       6764 
##  0.6735407  0.6721866  0.6715911  0.6705073  0.6704444  0.6676869  0.6675313 
##     139735      26035      84627       7416      10186       3459      55917 
##  0.6668724  0.6667655  0.6665325  0.6659282  0.6657394  0.6654487  0.6644620 
##       1390      85465       6890      55501      79680     122416      29095 
##  0.6630633  0.6628314  0.6625659  0.6617689  0.6602219  0.6596289  0.6590899 
##      27089      55754      24145      79796      55033      11167       6182 
##  0.6584924  0.6576149  0.6574109  0.6567372  0.6561774  0.6556135  0.6530137 
##      91750       3145      83937      81533  100293516       7873       8934 
##  0.6522633  0.6511688  0.6510102  0.6506985  0.6499770  0.6489446  0.6479863 
##      79016      51400       7186      56180       4707      57134      80219 
##  0.6468475  0.6468374  0.6467965  0.6467919  0.6461122  0.6455590  0.6444532 
##      54814      51728      84876      26521      10471     375346       9131 
##  0.6440915  0.6436581  0.6436451  0.6430927  0.6428118  0.6412366  0.6401704 
##      23412  100526842     166815      79647      56942      58515      10957 
##  0.6400363  0.6388990  0.6386573  0.6386081  0.6380095  0.6379507  0.6362425 
##        705      11275       1718       7064       5587      54583  100131801 
##  0.6353078  0.6346742  0.6345085  0.6343709  0.6334591  0.6330489  0.6326444 
##       1973       5638       5698     552900      10970      55137      51303 
##  0.6316575  0.6293616  0.6286575  0.6279692  0.6270531  0.6261793  0.6258914 
##       2023       9600       7511      51651      55188      56650      29100 
##  0.6257159  0.6248648  0.6247700  0.6245997  0.6245928  0.6238530  0.6230613 
##      64854      10542      85015       1454     159195      10213       4637 
##  0.6223419  0.6222458  0.6220202  0.6209925  0.6209361  0.6201361  0.6200942 
##      64768       3460      64065      84817       7386      10011       1528 
##  0.6175898  0.6158552  0.6158231  0.6152531  0.6150388  0.6146626  0.6132777 
##     285368       4728      23258      79693       8402     166647      54928 
##  0.6128131  0.6127293  0.6122664  0.6119835  0.6112575  0.6106291  0.6104851 
##     114789      10525      81552      55905      90627      50808     126321 
##  0.6101448  0.6100255  0.6099966  0.6099711  0.6080918  0.6066748  0.6052521 
##      57154      81603      79139       6499       7187       7001     253461 
##  0.6033936  0.6030303  0.6019621  0.6014824  0.6013756  0.6010787  0.6001307 
##       7371      10681      56902      56951      80301     647087       5245 
##  0.5993688  0.5992946  0.5992867  0.5989692  0.5984466  0.5980764  0.5979784 
##     160518      51184       5795      55362      10553     253430      28985 
##  0.5977376  0.5964412  0.5954499  0.5950255  0.5950133  0.5945713  0.5933431 
##      84153      10385      56342      84987      94081       6925     150274 
##  0.5924294  0.5922580  0.5917103  0.5912987  0.5910887  0.5908536  0.5895714 
##      84883      25946       5819     114134      26517      84340      79109 
##  0.5891724  0.5885944  0.5866007  0.5856401  0.5855408  0.5845668  0.5837672 
##      56926       8543      54741         27      55210       5872       5202 
##  0.5837400  0.5831436  0.5828817  0.5827801  0.5813582  0.5811642  0.5809034 
##       3659      10195         47      85363       9654      57136      25994 
##  0.5805598  0.5794566  0.5794139  0.5789484  0.5788656  0.5781753  0.5777173 
##      64983     388753      84833      55312      11346       4696        950 
##  0.5776701  0.5776415  0.5775846  0.5773408  0.5770953  0.5764207  0.5762340 
##  107282092      10123     401505      64718      23780      84668      59286 
##  0.5761257  0.5761156  0.5757391  0.5755073  0.5752557  0.5749503  0.5735913 
##       9486        506       5720       9351       4695      51371       2021 
##  0.5725779  0.5715088  0.5714641  0.5713777  0.5704948  0.5698803  0.5695908 
##      24139       7353       8774       6185      29071      64981      55916 
##  0.5688316  0.5684075  0.5676661  0.5671811  0.5665638  0.5664300  0.5661543 
##       9040      79158      10102      29940       4719      50807       6610 
##  0.5658186  0.5648420  0.5638569  0.5637454  0.5636606  0.5624770  0.5622036 
##     151987       8801        292      55322      80273       5526       9554 
##  0.5616725  0.5615534  0.5610579  0.5610513  0.5604397  0.5591788  0.5570439 
##      51021       5693       2181       8527      79080      10384       4710 
##  0.5562576  0.5550606  0.5546159  0.5536679  0.5528721  0.5527116  0.5523250 
##       5440       4701       1615      51645      64225       5583      84858 
##  0.5523110  0.5520989  0.5510285  0.5510261  0.5507488  0.5507432  0.5504331 
##      23072     114818        435      51421       5708      51109       4697 
##  0.5502635  0.5497343  0.5456532  0.5446283  0.5445468  0.5443224  0.5441648 
##      25829       5717      10162       1478       5696       3682      51528 
##  0.5439591  0.5436304  0.5434728  0.5433190  0.5414104  0.5407435  0.5402900 
##     131076      26123      83607       8572       9261      23264       9550 
##  0.5402266  0.5390955  0.5389076  0.5376765  0.5374228  0.5373290  0.5363388 
##      10605      23230       3915       9377       1912      79053       6637 
##  0.5361125  0.5359759  0.5350472  0.5347057  0.5345438  0.5342814  0.5336156 
##      55624      23385     140465      10072       7920      80777         39 
##  0.5330267  0.5328298  0.5327878  0.5323215  0.5322256  0.5321143  0.5320404 
##        578       4711       8683       5704       4591     134145      10533 
##  0.5314069  0.5312307  0.5308109  0.5303995  0.5286507  0.5284722  0.5282502 
##       4702      79581      81689       7532     221710       9997       1350 
##  0.5282466  0.5277393  0.5276999  0.5269559  0.5268754  0.5265903  0.5254431 
##       9601     160760     113444       6632       4258       7360      27440 
##  0.5247601  0.5242841  0.5240534  0.5231692  0.5230792  0.5227206  0.5224988 
##      11334       2588        120       6484       7328      80308       1666 
##  0.5223601  0.5216341  0.5201473  0.5201275  0.5197406  0.5195530  0.5192753 
##       7633       3301     339487     401152       6836       8460       5045 
##  0.5185809  0.5185192  0.5184296  0.5175781  0.5171052  0.5167923  0.5161709 
##      90701       6389       8992      64764      55144      55331      10924 
##  0.5161338  0.5145770  0.5144378  0.5136820  0.5135555  0.5132340  0.5127049 
##       3454      55177      51684       4712      11274      79650      84299 
##  0.5125154  0.5125085  0.5118626  0.5112021  0.5108026  0.5107355  0.5102225 
##       5796      10785      55262       7169      51573      26090       7003 
##  0.5099301  0.5098664  0.5091789  0.5091167  0.5088987  0.5078918  0.5065330 
##      55062       3029      64374     408050       7905       3419       7922 
##  0.5058647  0.5058197  0.5049012  0.5042375  0.5032555  0.5024515  0.5019989 
##       4726       9854  100287932      22824       1540        475       1737 
##  0.5016787  0.5013913  0.5010979  0.5009873  0.5008089  0.5005903  0.5003437 
##      10312        813      54920      51081        708     283149      51072 
##  0.4998497  0.4998115  0.4992063  0.4981791  0.4977727  0.4972220  0.4966053 
##      54949     221294       4694      55633       5538      51103       9446 
##  0.4965892  0.4963750  0.4962253  0.4961578  0.4953158  0.4946816  0.4946585 
##       1965      51287      80185     140707      26225       9334      51009 
##  0.4941034  0.4940410  0.4939040  0.4938653  0.4934304  0.4932684  0.4928175 
##       9019       9553       1984       4190       2969      57192      64855 
##  0.4917963  0.4913034  0.4903219  0.4903157  0.4902077  0.4900966  0.4895552 
##        377        529      22948       5034      11153      51647        162 
##  0.4893753  0.4889077  0.4888635  0.4882563  0.4881316  0.4880162  0.4876453 
##       1652  100037417         50      84309     113251       4758       6183 
##  0.4864432  0.4864432  0.4855452  0.4853934  0.4851152  0.4848776  0.4841113 
##      10237       6652     128869      28511      83460       1024       4708 
##  0.4840496  0.4837757  0.4835878  0.4835041  0.4833687  0.4829741  0.4827231 
##      54512      10940       9816     729991      10952      54918      55741 
##  0.4826471  0.4825338  0.4818020  0.4811610  0.4809917  0.4802075  0.4794579 
##  111089941      22862      64087       5683       5688      10975      23560 
##  0.4794579  0.4778224  0.4771817  0.4767560  0.4766003  0.4763471  0.4762218 
##      64215       9551      51121     207063      10609       3182     339344 
##  0.4754261  0.4748031  0.4741460  0.4739536  0.4724291  0.4723589  0.4721996 
##       1371       7520       9337      51022       5770      81892     440400 
##  0.4714190  0.4710509  0.4704255  0.4703260  0.4697270  0.4693231  0.4680180 
##      80267       9175        262      11234      54806       6881       5684 
##  0.4678376  0.4676523  0.4668321  0.4656737  0.4655863  0.4651641  0.4647073 
##      51491      55272      57128       1892     399909       6184      51264 
##  0.4646653  0.4646195  0.4632789  0.4627928  0.4626692  0.4625663  0.4617082 
##      22821       9513     203260       7417      54480      57669        488 
##  0.4607853  0.4604412  0.4604285  0.4603870  0.4600772  0.4600770  0.4593096 
##      56983      57688      92579      81894       3945      23352       6723 
##  0.4592396  0.4585233  0.4584248  0.4580207  0.4579239  0.4576828  0.4575684 
##      10197      84259     152002      55658     130557        522      85456 
##  0.4573002  0.4572685  0.4570355  0.4568333  0.4565553  0.4563212  0.4562265 
##      53343       4714       8500       2356       3074       7334      51079 
##  0.4556866  0.4555943  0.4549978  0.4545966  0.4543940  0.4540786  0.4538448 
##      56894     283635      29078      23404       3685      64432      29090 
##  0.4534550  0.4531284  0.4522870  0.4520918  0.4513706  0.4512460  0.4509786 
##      55298      51124      55862      64963       4664      51128      29954 
##  0.4508919  0.4505577  0.4502427  0.4496308  0.4494616  0.4494194  0.4492846 
##     140823       9927      56994       5695     112939       1020      50999 
##  0.4485810  0.4480849  0.4480083  0.4476704  0.4476565  0.4468605  0.4467146 
##      55290       7384      81853      27248      55361      27068      23484 
##  0.4466732  0.4465981  0.4455359  0.4454875  0.4453167  0.4451440  0.4447954 
##       4191      26155      56954      64840     114971       9352     159371 
##  0.4444954  0.4443932  0.4440057  0.4439081  0.4436820  0.4432851  0.4424240 
##      84272     113655      92106      81572      51399      56834        498 
##  0.4421186  0.4417743  0.4415032  0.4414595  0.4413871  0.4410114  0.4409176 
##       2193     200312     118487       7260      11316        514     388789 
##  0.4408128  0.4399104  0.4397035  0.4396203  0.4394146  0.4378152  0.4367137 
##      51650     253512       4706       5873      10534      23787     116254 
##  0.4364897  0.4359467  0.4358310  0.4355516  0.4343339  0.4341189  0.4340960 
##      55048      25764       5860      10440       2954      11321      10935 
##  0.4339955  0.4327792  0.4313768  0.4307705  0.4305081  0.4303823  0.4296889 
##      28232       7284        545       5691       8073      51075     112752 
##  0.4295752  0.4292735  0.4292686  0.4292267  0.4291593  0.4289914  0.4288715 
##      79770      51247       5715      22845      25977      65083      53916 
##  0.4285343  0.4285307  0.4282804  0.4280132  0.4272502  0.4272174  0.4269896 
##      80146      55847       1147      10076      79084      10514      51654 
##  0.4268238  0.4266939  0.4266466  0.4249244  0.4240934  0.4239350  0.4239327 
##      57609      55284       5435       3308      81034       6921      51657 
##  0.4238340  0.4224128  0.4221491  0.4214249  0.4213866  0.4209006  0.4205818 
##      28991       1861      23373  100129361     114793       2107       5261 
##  0.4204258  0.4202546  0.4199388  0.4196888  0.4189926  0.4182291  0.4168947 
##       1021      80028       5611      79142       6388      51142      64748 
##  0.4166489  0.4165975  0.4163847  0.4149589  0.4148301  0.4143533  0.4135921 
##       1327      10430       1329       2799      55829       8721       6734 
##  0.4132283  0.4130338  0.4123583  0.4116545  0.4115697  0.4108091  0.4107354 
##      10175      23464       4343      85403      59338      63891      54461 
##  0.4103136  0.4100851  0.4097568  0.4085080  0.4084826  0.4082644  0.4081925 
##     160418      84893       6747       3276      51074     390916       8050 
##  0.4081357  0.4078217  0.4071975  0.4068225  0.4060582  0.4059601  0.4058887 
##      80331        902      22907      79070      54927      90231       8772 
##  0.4055108  0.4051457  0.4048736  0.4048562  0.4048125  0.4040274  0.4037893 
##       2937       5709      10239      23731      57555       2132       5685 
##  0.4032230  0.4031897  0.4030984  0.4029031  0.4027990  0.4027539  0.4022070 
##       1340       9870        471     151194        427       3954      64969 
##  0.4021521  0.4019046  0.4016006  0.4012263  0.4010701  0.4006597  0.4003100 
##      28958       3068       4946      11315       5464      83658      51596 
##  0.4002615  0.3999184  0.3996269  0.3994953  0.3991162  0.3989838  0.3981944 
##       3843     220002        204      10282       5255      51360       2936 
##  0.3981827  0.3980259  0.3980050  0.3978201  0.3974112  0.3963387  0.3961340 
##      80135       8195       9217      54543  107986346      51241      23184 
##  0.3959825  0.3958397  0.3949693  0.3939792  0.3939792  0.3939424  0.3936274 
##       7779       2280      11345     284184      10146     150275       4718 
##  0.3930919  0.3930807  0.3930453  0.3930266  0.3927651  0.3926069  0.3923042 
##     347734      10907       5052      84967      54914       2288      11267 
##  0.3911257  0.3907453  0.3894281  0.3889606  0.3885261  0.3884308  0.3882580 
##      28977  114483834       6500      55700      54998       4725      93974 
##  0.3879548  0.3878858  0.3874980  0.3874663  0.3865884  0.3865752  0.3865657 
##      84720      55760      23169      10043      55129      79143        537 
##  0.3864299  0.3863317  0.3854047  0.3850952  0.3849886  0.3843728  0.3841144 
##      58477      83986      22827       7415       4704       4947       5694 
##  0.3840106  0.3836158  0.3822758  0.3819182  0.3818904  0.3818818  0.3815268 
##      91300      55650     127687       7355       1871      66008       3065 
##  0.3814380  0.3808971  0.3805277  0.3794777  0.3789681  0.3786374  0.3783556 
##      57406      84522       9728       2475       3588       1717       5937 
##  0.3779946  0.3779586  0.3771483  0.3768079  0.3767541  0.3763025  0.3753728 
##      51104       6728      51606       9296     124402      10483     127933 
##  0.3746960  0.3742044  0.3724372  0.3717379  0.3712387  0.3709478  0.3708868 
##      25807      63906      23423       8726      10576      10606        527 
##  0.3698592  0.3694326  0.3692886  0.3684311  0.3680585  0.3680066  0.3677784 
##       2923       1345     126298       8668       5689      29844        476 
##  0.3666033  0.3662799  0.3655816  0.3654839  0.3638466  0.3637550  0.3633267 
##       4738      54838  102724307      79701      79719      88745      55257 
##  0.3631488  0.3629942  0.3629942  0.3628012  0.3625106  0.3624760  0.3621606 
##      81889     128486      91942      81614      11171       6443       1977 
##  0.3616873  0.3616343  0.3613175  0.3606573  0.3593618  0.3591997  0.3584320 
##       9761     115098       7818      54776       9616     125111      25870 
##  0.3581627  0.3573183  0.3567049  0.3562279  0.3561240  0.3558515  0.3549813 
##       2907       7203      64841      10963      23585      29098       5162 
##  0.3549700  0.3544342  0.3542375  0.3537499  0.3534255  0.3532541  0.3529332 
##      84895      55243       6631      51014      26263       3688        593 
##  0.3514202  0.3512548  0.3506032  0.3505155  0.3502541  0.3499735  0.3497011 
##      55017       4358       5936       2286      10069      83743       6391 
##  0.3494866  0.3494421  0.3486404  0.3483037  0.3481124  0.3474222  0.3473608 
##       5822       5690      83606       6777       6016      56970      51094 
##  0.3469621  0.3468466  0.3464394  0.3459594  0.3456417  0.3455977  0.3447987 
##       9836      10574       5692       1954      10575      57129      23214 
##  0.3447933  0.3447353  0.3445793  0.3445572  0.3439027  0.3437618  0.3434951 
##      79594       5686      10618      79572      26515      85406       1798 
##  0.3434868  0.3434162  0.3416727  0.3416368  0.3412373  0.3404117  0.3396440 
##      10067      51150      55884       3735       7324     116150      91304 
##  0.3395832  0.3394023  0.3393458  0.3392134  0.3388361  0.3385156  0.3381603 
##       7325      23509      25921       1209      83891       8079      29074 
##  0.3377834  0.3367289  0.3366534  0.3361880  0.3358214  0.3353791  0.3350791 
##      55004      83941      51202        832      22870       5707      29803 
##  0.3345865  0.3340270  0.3333014  0.3330890  0.3330535  0.3323201  0.3292237 
##      10133      10539      55308      29085     246184      64645      63905 
##  0.3287241  0.3285449  0.3281597  0.3280011  0.3271326  0.3263739  0.3262988 
##      10190      29880      64110      55101     285590       4717      64422 
##  0.3259157  0.3255893  0.3255358  0.3254503  0.3246024  0.3236880  0.3231591 
##      11041      60559       5681      55845      55975      84064      23071 
##  0.3223784  0.3222406  0.3220374  0.3220218  0.3213756  0.3212269  0.3202883 
##      10548      11047      10857       1198       4715      85365       9246 
##  0.3201824  0.3197818  0.3196005  0.3195563  0.3194100  0.3192533  0.3191084 
##       1211      29789      55161       1453       9403       2950       3660 
##  0.3187619  0.3182633  0.3179582  0.3178440  0.3178433  0.3176678  0.3174430 
##      55011       5713        908      51230      84313       5886       7150 
##  0.3167756  0.3164301  0.3164300  0.3149971  0.3149931  0.3148409  0.3139033 
##      94005       1389     114049      84945       4245       4437        166 
##  0.3137364  0.3133710  0.3133067  0.3129681  0.3117532  0.3106279  0.3095171 
##      54948      23741      11056      22937       5682      51497      23141 
##  0.3093324  0.3090231  0.3083986  0.3081046  0.3068551  0.3066401  0.3064485 
##      57661        521      25912       9410      51637       8031      51504 
##  0.3060060  0.3058093  0.3057963  0.3049737  0.3047355  0.3046636  0.3046242 
##      58505      22883      10651     128866       9556     140735      54539 
##  0.3035532  0.3021324  0.3014014  0.3013866  0.3008115  0.3004853  0.2988710 
##      10289      56900        984     254170       5550        873     201595 
##  0.2976686  0.2974912  0.2974230  0.2973534  0.2973153  0.2947989  0.2947041 
##       8517      64960      10254       3281       4905       5250       5195 
##  0.2943482  0.2938146  0.2935395  0.2920160  0.2919505  0.2905110  0.2902453 
##      57583      57410      55173     116225       9343     550643      54896 
##  0.2898940  0.2886786  0.2886780  0.2885846  0.2878574  0.2875204  0.2870393 
##      81502      29928       6950     121260      57179       1655       9114 
##  0.2864391  0.2849716  0.2848187  0.2848076  0.2801764  0.2800703  0.2795482 
##       5049      92856       8803      55974      84335       6902       5036 
##  0.2785735  0.2783767  0.2780813  0.2769691  0.2722556  0.2715197  0.2709538 
##      65992      57647     112858       5929       4952       5705      65080 
##  0.2704233  0.2691624  0.2672488  0.2665367  0.2662050  0.2654655  0.2644212 
##      55720      11261      10652      51510      57827     152137       2739 
##  0.2636096  0.2627716  0.2627232  0.2626466  0.2622879  0.2619909  0.2611156 
##      23481      29978       9221      22984       9807        375      10768 
##  0.2605832  0.2586602  0.2581928  0.2577567  0.2575507  0.2575006  0.2563583 
##      26121      51246        599     124801      60592      10342       2068 
##  0.2557511  0.2550680  0.2539762  0.2533759  0.2532769  0.2522363  0.2516893 
##       2079        369       5781      28972      83877       8662      60681 
##  0.2506131  0.2492754  0.2470073  0.2467546  0.2459510  0.2456324  0.2447300 
##      25813       5725       6727       5516       3839      55739      51493 
##  0.2436649  0.2430490  0.2428012  0.2418749  0.2406836  0.2400650  0.2397036 
##       7376      29920       9097       1874       6742      22803       3035 
##  0.2387276  0.2386442  0.2380422  0.2380097  0.2375199  0.2373460  0.2364831 
##       5710       8678        509        830      55239      23118       5663 
##  0.2307318  0.2280885  0.2237992  0.2230121  0.2218414  0.2205063  0.2190780 
##        550       8666      56910       5716      26020      90488      56270 
##  0.2190694  0.2189596  0.2111060  0.2042586  0.2033679  0.2029184  0.1997055 
##      51582       9905      22818      10169      10521      55352      25828 
##  0.1966986  0.1827634  0.1720693  0.1719755 -0.1959607 -0.2157224 -0.2250444 
##       9877       8658      23265      55030      11083       5297      10654 
## -0.2353443 -0.2375470 -0.2383034 -0.2432497 -0.2501838 -0.2526630 -0.2536720 
##      85378      22938      56255      55696       8545       9138       1073 
## -0.2563461 -0.2577094 -0.2602351 -0.2620568 -0.2620944 -0.2672640 -0.2713638 
##       6294      51031       2005       4926      79665      10087       1459 
## -0.2722970 -0.2735897 -0.2796518 -0.2802891 -0.2803226 -0.2806464 -0.2810423 
##      55683       9295      84280      23181       5826      55830      23379 
## -0.2815167 -0.2822938 -0.2823541 -0.2874733 -0.2884744 -0.2937148 -0.2964759 
##       9858       9678      26071      51315      22872       9043      23049 
## -0.2979473 -0.2988231 -0.3006267 -0.3027375 -0.3028241 -0.3045084 -0.3063087 
##       5310       5584       4848       9444       8087        118     727957 
## -0.3071911 -0.3104099 -0.3126989 -0.3134580 -0.3143303 -0.3146862 -0.3148406 
##      56980      10307      23350      26056        392      11188      51631 
## -0.3161741 -0.3165103 -0.3168737 -0.3173178 -0.3175423 -0.3181242 -0.3183926 
##       8996       9208       5291      10443       4215      54904      23122 
## -0.3184161 -0.3239007 -0.3261590 -0.3267435 -0.3281741 -0.3300802 -0.3308521 
##       5498      63877      26122       6497       7174       1762      10401 
## -0.3328426 -0.3331601 -0.3347670 -0.3355432 -0.3371100 -0.3377275 -0.3386667 
##      84418     152006       6655      56907       3275      54470      80818 
## -0.3392857 -0.3393711 -0.3399779 -0.3406712 -0.3423888 -0.3431162 -0.3439979 
##      55596     159013       5580       9887       6618      80279       2218 
## -0.3442348 -0.3451410 -0.3461674 -0.3462598 -0.3474670 -0.3518473 -0.3528704 
##     221656      84162      57498        466        989      23248      10277 
## -0.3534680 -0.3550206 -0.3551847 -0.3554614 -0.3573999 -0.3577583 -0.3582554 
##      57018       6433      23232     196403      84312      50488       9871 
## -0.3582664 -0.3583405 -0.3588619 -0.3599458 -0.3614411 -0.3615933 -0.3621765 
##      84188       7289       9459       9646      85457     200030      79364 
## -0.3636495 -0.3642887 -0.3648399 -0.3659761 -0.3661954 -0.3668894 -0.3672409 
##     149013      64210      79877       1153       6603      83638      83444 
## -0.3674235 -0.3680099 -0.3680528 -0.3695422 -0.3699614 -0.3715570 -0.3724108 
##      23126     149345      90678      10188      81608      27148      22930 
## -0.3737067 -0.3739213 -0.3740208 -0.3743587 -0.3746220 -0.3749335 -0.3760134 
##      25932      10724      63892      10413      55719      23059       8273 
## -0.3766304 -0.3766957 -0.3781839 -0.3802114 -0.3804114 -0.3838193 -0.3838795 
##       6477      55778     129285     606495       6575      22863       7082 
## -0.3848731 -0.3856428 -0.3856961 -0.3857064 -0.3870328 -0.3885287 -0.3895281 
##       2058      11180      10228  100132247       5108      26060      22897 
## -0.3899010 -0.3920616 -0.3935101 -0.3938917 -0.3939420 -0.3953148 -0.3985116 
##     613037      79934       2064      11099       1385       8569      79648 
## -0.3988178 -0.3991319 -0.3994589 -0.4009749 -0.4023796 -0.4030291 -0.4047310 
##      64743       4799      26240      11232      23353      55644      57654 
## -0.4047459 -0.4050448 -0.4054000 -0.4066509 -0.4068841 -0.4069168 -0.4075119 
##      54822       6093      57494       2245       5831       5914      10106 
## -0.4078987 -0.4080029 -0.4084857 -0.4084875 -0.4100712 -0.4101864 -0.4112247 
##      60686       9697       8554      64397      26469      29907      23398 
## -0.4126803 -0.4150008 -0.4153505 -0.4154291 -0.4166092 -0.4176424 -0.4179887 
##        381      10163       5986     133686     388969       4298     375056 
## -0.4180117 -0.4186354 -0.4194455 -0.4197666 -0.4205261 -0.4206538 -0.4208997 
##      65123       3476      84874       1176     114823      54930      84317 
## -0.4212747 -0.4216038 -0.4225643 -0.4228826 -0.4229840 -0.4230240 -0.4235872 
##      79960       4784      23492     137886      64400      29911      11183 
## -0.4240700 -0.4246110 -0.4254945 -0.4255221 -0.4256604 -0.4262577 -0.4266614 
##        387      23140      65981     647135        402      23262      26007 
## -0.4271059 -0.4281267 -0.4285514 -0.4290998 -0.4294188 -0.4297668 -0.4310126 
##      85007       8761     144717      58486      55680     375190      79840 
## -0.4310602 -0.4316835 -0.4331924 -0.4337749 -0.4340584 -0.4377631 -0.4394331 
##      90799      55268      55763       5898       5361       3222      23001 
## -0.4396049 -0.4406383 -0.4409122 -0.4414717 -0.4424583 -0.4455552 -0.4463448 
##      27342      59345       9665      85458      23506       5586       8629 
## -0.4483152 -0.4484680 -0.4488442 -0.4493097 -0.4494534 -0.4495708 -0.4497708 
##      54587      83987      27245       <NA>      51380      51747      23272 
## -0.4498287 -0.4499099 -0.4500134 -0.4506561 -0.4509368 -0.4509382 -0.4511567 
##     146542      65998       <NA>       9814       5921      10057      64708 
## -0.4512992 -0.4525744 -0.4526164 -0.4538009 -0.4548623 -0.4550331 -0.4583905 
##      24149       5912       9253     259217      84836       8030      11168 
## -0.4595298 -0.4628179 -0.4629212 -0.4630681 -0.4640854 -0.4643351 -0.4644488 
##      63915     114625      80005      26086        598      22864     147965 
## -0.4648334 -0.4666813 -0.4673013 -0.4682644 -0.4692524 -0.4700110 -0.4702652 
##     148362      23254      54923     151011       2013      55900       2887 
## -0.4708739 -0.4709686 -0.4711753 -0.4716750 -0.4717620 -0.4717900 -0.4726349 
##      54946        817        738      64285      65250       5612      55734 
## -0.4731411 -0.4749549 -0.4751950 -0.4754176 -0.4755786 -0.4761791 -0.4764671 
##      23360      54893       4820       9609        394      10062      63874 
## -0.4770544 -0.4776162 -0.4790981 -0.4794416 -0.4795995 -0.4799641 -0.4805608 
##      55740      89781       8742       8824       <NA>     729085     124930 
## -0.4808284 -0.4813326 -0.4814952 -0.4815948 -0.4833795 -0.4859000 -0.4865551 
##      27315       9284     642799      53827      10211      53938       9181 
## -0.4866067 -0.4867296 -0.4867296 -0.4867809 -0.4870851 -0.4873333 -0.4876190 
##       7767      55630      10217      23344     114882       8826     116983 
## -0.4887114 -0.4891194 -0.4894836 -0.4897248 -0.4913836 -0.4916915 -0.4926482 
##      55715       9411  105378858       9487       8379      51309      55105 
## -0.4946174 -0.4946575 -0.4946575 -0.4957879 -0.4959409 -0.4969669 -0.4975162 
##      54737     150290      26046      57097      23410       4641     154810 
## -0.4992971 -0.5002702 -0.5015043 -0.5026363 -0.5034959 -0.5039357 -0.5045383 
##     266655       <NA>      83452      79660       2908     132884      79161 
## -0.5046136 -0.5053433 -0.5057554 -0.5073745 -0.5079385 -0.5084895 -0.5085437 
##      11163       3895      55890       6595       5116      79228      84286 
## -0.5114206 -0.5120667 -0.5136670 -0.5140599 -0.5141050 -0.5156678 -0.5179298 
##       9530       4983       6713      51135     145483       7637       6510 
## -0.5181524 -0.5190852 -0.5190934 -0.5192298 -0.5192459 -0.5196725 -0.5202100 
##       9517       2744      79085        928     387921      55152      57572 
## -0.5218365 -0.5218574 -0.5219492 -0.5228007 -0.5239478 -0.5250593 -0.5250703 
##      84693       3927     130502      11245      29945       6934       8473 
## -0.5250963 -0.5255526 -0.5291545 -0.5292415 -0.5299447 -0.5311522 -0.5319500 
##      29761      91179      10370       4287       4665     114926      27347 
## -0.5319890 -0.5324829 -0.5341928 -0.5343692 -0.5347657 -0.5357545 -0.5365447 
##      83856      80270     253959      64236      91544       2297      91975 
## -0.5367050 -0.5371834 -0.5385770 -0.5391371 -0.5392818 -0.5395398 -0.5398975 
##      63897       5525       1773     151313       7431      23075      26031 
## -0.5418400 -0.5427405 -0.5431157 -0.5432675 -0.5442363 -0.5461576 -0.5464825 
##      55005      23174      81888      10982      10717       6867      29066 
## -0.5473514 -0.5492330 -0.5493737 -0.5509759 -0.5512332 -0.5537179 -0.5537204 
##       1489      51429      79710      54961      51028  100129482     728927 
## -0.5538389 -0.5538558 -0.5541433 -0.5545370 -0.5547399 -0.5547921 -0.5550309 
##       9937      84067      25897      23116      54149      81550      79864 
## -0.5550938 -0.5562984 -0.5577837 -0.5578354 -0.5596999 -0.5598326 -0.5601952 
##      65124     153364      23142     146198       3221      89848      22927 
## -0.5602255 -0.5603313 -0.5606721 -0.5620945 -0.5628025 -0.5631555 -0.5633447 
##     374819     122953     130814      30844     132160       8045      54809 
## -0.5638151 -0.5638921 -0.5647192 -0.5664117 -0.5669263 -0.5689230 -0.5690775 
##      51101      11201     166929     284058      22933        780      54903 
## -0.5692404 -0.5704562 -0.5705990 -0.5719108 -0.5730508 -0.5736165 -0.5742665 
##     169834      64847     115817       9061       7782       1998       8997 
## -0.5749403 -0.5762255 -0.5779427 -0.5786078 -0.5789800 -0.5793421 -0.5799869 
##      83933      64423      55225      10559      27241      93627      84445 
## -0.5811219 -0.5811487 -0.5813285 -0.5813395 -0.5829409 -0.5831720 -0.5833655 
##     374879       1152      64780       4000      49855      28992      51455 
## -0.5853567 -0.5855557 -0.5859125 -0.5872299 -0.5875605 -0.5883372 -0.5890113 
##      79038       <NA>     441212        493       7597      23098     199221 
## -0.5891720 -0.5892506 -0.5892506 -0.5904632 -0.5944288 -0.5951022 -0.5965207 
##       1606     349565      51619      23052     123016      56172      23125 
## -0.5965533 -0.5971056 -0.5971957 -0.6055343 -0.6060341 -0.6070083 -0.6087117 
##       5338      81855     116447       <NA>     387119      26027      54704 
## -0.6097544 -0.6102782 -0.6102793 -0.6105854 -0.6116321 -0.6117369 -0.6119366 
##     255783       3590       <NA>        307       9849      23389      91801 
## -0.6139429 -0.6152403 -0.6156782 -0.6162111 -0.6177048 -0.6177534 -0.6180121 
##      24138      10650      81563       7621      80778       7077     256364 
## -0.6181325 -0.6182543 -0.6183183 -0.6197651 -0.6218416 -0.6220378 -0.6227373 
##      56271      55752      57820     114904     118987      80012       7358 
## -0.6234468 -0.6238399 -0.6253846 -0.6267377 -0.6270647 -0.6276080 -0.6279215 
##      79026      79583     254531       4636      51715      55296       6050 
## -0.6290195 -0.6299046 -0.6308090 -0.6309828 -0.6323824 -0.6356425 -0.6374309 
##      54832      55857      51696       9924       6550       3299       2330 
## -0.6382482 -0.6394101 -0.6396657 -0.6416981 -0.6420519 -0.6431201 -0.6431840 
##      90990     283078       9737       4154       9265      10274      80169 
## -0.6467545 -0.6473647 -0.6477498 -0.6478492 -0.6480444 -0.6495676 -0.6500774 
##       4485       8635     135228      51326  100506084  100996709     133746 
## -0.6507379 -0.6513577 -0.6526507 -0.6538795 -0.6538795 -0.6538795 -0.6547026 
##       6478     152926      55558       9064      57658      11138       1054 
## -0.6551437 -0.6552007 -0.6564097 -0.6567255 -0.6596719 -0.6599063 -0.6604366 
##     118490      57710      54407     388284      56890      10938  100499483 
## -0.6615385 -0.6618886 -0.6632230 -0.6638313 -0.6640986 -0.6643955 -0.6662137 
##      23564       1303       4772         16      55758        472      57657 
## -0.6678456 -0.6680458 -0.6691580 -0.6692524 -0.6699924 -0.6708615 -0.6720313 
##       4015     254427     158399      22832  102723508       5635       9847 
## -0.6727347 -0.6731131 -0.6745164 -0.6752713 -0.6754897 -0.6756024 -0.6759265 
##     541565        283       6935      55251      51166       7644      79815 
## -0.6776307 -0.6777840 -0.6791747 -0.6827317 -0.6848611 -0.6855264 -0.6858661 
##      26013      85315       9532     387882      54436      23171      79649 
## -0.6866051 -0.6867524 -0.6871716 -0.6873216 -0.6876397 -0.6894632 -0.6895929 
##       6301       5916      79188      10014      79144     440104      54823 
## -0.6897903 -0.6905520 -0.6913511 -0.6927124 -0.6934557 -0.6939298 -0.6945573 
##       8853       9374       9475      57636     137994      26140      23176 
## -0.6951906 -0.6958667 -0.6963338 -0.6967777 -0.6985883 -0.6986119 -0.6986968 
##      91663      23527      26227      23033     130617       <NA>      23380 
## -0.6998373 -0.7023478 -0.7029226 -0.7031079 -0.7058355 -0.7066410 -0.7075741 
##      90557         20       7216      29062       4131      80210      57619 
## -0.7077654 -0.7091809 -0.7093732 -0.7108083 -0.7127100 -0.7138635 -0.7146670 
##       3344      29070     148137     145748      84140       7402      83714 
## -0.7174841 -0.7190785 -0.7198716 -0.7204843 -0.7206615 -0.7210771 -0.7213021 
##      57037       7465      11260     400954      84142       2948       6038 
## -0.7221817 -0.7222457 -0.7237321 -0.7257172 -0.7260689 -0.7267592 -0.7280474 
##      79641        753      55769     115399       2674     389856       3778 
## -0.7287124 -0.7288907 -0.7297560 -0.7302233 -0.7317948 -0.7331589 -0.7344970 
##      57228       6715     253782      10966      10004     134957      29904 
## -0.7349702 -0.7364045 -0.7384012 -0.7385297 -0.7386135 -0.7390526 -0.7395376 
##      23522      80139     256643      23645      81543       7059     162962 
## -0.7402044 -0.7404762 -0.7416530 -0.7416842 -0.7429994 -0.7430232 -0.7440097 
##       7942      10826     134728     115560     161582       9639     256987 
## -0.7487553 -0.7487684 -0.7535050 -0.7539884 -0.7543566 -0.7559755 -0.7595805 
##       <NA>       4810       4060       4232      27250      57462     284611 
## -0.7605847 -0.7612021 -0.7619994 -0.7641747 -0.7650538 -0.7665317 -0.7669171 
##      22858      90634      23239         93       5355      55713      55357 
## -0.7679021 -0.7703549 -0.7703674 -0.7732045 -0.7736516 -0.7747584 -0.7804914 
##       6662      80864  100506127       9873     219981      57519      57469 
## -0.7812926 -0.7839155 -0.7840582 -0.7842511 -0.7843511 -0.7845235 -0.7851268 
##      10893      89866  111240474       3205       4616       3199     147011 
## -0.7859166 -0.7870940 -0.7870940 -0.7900278 -0.7903884 -0.7917352 -0.7932739 
##     201134      10420       1757      79812      27163      23336       7453 
## -0.7950368 -0.7989338 -0.7997796 -0.8004420 -0.8037134 -0.8086436 -0.8113261 
##       9910       2934       5140     160428       4987      84962       5990 
## -0.8168493 -0.8189191 -0.8190593 -0.8206455 -0.8233799 -0.8256639 -0.8258611 
##      85446      22809      55075      57584      55615      80757       3316 
## -0.8267310 -0.8271113 -0.8276817 -0.8286254 -0.8301638 -0.8310499 -0.8318810 
##       6917       5106       9659  124904395      81539      51063       3203 
## -0.8329571 -0.8332764 -0.8361012 -0.8361012 -0.8365196 -0.8372590 -0.8384970 
##       7089       9509     400961     414918      27152       5118       9990 
## -0.8403461 -0.8465709 -0.8473940 -0.8488642 -0.8517527 -0.8521731 -0.8541687 
##     151887     126868       2242  100288332  105376752       5600       9610 
## -0.8542489 -0.8558255 -0.8560514 -0.8571566 -0.8571566 -0.8601574 -0.8610011 
##     401548      25900       8863     727910     342132     135295      55198 
## -0.8610876 -0.8613685 -0.8642570 -0.8643564 -0.8643612 -0.8669879 -0.8709768 
##       8496     388403       3428     171425       9020      55224     387712 
## -0.8721110 -0.8722883 -0.8723940 -0.8734925 -0.8756056 -0.8766052 -0.8777278 
##     200035     257068       4752      83667      57544       4205      11092 
## -0.8791268 -0.8794977 -0.8802565 -0.8826619 -0.8837476 -0.8842079 -0.8846806 
##     219348     400986      57165     346157      55559      10395       6339 
## -0.8849932 -0.8884617 -0.8912195 -0.8931446 -0.8958855 -0.8967117 -0.8993648 
##     170463       5027      56971      79924       5239       9792      10079 
## -0.8996516 -0.9004927 -0.9007866 -0.9009868 -0.9029181 -0.9033401 -0.9034569 
##      11034       9435      57181      80709       1571      51559      57337 
## -0.9055142 -0.9063383 -0.9067391 -0.9079291 -0.9099663 -0.9101564 -0.9125045 
##     340061       3269      10098       3603      84107        825       5256 
## -0.9128861 -0.9146278 -0.9158709 -0.9161742 -0.9191374 -0.9213451 -0.9215301 
##     221424       <NA>      51281     401944       5590      79661      26037 
## -0.9215350 -0.9224939 -0.9239118 -0.9244714 -0.9264334 -0.9264705 -0.9264956 
##       6509      91860       4144     135250     114881      11000        782 
## -0.9288923 -0.9293267 -0.9296499 -0.9314611 -0.9319975 -0.9343943 -0.9357005 
##       8398       4240      23090     440350      10493       2852     145389 
## -0.9374631 -0.9378820 -0.9428710 -0.9440733 -0.9441438 -0.9457956 -0.9483429 
##     399687       4093      51477       9674     147645     339761       2946 
## -0.9492017 -0.9508466 -0.9517698 -0.9522787 -0.9527364 -0.9587984 -0.9589849 
##      57162  100128071      10677        540      55861       3899      10518 
## -0.9621728 -0.9622776 -0.9640187 -0.9656995 -0.9657291 -0.9659606 -0.9668671 
##      55565       5339       5863     285195       3563       2263       8637 
## -0.9674054 -0.9674525 -0.9677563 -0.9685726 -0.9703040 -0.9886432 -0.9887724 
##       3200       3800       <NA>     150356     126068       2313       5413 
## -0.9918556 -0.9943274 -0.9958855 -0.9972452 -0.9991622 -0.9994996 -1.0010985 
##        727      83604     130752     338382      57118  100133315       <NA> 
## -1.0058609 -1.0066550 -1.0086704 -1.0089013 -1.0094853 -1.0105965 -1.0115682 
##      79929      57664       4008      11067      55876      27254        666 
## -1.0122027 -1.0122322 -1.0143051 -1.0166861 -1.0170954 -1.0185684 -1.0227195 
##       3623       <NA>      57573     129804     163702      51804     145864 
## -1.0227558 -1.0247567 -1.0247922 -1.0251863 -1.0266743 -1.0281964 -1.0291875 
##     114822       3705      23371     283869     121512       8445      57139 
## -1.0313083 -1.0361028 -1.0372589 -1.0418481 -1.0419063 -1.0425406 -1.0426257 
##      93953      27198       2549       7042      57030       4059       9127 
## -1.0431197 -1.0441916 -1.0467246 -1.0478200 -1.0501062 -1.0506470 -1.0507964 
##     256691       8864      23576     130589       2035     160851      10742 
## -1.0511252 -1.0515303 -1.0516312 -1.0522232 -1.0527208 -1.0529229 -1.0548416 
##     113230     619207      84529      56242     154141      84460       1410 
## -1.0565195 -1.0571618 -1.0601979 -1.0618931 -1.0621266 -1.0647987 -1.0690481 
##      55901      23218      29958       8840     201294       1296       1649 
## -1.0743956 -1.0796308 -1.0873508 -1.0874480 -1.0903784 -1.0908951 -1.0914868 
##      51621     152110       4660     117156      57562       5959       7545 
## -1.0918890 -1.0919211 -1.0926840 -1.0962604 -1.1003322 -1.1008613 -1.1009214 
##       8646     120863       2583       2012     283554     344787     221336 
## -1.1032479 -1.1033549 -1.1044375 -1.1046730 -1.1047283 -1.1052182 -1.1052790 
##     219621      63976      79762       <NA>      11248       4675      26576 
## -1.1059307 -1.1069275 -1.1071044 -1.1073815 -1.1097380 -1.1098436 -1.1119276 
##      27143     259295       9256       4825     197257     126432     375759 
## -1.1140324 -1.1142620 -1.1166873 -1.1167189 -1.1203426 -1.1218212 -1.1218816 
##        489      11238       <NA>      92840      79628     113026      10086 
## -1.1232135 -1.1237063 -1.1266935 -1.1284937 -1.1291951 -1.1312388 -1.1338960 
##       <NA>     221421      57507       5260      55612     389119       3671 
## -1.1343429 -1.1363934 -1.1389798 -1.1401934 -1.1409462 -1.1495011 -1.1524394 
##       <NA>       5274     150209      55356       8082      60677      85477 
## -1.1526791 -1.1557369 -1.1569018 -1.1584613 -1.1617944 -1.1648283 -1.1661946 
##     199223     339366     140738      57447      10411        971      84253 
## -1.1680027 -1.1690762 -1.1691164 -1.1721363 -1.1730777 -1.1761547 -1.1765401 
##       3909      83886       8787      84249       5783      25805     140685 
## -1.1826501 -1.1875277 -1.1917551 -1.1966486 -1.1973377 -1.1993620 -1.2003992 
##       <NA>      55592     253935      26206     340526      10149     113835 
## -1.2021733 -1.2021733 -1.2038897 -1.2040881 -1.2045039 -1.2071974 -1.2086920 
##        280       9022        534        822      10903     162979     374977 
## -1.2107412 -1.2118634 -1.2150127 -1.2194659 -1.2207226 -1.2257244 -1.2260320 
##     203238      10656     285755  100132074       7869        104     167681 
## -1.2265884 -1.2277887 -1.2306780 -1.2330367 -1.2335872 -1.2338534 -1.2347637 
##     441058      91409       5174     256329     219970     142680     375704 
## -1.2355141 -1.2361762 -1.2369300 -1.2369370 -1.2370041 -1.2388248 -1.2401480 
##       1139      22925      10267       5493       5325     114883      79973 
## -1.2407543 -1.2424747 -1.2428036 -1.2488358 -1.2515933 -1.2549985 -1.2573970 
##      80765       1760      79901      64115       3315       6915      64798 
## -1.2601708 -1.2655044 -1.2683879 -1.2686796 -1.2705610 -1.2764669 -1.2766518 
##      23175      84734       <NA>      23508      84662      54855       9096 
## -1.2862591 -1.2865975 -1.2894702 -1.2986793 -1.3016248 -1.3079447 -1.3174009 
##        633     149175       2047     339977     128344  100130311      90427 
## -1.3184222 -1.3213280 -1.3213973 -1.3218224 -1.3245642 -1.3247723 -1.3251411 
##     400793      79858     202333       2812      56911       2300       3783 
## -1.3266251 -1.3268700 -1.3289211 -1.3322453 -1.3349890 -1.3376399 -1.3471014 
##       9518      84074     222223      57604       6337        828      84443 
## -1.3476505 -1.3512963 -1.3570000 -1.3573469 -1.3573768 -1.3590589 -1.3615605 
##      57194       8495      90525      80022       4094     340719      56967 
## -1.3624801 -1.3631735 -1.3661424 -1.3667430 -1.3682205 -1.3690305 -1.3696088 
##     284358      58473      57639      10974     387509       5627     285141 
## -1.3809400 -1.3835333 -1.3855005 -1.3860329 -1.3877116 -1.3882845 -1.3951156 
##       6495       7079      84171     286343     132014     157638         21 
## -1.3983234 -1.3997204 -1.4008942 -1.4032400 -1.4040744 -1.4091375 -1.4113768 
##      54985      54715      54413     151295       1958       9414      50855 
## -1.4115973 -1.4126157 -1.4144783 -1.4159492 -1.4167228 -1.4170779 -1.4259092 
##  100996693      80737      22843      84215      65055       7483       1464 
## -1.4262015 -1.4264529 -1.4334910 -1.4364783 -1.4406305 -1.4414050 -1.4426983 
##      29765       5333      81786       4645      57644      23127       <NA> 
## -1.4428131 -1.4442333 -1.4452516 -1.4460393 -1.4474429 -1.4480131 -1.4484245 
##       2273       <NA>     221442       9788       1831     283229     642475 
## -1.4538172 -1.4543287 -1.4543287 -1.4557818 -1.4585193 -1.4592406 -1.4596686 
##      54756       6094  100131897       1240       3752       6920       <NA> 
## -1.4599443 -1.4602564 -1.4605340 -1.4617667 -1.4618097 -1.4669919 -1.4692631 
##      10417     340419       5362      51316     147906       4306      79156 
## -1.4694563 -1.4736568 -1.4762072 -1.4782439 -1.4879115 -1.4885292 -1.4885456 
##       <NA>       3489      64218      10116      64386       6442     161291 
## -1.4889970 -1.4895509 -1.4907611 -1.4925630 -1.4933996 -1.4948931 -1.4949669 
##       6710       3795       8490       4642      10231       1145     163255 
## -1.4979273 -1.4995977 -1.4997422 -1.5063649 -1.5074797 -1.5081509 -1.5086172 
##      84958     124989       9245     643596       8190       3993       <NA> 
## -1.5111649 -1.5123925 -1.5157110 -1.5222179 -1.5284455 -1.5291477 -1.5316835 
##     128853       2149       <NA>      89832       1101       4185       2196 
## -1.5323476 -1.5325382 -1.5327704 -1.5356940 -1.5380700 -1.5390235 -1.5411341 
##     256472      57381       7739     619279       5740       5205       5745 
## -1.5431454 -1.5459253 -1.5460329 -1.5503072 -1.5517607 -1.5521017 -1.5565805 
##       5031     123591       <NA>     259173      26153      29775     126823 
## -1.5574388 -1.5583507 -1.5604211 -1.5609200 -1.5621629 -1.5646474 -1.5658461 
##     201625       6276      57452      80217      51285     441027       3908 
## -1.5795546 -1.5852467 -1.5854206 -1.5865200 -1.5878081 -1.5902414 -1.5936195 
##       8654       2030       2788      10811      80329       7454      23428 
## -1.5968491 -1.5971102 -1.5986515 -1.6006200 -1.6028357 -1.6173712 -1.6206461 
##       <NA>     348174      80237       7538      81616       4046      27151 
## -1.6214372 -1.6226965 -1.6358705 -1.6447462 -1.6495757 -1.6507430 -1.6565600 
##        688      22866     161176     113146       3177     375791     223117 
## -1.6601204 -1.6632741 -1.6632815 -1.6676429 -1.6729987 -1.6780991 -1.6790233 
##       <NA>      23650       1621       5021       2615      84696     148398 
## -1.6799358 -1.6829147 -1.6896684 -1.6899156 -1.6903685 -1.6961775 -1.6990289 
##      10954     225689      79442        165       7033      10365     148808 
## -1.7090115 -1.7130592 -1.7142859 -1.7188856 -1.7240812 -1.7254647 -1.7290328 
##       8076        815      55930      23637       8291       2261        176 
## -1.7323927 -1.7410468 -1.7420749 -1.7430558 -1.7453509 -1.7478819 -1.7518741 
##       4684      79962     192668     149465      57482     160622      84628 
## -1.7521342 -1.7547884 -1.7587376 -1.7619316 -1.7651278 -1.7651827 -1.7666842 
##     326624       5046       1188      10279       7068        183     144100 
## -1.7669445 -1.7684967 -1.7750577 -1.7773823 -1.7819267 -1.7890832 -1.7981050 
##      29970     147968      10396     440603       8549     285671      10046 
## -1.8006485 -1.8052175 -1.8141581 -1.8231077 -1.8282675 -1.8291589 -1.8353932 
##       3955       6092      79955     554235        974     146330       2596 
## -1.8360451 -1.8382698 -1.8387629 -1.8422857 -1.8441639 -1.8448640 -1.8450596 
##       2308       2303       7078      22801       7253      80739      84417 
## -1.8473320 -1.8478190 -1.8570474 -1.8581151 -1.8590081 -1.8590395 -1.8630247 
##       7164       9717       4147      57124       9719       8708       6665 
## -1.8657066 -1.8677428 -1.8678856 -1.8682604 -1.8688000 -1.8759266 -1.8761851 
##       5608       4544     165679       9760      27129     196410     645811 
## -1.8795244 -1.8818394 -1.8978820 -1.8988388 -1.9003767 -1.9017850 -1.9051505 
##      27345     143686      23037     222643       2306      57761        421 
## -1.9085514 -1.9213151 -1.9403513 -1.9433499 -1.9497702 -1.9550880 -1.9615210 
##       4208       9452      11219      29125     116443     127579     643008 
## -1.9664904 -1.9671452 -1.9684546 -1.9688662 -1.9710908 -1.9755544 -1.9773363 
##       4058       2170       4884       9472       1833     219623       <NA> 
## -1.9830961 -1.9854941 -1.9864604 -1.9885190 -1.9899481 -1.9924410 -1.9970736 
##      92749       1306      56256     112476     221002     148252       4212 
## -1.9985270 -1.9997547 -2.0060164 -2.0272274 -2.0380303 -2.0380644 -2.0525852 
##       5172     138715       8515     114899       5630     375775       7805 
## -2.0604991 -2.0660913 -2.0663195 -2.0737630 -2.0743928 -2.0917355 -2.0922100 
##       4885     646962     259236     161497      83481       2354       1397 
## -2.0981090 -2.0996667 -2.1026073 -2.1171671 -2.1211637 -2.1278590 -2.1344619 
##      11341       6493      10156      29995     117144       7125      56963 
## -2.1371645 -2.1481464 -2.1521269 -2.1578891 -2.1598431 -2.1600480 -2.1610010 
##     116496       1016      10156  100271927       4223       7123      23150 
## -2.1673489 -2.1745305 -2.1800436 -2.1800436 -2.1867582 -2.1892658 -2.1924864 
##       <NA>      29933     202500       1638      53616       7056     126393 
## -2.2024785 -2.2042826 -2.2080599 -2.2166274 -2.2176905 -2.2193157 -2.2270480 
##       5178     221481       4861       3699       5915       4902      10110 
## -2.2324570 -2.2369542 -2.2413953 -2.2443793 -2.2561434 -2.2576210 -2.2638349 
##       3739       8639      93010       <NA>      51332      10699      57188 
## -2.2743714 -2.2780818 -2.2787186 -2.2897756 -2.2915045 -2.3008411 -2.3030014 
##       9496     255239      79589     170689     497190  124907805      51760 
## -2.3100319 -2.3310076 -2.3360310 -2.3385297 -2.3559129 -2.3559129 -2.3630816 
##      55089        360        635      30820       7134      85439       5334 
## -2.3816312 -2.3825410 -2.3872175 -2.3914169 -2.3954715 -2.4133920 -2.4161040 
##       <NA>      27092      57699     144347  100533183       5420       1382 
## -2.4267557 -2.4362621 -2.4367480 -2.4392801 -2.4392801 -2.4450343 -2.4747044 
##       9389      57125      84106        288      80303       4881        927 
## -2.4965380 -2.5065592 -2.5091691 -2.5126213 -2.5137543 -2.5236486 -2.5269844 
##      64129      84707        478       5625       8817     167838        886 
## -2.5279204 -2.5328084 -2.5372995 -2.5373362 -2.5394264 -2.5519627 -2.5548926 
##      79190     127707      84570  102724536      23017     116362       6445 
## -2.5786749 -2.5829511 -2.6011171 -2.6027852 -2.6057209 -2.6173031 -2.6191312 
##       <NA>       5348        761       5176     146760       2254       8483 
## -2.6212609 -2.6353171 -2.6399475 -2.6547355 -2.6550956 -2.6560109 -2.6568885 
##      23563     116442      11170      80763       4674      23086      79689 
## -2.6569672 -2.6729456 -2.6899715 -2.6940667 -2.6940847 -2.7305494 -2.7326783 
##       1396        358     146177       7060      80760       4856       2353 
## -2.7433910 -2.7477584 -2.7677398 -2.7766264 -2.7914443 -2.7963531 -2.8003467 
##        314       7148      80144      80183     340527     151449      79365 
## -2.8189774 -2.8209764 -2.8526207 -2.8534121 -2.8599437 -2.8802087 -2.8828343 
##        117       1474      81578     653075     653125      64094     148113 
## -2.8851281 -2.8983574 -2.9016358 -2.9213505 -2.9213505 -2.9283426 -2.9324308 
##       2533       <NA>     389084       1357       1674       <NA>     283298 
## -2.9343020 -2.9444983 -2.9579321 -2.9928880 -3.0385281 -3.0470740 -3.0478592 
##       4056       1298       8822      55001       7058      10391      10457 
## -3.0563739 -3.0584203 -3.0663975 -3.0740809 -3.0775659 -3.0793101 -3.0885733 
##       3131      27074       1297       1299     283358       3209      64084 
## -3.1093834 -3.1148666 -3.1155823 -3.1212880 -3.1223462 -3.1367622 -3.1681167 
##      84894       8447      54437     345930      57530     112609     692094 
## -3.2045610 -3.2156847 -3.2168971 -3.2577200 -3.2649657 -3.2661446 -3.2714225 
##     646658     123099       3587       2139     645121      23544     127435 
## -3.2984558 -3.3177486 -3.3259846 -3.3402133 -3.3565827 -3.3782388 -3.3917972 
##       1549      55801     140578       2700        492      25791       1302 
## -3.3960020 -3.3974873 -3.4279217 -3.4311923 -3.4701327 -3.4740315 -3.4836241 
##     164395       2487      25830      59344       8707      56062       1746 
## -3.4989367 -3.5624583 -3.5887557 -3.6133828 -3.6141458 -3.6893868 -3.6994728 
##     145270     119395         70      24141     440738       3736        477 
## -3.7236172 -3.7326232 -3.7367130 -3.7673604 -3.8336768 -3.8370090 -3.8443855 
##     338773     136227       9671     339855      64090       8435      23349 
## -3.9028850 -3.9157039 -3.9390511 -3.9511792 -4.0158539 -4.0266382 -4.0877327 
##       2625      10242      10218       9379      26290     392617       4653 
## -4.1080335 -4.1287526 -4.1415232 -4.1662847 -4.2475278 -4.3210423 -4.3216292 
##     553158       3742       9595       5224      57167     388336       6696 
## -4.3334952 -4.3462974 -4.4481354 -4.4732641 -4.4830826 -4.4962252 -4.5269145 
##     642273      11061       3861       2899      30812     125113       7139 
## -4.5396177 -4.5855136 -4.6367716 -4.7247058 -4.7537394 -4.7863795 -4.8273444 
##  107984345     114792       7140       6423       2660      91156       3857 
## -4.8500319 -4.9583273 -5.0103509 -5.0594071 -5.0658405 -5.2053899 -5.2641292 
##       <NA>      90586       <NA>       2982       7135       6755       3868 
## -5.2813826 -5.2813826 -5.3334705 -5.3746632 -5.4576301 -5.4954160 -5.5428803 
##       1280     192666       3851       <NA>     114905       4242      90167 
## -5.8115711 -6.0834315 -6.1676620 -6.2365948 -6.2663336 -6.3802309 -6.4651590 
##     390664       <NA>       <NA>       <NA> 
## -6.5076834 -6.7751559 -7.4355326 -7.5193246
#gene_ids <- bitr(tmp, fromType = tmp$hgnc_symbol, toType =tmp$entrezgene_id, OrgDb = org.Hs.eg.db)

# GO over-representation test

ego <- clusterProfiler::enrichKEGG(gene= gene,                                                                              organism = 'hsa',
                                   keyType = "kegg",
                                   pvalueCutoff  = 0.05,
                                   qvalueCutoff  = 0.01)
## Reading KEGG annotation online: "https://rest.kegg.jp/link/hsa/pathway"...
## Reading KEGG annotation online: "https://rest.kegg.jp/list/pathway/hsa"...
#egoKEGG<-gseKEGG(geneList = gene_list,
              #organism="hsa",
              #keyType = "kegg",
              #pvalueCutoff = 0.001,
              #pAdjustMethod = "BH")
#summary(egoKEGG)
summary(ego)
## Warning in summary(ego): summary method to convert the object to data.frame is
## deprecated, please use as.data.frame instead.
##                ID                                                Description
## hsa05012 hsa05012                                          Parkinson disease
## hsa00190 hsa00190                                  Oxidative phosphorylation
## hsa03050 hsa03050                                                 Proteasome
## hsa05020 hsa05020                                              Prion disease
## hsa05208 hsa05208          Chemical carcinogenesis - reactive oxygen species
## hsa05010 hsa05010                                          Alzheimer disease
## hsa05415 hsa05415                                    Diabetic cardiomyopathy
## hsa04668 hsa04668                                      TNF signaling pathway
## hsa04932 hsa04932                          Non-alcoholic fatty liver disease
## hsa05022 hsa05022          Pathways of neurodegeneration - multiple diseases
## hsa05016 hsa05016                                         Huntington disease
## hsa04714 hsa04714                                              Thermogenesis
## hsa05014 hsa05014                              Amyotrophic lateral sclerosis
## hsa05323 hsa05323                                       Rheumatoid arthritis
## hsa04657 hsa04657                                    IL-17 signaling pathway
## hsa05222 hsa05222                                     Small cell lung cancer
## hsa05017 hsa05017                                     Spinocerebellar ataxia
## hsa00010 hsa00010                               Glycolysis / Gluconeogenesis
## hsa05165 hsa05165                             Human papillomavirus infection
## hsa04978 hsa04978                                         Mineral absorption
## hsa00020 hsa00020                                  Citrate cycle (TCA cycle)
## hsa04066 hsa04066                                    HIF-1 signaling pathway
## hsa04141 hsa04141                Protein processing in endoplasmic reticulum
## hsa05230 hsa05230                        Central carbon metabolism in cancer
## hsa05169 hsa05169                               Epstein-Barr virus infection
## hsa04974 hsa04974                           Protein digestion and absorption
## hsa04964 hsa04964                    Proximal tubule bicarbonate reclamation
## hsa04260 hsa04260                                 Cardiac muscle contraction
## hsa04512 hsa04512                                   ECM-receptor interaction
## hsa05110 hsa05110                                  Vibrio cholerae infection
## hsa05410 hsa05410                                Hypertrophic cardiomyopathy
## hsa05120 hsa05120 Epithelial cell signaling in Helicobacter pylori infection
## hsa04933 hsa04933       AGE-RAGE signaling pathway in diabetic complications
## hsa05167 hsa05167            Kaposi sarcoma-associated herpesvirus infection
## hsa04931 hsa04931                                         Insulin resistance
##          GeneRatio  BgRatio       pvalue     p.adjust       qvalue
## hsa05012  104/1483 266/8466 2.191612e-17 7.341901e-15 5.490565e-15
## hsa00190   65/1483 134/8466 1.006695e-16 1.686214e-14 1.261018e-14
## hsa03050   32/1483  46/8466 8.727506e-15 9.745715e-13 7.288233e-13
## hsa05020   99/1483 272/8466 3.152661e-14 2.465277e-12 1.843632e-12
## hsa05208   86/1483 223/8466 3.679518e-14 2.465277e-12 1.843632e-12
## hsa05010  124/1483 384/8466 4.311158e-13 2.407063e-11 1.800097e-11
## hsa05415   76/1483 203/8466 6.722128e-12 3.217018e-10 2.405814e-10
## hsa04668   51/1483 114/8466 1.049915e-11 4.396520e-10 3.287892e-10
## hsa04932   60/1483 155/8466 2.432185e-10 9.053133e-09 6.770293e-09
## hsa05022  133/1483 476/8466 4.275132e-09 1.432169e-07 1.071033e-07
## hsa05016   94/1483 306/8466 6.208880e-09 1.890886e-07 1.414080e-07
## hsa04714   76/1483 232/8466 8.651858e-09 2.415310e-07 1.806265e-07
## hsa05014  104/1483 364/8466 6.759172e-08 1.741787e-06 1.302577e-06
## hsa05323   35/1483  93/8466 2.907420e-06 6.957040e-05 5.202751e-05
## hsa04657   35/1483  94/8466 3.863418e-06 8.628301e-05 6.452586e-05
## hsa05222   34/1483  92/8466 6.412025e-06 1.342518e-04 1.003988e-04
## hsa05017   46/1483 143/8466 1.297075e-05 2.556001e-04 1.911479e-04
## hsa00010   26/1483  67/8466 2.892354e-05 5.382993e-04 4.025616e-04
## hsa05165   87/1483 331/8466 3.077063e-05 5.425347e-04 4.057290e-04
## hsa04978   24/1483  60/8466 3.244742e-05 5.434942e-04 4.064466e-04
## hsa00020   15/1483  30/8466 4.630507e-05 7.386761e-04 5.524113e-04
## hsa04066   36/1483 109/8466 5.954720e-05 9.067414e-04 6.780973e-04
## hsa04141   51/1483 173/8466 6.405356e-05 9.329541e-04 6.977001e-04
## hsa05230   26/1483  70/8466 6.974632e-05 9.735424e-04 7.280537e-04
## hsa05169   57/1483 202/8466 9.408889e-05 1.233669e-03 9.225870e-04
## hsa04974   34/1483 103/8466 9.574747e-05 1.233669e-03 9.225870e-04
## hsa04964   12/1483  23/8466 1.604104e-04 1.990277e-03 1.488408e-03
## hsa04260   29/1483  87/8466 2.528139e-04 3.024738e-03 2.262019e-03
## hsa04512   29/1483  89/8466 3.905437e-04 4.511453e-03 3.373844e-03
## hsa05110   19/1483  50/8466 4.616324e-04 5.154895e-03 3.855035e-03
## hsa05410   29/1483  90/8466 4.815417e-04 5.203757e-03 3.891576e-03
## hsa05120   24/1483  70/8466 5.284044e-04 5.531734e-03 4.136850e-03
## hsa04933   31/1483 100/8466 6.606417e-04 6.706514e-03 5.015398e-03
## hsa05167   52/1483 194/8466 7.234645e-04 7.128253e-03 5.330791e-03
## hsa04931   32/1483 108/8466 1.282028e-03 1.227083e-02 9.176618e-03
##                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 geneID
## hsa05012                                                                                                                                                 135/11047/498/506/509/514/516/518/10476/522/598/91860/815/817/1327/9377/1329/1340/1345/1347/1349/1350/54205/1649/1843/1965/2770/2774/3800/4128/4129/4217/9927/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/11315/10105/5682/5683/5684/5685/5686/5687/5688/5689/5690/5691/5692/5693/5694/5695/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/6389/6391/5413/4891/292/57181/23516/55630/7922/64116/347733/7295/25828/9246/10975/7384/7386/27089/7416/7417
## hsa00190                                                                                                                                                                                                                                                                                                                                                            498/506/509/514/516/518/521/9551/10632/10476/522/537/533/527/9114/8992/529/9296/9550/534/51606/10063/1327/9377/1329/1340/1345/1347/1349/1350/54205/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/5464/27068/6389/6391/10312/10975/7384/7386/27089
## hsa03050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           11047/51371/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## hsa05020                                                                                                                                                                           11047/498/506/509/514/516/518/10476/522/727/775/6352/1327/9377/1329/1340/1345/1347/1349/1350/1385/64764/1459/54205/1649/1958/1965/2534/116443/3569/3800/3915/5600/4684/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/5291/5293/8503/10105/5580/5682/5683/5684/5685/5686/5687/5688/5689/5690/5691/5692/5693/5694/5695/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/6389/6391/292/10963/347733/10975/7384/7386/27089/7416/7417
## hsa05208                                                                                                                                                                                                                                                         25/27/1645/1646/8644/369/498/506/509/514/516/518/10476/522/873/1147/1327/9377/1329/1340/1345/1347/1349/1350/1571/2353/2946/2948/9446/3091/8517/5604/9020/4217/5600/4257/4258/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/4790/4792/5291/5293/8503/5337/5338/10105/5580/5587/5770/5781/5795/6389/6391/292/6648/6655/10975/7384/7386/27089/7416/7417
## hsa05010                                              11047/369/22863/488/489/498/506/509/514/516/518/10476/522/8678/637/775/91860/1020/1139/1147/1327/9377/1329/1340/1345/1347/1349/1350/1435/1454/1459/54205/1649/1965/8772/355/2597/3028/8517/3569/3667/3800/5604/4217/2475/23385/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/4790/4843/5291/5293/8503/10105/5663/5682/5683/5684/5685/5686/5687/5688/5689/5690/5691/5692/5693/5694/5695/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/5743/6389/6391/4891/292/57181/23516/55630/7922/64116/7186/347733/10975/7384/7386/27089/7416/7417/55062/7482/7474/7483
## hsa05415                                                                                                                                                                                                                                                                                                          183/488/489/498/506/509/514/516/518/10476/522/815/817/1281/1327/9377/1329/1340/1345/1347/1349/1350/2597/9945/2936/2997/3667/5600/2475/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/4790/5162/5166/5291/5293/8503/10105/5580/5590/6389/6391/292/6513/7042/7043/7046/10975/7384/7386/27089/7416/7417
## hsa04668                                                                                                                                                                                                                                                                                                                                                                                                                                9530/602/330/6347/6364/6352/1051/8837/1147/1385/64764/1435/1437/2919/3627/2920/2921/6374/6372/1540/1906/8772/355/2353/3383/8517/3600/3569/3659/3976/5604/5606/5608/9020/4217/1326/5600/4314/4790/4792/64127/5291/5293/8503/5743/6401/23118/7128/7133/7186/7187
## hsa04932                                                                                                                                                                                                                                                                                                                                                                             51094/637/1327/9377/1329/1340/1345/1347/1349/1350/3576/54205/1571/1649/1965/355/2353/3569/3667/4217/5600/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/4790/10062/5291/5293/8503/5563/51422/6389/6391/7186/10975/7384/7386/27089
## hsa05022 11047/369/22863/488/489/498/506/509/514/516/518/10476/522/4287/578/598/627/8678/637/775/91860/815/817/1020/1139/1327/9377/1329/1340/1345/1347/1349/1350/1435/1454/1459/54205/1649/79139/201625/1965/8772/355/3028/3569/3800/440738/5604/5606/5608/4217/5600/9927/2475/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/4790/4843/10133/11315/10105/5630/5663/5682/5683/5684/5685/5686/5687/5688/5689/5690/5691/5692/5693/5694/5695/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/5743/116442/6389/6391/5413/292/7133/10452/7186/347733/9246/10975/7384/7386/27089/9217/7415/7416/7417/55062/7482/7474/7483
## hsa05016                                                                                                                                                                                                  11047/22863/498/506/509/514/516/518/10476/522/627/8678/1211/1327/9377/1329/1340/1345/1347/1349/1350/1385/64764/54205/201625/3065/3800/4217/2475/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/5435/5440/10105/5682/5683/5684/5685/5686/5687/5688/5689/5690/5691/5692/5693/5694/5695/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/6389/6391/292/6648/7186/347733/10975/7384/7386/27089/7416/7417/55062
## hsa04714                                                                                                                                                                                                                                                                                     2181/2182/84335/498/506/509/514/516/518/521/9551/10632/10476/522/28958/51287/388753/84987/51241/10063/1327/9377/1329/1340/1345/1347/1349/1350/1385/64764/5606/4217/5600/2475/4694/51079/4695/4696/4697/4701/4702/4704/4706/51103/91942/29078/284184/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/4881/63976/5563/51422/6389/6391/6595/6603/6655/10975/7384/7386/27089
## hsa05014                                                                                                                                          11047/283/22863/498/506/509/514/516/518/10476/522/598/8678/637/1327/9377/1329/1340/1345/1347/1349/1350/54205/1649/79139/201625/1965/3800/440738/5606/5608/4217/5600/2475/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/4843/9542/55916/10133/5630/5682/5683/5684/5685/5686/5687/5688/5689/5690/5691/5692/5693/5694/5695/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/116442/6389/6391/7133/10452/7186/347733/29978/10975/7384/7386/27089/9217/7415/7416/55062
## hsa05323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   284/537/533/527/9114/8992/529/9296/9550/534/51606/6347/6364/6348/6352/1435/1437/1513/2919/2920/2921/6374/6372/3576/2353/3383/3589/3600/51561/3569/4312/4314/10312/7042/7043
## hsa04657                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         6356/6347/6364/6354/1051/1147/1437/1440/2919/3627/2920/2921/6374/6372/3576/8772/2353/2354/8517/132014/3569/3934/5600/225689/4312/4314/4790/4792/5743/23118/7128/7186/7187/10758/29761
## hsa05222                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        578/598/330/898/1021/1030/1147/1282/1284/1285/1286/54205/1871/4616/8517/3685/3688/3908/3909/3910/3912/3914/3915/3918/4790/4792/4843/5291/5293/8503/5743/5915/7186/7187
## hsa05017                                                                                                                                                                                                                                                                                                                                                                                                                                                    11047/22863/488/489/4287/8678/54205/116443/3752/4217/2475/5291/5293/8503/10105/5682/5683/5684/5685/5686/5687/5688/5689/5690/5691/5692/5693/5694/5695/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/6095/292/7186/7416/7417/7436/55062
## hsa00010                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          83440/219/217/226/1737/2023/2026/387712/92579/130589/2597/2821/3099/3939/3945/9562/5105/5106/5162/5211/5214/5223/5224/5230/5315/7167
## hsa05165                                                                                                                                                                                                                                                 472/537/533/527/9114/8992/529/9296/9550/534/51606/545/578/896/898/1021/1101/1147/1280/1282/1284/1285/1286/1297/1298/1299/1385/64764/8772/355/2308/3065/3105/3454/3455/8517/3659/9636/3672/8515/22801/3685/3688/3908/3909/3910/3912/3914/3915/3918/3955/3993/5604/4242/2475/4790/4799/8638/50855/5291/5293/8503/5315/5516/5519/5525/5526/5584/5590/5663/5734/5743/5986/6655/6696/6772/6934/10312/7058/7059/7060/7148/7187/23352/7482/7474/7483
## hsa04978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          475/476/477/478/481/483/492/493/540/79901/2495/4493/4494/4495/4501/4502/4891/7779/142680/55630/6547/6550/26872/54822
## hsa00020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          47/48/50/1737/3419/4190/4191/5091/5105/5106/5162/6389/6391/8803/8801
## hsa04066                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          226/284/815/817/1906/54583/112399/1977/6921/2023/2026/387712/2064/2597/3091/3099/3459/3460/3569/3939/3945/5604/8569/2475/4790/4843/5162/5163/5211/5214/5230/5291/5293/8503/6513/7037
## hsa04141                                                                                                                                                                                                                                                                                                                                                                                                 4287/573/9532/578/10970/1410/1649/79139/51009/3301/51726/64215/5611/80331/55741/111089941/80267/1965/27248/30001/22824/10525/4121/57134/4217/51360/58505/5034/2923/9601/23645/5886/6184/6185/51128/10483/9871/22872/10952/23480/55829/64374/6500/6747/201595/7186/51619/10277/29978/7353/7415
## hsa05230                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           2064/2263/2261/2744/3091/3099/3939/3945/5604/2475/5162/5163/5211/5214/5223/5224/5291/5293/8503/5315/9997/23410/9123/6510/6513/57103
## hsa05169                                                                                                                                                                                                                                                                                                                                                                                                  11047/567/578/637/896/898/1021/1147/3627/54205/1871/8772/355/4616/3065/3105/3383/3454/3455/8517/3569/51135/9636/5606/5608/9020/5600/4790/4791/4792/4793/4794/4938/2923/5291/5293/8503/5704/5705/5707/5717/10213/5708/5709/5710/5713/5971/22938/6772/23118/6890/6891/6892/7128/7186/7187/7431
## hsa04974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               476/477/478/481/483/1302/1303/1306/80781/81578/169044/84570/136227/1280/1281/1282/1284/1285/1286/1290/1294/1296/1297/1298/1299/1357/3783/6510/120103/54407/9056/23428/6547/6550
## hsa04964                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          358/476/477/478/481/483/760/2744/4190/5105/5106/6550
## hsa04260                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       70/444/476/477/478/481/483/488/489/775/782/27092/1327/9377/1329/1340/1345/1347/1349/1350/6547/7134/7139/7168/7169/10975/7384/7386/27089
## hsa04512                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          375790/1101/1280/1282/1284/1285/1286/1297/1298/1299/80144/2812/3672/8515/22801/3685/3688/3908/3909/3910/3912/3914/3915/3918/6696/7058/7059/7060/7148
## hsa05110                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 375/537/533/527/9114/8992/529/9296/9550/534/51606/30001/9601/10952/23480/6558/10312/7082/9414
## hsa05410                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  70/183/488/489/775/782/27092/1674/1906/3569/3672/8515/22801/3685/3688/3908/4000/5563/51422/6442/6443/6445/6547/7042/7043/7134/7139/7168/7169
## hsa05120                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          537/533/527/9114/8992/529/9296/9550/534/51606/6352/1147/2919/2920/2921/3576/8517/9020/5600/4790/4792/5781/10312/7082
## hsa04933                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   183/6347/1281/1282/1284/1285/1286/3576/1906/1958/2152/2308/3383/3569/5600/4772/4790/5291/5293/8503/5333/113026/5580/5590/6401/6772/6777/7042/7043/7046/7056
## hsa05167                                                                                                                                                                                                                                                                                                                                                                                                                       22863/64422/578/8678/637/718/91860/1021/1147/1385/1437/2919/2920/2921/3576/54205/1871/8772/355/2353/59345/10681/2791/2788/3055/3091/3105/3383/3454/3455/3459/8517/3569/440738/5604/5608/5600/9261/2475/4772/4790/4792/5291/5293/8503/5743/1827/6772/6934/7186/7187/7538
## hsa04931                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        183/1385/64764/2308/92579/9945/2997/3569/3667/2475/4790/4792/7376/10062/10724/8473/5105/5106/5291/5293/8503/79660/5507/5563/51422/5580/5590/5770/5781/11000/6513/57761
##          Count
## hsa05012   104
## hsa00190    65
## hsa03050    32
## hsa05020    99
## hsa05208    86
## hsa05010   124
## hsa05415    76
## hsa04668    51
## hsa04932    60
## hsa05022   133
## hsa05016    94
## hsa04714    76
## hsa05014   104
## hsa05323    35
## hsa04657    35
## hsa05222    34
## hsa05017    46
## hsa00010    26
## hsa05165    87
## hsa04978    24
## hsa00020    15
## hsa04066    36
## hsa04141    51
## hsa05230    26
## hsa05169    57
## hsa04974    34
## hsa04964    12
## hsa04260    29
## hsa04512    29
## hsa05110    19
## hsa05410    29
## hsa05120    24
## hsa04933    31
## hsa05167    52
## hsa04931    32
head(summary(ego))
## Warning in summary(ego): summary method to convert the object to data.frame is
## deprecated, please use as.data.frame instead.
##                ID                                       Description GeneRatio
## hsa05012 hsa05012                                 Parkinson disease  104/1483
## hsa00190 hsa00190                         Oxidative phosphorylation   65/1483
## hsa03050 hsa03050                                        Proteasome   32/1483
## hsa05020 hsa05020                                     Prion disease   99/1483
## hsa05208 hsa05208 Chemical carcinogenesis - reactive oxygen species   86/1483
## hsa05010 hsa05010                                 Alzheimer disease  124/1483
##           BgRatio       pvalue     p.adjust       qvalue
## hsa05012 266/8466 2.191612e-17 7.341901e-15 5.490565e-15
## hsa00190 134/8466 1.006695e-16 1.686214e-14 1.261018e-14
## hsa03050  46/8466 8.727506e-15 9.745715e-13 7.288233e-13
## hsa05020 272/8466 3.152661e-14 2.465277e-12 1.843632e-12
## hsa05208 223/8466 3.679518e-14 2.465277e-12 1.843632e-12
## hsa05010 384/8466 4.311158e-13 2.407063e-11 1.800097e-11
##                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    geneID
## hsa05012                                                                                                    135/11047/498/506/509/514/516/518/10476/522/598/91860/815/817/1327/9377/1329/1340/1345/1347/1349/1350/54205/1649/1843/1965/2770/2774/3800/4128/4129/4217/9927/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/11315/10105/5682/5683/5684/5685/5686/5687/5688/5689/5690/5691/5692/5693/5694/5695/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/6389/6391/5413/4891/292/57181/23516/55630/7922/64116/347733/7295/25828/9246/10975/7384/7386/27089/7416/7417
## hsa00190                                                                                                                                                                                                                                                                                                               498/506/509/514/516/518/521/9551/10632/10476/522/537/533/527/9114/8992/529/9296/9550/534/51606/10063/1327/9377/1329/1340/1345/1347/1349/1350/54205/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/5464/27068/6389/6391/10312/10975/7384/7386/27089
## hsa03050                                                                                                                                                                                                                                                                                                                                                                                                                                                                              11047/51371/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## hsa05020                                                                                                                              11047/498/506/509/514/516/518/10476/522/727/775/6352/1327/9377/1329/1340/1345/1347/1349/1350/1385/64764/1459/54205/1649/1958/1965/2534/116443/3569/3800/3915/5600/4684/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/5291/5293/8503/10105/5580/5682/5683/5684/5685/5686/5687/5688/5689/5690/5691/5692/5693/5694/5695/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/6389/6391/292/10963/347733/10975/7384/7386/27089/7416/7417
## hsa05208                                                                                                                                                                                                            25/27/1645/1646/8644/369/498/506/509/514/516/518/10476/522/873/1147/1327/9377/1329/1340/1345/1347/1349/1350/1571/2353/2946/2948/9446/3091/8517/5604/9020/4217/5600/4257/4258/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/4790/4792/5291/5293/8503/5337/5338/10105/5580/5587/5770/5781/5795/6389/6391/292/6648/6655/10975/7384/7386/27089/7416/7417
## hsa05010 11047/369/22863/488/489/498/506/509/514/516/518/10476/522/8678/637/775/91860/1020/1139/1147/1327/9377/1329/1340/1345/1347/1349/1350/1435/1454/1459/54205/1649/1965/8772/355/2597/3028/8517/3569/3667/3800/5604/4217/2475/23385/4694/51079/4695/4696/4697/4701/4702/4704/4706/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/4790/4843/5291/5293/8503/10105/5663/5682/5683/5684/5685/5686/5687/5688/5689/5690/5691/5692/5693/5694/5695/5704/5705/5707/5717/10213/5708/5709/5710/5713/5715/5743/6389/6391/4891/292/57181/23516/55630/7922/64116/7186/347733/10975/7384/7386/27089/7416/7417/55062/7482/7474/7483
##          Count
## hsa05012   104
## hsa00190    65
## hsa03050    32
## hsa05020    99
## hsa05208    86
## hsa05010   124
browseKEGG(ego,'hsa05012')
hsa05012 <- pathview(gene.data  = gene_list,
                     pathway.id = "hsa05012",
                     species    = "hsa",
                     limit      = list(gene=max(abs(gene_list)), cpd=1))
## 'select()' returned 1:1 mapping between keys and columns
## Info: Working in directory /Users/aungphyo/Desktop/June Project
## Info: Writing image file hsa05012.pathview.png
hsa05012
## $plot.data.gene
##     kegg.names  labels
## 5       120892   LRRK2
## 11        7317    UBA1
## 12        6233  RPS27A
## 13        9246  UBE2L6
## 14        6233  RPS27A
## 15        5071    PRKN
## 16        5413 SEPTIN5
## 17        9627  SNCAIP
## 18        2861   GPR37
## 19       11315   PARK7
## 20       65018   PINK1
## 21        6622    SNCA
## 22        7345   UCHL1
## 25       54205    CYCS
## 26        4694  NDUFA1
## 27        6389    SDHA
## 28        7384  UQCRC1
## 29        1327  COX4I1
## 30         498 ATP5F1A
## 31       27429   HTRA2
## 32         292 SLC25A5
## 45        6233  RPS27A
## 46        6233  RPS27A
## 47        6233  RPS27A
## 48        6233  RPS27A
## 49        6233  RPS27A
## 50        6233  RPS27A
## 59        6233  RPS27A
## 60        6233  RPS27A
## 61        6233  RPS27A
## 139       7326  UBE2G1
## 149       7054      TH
## 150       6531  SLC6A3
## 152        842   CASP9
## 153        836   CASP3
## 155        317   APAF1
## 159       6570 SLC18A1
## 160       6531  SLC6A3
## 168        135 ADORA2A
## 169       1813    DRD2
## 170       1812    DRD1
## 171       2774    GNAL
## 172       2770   GNAI1
## 173       2774    GNAL
## 174        111   ADCY5
## 175        111   ADCY5
## 176       5566  PRKACA
## 177       5566  PRKACA
## 229       6622    SNCA
## 232       9451 EIF2AK3
## 233       2081    ERN1
## 234      22926    ATF6
## 236       1965  EIF2S1
## 237        468    ATF4
## 241       7494    XBP1
## 243       1649   DDIT3
## 244       1649   DDIT3
## 248       3309   HSPA5
## 255       6622    SNCA
## 260       5682   PSMA1
## 261       5704   PSMC4
## 267       3708   ITPR1
## 271       5335   PLCG1
## 272       6622    SNCA
## 273       5071    PRKN
## 278      91860  CALML4
## 279        815  CAMK2A
## 280       4137    MAPT
## 284       6263    RYR3
## 292       3800   KIF5C
## 295       7277  TUBA4A
## 296     347733  TUBB2B
## 300       6622    SNCA
## 304      65018   PINK1
## 307       5071    PRKN
## 314      65018   PINK1
## 315       5071    PRKN
## 316        581     BAX
## 323       6622    SNCA
## 326      11315   PARK7
## 327        598  BCL2L1
## 332      10131   TRAP1
## 335      65018   PINK1
## 338       7157    TP53
## 343       1616    DAXX
## 344       4217  MAP3K5
## 345       5599   MAPK8
## 347       4780  NFE2L2
## 361       1843   DUSP1
## 362       7295     TXN
## 364       6570 SLC18A1
## 365       6622    SNCA
## 368       5071    PRKN
## 374       4128    MAOA
## 375       5071    PRKN
## 382      90550     MCU
## 398       9927    MFN2
## 402       6622    SNCA
## 711       6531  SLC6A3
## 714       9817   KEAP1
## 715       7295     TXN
## 724       4891 SLC11A2
## 735       6647    SOD1
##                                                                                                                         all.mapped
## 5                                                                                                                                 
## 11                                                                                                                                
## 12                                                                                                                                
## 13                                                                                                                            9246
## 14                                                                                                                                
## 15                                                                                                                                
## 16                                                                                                                            5413
## 17                                                                                                                                
## 18                                                                                                                                
## 19                                                                                                                           11315
## 20                                                                                                                                
## 21                                                                                                                                
## 22                                                                                                                                
## 25                                                                                                                           54205
## 26  4694,4695,4696,4697,4701,4702,4704,4706,4707,4708,4709,4710,4711,4712,4714,4715,4717,4718,4719,4725,4726,4728,4729,51079,54539
## 27                                                                                                                       6389,6391
## 28                                                                                                           7384,7386,10975,27089
## 29                                                                                         1327,1329,1340,1345,1347,1349,1350,9377
## 30                                                                                               498,506,509,514,516,518,522,10476
## 31                                                                                                                                
## 32                                                                                                             292,7416,7417,10105
## 45                                                                                                                                
## 46                                                                                                                                
## 47                                                                                                                                
## 48                                                                                                                                
## 49                                                                                                                                
## 50                                                                                                                                
## 59                                                                                                                                
## 60                                                                                                                                
## 61                                                                                                                                
## 139                                                                                                                               
## 149                                                                                                                               
## 150                                                                                                                               
## 152                                                                                                                               
## 153                                                                                                                               
## 155                                                                                                                               
## 159                                                                                                                               
## 160                                                                                                                               
## 168                                                                                                                            135
## 169                                                                                                                               
## 170                                                                                                                               
## 171                                                                                                                           2774
## 172                                                                                                                           2770
## 173                                                                                                                           2774
## 174                                                                                                                               
## 175                                                                                                                               
## 176                                                                                                                               
## 177                                                                                                                               
## 229                                                                                                                               
## 232                                                                                                                               
## 233                                                                                                                               
## 234                                                                                                                               
## 236                                                                                                                           1965
## 237                                                                                                                               
## 241                                                                                                                               
## 243                                                                                                                           1649
## 244                                                                                                                           1649
## 248                                                                                                                               
## 255                                                                                                                               
## 260                                                          5682,5683,5684,5685,5686,5687,5688,5689,5690,5691,5692,5693,5694,5695
## 261                                                                       5704,5705,5707,5708,5709,5710,5713,5715,5717,10213,11047
## 267                                                                                                                               
## 271                                                                                                                               
## 272                                                                                                                               
## 273                                                                                                                               
## 278                                                                                                                          91860
## 279                                                                                                                        815,817
## 280                                                                                                                               
## 284                                                                                                                               
## 292                                                                                                                           3800
## 295                                                                                                                               
## 296                                                                                                                         347733
## 300                                                                                                                               
## 304                                                                                                                               
## 307                                                                                                                               
## 314                                                                                                                               
## 315                                                                                                                               
## 316                                                                                                                               
## 323                                                                                                                               
## 326                                                                                                                          11315
## 327                                                                                                                            598
## 332                                                                                                                               
## 335                                                                                                                               
## 338                                                                                                                               
## 343                                                                                                                               
## 344                                                                                                                           4217
## 345                                                                                                                               
## 347                                                                                                                               
## 361                                                                                                                           1843
## 362                                                                                                                     7295,25828
## 364                                                                                                                               
## 365                                                                                                                               
## 368                                                                                                                               
## 374                                                                                                                      4128,4129
## 375                                                                                                                               
## 382                                                                                                                               
## 398                                                                                                                           9927
## 402                                                                                                                               
## 711                                                                                                                               
## 714                                                                                                                               
## 715                                                                                                                     7295,25828
## 724                                                                                              4891,7922,23516,55630,57181,64116
## 735                                                                                                                               
##     type    x    y width height   mol.data mol.col
## 5   gene 1180  963    46     17         NA #FFFFFF
## 11  gene  730  185    46     17         NA #FFFFFF
## 12  gene  730  215    46     17         NA #FFFFFF
## 13  gene  825  185    46     17  0.3191084 #BEBEBE
## 14  gene  825  215    46     17         NA #FFFFFF
## 15  gene  996  227    46     17         NA #FFFFFF
## 16  gene 1102  354    46     17 -1.0010985 #BEBEBE
## 17  gene 1102  385    46     17         NA #FFFFFF
## 18  gene 1102  322    46     17         NA #FFFFFF
## 19  gene 1086 1303    46     17  0.3994953 #BEBEBE
## 20  gene  915 1183    46     17         NA #FFFFFF
## 21  gene 1185  271    46     17         NA #FFFFFF
## 22  gene  825  439    46     17         NA #FFFFFF
## 25  gene 1318 1019    46     17  1.0141319 #BEBEBE
## 26  gene  869  990    46     17 13.2562200 #FF0000
## 27  gene  869 1025    46     17  0.8619377 #BEBEBE
## 28  gene  869 1056    46     17  2.1964764 #BEBEBE
## 29  gene  869 1089    46     17  4.1905008 #CE8F8F
## 30  gene  869 1121    46     17  4.3905575 #CE8F8F
## 31  gene 1172 1009    46     17         NA #FFFFFF
## 32  gene 1236 1073    46     17  3.1198377 #CE8F8F
## 45  gene  911  395    46     17         NA #FFFFFF
## 46  gene  911  423    46     17         NA #FFFFFF
## 47  gene  911  450    46     17         NA #FFFFFF
## 48  gene  730  393    46     17         NA #FFFFFF
## 49  gene  730  423    46     17         NA #FFFFFF
## 50  gene  730  453    46     17         NA #FFFFFF
## 59  gene 1006  283    46     17         NA #FFFFFF
## 60  gene 1006  314    46     17         NA #FFFFFF
## 61  gene 1006  344    46     17         NA #FFFFFF
## 139 gene  825  276    46     17         NA #FFFFFF
## 149 gene 1164  720    46     17         NA #FFFFFF
## 150 gene  616  749    46     17         NA #FFFFFF
## 152 gene 1435 1019    46     17         NA #FFFFFF
## 153 gene 1435  969    46     17         NA #FFFFFF
## 155 gene 1370 1048    46     17         NA #FFFFFF
## 159 gene  909  863    46     17         NA #FFFFFF
## 160 gene  616  952    46     17         NA #FFFFFF
## 168 gene  407  648    46     17  2.7820393 #CE8F8F
## 169 gene  407  743    46     17         NA #FFFFFF
## 170 gene  407 1023    46     17         NA #FFFFFF
## 171 gene  330  648    46     17  0.8048066 #BEBEBE
## 172 gene  330  743    46     17  0.8899164 #BEBEBE
## 173 gene  330 1023    46     17  0.8048066 #BEBEBE
## 174 gene  294  693    46     17         NA #FFFFFF
## 175 gene  294  982    46     17         NA #FFFFFF
## 176 gene  178  693    46     17         NA #FFFFFF
## 177 gene  178  982    46     17         NA #FFFFFF
## 229 gene 1250  720    46     17         NA #FFFFFF
## 232 gene 1050  654    46     17         NA #FFFFFF
## 233 gene 1050  611    46     17         NA #FFFFFF
## 234 gene 1050  567    46     17         NA #FFFFFF
## 236 gene 1135  654    46     17  0.4941034 #BEBEBE
## 237 gene 1219  654    46     17         NA #FFFFFF
## 241 gene 1219  611    46     17         NA #FFFFFF
## 243 gene 1394  567    46     17 -1.0914868 #BEBEBE
## 244 gene 1394  654    46     17 -1.0914868 #BEBEBE
## 248 gene  980  611    46     17         NA #FFFFFF
## 255 gene  947  571    46     17         NA #FFFFFF
## 260 gene 1292  176    46     17  6.5019065 #DF5F5F
## 261 gene 1292  193    46     17  4.5349123 #DF5F5F
## 267 gene  878  627    46     17         NA #FFFFFF
## 271 gene  781  683    46     17         NA #FFFFFF
## 272 gene  616  608    46     17         NA #FFFFFF
## 273 gene  679  683    46     17         NA #FFFFFF
## 278 gene  740  512    46     17 -0.9293267 #BEBEBE
## 279 gene  818  512    46     17 -2.2160017 #BEBEBE
## 280 gene  896  512    46     17         NA #FFFFFF
## 284 gene  878  599    46     17         NA #FFFFFF
## 292 gene  840 1338    46     17 -0.9943274 #BEBEBE
## 295 gene  751 1359    46     17         NA #FFFFFF
## 296 gene  797 1359    46     17  1.0314318 #BEBEBE
## 300 gene  755 1323    46     17         NA #FFFFFF
## 304 gene  762 1006    46     17         NA #FFFFFF
## 307 gene 1006 1192    46     17         NA #FFFFFF
## 314 gene 1250 1149    46     17         NA #FFFFFF
## 315 gene 1330 1129    46     17         NA #FFFFFF
## 316 gene 1250 1104    46     17         NA #FFFFFF
## 323 gene  844  950    46     17         NA #FFFFFF
## 326 gene 1143 1139    46     17  0.3994953 #BEBEBE
## 327 gene 1185 1183    46     17 -0.4692524 #BEBEBE
## 332 gene 1172 1030    46     17         NA #FFFFFF
## 335 gene 1250  984    46     17         NA #FFFFFF
## 338 gene 1352 1330    46     17         NA #FFFFFF
## 343 gene 1156 1406    46     17         NA #FFFFFF
## 344 gene 1156 1423    46     17  1.0639852 #BEBEBE
## 345 gene 1240 1415    46     17         NA #FFFFFF
## 347 gene 1352 1372    46     17         NA #FFFFFF
## 361 gene 1467 1330    46     17  1.2495288 #BEBEBE
## 362 gene 1467 1372    46     17  0.4871233 #BEBEBE
## 364 gene  951  810    46     17         NA #FFFFFF
## 365 gene  998  773    46     17         NA #FFFFFF
## 368 gene  798  776    46     17         NA #FFFFFF
## 374 gene 1196  782    46     17  3.9328765 #CE8F8F
## 375 gene 1231  747    46     17         NA #FFFFFF
## 382 gene  965  966    46     17         NA #FFFFFF
## 398 gene 1089 1183    46     17  0.4480849 #BEBEBE
## 402 gene 1102  290    46     17         NA #FFFFFF
## 711 gene  616 1422    46     17         NA #FFFFFF
## 714 gene 1239 1372    46     17         NA #FFFFFF
## 715 gene 1140 1469    46     17  0.4871233 #BEBEBE
## 724 gene  616 1026    46     17  6.8724953 #EF3030
## 735 gene  967 1438    46     17         NA #FFFFFF
## 
## $plot.data.cpd
##     kegg.names labels all.mapped     type    x    y width height mol.data
## 23      C04599 C04599            compound  511  950     8      8       NA
## 24      C07593 C07593            compound  543  989     8      8       NA
## 80      C00002 C00002            compound  946 1138     8      8       NA
## 81      C00008 C00008            compound  928 1103     8      8       NA
## 82      C00009 C00009            compound  960 1103     8      8       NA
## 89      C03758 C03758            compound 1128  819     8      8       NA
## 98      C00027 C00704            compound 1129  873     8      8       NA
## 100     C00002 C00002            compound  685  325     8      8       NA
## 101     C00020 C00020            compound  662  271     8      8       NA
## 102     C00013 C00013            compound  695  271     8      8       NA
## 104     C11310 C11310            compound  567  952     8      8       NA
## 124     C00002 C00002            compound 1121  139     8      8       NA
## 125     C00008 C00008            compound 1179  140     8      8       NA
## 126     C00009 C00009            compound 1208  140     8      8       NA
## 128     C00355 C00355            compound 1128  756     8      8       NA
## 147     C00082 C00082            compound 1128  691     8      8       NA
## 189     C03758 C03758            compound  568  831     8      8       NA
## 202     C00575 C00575            compound  236  692     8      8       NA
## 203     C00575 C00575            compound  236  981     8      8       NA
## 219     C00212 C00212            compound  465  647     8      8       NA
## 264     C01245 C01245            compound  842  656     8      8       NA
## 265     C00076 C00076            compound  795  613     8      8       NA
## 266     C00165 C00165            compound  844  693     8      8       NA
## 276     C00076 C00076            compound  560  607     8      8       NA
## 303     C15231 C15231            compound  543 1055     8      8       NA
## 372     C17755 C17755            compound 1235  819     8      8       NA
## 383     C00076 C00076            compound  966  914     8      8       NA
## 404     C04043 C04043            compound 1235  795     8      8       NA
## 706     C14701 C14701            compound  544 1419     8      8       NA
## 707     C14701 C14701            compound  885 1420     8      8       NA
## 708     C14701 C14701            compound  885 1492     8      8       NA
## 712     C00704 C00704            compound  939 1420     8      8       NA
## 713     C00007 C00007            compound  943 1492     8      8       NA
## 727     C00027 C00027            compound 1000 1420     8      8       NA
## 728     C16844 C16844            compound 1057 1420     8      8       NA
## 732     C22381 C22381            compound 1082 1370     8      8       NA
## 742     C00034 C00034            compound  543 1025     8      8       NA
##     mol.col
## 23  #FFFFFF
## 24  #FFFFFF
## 80  #FFFFFF
## 81  #FFFFFF
## 82  #FFFFFF
## 89  #FFFFFF
## 98  #FFFFFF
## 100 #FFFFFF
## 101 #FFFFFF
## 102 #FFFFFF
## 104 #FFFFFF
## 124 #FFFFFF
## 125 #FFFFFF
## 126 #FFFFFF
## 128 #FFFFFF
## 147 #FFFFFF
## 189 #FFFFFF
## 202 #FFFFFF
## 203 #FFFFFF
## 219 #FFFFFF
## 264 #FFFFFF
## 265 #FFFFFF
## 266 #FFFFFF
## 276 #FFFFFF
## 303 #FFFFFF
## 372 #FFFFFF
## 383 #FFFFFF
## 404 #FFFFFF
## 706 #FFFFFF
## 707 #FFFFFF
## 708 #FFFFFF
## 712 #FFFFFF
## 713 #FFFFFF
## 727 #FFFFFF
## 728 #FFFFFF
## 732 #FFFFFF
## 742 #FFFFFF
dotplot(ego,x="GeneRatio",showCategory=20,font.size=6)

#dotplot(egoKEGG,x="GeneRatio",showCategory=20,font.size=6)
subset <- ego[ego$Count>=10, asis=T]
cnetplot(ego, foldChange=geneList)
## Scale for size is already present.
## Adding another scale for size, which will replace the existing scale.
## Warning: ggrepel: 12 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps

filtered_pathway <- subset(fgsea_kegg, NES > 2.3)

filt_p <- as.vector(filtered_pathway$pathway)

for (i in filt_p){
    plt <- plotEnrichment(pathway = pathway_kegg[[i]],
    gseaParam = 1, ticksSize = 0.5, stats= rank) +
    labs(title=i) + theme(plot.title = element_text(hjust = 0.5, face="bold"))
    print(plt)
}

kegg_cytokine= subset(fgsea_kegg, fgsea_kegg$pathway=="KEGG_CYTOKINE_CYTOKINE_RECEPTOR_INTERACTION")
kegg_cytokine = unlist(kegg_cytokine$leadingEdge)


subset <- rld[kegg_cytokine, 7:12]

# scale and center the values
mat <- as.matrix(scale(t(subset), center = T))

# basic plot to check we're plotting something sensible
#pheatmap(t(mat))

# spruce it up a bit..
ann <- data.frame(Condition = c(rep("Healthy_control", 3), rep("Healthy_cytokine", 3)))
rownames(ann) <- rownames(mat)
col <- c("forestgreen","blue")
names(col) <- c("Healthy_cytokine", "Healthy_control")
ann_col <- list(Condition = col)

pheatmap(t(mat), 
         show_rownames = TRUE,
         annotation_col = ann,
         annotation_colors = ann_col,
         main = "KEGG Cytokine-Cytokine Interaction",
         labels_row = rownames(subset), # figure out remove row labels
         fontsize_row = 6,
         color = hcl.colors(100, "PRGn",rev=F))

ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "KEGG Cytokine-Cytokine Interaction",
                        labels_row = rownames(subset),
                        fontsize = 6,
                        legend = TRUE,
                       heatmap_legend_param =list(title="z-score",at=c (-1.5,-1,-0.5,0,0.5,1,1.5)),
        color=hcl.colors(100, 'PRGn',rev=F))

kegg_cytokine= subset(fgsea_kegg, fgsea_kegg$pathway=="KEGG_NOD_LIKE_RECEPTOR_SIGNALING_PATHWAY")
kegg_cytokine = unlist(kegg_cytokine$leadingEdge)


subset <- rld[kegg_cytokine, 7:12]

# scale and center the values
mat <- as.matrix(scale(t(subset), center = T))

# basic plot to check we're plotting something sensible
#pheatmap(t(mat))

# spruce it up a bit..
ann <- data.frame(Condition = c(rep("Healthy_control", 3), rep("Healthy_cytokine", 3)))
rownames(ann) <- rownames(mat)
col <- c("forestgreen","blue")
names(col) <- c("Healthy_cytokine", "Healthy_control")
ann_col <- list(Condition = col)

pheatmap(t(mat), 
         show_rownames = TRUE,
         annotation_col = ann,
         annotation_colors = ann_col,
         main = "KEGG Oxydative Phosphorylation",
         labels_row = rownames(subset), # figure out remove row labels
         fontsize_row = 6,
         color = hcl.colors(100, "PRGn",rev=F))

ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "KEGG_NOD_LIKE_RECEPTOR_SIGNALING_PATHWAY",
                        labels_row = rownames(subset),
                        fontsize = 6,
                        legend = TRUE,
                       heatmap_legend_param =list(title="z-score",at=c (-1.5,-1,-0.5,0,0.5,1,1.5)),
        color=hcl.colors(100, 'PRGn',rev=F))

kegg_cytokine= subset(fgsea_kegg, fgsea_kegg$pathway=="KEGG_CHEMOKINE_SIGNALING_PATHWAY")
kegg_cytokine = unlist(kegg_cytokine$leadingEdge)


subset <- rld[kegg_cytokine, 7:12]

# scale and center the values
mat <- as.matrix(scale(t(subset), center = T))

# basic plot to check we're plotting something sensible
#pheatmap(t(mat))

# spruce it up a bit..
ann <- data.frame(Condition = c(rep("Healthy_control", 3), rep("Healthy_cytokine", 3)))
rownames(ann) <- rownames(mat)
col <- c("forestgreen","blue")
names(col) <- c("Healthy_cytokine", "Healthy_control")
ann_col <- list(Condition = col)

pheatmap(t(mat), 
         show_rownames = TRUE,
         annotation_col = ann,
         annotation_colors = ann_col,
         main = "KEGG Chemokine Signaling Pathway",
         labels_row = rownames(subset), # figure out remove row labels
         fontsize_row = 6,
         color = hcl.colors(100, "PRGn",rev=F))

ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "KEGG Chemokine Signaling Pathway",
                        labels_row = rownames(subset),
                        fontsize = 6,
                        legend = TRUE,
                       heatmap_legend_param =list(title="z-score",at=c (-1.5,-1,-0.5,0,0.5,1,1.5)),
        color=hcl.colors(100, 'PRGn',rev=F))

Reactome

# read in gmt file
pathway_reactome <- gmtPathways("/Users/aungphyo/Downloads/c2.cp.reactome.v2023.1.Hs.symbols.gmt.txt")
head(pathway, 1)
## $GOBP_MITOCHONDRIAL_GENOME_MAINTENANCE
##  [1] "AKT3"     "PPARGC1A" "POLG2"    "PARP1"    "DNA2"     "TYMP"    
##  [7] "FLCN"     "PRIMPOL"  "ENDOG"    "STOX1"    "SLC25A4"  "LIG3"    
## [13] "MEF2A"    "MPV17"    "OPA1"     "RRM2B"    "POLG"     "SLC25A36"
## [19] "TWNK"     "RRM1"     "METTL4"   "SSBP1"    "TOP3A"    "TP53"    
## [25] "TEFM"     "PIF1"     "SESN2"    "SLC25A33" "DNAJA3"   "MGME1"   
## [31] "LONP1"
## convert result object to dataframe
res <- as.data.frame(res1)
res$hgnc_symbol <- rownames(res)

# compute summary stat
fgsea_rank <- res %>%
              dplyr::select(hgnc_symbol, log2FoldChange) %>%
              na.omit() %>%
              distinct() %>%
              group_by(hgnc_symbol) %>%
              summarize(log2foldchange=mean(log2FoldChange))

fgsea_rank
## # A tibble: 16,478 × 2
##    hgnc_symbol log2foldchange
##    <chr>                <dbl>
##  1 ""                 -0.0811
##  2 "A1BG"              0.178 
##  3 "A1CF"              0.807 
##  4 "A2M"               0.690 
##  5 "A2ML1"            -0.669 
##  6 "A2MP1"             0.232 
##  7 "A4GALT"            0.921 
##  8 "A4GNT"            -0.651 
##  9 "AAAS"             -0.282 
## 10 "AACS"              0.124 
## # ℹ 16,468 more rows
rank <- deframe(fgsea_rank)
head(rank, 20)
##                    A1BG        A1CF         A2M       A2ML1       A2MP1 
## -0.08106658  0.17779131  0.80699938  0.69022080 -0.66934621  0.23223054 
##      A4GALT       A4GNT        AAAS        AACS       AADAT       AAGAB 
##  0.92105758 -0.65100877 -0.28201115  0.12395885 -0.68486107  0.36251058 
##        AAK1       AAMDC        AAMP       AANAT        AAR2        AARD 
##  0.06013558 -0.29388262  0.10425325  0.16858497  0.05793644  0.77611830 
##       AARS1       AARS2 
## -0.66925235  0.04273303
# run fgsea
fgsea_reactome <- fgsea(pathways=pathway_reactome, stats=rank, nperm=1000)

fgseaResTidy_reactome <- fgsea_reactome %>%
  as_tibble() %>%
  arrange(desc(NES))

# Show in a nice table:
fgseaResTidy_reactome %>%
  dplyr::select(-leadingEdge, -ES, -nMoreExtreme) %>%
  arrange(padj) %>%
  DT::datatable()

Cluster Profiler of Reactome

df <- as.data.frame(res1)
df$hgnc_symbol <- rownames(df)
info <- getBM(attributes=c("hgnc_symbol",
                           "entrezgene_id"),
                  filters = c("hgnc_symbol"),
                  values = df$hgnc_symbol,
                  mart = mart,
                  useCache=FALSE)
tmp <- merge(df, info, by="hgnc_symbol")

# subset the dataframe to include only stat sig genes
tmp <- tmp[tmp$padj < 0.05,]
OrgDb <- org.Hs.eg.db

geneList <- as.vector(tmp$log2FoldChange)
names(geneList) <- as.character(tmp$entrezgene_id)
gene <- na.omit(as.character(tmp$entrezgene_id))
gene_list<-sort(geneList,decreasing = TRUE)

#gene_ids <- bitr(tmp, fromType = tmp$hgnc_symbol, toType =tmp$entrezgene_id, OrgDb = org.Hs.eg.db)

# Reactome over-representation test
ego <- enrichPathway(gene= gene,                                                                        organism = 'human',
                pvalueCutoff  = 0.05,
                qvalueCutoff  = 0.01)
summary(ego)
## Warning in summary(ego): summary method to convert the object to data.frame is
## deprecated, please use as.data.frame instead.
##                          ID
## R-HSA-351202   R-HSA-351202
## R-HSA-1428517 R-HSA-1428517
## R-HSA-350562   R-HSA-350562
## R-HSA-5676590 R-HSA-5676590
## R-HSA-9020702 R-HSA-9020702
## R-HSA-5607761 R-HSA-5607761
## R-HSA-1169091 R-HSA-1169091
## R-HSA-5362768 R-HSA-5362768
## R-HSA-163200   R-HSA-163200
## R-HSA-69541     R-HSA-69541
## R-HSA-1236978 R-HSA-1236978
## R-HSA-180534   R-HSA-180534
## R-HSA-349425   R-HSA-349425
## R-HSA-69601     R-HSA-69601
## R-HSA-69610     R-HSA-69610
## R-HSA-69613     R-HSA-69613
## R-HSA-9762114 R-HSA-9762114
## R-HSA-1234176 R-HSA-1234176
## R-HSA-1234174 R-HSA-1234174
## R-HSA-449147   R-HSA-449147
## R-HSA-211733   R-HSA-211733
## R-HSA-5678895 R-HSA-5678895
## R-HSA-5387390 R-HSA-5387390
## R-HSA-180585   R-HSA-180585
## R-HSA-8854050 R-HSA-8854050
## R-HSA-9604323 R-HSA-9604323
## R-HSA-5610785 R-HSA-5610785
## R-HSA-69563     R-HSA-69563
## R-HSA-69580     R-HSA-69580
## R-HSA-75815     R-HSA-75815
## R-HSA-174113   R-HSA-174113
## R-HSA-4641257 R-HSA-4641257
## R-HSA-8941858 R-HSA-8941858
## R-HSA-5668541 R-HSA-5668541
## R-HSA-169911   R-HSA-169911
## R-HSA-450408   R-HSA-450408
## R-HSA-1168372 R-HSA-1168372
## R-HSA-195253   R-HSA-195253
## R-HSA-5358346 R-HSA-5358346
## R-HSA-69615     R-HSA-69615
## R-HSA-4641258 R-HSA-4641258
## R-HSA-187577   R-HSA-187577
## R-HSA-5610780 R-HSA-5610780
## R-HSA-5610783 R-HSA-5610783
## R-HSA-5607764 R-HSA-5607764
## R-HSA-2871837 R-HSA-2871837
## R-HSA-174084   R-HSA-174084
## R-HSA-4608870 R-HSA-4608870
## R-HSA-611105   R-HSA-611105
## R-HSA-1236974 R-HSA-1236974
## R-HSA-446652   R-HSA-446652
## R-HSA-5619084 R-HSA-5619084
## R-HSA-8939902 R-HSA-8939902
## R-HSA-174154   R-HSA-174154
## R-HSA-5658442 R-HSA-5658442
## R-HSA-450531   R-HSA-450531
## R-HSA-69017     R-HSA-69017
## R-HSA-69202     R-HSA-69202
## R-HSA-983705   R-HSA-983705
## R-HSA-1236975 R-HSA-1236975
## R-HSA-69656     R-HSA-69656
## R-HSA-8948751 R-HSA-8948751
## R-HSA-9759194 R-HSA-9759194
## R-HSA-174184   R-HSA-174184
## R-HSA-1474290 R-HSA-1474290
## R-HSA-174178   R-HSA-174178
## R-HSA-179419   R-HSA-179419
## R-HSA-202424   R-HSA-202424
## R-HSA-9755511 R-HSA-9755511
## R-HSA-5632684 R-HSA-5632684
## R-HSA-9013694 R-HSA-9013694
## R-HSA-5687128 R-HSA-5687128
## R-HSA-8878159 R-HSA-8878159
## R-HSA-176409   R-HSA-176409
## R-HSA-176814   R-HSA-176814
## R-HSA-9711123 R-HSA-9711123
## R-HSA-176408   R-HSA-176408
## R-HSA-68949     R-HSA-68949
## R-HSA-5357801 R-HSA-5357801
## R-HSA-202403   R-HSA-202403
## R-HSA-6799198 R-HSA-6799198
## R-HSA-109581   R-HSA-109581
## R-HSA-4086400 R-HSA-4086400
## R-HSA-2022090 R-HSA-2022090
## R-HSA-5689603 R-HSA-5689603
## R-HSA-8852276 R-HSA-8852276
## R-HSA-174143   R-HSA-174143
## R-HSA-453276   R-HSA-453276
## R-HSA-382556   R-HSA-382556
## R-HSA-1650814 R-HSA-1650814
## R-HSA-69052     R-HSA-69052
## R-HSA-5684996 R-HSA-5684996
## R-HSA-3000157 R-HSA-3000157
## R-HSA-5673001 R-HSA-5673001
## R-HSA-1268020 R-HSA-1268020
## R-HSA-168142   R-HSA-168142
## R-HSA-168176   R-HSA-168176
## R-HSA-975871   R-HSA-975871
## R-HSA-5683057 R-HSA-5683057
## R-HSA-168164   R-HSA-168164
## R-HSA-8878166 R-HSA-8878166
## R-HSA-1474244 R-HSA-1474244
## R-HSA-166166   R-HSA-166166
## R-HSA-937061   R-HSA-937061
## R-HSA-5621481 R-HSA-5621481
## R-HSA-2454202 R-HSA-2454202
## R-HSA-1257604 R-HSA-1257604
## R-HSA-5610787 R-HSA-5610787
## R-HSA-1442490 R-HSA-1442490
## R-HSA-157118   R-HSA-157118
## R-HSA-162909   R-HSA-162909
## R-HSA-5663202 R-HSA-5663202
## R-HSA-8949613 R-HSA-8949613
## R-HSA-8948216 R-HSA-8948216
## R-HSA-975138   R-HSA-975138
## R-HSA-1474228 R-HSA-1474228
## R-HSA-975155   R-HSA-975155
## R-HSA-168181   R-HSA-168181
## R-HSA-450294   R-HSA-450294
## R-HSA-163210   R-HSA-163210
## R-HSA-6807070 R-HSA-6807070
## R-HSA-453279   R-HSA-453279
## R-HSA-5358351 R-HSA-5358351
## R-HSA-71387     R-HSA-71387
## R-HSA-168138   R-HSA-168138
## R-HSA-3858494 R-HSA-3858494
## R-HSA-70263     R-HSA-70263
## R-HSA-8939236 R-HSA-8939236
## R-HSA-69206     R-HSA-69206
## R-HSA-448424   R-HSA-448424
## R-HSA-9006925 R-HSA-9006925
## R-HSA-166058   R-HSA-166058
## R-HSA-168188   R-HSA-168188
## R-HSA-71406     R-HSA-71406
## R-HSA-453274   R-HSA-453274
## R-HSA-2214320 R-HSA-2214320
## R-HSA-1638074 R-HSA-1638074
## R-HSA-5628897 R-HSA-5628897
## R-HSA-168179   R-HSA-168179
## R-HSA-181438   R-HSA-181438
## R-HSA-2243919 R-HSA-2243919
## R-HSA-8957275 R-HSA-8957275
## R-HSA-445989   R-HSA-445989
## R-HSA-390450   R-HSA-390450
## R-HSA-69275     R-HSA-69275
## R-HSA-201681   R-HSA-201681
## R-HSA-419037   R-HSA-419037
## R-HSA-5689880 R-HSA-5689880
## R-HSA-5619115 R-HSA-5619115
## R-HSA-186797   R-HSA-186797
## R-HSA-917937   R-HSA-917937
## R-HSA-1630316 R-HSA-1630316
## R-HSA-166016   R-HSA-166016
## R-HSA-6783783 R-HSA-6783783
## R-HSA-5688426 R-HSA-5688426
## R-HSA-381426   R-HSA-381426
## R-HSA-69239     R-HSA-69239
## R-HSA-3000178 R-HSA-3000178
##                                                                                                                               Description
## R-HSA-351202                                                                                                     Metabolism of polyamines
## R-HSA-1428517                                                              The citric acid (TCA) cycle and respiratory electron transport
## R-HSA-350562                                                                                  Regulation of ornithine decarboxylase (ODC)
## R-HSA-5676590                                                                                          NIK-->noncanonical NF-kB signaling
## R-HSA-9020702                                                                                                     Interleukin-1 signaling
## R-HSA-5607761                                                                              Dectin-1 mediated noncanonical NF-kB signaling
## R-HSA-1169091                                                                                          Activation of NF-kappaB in B cells
## R-HSA-5362768                                                                                             Hh mutants are degraded by ERAD
## R-HSA-163200          Respiratory electron transport, ATP synthesis by chemiosmotic coupling, and heat production by uncoupling proteins.
## R-HSA-69541                                                                                                          Stabilization of p53
## R-HSA-1236978                                                                Cross-presentation of soluble exogenous antigens (endosomes)
## R-HSA-180534                                                                                              Vpu mediated degradation of CD4
## R-HSA-349425                                                                              Autodegradation of the E3 ubiquitin ligase COP1
## R-HSA-69601                                                                       Ubiquitin Mediated Degradation of Phosphorylated Cdc25A
## R-HSA-69610                                                                                           p53-Independent DNA Damage Response
## R-HSA-69613                                                                                    p53-Independent G1/S DNA damage checkpoint
## R-HSA-9762114                                                                          GSK3B and BTRC:CUL1-mediated-degradation of NFE2L2
## R-HSA-1234176                                                    Oxygen-dependent proline hydroxylation of Hypoxia-inducible Factor Alpha
## R-HSA-1234174                                                                                                Cellular response to hypoxia
## R-HSA-449147                                                                                                    Signaling by Interleukins
## R-HSA-211733                                                          Regulation of activated PAK-2p34 by proteasome mediated degradation
## R-HSA-5678895                                                                                       Defective CFTR causes cystic fibrosis
## R-HSA-5387390                                                                                        Hh mutants abrogate ligand secretion
## R-HSA-180585                                                                                         Vif-mediated degradation of APOBEC3G
## R-HSA-8854050                                                        FBXL7 down-regulates AURKA during mitotic entry and in early mitosis
## R-HSA-9604323                                                                                     Negative regulation of NOTCH4 signaling
## R-HSA-5610785                                                                                GLI3 is processed to GLI3R by the proteasome
## R-HSA-69563                                                                                          p53-Dependent G1 DNA Damage Response
## R-HSA-69580                                                                                      p53-Dependent G1/S DNA damage checkpoint
## R-HSA-75815                                                                                   Ubiquitin-dependent degradation of Cyclin D
## R-HSA-174113                                                                                   SCF-beta-TrCP mediated degradation of Emi1
## R-HSA-4641257                                                                                                         Degradation of AXIN
## R-HSA-8941858                                                                                 Regulation of RUNX3 expression and activity
## R-HSA-5668541                                                                                           TNFR2 non-canonical NF-kB pathway
## R-HSA-169911                                                                                                      Regulation of Apoptosis
## R-HSA-450408                                                                                  AUF1 (hnRNP D0) binds and destabilizes mRNA
## R-HSA-1168372                                                                        Downstream signaling events of B Cell Receptor (BCR)
## R-HSA-195253                                                                       Degradation of beta-catenin by the destruction complex
## R-HSA-5358346                                                                                                  Hedgehog ligand biogenesis
## R-HSA-69615                                                                                                   G1/S DNA Damage Checkpoints
## R-HSA-4641258                                                                                                          Degradation of DVL
## R-HSA-187577                                                                                    SCF(Skp2)-mediated degradation of p27/p21
## R-HSA-5610780                                                                                       Degradation of GLI1 by the proteasome
## R-HSA-5610783                                                                                       Degradation of GLI2 by the proteasome
## R-HSA-5607764                                                                                                 CLEC7A (Dectin-1) signaling
## R-HSA-2871837                                                                                             FCERI mediated NF-kB activation
## R-HSA-174084                                                                                        Autodegradation of Cdh1 by Cdh1:APC/C
## R-HSA-4608870                                                                                     Asymmetric localization of PCP proteins
## R-HSA-611105                                                                                               Respiratory electron transport
## R-HSA-1236974                                                                                                        ER-Phagosome pathway
## R-HSA-446652                                                                                               Interleukin-1 family signaling
## R-HSA-5619084                                                                                                   ABC transporter disorders
## R-HSA-8939902                                                                                 Regulation of RUNX2 expression and activity
## R-HSA-174154                                                                                  APC/C:Cdc20 mediated degradation of Securin
## R-HSA-5658442                                                                                                   Regulation of RAS by GAPs
## R-HSA-450531                                                          Regulation of mRNA stability by proteins that bind AU-rich elements
## R-HSA-69017                                                                              CDK-mediated phosphorylation and removal of Cdc6
## R-HSA-69202                                                                            Cyclin E associated events during G1/S transition 
## R-HSA-983705                                                                                       Signaling by the B Cell Receptor (BCR)
## R-HSA-1236975                                                                                       Antigen processing-Cross presentation
## R-HSA-69656                                                                              Cyclin A:Cdk2-associated events at S phase entry
## R-HSA-8948751                                                                                   Regulation of PTEN stability and activity
## R-HSA-9759194                                                                                           Nuclear events mediated by NFE2L2
## R-HSA-174184                                                                         Cdc20:Phospho-APC/C mediated degradation of Cyclin A
## R-HSA-1474290                                                                                                          Collagen formation
## R-HSA-174178                     APC/C:Cdh1 mediated degradation of Cdc20 and other APC/C:Cdh1 targeted proteins in late mitosis/early G1
## R-HSA-179419                      APC:Cdc20 mediated degradation of cell cycle proteins prior to satisfation of the cell cycle checkpoint
## R-HSA-202424                                                                                                     Downstream TCR signaling
## R-HSA-9755511                                                                                                        KEAP1-NFE2L2 pathway
## R-HSA-5632684                                                                                                         Hedgehog 'on' state
## R-HSA-9013694                                                                                                         Signaling by NOTCH4
## R-HSA-5687128                                                                                                       MAPK6/MAPK4 signaling
## R-HSA-8878159                                                                                         Transcriptional regulation by RUNX3
## R-HSA-176409                                                                         APC/C:Cdc20 mediated degradation of mitotic proteins
## R-HSA-176814                                                 Activation of APC/C and APC/C:Cdc20 mediated degradation of mitotic proteins
## R-HSA-9711123                                                                                        Cellular response to chemical stress
## R-HSA-176408                                                               Regulation of APC/C activators between G1/S and early anaphase
## R-HSA-68949                                                                                                   Orc1 removal from chromatin
## R-HSA-5357801                                                                                                       Programmed Cell Death
## R-HSA-202403                                                                                                                TCR signaling
## R-HSA-6799198                                                                                                        Complex I biogenesis
## R-HSA-109581                                                                                                                    Apoptosis
## R-HSA-4086400                                                                                                              PCP/CE pathway
## R-HSA-2022090                                                                Assembly of collagen fibrils and other multimeric structures
## R-HSA-5689603                                                                                                             UCH proteinases
## R-HSA-8852276                                                                   The role of GTSE1 in G2/M progression after G2 checkpoint
## R-HSA-174143                                                                            APC/C-mediated degradation of cell cycle proteins
## R-HSA-453276                                                                                             Regulation of mitotic cell cycle
## R-HSA-382556                                                                                       ABC-family proteins mediated transport
## R-HSA-1650814                                                                                 Collagen biosynthesis and modifying enzymes
## R-HSA-69052                                                                              Switching of origins to a post-replicative state
## R-HSA-5684996                                                                                                       MAPK1/MAPK3 signaling
## R-HSA-3000157                                                                                                        Laminin interactions
## R-HSA-5673001                                                                                                      RAF/MAP kinase cascade
## R-HSA-1268020                                                                                                Mitochondrial protein import
## R-HSA-168142                                                                                        Toll Like Receptor 10 (TLR10) Cascade
## R-HSA-168176                                                                                          Toll Like Receptor 5 (TLR5) Cascade
## R-HSA-975871                                                                                   MyD88 cascade initiated on plasma membrane
## R-HSA-5683057                                                                                              MAPK family signaling cascades
## R-HSA-168164                                                                                          Toll Like Receptor 3 (TLR3) Cascade
## R-HSA-8878166                                                                                         Transcriptional regulation by RUNX2
## R-HSA-1474244                                                                                           Extracellular matrix organization
## R-HSA-166166                                                                                              MyD88-independent TLR4 cascade 
## R-HSA-937061                                                                                        TRIF(TICAM1)-mediated TLR4 signaling 
## R-HSA-5621481                                                                                              C-type lectin receptors (CLRs)
## R-HSA-2454202                                                                                       Fc epsilon receptor (FCERI) signaling
## R-HSA-1257604                                                                                                PIP3 activates AKT signaling
## R-HSA-5610787                                                                                                        Hedgehog 'off' state
## R-HSA-1442490                                                                                                        Collagen degradation
## R-HSA-157118                                                                                                           Signaling by NOTCH
## R-HSA-162909                                                                                             Host Interactions of HIV factors
## R-HSA-5663202                                            Diseases of signal transduction by growth factor receptors and second messengers
## R-HSA-8949613                                                                                                           Cristae formation
## R-HSA-8948216                                                                                                Collagen chain trimerization
## R-HSA-975138                                                 TRAF6 mediated induction of NFkB and MAP kinases upon TLR7/8 or 9 activation
## R-HSA-1474228                                                                                     Degradation of the extracellular matrix
## R-HSA-975155                                                                                MyD88 dependent cascade initiated on endosome
## R-HSA-168181                                                                                      Toll Like Receptor 7/8 (TLR7/8) Cascade
## R-HSA-450294                                                                                                        MAP kinase activation
## R-HSA-163210                                                                                    Formation of ATP by chemiosmotic coupling
## R-HSA-6807070                                                                                                             PTEN Regulation
## R-HSA-453279                                                                                         Mitotic G1 phase and G1/S transition
## R-HSA-5358351                                                                                                       Signaling by Hedgehog
## R-HSA-71387                                                                                                   Metabolism of carbohydrates
## R-HSA-168138                                                                                          Toll Like Receptor 9 (TLR9) Cascade
## R-HSA-3858494                                                                                      Beta-catenin independent WNT signaling
## R-HSA-70263                                                                                                               Gluconeogenesis
## R-HSA-8939236                                                  RUNX1 regulates transcription of genes involved in differentiation of HSCs
## R-HSA-69206                                                                                                               G1/S Transition
## R-HSA-448424                                                                                                     Interleukin-17 signaling
## R-HSA-9006925                                                                                Intracellular signaling by second messengers
## R-HSA-166058                                                                        MyD88:MAL(TIRAP) cascade initiated on plasma membrane
## R-HSA-168188                                                                                         Toll Like Receptor TLR6:TLR2 Cascade
## R-HSA-71406                                                                               Pyruvate metabolism and Citric Acid (TCA) cycle
## R-HSA-453274                                                                                                       Mitotic G2-G2/M phases
## R-HSA-2214320                                                                                                  Anchoring fibril formation
## R-HSA-1638074                                                                                          Keratan sulfate/keratin metabolism
## R-HSA-5628897                                                                                              TP53 Regulates Metabolic Genes
## R-HSA-168179                                                                                         Toll Like Receptor TLR1:TLR2 Cascade
## R-HSA-181438                                                                                          Toll Like Receptor 2 (TLR2) Cascade
## R-HSA-2243919                                                                                            Crosslinking of collagen fibrils
## R-HSA-8957275                                                                                  Post-translational protein phosphorylation
## R-HSA-445989                                                                               TAK1-dependent IKK and NF-kappa-B activation  
## R-HSA-390450                                                                                                 Folding of actin by CCT/TriC
## R-HSA-69275                                                                                                               G2/M Transition
## R-HSA-201681                                                                                   TCF dependent signaling in response to WNT
## R-HSA-419037                                                                                                           NCAM1 interactions
## R-HSA-5689880                                                                                            Ub-specific processing proteases
## R-HSA-5619115                                                                                     Disorders of transmembrane transporters
## R-HSA-186797                                                                                                            Signaling by PDGF
## R-HSA-917937                                                                                                    Iron uptake and transport
## R-HSA-1630316                                                                                                Glycosaminoglycan metabolism
## R-HSA-166016                                                                                          Toll Like Receptor 4 (TLR4) Cascade
## R-HSA-6783783                                                                                                    Interleukin-10 signaling
## R-HSA-5688426                                                                                                            Deubiquitination
## R-HSA-381426  Regulation of Insulin-like Growth Factor (IGF) transport and uptake by Insulin-like Growth Factor Binding Proteins (IGFBPs)
## R-HSA-69239                                                                                                              Synthesis of DNA
## R-HSA-3000178                                                                                                           ECM proteoglycans
##               GeneRatio   BgRatio       pvalue     p.adjust       qvalue
## R-HSA-351202    38/1933  59/10891 2.252835e-15 3.356725e-12 2.881258e-12
## R-HSA-1428517   76/1933 178/10891 4.892925e-15 3.645229e-12 3.128897e-12
## R-HSA-350562    34/1933  51/10891 1.454711e-14 6.741519e-12 5.786610e-12
## R-HSA-5676590   37/1933  59/10891 1.851969e-14 6.741519e-12 5.786610e-12
## R-HSA-9020702   56/1933 115/10891 2.262255e-14 6.741519e-12 5.786610e-12
## R-HSA-5607761   37/1933  60/10891 4.010768e-14 9.960074e-12 8.549268e-12
## R-HSA-1169091   38/1933  67/10891 7.720691e-13 1.551794e-10 1.331989e-10
## R-HSA-5362768   34/1933  56/10891 8.331782e-13 1.551794e-10 1.331989e-10
## R-HSA-163200    57/1933 127/10891 1.052214e-12 1.741998e-10 1.495251e-10
## R-HSA-69541     34/1933  57/10891 1.714764e-12 2.042224e-10 1.752951e-10
## R-HSA-1236978   31/1933  49/10891 1.772616e-12 2.042224e-10 1.752951e-10
## R-HSA-180534    32/1933  52/10891 2.330054e-12 2.042224e-10 1.752951e-10
## R-HSA-349425    32/1933  52/10891 2.330054e-12 2.042224e-10 1.752951e-10
## R-HSA-69601     32/1933  52/10891 2.330054e-12 2.042224e-10 1.752951e-10
## R-HSA-69610     32/1933  52/10891 2.330054e-12 2.042224e-10 1.752951e-10
## R-HSA-69613     32/1933  52/10891 2.330054e-12 2.042224e-10 1.752951e-10
## R-HSA-9762114   32/1933  52/10891 2.330054e-12 2.042224e-10 1.752951e-10
## R-HSA-1234176   37/1933  66/10891 2.512352e-12 2.079669e-10 1.785092e-10
## R-HSA-1234174   40/1933  75/10891 2.861399e-12 2.243939e-10 1.926094e-10
## R-HSA-449147   144/1933 473/10891 3.787065e-12 2.661909e-10 2.284860e-10
## R-HSA-211733    31/1933  50/10891 3.875229e-12 2.661909e-10 2.284860e-10
## R-HSA-5678895   35/1933  61/10891 3.930335e-12 2.661909e-10 2.284860e-10
## R-HSA-5387390   34/1933  59/10891 6.745370e-12 4.369827e-10 3.750858e-10
## R-HSA-180585    32/1933  54/10891 9.959822e-12 5.707744e-10 4.899265e-10
## R-HSA-8854050   32/1933  54/10891 9.959822e-12 5.707744e-10 4.899265e-10
## R-HSA-9604323   32/1933  54/10891 9.959822e-12 5.707744e-10 4.899265e-10
## R-HSA-5610785   34/1933  60/10891 1.292819e-11 7.134443e-10 6.123878e-10
## R-HSA-69563     36/1933  66/10891 1.476023e-11 7.583704e-10 6.509503e-10
## R-HSA-69580     36/1933  66/10891 1.476023e-11 7.583704e-10 6.509503e-10
## R-HSA-75815     31/1933  52/10891 1.688876e-11 8.388083e-10 7.199944e-10
## R-HSA-174113    32/1933  55/10891 1.978499e-11 8.933221e-10 7.667866e-10
## R-HSA-4641257   32/1933  55/10891 1.978499e-11 8.933221e-10 7.667866e-10
## R-HSA-8941858   32/1933  55/10891 1.978499e-11 8.933221e-10 7.667866e-10
## R-HSA-5668541   47/1933 102/10891 3.298443e-11 1.439061e-09 1.235224e-09
## R-HSA-169911    31/1933  53/10891 3.380346e-11 1.439061e-09 1.235224e-09
## R-HSA-450408    32/1933  56/10891 3.835092e-11 1.513566e-09 1.299175e-09
## R-HSA-1168372   41/1933  83/10891 3.860102e-11 1.513566e-09 1.299175e-09
## R-HSA-195253    41/1933  83/10891 3.860102e-11 1.513566e-09 1.299175e-09
## R-HSA-5358346   35/1933  65/10891 4.618538e-11 1.741356e-09 1.494700e-09
## R-HSA-69615     36/1933  68/10891 4.674782e-11 1.741356e-09 1.494700e-09
## R-HSA-4641258   32/1933  57/10891 7.264206e-11 2.625066e-09 2.253236e-09
## R-HSA-187577    33/1933  60/10891 7.751872e-11 2.625066e-09 2.253236e-09
## R-HSA-5610780   33/1933  60/10891 7.751872e-11 2.625066e-09 2.253236e-09
## R-HSA-5610783   33/1933  60/10891 7.751872e-11 2.625066e-09 2.253236e-09
## R-HSA-5607764   46/1933 101/10891 8.749656e-11 2.897108e-09 2.486744e-09
## R-HSA-2871837   40/1933  82/10891 1.095871e-10 3.549668e-09 3.046872e-09
## R-HSA-174084    34/1933  64/10891 1.426516e-10 4.428143e-09 3.800914e-09
## R-HSA-4608870   34/1933  64/10891 1.426516e-10 4.428143e-09 3.800914e-09
## R-HSA-611105    46/1933 103/10891 1.983886e-10 6.032632e-09 5.178133e-09
## R-HSA-1236974   42/1933  90/10891 2.229993e-10 6.645378e-09 5.704086e-09
## R-HSA-446652    60/1933 153/10891 2.508187e-10 7.327840e-09 6.289880e-09
## R-HSA-5619084   38/1933  78/10891 3.358445e-10 9.623236e-09 8.260143e-09
## R-HSA-8939902   36/1933  73/10891 6.364194e-10 1.789179e-08 1.535749e-08
## R-HSA-174154    34/1933  68/10891 1.192777e-09 3.231341e-08 2.773634e-08
## R-HSA-5658442   34/1933  68/10891 1.192777e-09 3.231341e-08 2.773634e-08
## R-HSA-450531    40/1933  88/10891 1.585559e-09 4.218719e-08 3.621154e-08
## R-HSA-69017     35/1933  73/10891 2.876015e-09 7.518005e-08 6.453109e-08
## R-HSA-69202     38/1933  83/10891 3.152206e-09 8.097908e-08 6.950871e-08
## R-HSA-983705    46/1933 112/10891 5.509100e-09 1.391281e-07 1.194212e-07
## R-HSA-1236975   44/1933 105/10891 5.636512e-09 1.399734e-07 1.201467e-07
## R-HSA-69656     38/1933  85/10891 7.180521e-09 1.753931e-07 1.505493e-07
## R-HSA-8948751   33/1933  69/10891 8.800883e-09 2.115051e-07 1.815462e-07
## R-HSA-9759194   36/1933  79/10891 9.529710e-09 2.253852e-07 1.934603e-07
## R-HSA-174184    34/1933  73/10891 1.231691e-08 2.867530e-07 2.461356e-07
## R-HSA-1474290   39/1933  90/10891 1.339237e-08 3.069944e-07 2.635099e-07
## R-HSA-174178    34/1933  74/10891 1.893299e-08 4.210472e-07 3.614075e-07
## R-HSA-179419    34/1933  74/10891 1.893299e-08 4.210472e-07 3.614075e-07
## R-HSA-202424    41/1933  98/10891 1.964094e-08 4.303677e-07 3.694078e-07
## R-HSA-9755511   42/1933 102/10891 2.310106e-08 4.988489e-07 4.281889e-07
## R-HSA-5632684   37/1933  85/10891 2.715468e-08 5.780067e-07 4.961344e-07
## R-HSA-9013694   36/1933  82/10891 3.187427e-08 6.689107e-07 5.741621e-07
## R-HSA-5687128   38/1933  89/10891 3.338974e-08 6.832084e-07 5.864346e-07
## R-HSA-8878159   40/1933  96/10891 3.347262e-08 6.832084e-07 5.864346e-07
## R-HSA-176409    34/1933  76/10891 4.327137e-08 8.712749e-07 7.478622e-07
## R-HSA-176814    34/1933  77/10891 6.438983e-08 1.279211e-06 1.098016e-06
## R-HSA-9711123   65/1933 194/10891 7.293272e-08 1.429865e-06 1.227330e-06
## R-HSA-176408    35/1933  81/10891 8.047778e-08 1.557297e-06 1.336712e-06
## R-HSA-68949     32/1933  71/10891 8.679957e-08 1.658094e-06 1.423232e-06
## R-HSA-5357801   68/1933 210/10891 1.625374e-07 3.065579e-06 2.631352e-06
## R-HSA-202403    45/1933 120/10891 2.035158e-07 3.790482e-06 3.253575e-06
## R-HSA-6799198   27/1933  57/10891 2.527133e-07 4.648677e-06 3.990210e-06
## R-HSA-109581    60/1933 180/10891 2.818429e-07 5.121292e-06 4.395881e-06
## R-HSA-4086400   37/1933  92/10891 3.202369e-07 5.748831e-06 4.934531e-06
## R-HSA-2022090   28/1933  61/10891 3.462093e-07 6.141094e-06 5.271232e-06
## R-HSA-5689603   39/1933 102/10891 7.317025e-07 1.282631e-05 1.100952e-05
## R-HSA-8852276   32/1933  77/10891 8.340910e-07 1.445111e-05 1.240417e-05
## R-HSA-174143    35/1933  88/10891 9.073767e-07 1.536354e-05 1.318735e-05
## R-HSA-453276    35/1933  88/10891 9.073767e-07 1.536354e-05 1.318735e-05
## R-HSA-382556    39/1933 103/10891 9.783749e-07 1.633986e-05 1.402538e-05
## R-HSA-1650814   29/1933  67/10891 9.869712e-07 1.633986e-05 1.402538e-05
## R-HSA-69052     36/1933  92/10891 1.012787e-06 1.658299e-05 1.423407e-05
## R-HSA-5684996   83/1933 286/10891 1.414931e-06 2.291573e-05 1.966981e-05
## R-HSA-3000157   17/1933  30/10891 1.841470e-06 2.950312e-05 2.532412e-05
## R-HSA-5673001   81/1933 280/10891 2.171151e-06 3.441505e-05 2.954029e-05
## R-HSA-1268020   27/1933  64/10891 4.214120e-06 6.609515e-05 5.673303e-05
## R-HSA-168142    36/1933  97/10891 4.352311e-06 6.617289e-05 5.679976e-05
## R-HSA-168176    36/1933  97/10891 4.352311e-06 6.617289e-05 5.679976e-05
## R-HSA-975871    36/1933  97/10891 4.352311e-06 6.617289e-05 5.679976e-05
## R-HSA-5683057   90/1933 325/10891 4.487651e-06 6.754142e-05 5.797444e-05
## R-HSA-168164    38/1933 105/10891 4.797790e-06 7.148707e-05 6.136121e-05
## R-HSA-8878166   42/1933 121/10891 5.317896e-06 7.845212e-05 6.733969e-05
## R-HSA-1474244   84/1933 300/10891 5.843538e-06 8.536149e-05 7.327037e-05
## R-HSA-166166    39/1933 110/10891 6.403986e-06 9.174941e-05 7.875347e-05
## R-HSA-937061    39/1933 110/10891 6.403986e-06 9.174941e-05 7.875347e-05
## R-HSA-5621481   47/1933 142/10891 6.651777e-06 9.439188e-05 8.102164e-05
## R-HSA-2454202   45/1933 134/10891 6.767905e-06 9.513376e-05 8.165844e-05
## R-HSA-1257604   76/1933 267/10891 8.482659e-06 1.181230e-04 1.013913e-04
## R-HSA-5610787   39/1933 113/10891 1.327904e-05 1.832015e-04 1.572518e-04
## R-HSA-1442490   26/1933  64/10891 1.435475e-05 1.962254e-04 1.684309e-04
## R-HSA-157118    68/1933 236/10891 1.613624e-05 2.185727e-04 1.876127e-04
## R-HSA-162909    43/1933 130/10891 1.648408e-05 2.212728e-04 1.899304e-04
## R-HSA-5663202  111/1933 433/10891 1.791568e-05 2.383426e-04 2.045823e-04
## R-HSA-8949613   16/1933  31/10891 1.847429e-05 2.435991e-04 2.090942e-04
## R-HSA-8948216   20/1933  44/10891 1.960413e-05 2.562294e-04 2.199356e-04
## R-HSA-975138    36/1933 103/10891 2.059175e-05 2.667974e-04 2.290066e-04
## R-HSA-1474228   45/1933 140/10891 2.401609e-05 3.084826e-04 2.647873e-04
## R-HSA-975155    36/1933 104/10891 2.618731e-05 3.334966e-04 2.862581e-04
## R-HSA-168181    36/1933 105/10891 3.313803e-05 4.184378e-04 3.591678e-04
## R-HSA-450294    25/1933  64/10891 4.596005e-05 5.754662e-04 4.939537e-04
## R-HSA-163210    11/1933  18/10891 4.996433e-05 6.203905e-04 5.325146e-04
## R-HSA-6807070   44/1933 140/10891 5.412980e-05 6.665571e-04 5.721419e-04
## R-HSA-453279    46/1933 149/10891 6.047533e-05 7.285017e-04 6.253123e-04
## R-HSA-5358351   46/1933 149/10891 6.047533e-05 7.285017e-04 6.253123e-04
## R-HSA-71387     79/1933 295/10891 6.062699e-05 7.285017e-04 6.253123e-04
## R-HSA-168138    36/1933 108/10891 6.524917e-05 7.777700e-04 6.676020e-04
## R-HSA-3858494   45/1933 146/10891 7.561100e-05 8.941300e-04 7.674800e-04
## R-HSA-70263     16/1933  34/10891 7.915931e-05 9.287194e-04 7.971700e-04
## R-HSA-8939236   41/1933 130/10891 8.788486e-05 1.023035e-03 8.781258e-04
## R-HSA-69206     41/1933 131/10891 1.063478e-04 1.228358e-03 1.054366e-03
## R-HSA-448424    26/1933  72/10891 1.527232e-04 1.750443e-03 1.502500e-03
## R-HSA-9006925   80/1933 309/10891 1.842544e-04 2.068323e-03 1.775354e-03
## R-HSA-166058    36/1933 113/10891 1.846222e-04 2.068323e-03 1.775354e-03
## R-HSA-168188    36/1933 113/10891 1.846222e-04 2.068323e-03 1.775354e-03
## R-HSA-71406     21/1933  55/10891 2.661422e-04 2.959343e-03 2.540163e-03
## R-HSA-453274    55/1933 198/10891 2.853757e-04 3.149702e-03 2.703559e-03
## R-HSA-2214320    9/1933  15/10891 3.061599e-04 3.354252e-03 2.879135e-03
## R-HSA-1638074   15/1933  34/10891 3.213750e-04 3.491535e-03 2.996973e-03
## R-HSA-5628897   29/1933  87/10891 3.238094e-04 3.491535e-03 2.996973e-03
## R-HSA-168179    36/1933 116/10891 3.280637e-04 3.491535e-03 2.996973e-03
## R-HSA-181438    36/1933 116/10891 3.280637e-04 3.491535e-03 2.996973e-03
## R-HSA-2243919   10/1933  18/10891 3.308079e-04 3.495771e-03 3.000609e-03
## R-HSA-8957275   34/1933 108/10891 3.533764e-04 3.707964e-03 3.182745e-03
## R-HSA-445989    18/1933  45/10891 3.697163e-04 3.852289e-03 3.306628e-03
## R-HSA-390450     7/1933  10/10891 3.989761e-04 4.128294e-03 3.543538e-03
## R-HSA-69275     54/1933 196/10891 4.020779e-04 4.131697e-03 3.546459e-03
## R-HSA-201681    62/1933 233/10891 4.350501e-04 4.439895e-03 3.811001e-03
## R-HSA-419037    17/1933  42/10891 4.537944e-04 4.599685e-03 3.948158e-03
## R-HSA-5689880   59/1933 220/10891 4.771871e-04 4.804113e-03 4.123629e-03
## R-HSA-5619115   49/1933 176/10891 5.642723e-04 5.642723e-03 4.843454e-03
## R-HSA-186797    21/1933  58/10891 6.151461e-04 6.069984e-03 5.210195e-03
## R-HSA-917937    21/1933  58/10891 6.151461e-04 6.069984e-03 5.210195e-03
## R-HSA-1630316   37/1933 124/10891 6.363939e-04 6.238335e-03 5.354700e-03
## R-HSA-166016    42/1933 146/10891 6.602820e-04 6.430198e-03 5.519385e-03
## R-HSA-6783783   18/1933  47/10891 6.881035e-04 6.657625e-03 5.714599e-03
## R-HSA-5688426   75/1933 298/10891 7.095250e-04 6.820595e-03 5.854485e-03
## R-HSA-381426    37/1933 125/10891 7.523142e-04 7.185566e-03 6.167758e-03
## R-HSA-69239     36/1933 121/10891 7.938456e-04 7.533948e-03 6.466794e-03
## R-HSA-3000178   25/1933  76/10891 1.012998e-03 9.552956e-03 8.199818e-03
##                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             geneID
## R-HSA-351202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      262/51582/4946/4947/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6303/54498/6723
## R-HSA-1428517                                                                                                                                                                                                                                                                                                                                                                     50/498/506/509/514/516/518/521/9551/10632/10476/522/80219/84987/51241/1327/9377/1329/1340/1345/1349/1350/54205/1737/81889/2739/2954/3029/3419/3939/3945/4191/4694/51079/4695/4696/4697/4701/4702/4704/4706/51103/91942/29078/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/5162/8050/5163/5166/54704/9997/6389/6391/9123/8803/8801/10975/7384/7386/27089/7416
## R-HSA-350562                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          51582/4946/4947/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-5676590                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1147/9020/4791/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5971/6500/9040
## R-HSA-9020702                                                                                                                                                                                                                                                                                                                                                                                                                                                                   1147/8517/3656/51135/5604/5608/4215/1326/4790/4791/4792/4793/28511/64127/387522/57162/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-5607761                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1147/9020/4791/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5971/6500/9040
## R-HSA-1169091                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      1147/8517/4790/4792/4793/4794/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500
## R-HSA-5362768                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        51009/27248/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7415
## R-HSA-163200                                                                                                                                                                                                                                                                                                                                                                                                                                                                     498/506/509/514/516/518/521/9551/10632/10476/522/80219/84987/51241/1327/9377/1329/1340/1345/1349/1350/54205/4694/51079/4695/4696/4697/4701/4702/4704/4706/51103/91942/29078/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/9997/6389/6391/10975/7384/7386/27089
## R-HSA-69541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           472/11200/51230/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-1236978                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-180534                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500
## R-HSA-349425                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      472/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-69601                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     11200/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-69610                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     11200/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-69613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     11200/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-9762114                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500
## R-HSA-1234176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       84962/54583/112399/6921/2034/3091/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-1234174                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       84962/768/10370/54583/112399/6921/2034/3091/25994/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-449147  375/466/10538/598/552900/6356/6347/6364/6348/6352/1052/1147/23529/1385/1435/1437/1440/1489/2919/3627/2920/3576/1845/1846/2162/2353/2308/2534/2625/9446/3055/3091/3383/163702/8517/3587/3588/3589/3590/3600/3601/3603/132014/51561/55801/90865/3563/3569/3574/3575/3656/51135/3667/3688/3929/3934/3965/3976/4128/5604/5606/5608/4215/1326/5600/9261/4205/4208/4282/4312/4314/4790/4791/4792/4793/28511/64127/4843/9180/5034/27250/387522/57162/5291/5293/8503/5516/5519/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5743/5781/5783/26469/5898/8767/6095/6288/6500/6648/6655/6772/6775/6777/23118/6888/6950/92610/7133/7186/7334/9097/11274/7431/6935
## R-HSA-211733                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-5678895                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  79139/51009/27248/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7415
## R-HSA-5387390                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        51009/27248/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7415
## R-HSA-180585                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     6921/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-8854050                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500
## R-HSA-9604323                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500
## R-HSA-5610785                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         2737/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/51684
## R-HSA-69563                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 472/898/11200/51230/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/25946
## R-HSA-69580                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 472/898/11200/51230/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/25946
## R-HSA-75815                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-174113                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500
## R-HSA-4641257                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/8658
## R-HSA-8941858                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/57154
## R-HSA-5668541                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           330/1147/9020/4791/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5971/6500/4982/7133/943/3604/8742/8740/8744/7186/7187/9040
## R-HSA-169911                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-450408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     3315/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-1168372                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      1147/2280/8517/4772/4790/4792/4793/4794/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/10125/6500
## R-HSA-195253                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         3065/5516/5519/5525/5526/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/6934/7088/7089/166
## R-HSA-5358346                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   51009/27248/5034/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7415
## R-HSA-69615                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 472/898/11200/51230/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/25946
## R-HSA-4641258                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   23072/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-187577                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 898/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500
## R-HSA-5610780                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/51684
## R-HSA-5610783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/51684
## R-HSA-5607764                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          10768/1147/8517/9020/4772/4790/4791/4792/387522/5580/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5971/6500/23118/9040/7334
## R-HSA-2871837                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        1147/8517/4790/4792/387522/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/10125/6500/23118/7334
## R-HSA-174084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        29945/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7324
## R-HSA-4608870                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        50855/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/57154/7474
## R-HSA-611105                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      80219/84987/51241/1327/9377/1329/1340/1345/1349/1350/54205/4694/51079/4695/4696/4697/4701/4702/4704/4706/51103/91942/29078/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/9997/6389/6391/10975/7384/7386/27089
## R-HSA-1236974                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 567/1147/3105/8517/2923/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/9554/10952/23480/6890/6891/6892
## R-HSA-446652                                                                                                                                                                                                                                                                                                                                                                                                                                              1147/8517/90865/3656/51135/5604/5608/4215/1326/4790/4791/4792/4793/28511/64127/387522/57162/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5781/5783/26469/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-5619084                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       19/21/5826/79139/51009/27248/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7415
## R-HSA-8939902                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                650/2908/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/57154/6772
## R-HSA-174154                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        29945/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7324
## R-HSA-5658442                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5921/22821/10156
## R-HSA-450531                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            23404/54512/5393/3315/5600/9261/5580/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7538/677
## R-HSA-69017                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     29945/898/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7324
## R-HSA-69202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        91768/898/902/1874/91750/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/7465
## R-HSA-983705                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             10768/974/1147/2280/2534/8517/4772/4790/4792/4793/4794/84876/5293/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/10125/6500
## R-HSA-1236975                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       567/1147/1520/3105/8517/3685/2923/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/9554/10952/23480/6890/6891/6892
## R-HSA-69656                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        91768/898/902/1874/91750/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/7465
## R-HSA-8948751                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               1459/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/8658
## R-HSA-9759194                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                2936/7975/5052/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/6888
## R-HSA-174184                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        29945/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7324
## R-HSA-1474290                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        9509/649/1302/1303/1306/80781/81578/169044/84570/136227/1280/1281/1282/1284/1285/1286/1290/1294/1296/1297/1298/1299/23127/1520/3909/3914/3918/4015/84695/84171/4314/5033/283208/5034/5118/5339/5351/5352/7837
## R-HSA-174178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        29945/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7324
## R-HSA-179419                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        29945/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7324
## R-HSA-202424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     1147/8517/4790/4792/387522/5291/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/8767/6500/23118/7334
## R-HSA-9755511                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                1459/2936/7975/79594/5052/5580/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/83667/6500/6888/7353/7415
## R-HSA-5632684                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      132884/2619/2737/23432/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/57154/51684
## R-HSA-9013694                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             10046/23385/5663/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/22938
## R-HSA-5687128                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        896/2118/2308/3315/8997/4343/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/989
## R-HSA-8878159                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        9759/10046/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/57154/22938/6696/6934/7003/8463/10413
## R-HSA-176409                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        29945/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7324
## R-HSA-176814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        29945/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7324
## R-HSA-9711123                                                                                                                                                                                                                                                                                                                                                                                                                      475/84987/51241/1327/9377/1329/1340/1345/1349/1350/1459/54205/30001/2936/2950/85441/81502/7975/79594/4697/5034/5052/7001/10935/5580/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/9997/83667/6500/6648/6888/7295/25828/7353/7415
## R-HSA-176408                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   29945/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/7324
## R-HSA-68949                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500
## R-HSA-5357801                                                                                                                                                                                                                                                                                                                                                                                                          118/51074/26060/57099/578/598/637/330/90427/708/8837/128866/54205/23604/140735/1991/8772/355/10211/2934/3006/3659/3660/4000/8473/57162/5339/5580/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6093/7082/9414/8795/8743/7186/55075/7431/7532
## R-HSA-202403                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                1147/55740/2533/8517/4790/4792/387522/5291/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5795/8767/6500/23118/7334/7454
## R-HSA-6799198                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          4694/51079/4695/4696/4701/4702/4704/4706/51103/91942/29078/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729
## R-HSA-109581                                                                                                                                                                                                                                                                                                                                                                                                                                                      118/51074/26060/57099/578/598/637/90427/708/8837/54205/23604/140735/8772/355/2934/3006/4000/5339/5580/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6093/7082/9414/8795/8743/7186/55075/7431/7532
## R-HSA-4086400                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         1211/23002/50855/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/387/57154/7474
## R-HSA-2022090                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        649/1302/1303/1306/80781/1280/1281/1282/1284/1285/1286/1290/1294/1296/1297/1298/1299/1520/3909/3914/3918/4015/84695/84171/4314/5118/5339/7837
## R-HSA-5689603                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          11047/723790/83444/221656/4738/8473/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/29844/7046
## R-HSA-8852276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/347733
## R-HSA-174143                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   29945/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/7324
## R-HSA-453276                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   29945/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/7324
## R-HSA-382556                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  20/21/10057/79139/51009/1965/27248/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/7415
## R-HSA-1650814                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            9509/649/1302/1303/1306/80781/81578/169044/84570/136227/1280/1281/1282/1284/1285/1286/1290/1294/1296/1297/1298/1299/23127/5033/283208/5034/5118/5351/5352
## R-HSA-69052                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                29945/898/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/7324
## R-HSA-5684996                                                                                                                                                                                                                                                                                                                              51104/284/369/402/598/815/817/22866/1437/1843/80824/1846/1847/2064/2255/8822/8817/2252/2254/2263/2261/2534/2674/2675/54756/3563/3569/8826/3667/4254/8844/283455/5604/4684/9542/4902/5245/5291/5516/5519/5525/5526/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5781/5921/22821/10156/221002/10125/5863/57139/6710/51332
## R-HSA-3000157                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               80781/1282/1284/1285/1286/1294/3672/3685/3688/3908/3909/3910/3912/3914/3915/3918/22795
## R-HSA-5673001                                                                                                                                                                                                                                                                                                                                        51104/284/369/402/598/815/817/22866/1437/1843/80824/1846/1847/2064/2255/8822/8817/2252/2254/2263/2261/2534/2674/2675/54756/3563/8826/3667/4254/8844/283455/5604/4684/9542/4902/5245/5291/5516/5519/5525/5526/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5921/22821/10156/221002/10125/5863/57139/6710/51332
## R-HSA-1268020                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       50/498/506/516/51142/54927/56942/51287/388753/10063/80273/150274/197257/10651/4714/25813/26515/26517/10440/29090/29928/100287932/26521/10452/401505/54543/7416
## R-HSA-168142                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           466/1147/1385/1845/1846/2353/8517/3656/51135/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-168176                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           466/1147/1385/1845/1846/2353/8517/3656/51135/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-975871                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           466/1147/1385/1845/1846/2353/8517/3656/51135/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-5683057                                                                                                                                                                                                                                                                                             51104/284/369/402/598/815/817/896/22866/1437/1843/80824/1846/1847/2064/2118/2255/8822/8817/2252/2254/2263/2261/2308/2534/2674/2675/3315/54756/3563/3569/8826/3667/8997/4254/8844/283455/5604/4343/4684/9542/4902/5245/5291/5516/5519/5525/5526/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5781/5921/22821/10156/221002/10125/5863/57139/989/6710/51332
## R-HSA-168164                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   466/330/1147/1385/1845/1846/8772/2353/8517/3656/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/5516/5519/8767/6288/23098/6500/23118/92610/7186/7187/7334/9097/11274
## R-HSA-8878166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   25/650/2737/9759/4094/2908/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/57154/6662/6772/10413
## R-HSA-1474244                                                                                                                                                                                                                                                                                                                 176/9510/9509/375790/633/649/650/147968/825/1302/1303/1306/80781/81578/169044/84570/136227/1280/1281/1282/1284/1285/1286/1290/1294/1296/1297/1298/1299/23127/1513/1520/780/2202/1991/2200/2201/5045/3383/3672/8515/22801/3682/3685/3688/3791/3908/3909/3910/3912/3914/3915/3918/4015/84695/84171/4052/4060/8076/4312/4319/4321/10893/64386/4314/4684/23385/22795/5033/283208/5034/5118/85007/5339/5351/5352/5663/7837/6696/7042/7043/7077/7148/51399
## R-HSA-166166                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              466/330/1147/1385/1845/1846/8772/2353/8517/3656/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/5516/5519/5781/8767/6288/23098/6500/23118/92610/7186/7187/7334/9097/11274
## R-HSA-937061                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              466/330/1147/1385/1845/1846/8772/2353/8517/3656/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/5516/5519/5781/8767/6288/23098/6500/23118/92610/7186/7187/7334/9097/11274
## R-HSA-5621481                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                     10768/1147/2534/8517/9020/4772/4790/4791/4792/387522/5580/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5971/6500/23118/9040/7334
## R-HSA-2454202                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              10768/1147/2353/2534/8517/4772/4790/4792/387522/5291/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/10125/6500/23118/7334
## R-HSA-1257604                                                                                                                                                                                                                                                                                                                                                            84335/1147/1385/1459/8726/1958/2064/2255/8822/8817/2252/2254/2263/2261/2308/2534/2549/3065/10014/8870/90865/51135/3667/4254/55004/10542/79109/4343/2475/9542/1912/80012/23239/5291/5293/8503/5516/5519/5525/5526/55615/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5781/57167/8658/57761
## R-HSA-5610787                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           2737/23432/27152/54903/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/51684/347733/7289
## R-HSA-1442490                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               1302/1303/1306/80781/84570/136227/1280/1281/1282/1284/1285/1286/1290/1294/1296/1297/1298/1299/1513/1991/5045/4312/4319/4321/4314/85007
## R-HSA-157118                                                                                                                                                                                                                                                                                                                                                                                                     488/489/2683/1024/1385/92737/1871/1999/5045/723790/55766/8349/3017/8362/554313/3065/83933/9759/10014/3091/3955/10046/4242/4343/23385/23509/56983/5584/5663/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5986/6500/22938/6484/6772/7088/7089/23286
## R-HSA-162909                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                162/375/51606/567/6921/2534/3055/3105/11168/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5905/6500/292
## R-HSA-5663202                                                                                                                                                                          57085/84335/238/369/10533/471/9530/597/598/815/817/1024/1051/1147/22866/1385/51009/80824/2064/27248/2255/8822/8817/2252/2254/2263/2261/81608/2280/2308/8087/2534/2549/3065/83933/9759/10014/8826/3667/3791/4254/8844/283455/4000/4008/9208/10046/5604/79109/2475/399687/23385/9542/9061/5245/5291/5293/8503/5435/5440/64840/8496/5516/5519/5525/5526/55615/5663/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5781/9444/22872/6500/22938/6772/6777/6934/10342/7046/8658/7415
## R-HSA-8949613                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      79135/498/506/509/514/516/518/521/9551/10632/10476/522/54927/440574/10651/25813
## R-HSA-8948216                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           1302/1303/1306/80781/81578/169044/84570/136227/1280/1281/1282/1284/1285/1286/1290/1294/1296/1297/1298/1299
## R-HSA-975138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           466/1147/1385/1845/1846/2353/8517/3656/51135/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-1474228                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              176/9510/649/147968/825/1302/1303/1306/80781/84570/136227/1280/1281/1282/1284/1285/1286/1290/1294/1296/1297/1298/1299/1513/1520/1991/2200/2201/5045/3909/3912/3914/3915/3918/4312/4319/4321/10893/64386/4314/23385/85007/5663/6696/7077
## R-HSA-975155                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           466/1147/1385/1845/1846/2353/8517/3656/51135/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-168181                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           466/1147/1385/1845/1846/2353/8517/3656/51135/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-450294                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                       466/1147/1385/1845/1846/2353/8517/3656/5604/5606/5608/1326/5600/9261/4205/4208/4790/64127/387522/5516/5519/8767/6500/23118/7334
## R-HSA-163210                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      498/506/509/514/516/518/521/9551/10632/10476/522
## R-HSA-6807070                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   1459/8726/1958/3065/10014/55004/10542/4343/2475/1912/80012/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/57167/8658
## R-HSA-453279                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  25/91768/896/898/902/1021/1030/1871/1874/3065/91750/5516/5519/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/7465
## R-HSA-5358351                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   51009/27248/132884/2619/2737/23432/27152/54903/5034/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/57154/51684/347733/7289/7415
## R-HSA-71387                                                                                                                                                                                                                                                                                                                                        10057/176/83440/375790/231/226/8708/8707/10678/93010/2683/8702/9334/11041/633/11261/54480/55501/9435/23563/56548/55790/1464/29940/92126/2023/2026/2132/170384/92579/2588/2597/26035/2799/2239/2821/2997/3038/3074/3099/9955/9394/8692/3795/4060/4125/4190/4191/9061/9060/5091/5105/5106/5210/5211/5214/5223/5224/5230/283209/5255/5256/5260/5261/5315/5507/5516/5519/8402/6513/347734/6652/6482/6484/6888/26007/7167/7360/10090
## R-HSA-168138                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           466/1147/1385/1845/1846/2353/8517/3656/51135/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-3858494                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                815/1211/23002/59345/10681/2791/2788/4343/4772/50855/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/387/57154/6934/7474
## R-HSA-70263                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        226/2023/2026/92579/2597/2821/4190/4191/5091/5105/5106/5223/5224/5230/8402/7167
## R-HSA-8939236                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    25/902/2625/723790/55766/8349/3017/8362/554313/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/10413
## R-HSA-69206                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         91768/898/902/1874/3065/91750/5516/5519/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/7465
## R-HSA-448424                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                466/1147/1385/1845/1846/2353/8517/132014/3656/5604/5606/5608/1326/5600/9261/4205/4208/4790/64127/387522/5516/5519/8767/6500/23118/7334
## R-HSA-9006925                                                                                                                                                                                                                                                                                                                                         10768/84335/815/817/1147/1385/1459/8726/1958/2064/2255/8822/8817/2252/2254/2263/2261/2308/2534/2549/3065/10014/8870/90865/51135/3667/4254/55004/10542/79109/4343/2475/9542/1912/80012/23239/5291/5293/8503/5516/5519/5525/5526/5580/55615/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5781/57167/8658/57761
## R-HSA-166058                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           466/1147/1385/1845/1846/2353/8517/3656/51135/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-168188                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           466/1147/1385/1845/1846/2353/8517/3656/51135/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-71406                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                               50/1737/81889/2739/2954/3029/3419/3939/3945/4191/5162/8050/5163/5166/54704/6389/6391/9123/8803/8801/7416
## R-HSA-453274                                                                                                                                                                                                                                                                                                                                                                                                                                                                         84962/902/984/22897/1453/1454/1871/54930/55559/91750/10133/5108/5116/22822/51400/4660/5516/5519/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/9814/6500/347733/85378/7465/7532
## R-HSA-2214320                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          649/1282/1284/1285/1286/1294/3909/3914/3918
## R-HSA-1638074                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                        176/10678/93010/2683/8702/9334/11041/9435/23563/2588/2799/3074/4060/6482/6484
## R-HSA-5628897                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          84987/51241/1327/9377/1329/1340/1345/1349/1350/54205/54541/2744/2821/2936/55004/10542/4343/2475/4697/5052/7001/5563/51422/9997/83667/143686/57103/7295/7532
## R-HSA-168179                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           466/1147/1385/1845/1846/2353/8517/3656/51135/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-181438                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                           466/1147/1385/1845/1846/2353/8517/3656/51135/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-2243919                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                   649/1282/1284/1285/1286/4015/84695/84171/5118/7837
## R-HSA-8957275                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  174/718/813/1000/10970/1435/5611/2153/54757/2200/11167/10272/2519/2621/3487/3490/3569/3895/3912/3915/4052/4240/11320/375056/54587/5034/255738/5768/7857/51246/6696/8614/10618/54972
## R-HSA-445989                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                      1147/8517/3656/4790/4791/4792/4793/28511/64127/387522/8767/6288/23118/92610/7186/7334/9097/11274
## R-HSA-390450                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                 10576/7203/10575/22948/908/10574/6950
## R-HSA-69275                                                                                                                                                                                                                                                                                                                                                                                                                                                                               84962/902/984/22897/1453/1454/54930/55559/91750/10133/5108/5116/22822/51400/4660/5516/5519/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/9814/6500/347733/85378/7465/7532
## R-HSA-201681                                                                                                                                                                                                                                                                                                                                                                                                                                  283149/1454/1459/723790/55766/8349/3017/8362/554313/3065/23072/55366/8549/5516/5519/5525/5526/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5929/340419/84870/6422/6423/6659/6662/6934/7088/7089/8658/11197/7474/7483
## R-HSA-419037                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                  375790/775/782/1280/1281/1282/1284/1285/1286/1290/1297/1298/1299/2674/2675/4684/4902
## R-HSA-5689880                                                                                                                                                                                                                                                                                                                                                                                                                                                   11047/8678/330/1540/2625/723790/8349/3017/3091/8517/90865/79594/4792/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/51651/63891/79589/6478/10254/6881/7046/8658/7186/7353/9097/11274/29761/7416/7417
## R-HSA-5619115                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                          19/21/5826/79139/51009/27248/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/4891/9990/6575/5172/6513/142680/10559/7355/55630/9056/285195/7415
## R-HSA-186797                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                              1280/1281/1282/1284/1285/1286/1290/1297/1298/1299/5045/5291/5327/5781/5921/6696/6772/6777/7058/7059/7060
## R-HSA-917937                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                48/537/533/527/9114/8992/529/9296/9550/534/51606/79901/2495/10539/3934/57192/4738/6500/4891/10312/7037
## R-HSA-1630316                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             10057/176/375790/10678/93010/2683/8702/9334/11041/633/11261/54480/55501/9435/23563/56548/55790/1464/29940/92126/2132/2588/26035/2799/2239/3038/3074/9955/9394/8692/4060/9061/9060/347734/6482/6484/10090
## R-HSA-166016                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                             466/330/1147/1385/1845/1846/8772/2353/8517/3656/51135/3929/5604/5606/5608/1326/5600/9261/4205/4208/4790/4791/4792/4793/28511/64127/387522/57162/5516/5519/5781/8767/6288/23098/6500/23118/92610/7186/7187/7334/9097/11274
## R-HSA-6783783                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                            6347/6364/6348/6352/1435/1437/1440/2919/3627/2920/3576/3383/3587/3588/3569/3976/5743/7133
## R-HSA-5688426                                                                                                                                                                                                                                                                                                                                                            84142/11047/4287/8678/330/1540/2625/723790/8349/3017/3091/8517/90865/83444/221656/79594/4738/4792/64127/8473/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/51651/5886/387/8767/63891/79589/6478/10254/57559/6881/29844/7046/7128/10318/8658/7186/7187/7353/9097/11274/29761/7415/7416/7417
## R-HSA-381426                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                    174/718/813/1000/10970/1435/5611/2153/54757/2200/11167/10272/2519/2621/3487/3489/3490/3569/3895/3912/3915/4052/4240/11320/375056/4312/54587/5034/5069/255738/5768/7857/51246/6696/8614/10618/54972
## R-HSA-69239                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                29945/898/246184/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6500/7324
## R-HSA-3000178                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                                         176/375790/633/1280/1281/1282/1284/1285/1286/1290/1297/1298/1299/3685/3688/3908/3909/3910/3912/3915/4060/4684/7042/7043/7148
##               Count
## R-HSA-351202     38
## R-HSA-1428517    76
## R-HSA-350562     34
## R-HSA-5676590    37
## R-HSA-9020702    56
## R-HSA-5607761    37
## R-HSA-1169091    38
## R-HSA-5362768    34
## R-HSA-163200     57
## R-HSA-69541      34
## R-HSA-1236978    31
## R-HSA-180534     32
## R-HSA-349425     32
## R-HSA-69601      32
## R-HSA-69610      32
## R-HSA-69613      32
## R-HSA-9762114    32
## R-HSA-1234176    37
## R-HSA-1234174    40
## R-HSA-449147    144
## R-HSA-211733     31
## R-HSA-5678895    35
## R-HSA-5387390    34
## R-HSA-180585     32
## R-HSA-8854050    32
## R-HSA-9604323    32
## R-HSA-5610785    34
## R-HSA-69563      36
## R-HSA-69580      36
## R-HSA-75815      31
## R-HSA-174113     32
## R-HSA-4641257    32
## R-HSA-8941858    32
## R-HSA-5668541    47
## R-HSA-169911     31
## R-HSA-450408     32
## R-HSA-1168372    41
## R-HSA-195253     41
## R-HSA-5358346    35
## R-HSA-69615      36
## R-HSA-4641258    32
## R-HSA-187577     33
## R-HSA-5610780    33
## R-HSA-5610783    33
## R-HSA-5607764    46
## R-HSA-2871837    40
## R-HSA-174084     34
## R-HSA-4608870    34
## R-HSA-611105     46
## R-HSA-1236974    42
## R-HSA-446652     60
## R-HSA-5619084    38
## R-HSA-8939902    36
## R-HSA-174154     34
## R-HSA-5658442    34
## R-HSA-450531     40
## R-HSA-69017      35
## R-HSA-69202      38
## R-HSA-983705     46
## R-HSA-1236975    44
## R-HSA-69656      38
## R-HSA-8948751    33
## R-HSA-9759194    36
## R-HSA-174184     34
## R-HSA-1474290    39
## R-HSA-174178     34
## R-HSA-179419     34
## R-HSA-202424     41
## R-HSA-9755511    42
## R-HSA-5632684    37
## R-HSA-9013694    36
## R-HSA-5687128    38
## R-HSA-8878159    40
## R-HSA-176409     34
## R-HSA-176814     34
## R-HSA-9711123    65
## R-HSA-176408     35
## R-HSA-68949      32
## R-HSA-5357801    68
## R-HSA-202403     45
## R-HSA-6799198    27
## R-HSA-109581     60
## R-HSA-4086400    37
## R-HSA-2022090    28
## R-HSA-5689603    39
## R-HSA-8852276    32
## R-HSA-174143     35
## R-HSA-453276     35
## R-HSA-382556     39
## R-HSA-1650814    29
## R-HSA-69052      36
## R-HSA-5684996    83
## R-HSA-3000157    17
## R-HSA-5673001    81
## R-HSA-1268020    27
## R-HSA-168142     36
## R-HSA-168176     36
## R-HSA-975871     36
## R-HSA-5683057    90
## R-HSA-168164     38
## R-HSA-8878166    42
## R-HSA-1474244    84
## R-HSA-166166     39
## R-HSA-937061     39
## R-HSA-5621481    47
## R-HSA-2454202    45
## R-HSA-1257604    76
## R-HSA-5610787    39
## R-HSA-1442490    26
## R-HSA-157118     68
## R-HSA-162909     43
## R-HSA-5663202   111
## R-HSA-8949613    16
## R-HSA-8948216    20
## R-HSA-975138     36
## R-HSA-1474228    45
## R-HSA-975155     36
## R-HSA-168181     36
## R-HSA-450294     25
## R-HSA-163210     11
## R-HSA-6807070    44
## R-HSA-453279     46
## R-HSA-5358351    46
## R-HSA-71387      79
## R-HSA-168138     36
## R-HSA-3858494    45
## R-HSA-70263      16
## R-HSA-8939236    41
## R-HSA-69206      41
## R-HSA-448424     26
## R-HSA-9006925    80
## R-HSA-166058     36
## R-HSA-168188     36
## R-HSA-71406      21
## R-HSA-453274     55
## R-HSA-2214320     9
## R-HSA-1638074    15
## R-HSA-5628897    29
## R-HSA-168179     36
## R-HSA-181438     36
## R-HSA-2243919    10
## R-HSA-8957275    34
## R-HSA-445989     18
## R-HSA-390450      7
## R-HSA-69275      54
## R-HSA-201681     62
## R-HSA-419037     17
## R-HSA-5689880    59
## R-HSA-5619115    49
## R-HSA-186797     21
## R-HSA-917937     21
## R-HSA-1630316    37
## R-HSA-166016     42
## R-HSA-6783783    18
## R-HSA-5688426    75
## R-HSA-381426     37
## R-HSA-69239      36
## R-HSA-3000178    25
head(summary(ego))
## Warning in summary(ego): summary method to convert the object to data.frame is
## deprecated, please use as.data.frame instead.
##                          ID
## R-HSA-351202   R-HSA-351202
## R-HSA-1428517 R-HSA-1428517
## R-HSA-350562   R-HSA-350562
## R-HSA-5676590 R-HSA-5676590
## R-HSA-9020702 R-HSA-9020702
## R-HSA-5607761 R-HSA-5607761
##                                                                  Description
## R-HSA-351202                                        Metabolism of polyamines
## R-HSA-1428517 The citric acid (TCA) cycle and respiratory electron transport
## R-HSA-350562                     Regulation of ornithine decarboxylase (ODC)
## R-HSA-5676590                             NIK-->noncanonical NF-kB signaling
## R-HSA-9020702                                        Interleukin-1 signaling
## R-HSA-5607761                 Dectin-1 mediated noncanonical NF-kB signaling
##               GeneRatio   BgRatio       pvalue     p.adjust       qvalue
## R-HSA-351202    38/1933  59/10891 2.252835e-15 3.356725e-12 2.881258e-12
## R-HSA-1428517   76/1933 178/10891 4.892925e-15 3.645229e-12 3.128897e-12
## R-HSA-350562    34/1933  51/10891 1.454711e-14 6.741519e-12 5.786610e-12
## R-HSA-5676590   37/1933  59/10891 1.851969e-14 6.741519e-12 5.786610e-12
## R-HSA-9020702   56/1933 115/10891 2.262255e-14 6.741519e-12 5.786610e-12
## R-HSA-5607761   37/1933  60/10891 4.010768e-14 9.960074e-12 8.549268e-12
##                                                                                                                                                                                                                                                                                                                                                                                                         geneID
## R-HSA-351202                                                                                                                                                                                                  262/51582/4946/4947/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/6303/54498/6723
## R-HSA-1428517 50/498/506/509/514/516/518/521/9551/10632/10476/522/80219/84987/51241/1327/9377/1329/1340/1345/1349/1350/54205/1737/81889/2739/2954/3029/3419/3939/3945/4191/4694/51079/4695/4696/4697/4701/4702/4704/4706/51103/91942/29078/4707/54539/4708/4709/4710/4711/4712/4714/4715/4717/4718/4719/4725/4726/4728/4729/5162/8050/5163/5166/54704/9997/6389/6391/9123/8803/8801/10975/7384/7386/27089/7416
## R-HSA-350562                                                                                                                                                                                                                      51582/4946/4947/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197
## R-HSA-5676590                                                                                                                                                                                                       1147/9020/4791/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5971/6500/9040
## R-HSA-9020702                                                                                               1147/8517/3656/51135/5604/5608/4215/1326/4790/4791/4792/4793/28511/64127/387522/57162/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/8767/6288/6500/23118/92610/7186/7334/9097/11274
## R-HSA-5607761                                                                                                                                                                                                       1147/9020/4791/5682/5683/5684/5685/5686/5687/5688/5689/5699/5690/5691/5692/5693/5694/5695/5696/5698/5704/5705/5707/5716/5717/10213/5708/5709/5710/5713/5715/5720/5721/10197/5971/6500/9040
##               Count
## R-HSA-351202     38
## R-HSA-1428517    76
## R-HSA-350562     34
## R-HSA-5676590    37
## R-HSA-9020702    56
## R-HSA-5607761    37
#Reactome gene set enrichment test
#ego_reactome<-gsePathway(geneList = gene_list,
                         #organism = 'human',
                         #pvalueCutoff = 0.001,
                         #pAdjustMethod = "BH")

#summary(ego_reactome)
dotplot(ego,x="GeneRatio",showCategory=20,font.size=6)

#dotplot(ego_reactome,x="GeneRatio",showCategory=20,font.size=6)
subset <- ego[ego$Count>=10, asis=T]
cnetplot(ego,categorySize="geneNum",foldChange=geneList)
## Scale for size is already present.
## Adding another scale for size, which will replace the existing scale.
## Warning: ggrepel: 2 unlabeled data points (too many overlaps). Consider
## increasing max.overlaps

Enrichment plot

filtered_pathway <- subset(fgsea_reactome, NES > 2.3)

filt_p <- as.vector(filtered_pathway$pathway)

for (i in filt_p){
    plt <- plotEnrichment(pathway = pathway_reactome[[i]],
    gseaParam = 1, ticksSize = 0.5, stats= rank) +
    labs(title=i) + theme(plot.title = element_text(hjust = 0.5, face="bold"))
    print(plt)
}

reactome_IL= subset(fgsea_reactome, fgsea_reactome$pathway=="REACTOME_INTERLEUKIN_4_AND_INTERLEUKIN_13_SIGNALING")
reactome_IL= unlist(reactome_IL$leadingEdge)


subset <- rld[reactome_IL, 7:12]

# scale and center the values
mat <- as.matrix(scale(t(subset), center = T))

# basic plot to check we're plotting something sensible
#pheatmap(t(mat))

# spruce it up a bit..
ann <- data.frame(Condition = c(rep("Healthy_control", 3), rep("Healthy_cytokine", 3)))
rownames(ann) <- rownames(mat)
col <- c("blue", "forestgreen")
names(col) <- c("Healthy_control", "Healthy_cytokine")
ann_col <- list(Condition = col)



ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "REACTOME_INTERLEUKIN_4_AND_INTERLEUKIN_13_SIGNALING",
                        labels_row = rownames(subset),
                        fontsize = 6,
                        legend = TRUE,
                       heatmap_legend_param =list(title="z-score",at=c (-1.5,-1,-0.5,0,0.5,1,1.5)),
        color=hcl.colors(100, 'PRGn',rev=F))

reactome_IL= subset(fgsea_reactome, fgsea_reactome$pathway=="REACTOME_CHEMOKINE_RECEPTORS_BIND_CHEMOKINES")
reactome_IL= unlist(reactome_IL$leadingEdge)


subset <- rld[reactome_IL, 7:12]

# scale and center the values
mat <- as.matrix(scale(t(subset), center = T))

# basic plot to check we're plotting something sensible
#pheatmap(t(mat))

# spruce it up a bit..
ann <- data.frame(Condition = c(rep("Healthy_control", 3), rep("Healthy_cytokine", 3)))
rownames(ann) <- rownames(mat)
col <- c("blue", "forestgreen")
names(col) <- c("Healthy_control", "Healthy_cytokine")
ann_col <- list(Condition = col)

pheatmap(t(mat), 
         show_rownames = TRUE,
         annotation_col = ann,
         annotation_colors = ann_col,
         main = "REACTOME_CHEMOKINE_RECEPTORS_BIND_CHEMOKINES",
         labels_row = rownames(subset), # figure out remove row labels
         fontsize_row = 6,
         color = hcl.colors(100, "PRGn",rev=F))

ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "REACTOME_CHEMOKINE_RECEPTORS_BIND_CHEMOKINES",
                        labels_row = rownames(subset),
                        fontsize = 6,
                        legend = TRUE,
                       heatmap_legend_param =list(title="z-score",at=c (-1.5,-1,-0.5,0,0.5,1,1.5)),
        color=hcl.colors(100, 'PRGn',rev=F))

reactome_IL= subset(fgsea_reactome, fgsea_reactome$pathway=="REACTOME_INTERLEUKIN_10_SIGNALING")
reactome_IL= unlist(reactome_IL$leadingEdge)


subset <- rld[reactome_IL, 7:12]

# scale and center the values
mat <- as.matrix(scale(t(subset), center = T))

# basic plot to check we're plotting something sensible
#pheatmap(t(mat))

# spruce it up a bit..
ann <- data.frame(Condition = c(rep("Healthy_control", 3), rep("Healthy_cytokine", 3)))
rownames(ann) <- rownames(mat)
col <- c("blue", "forestgreen")
names(col) <- c("Healthy_control", "Healthy_cytokine")
ann_col <- list(Condition = col)

pheatmap(t(mat), 
         show_rownames = TRUE,
         annotation_col = ann,
         annotation_colors = ann_col,
         main = "REACTOME_INTERLEUKIN_10_SIGNALING",
         labels_row = rownames(subset), # figure out remove row labels
         fontsize_row = 6,
         color = hcl.colors(100, "PRGn",rev=F))

ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "REACTOME_INTERLEUKIN_10_SIGNALING",
                        labels_row = rownames(subset),
                        fontsize = 6,
                        legend = TRUE,
                       heatmap_legend_param =list(title="z-score",at=c (-1.5,-1,-0.5,0,0.5,1,1.5)),
        color=hcl.colors(100, 'PRGn',rev=F))

reactome_IL= subset(fgsea_reactome, fgsea_reactome$pathway=="REACTOME_PEPTIDE_LIGAND_BINDING_RECEPTORS")
reactome_IL= unlist(reactome_IL$leadingEdge)


subset <- rld[reactome_IL, 7:12]

# scale and center the values
mat <- as.matrix(scale(t(subset), center = T))

# basic plot to check we're plotting something sensible
#pheatmap(t(mat))

# spruce it up a bit..
ann <- data.frame(Condition = c(rep("Healthy_control", 3), rep("Healthy_cytokine", 3)))
rownames(ann) <- rownames(mat)
col <- c("blue", "forestgreen")
names(col) <- c("Healthy_control", "Healthy_cytokine")
ann_col <- list(Condition = col)

pheatmap(t(mat), 
         show_rownames = TRUE,
         annotation_col = ann,
         annotation_colors = ann_col,
         main = "REACTOME_PEPTIDE_LIGAND_BINDING_RECEPTORS",
         labels_row = rownames(subset), # figure out remove row labels
         fontsize_row = 6,
         color = hcl.colors(100, "PRGn",rev=F))

ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "REACTOME_PEPTIDE_LIGAND_BINDING_RECEPTORS",
                        labels_row = rownames(subset),
                        fontsize = 6,
                        legend = TRUE,
                       heatmap_legend_param =list(title="z-score",at=c (-1.5,-1,-0.5,0,0.5,1,1.5)),
        color=hcl.colors(100, 'PRGn',rev=F))

reactome_IL= subset(fgsea_reactome, fgsea_reactome$pathway=="REACTOME_SIGNALING_BY_INTERLEUKINS")
reactome_IL= unlist(reactome_IL$leadingEdge)


subset <- rld[reactome_IL, 7:12]

# scale and center the values
mat <- as.matrix(scale(t(subset), center = T))

# basic plot to check we're plotting something sensible
#pheatmap(t(mat))

# spruce it up a bit..
ann <- data.frame(Condition = c(rep("Healthy_control", 3), rep("Healthy_cytokine", 3)))
rownames(ann) <- rownames(mat)
col <- c("blue", "forestgreen")
names(col) <- c("Healthy_control", "Healthy_cytokine")
ann_col <- list(Condition = col)

pheatmap(t(mat), 
         show_rownames = TRUE,
         annotation_col = ann,
         annotation_colors = ann_col,
         main = "REACTOME_SIGNALING_BY_INTERLEUKINS",
         labels_row = rownames(subset), # figure out remove row labels
         fontsize_row = 6,
         color = hcl.colors(100, "PRGn",rev=F))

ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "REACTOME_SIGNALING_BY_INTERLEUKINS",
                        labels_row = rownames(subset),
                        fontsize = 6,
                        legend = TRUE,
                       heatmap_legend_param =list(title="z-score",at=c (-1.5,-1,-0.5,0,0.5,1,1.5)),
        color=hcl.colors(100, 'PRGn',rev=F))