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(clusterProfiler)
library(circlize)
library(fgsea)
library(tidyverse)
library(ggpubr)
library(vsn)
library(hexbin)
library(ggnewscale)
library(pathview)
library(ReactomePA)
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_control vs healthy_treatment
d_con_vs_h_con <- results(dds, filterFun=ihw, alpha=0.05, c("condition", "disease_control", "healthy_control"))
res_con_con <- lfcShrink(dds=dds, res=d_con_vs_h_con, coef=4, type="apeglm")
summary(res_con_con)
## 
## out of 23094 with nonzero total read count
## adjusted p-value < 0.05
## LFC > 0 (up)       : 75, 0.32%
## LFC < 0 (down)     : 102, 0.44%
## outliers [1]       : 0, 0%
## [1] see 'cooksCutoff' argument of ?results
## see metadata(res)$ihwResult on hypothesis weighting
# make melanoma vs control object
#h_con_v_h_treat <- results(dds, filterFun=ihw, alpha=0.05, c("condition", "healthy_treatment", "healthy_control"))
#res2 <- lfcShrink(dds=dds, res=h_con_v_h_treat, coef=7, type="apeglm")
#summary(res2)

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_con_con<- get_upregulated(as.data.frame(res_con_con))
de_up_con_con
##               baseMean log2FoldChange     lfcSE       pvalue         padj
## ACAN       98306.11777       1.056698 0.3984906 2.069014e-04 2.260915e-02
## ADRA2A       192.06655       1.951692 0.6172420 5.149377e-05 1.143332e-02
## CACNB4       372.75174       1.081115 0.3722839 1.194394e-04 2.251554e-02
## CCDC144CP     85.19642       2.749180 0.5881936 8.399588e-08 6.568596e-05
## CD300C        21.40825       2.997736 1.0404597 8.998943e-05 1.605928e-02
## COL8A1     29391.29197       1.216371 0.1851758 2.017930e-12 6.800484e-09
## COMP       94896.52913       2.474751 0.5671354 1.746096e-07 8.740734e-05
## DUSP4       1202.22541       1.998474 0.4233420 8.909073e-08 7.466250e-05
## EFEMP1     32626.14693       2.065968 0.4889237 7.742207e-07 3.416717e-04
## FGF7        3056.95082       1.192386 0.3559080 2.295870e-05 6.410055e-03
## HTATSF1P2    131.72434       1.505721 0.5162383 8.149104e-05 1.156536e-02
## KCNA4        730.63378       1.539444 0.5487194 1.382081e-04 1.426608e-02
## KCNMB4        26.86105       1.805591 0.6643664 1.946272e-04 2.260915e-02
## KCNN4        397.10554       1.312927 0.3704213 1.389800e-05 4.752154e-03
## LRRC15       344.55355       2.644786 0.4036500 1.591078e-12 6.800484e-09
## NOTCH3      3460.89302       1.395555 0.4616528 7.617798e-05 1.463348e-02
## NPIPA5        37.34668       1.999715 0.7057637 1.280354e-04 1.825550e-02
## NTN1         257.05529       1.858884 0.7241373 2.714309e-04 3.200365e-02
## PCSK9        690.40813       1.115168 0.3256374 1.865206e-05 8.125525e-03
## PDE4B       2673.01860       1.102890 0.3170324 1.729338e-05 5.625333e-03
## PLA2G4A     1359.66561       1.043716 0.3135185 3.149983e-05 7.804901e-03
## PLXNA4      2576.32759       1.616086 0.4303485 3.607987e-06 1.667138e-03
## PRG4        1592.07087       3.160628 0.9096061 1.289265e-05 4.752154e-03
## RIMS1        254.05875       1.722380 0.6333767 1.158756e-04 2.014024e-02
## RNF152       173.80893       1.392463 0.4453531 5.018338e-05 7.891598e-03
## RPL9        4383.68178       3.476705 0.8266612 8.012446e-07 3.416717e-04
## SERPINE2  150151.49467       1.032545 0.3767327 1.608685e-04 2.260915e-02
## SIM1          36.57436       3.319501 1.1066805 2.587927e-05 6.408686e-03
## SLC24A3      150.65941       2.894525 0.5658851 4.546352e-09 4.170469e-06
## SLC31A2      398.86443       1.381337 0.2913436 8.759196e-08 7.473741e-05
## SYN2          20.37552       1.760707 0.6107394 1.271224e-04 2.018839e-02
## TLR4         452.37223       1.309160 0.3439858 5.283172e-06 7.720203e-03
## TMTC1       4132.23483       1.096866 0.3699652 8.603486e-05 1.598803e-02
## TTC9         564.65603       1.535143 0.2778984 1.345556e-09 2.300435e-06
## UPK1B        200.30740       1.582648 0.5745240 1.640626e-04 2.308929e-02
## USP32P3       60.85340       2.670243 0.4446409 7.069890e-11 2.100926e-07
de_down_con_con <- get_downregulated(as.data.frame(res_con_con))
de_down_con_con
##            baseMean log2FoldChange     lfcSE       pvalue         padj
## ARHGEF3   141.64909      -1.168713 0.2304537 1.819702e-08 1.394663e-05
## ASPHD1    189.55046      -1.324294 0.3925064 2.301968e-05 6.410055e-03
## CA3        49.87780      -2.406760 1.0068084 3.686240e-04 3.545883e-02
## CELF2      85.71524      -1.393387 0.4845890 1.179479e-04 1.976962e-02
## CGN       182.02588      -3.059773 0.7981500 9.588480e-07 5.532669e-04
## CLGN      716.66451      -1.455357 0.5328705 1.197608e-04 1.287384e-02
## CORIN      99.09387      -2.324966 0.4461512 7.126036e-09 6.034034e-06
## CRISPLD1 1494.14501      -1.915982 0.3473160 1.145625e-09 2.300435e-06
## DES        63.13858      -2.028567 0.3550585 4.724315e-10 8.880289e-07
## EFNA1     322.09097      -1.094892 0.3163235 1.877480e-05 5.909067e-03
## EPHB2     628.49952      -1.012022 0.3412438 9.602459e-05 1.696143e-02
## HMGA1    2196.79384      -1.449313 0.3629623 1.903503e-06 9.691274e-04
## JPH2      277.85000      -1.147206 0.3164001 1.069347e-05 4.155030e-03
## LAMC2     430.89038      -2.223020 0.3722959 9.746883e-11 3.018565e-07
## LGALS3BP  554.79300      -1.469299 0.3625762 1.825708e-06 8.762969e-04
## MTSS1     112.98654      -1.259698 0.4955218 3.101154e-04 3.508635e-02
## NRG1      843.80277      -1.425980 0.4212152 1.552352e-05 5.268975e-03
## PDE3B      81.35816      -1.581396 0.3203950 3.344565e-08 2.923202e-05
## PDZRN3   2155.47885      -1.037573 0.3095992 2.831501e-05 7.334678e-03
## PEG10    3308.85305      -1.067979 0.2258701 8.264340e-08 7.064582e-05
## PRKG1     504.17571      -1.467099 0.2733320 2.752715e-09 6.081575e-06
## RAP1GAP    87.14313      -1.628123 0.3839407 7.009225e-07 3.634546e-04
## TOX       597.80734      -1.904218 0.2556757 3.132296e-15 5.355143e-11
## TSPAN10   112.20477      -1.299927 0.3638077 1.216075e-05 3.246291e-03
## WIF1       37.59075      -4.381106 1.3103506 5.356984e-05 1.059949e-02
## WNK4     1140.71624      -1.001210 0.2090460 7.033298e-08 6.568596e-05
## remove NA values from results
library(EnhancedVolcano)
res <- results(dds, alpha=0.05, c('condition','disease_control','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)

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

## place top 20 DE genes in vector (optinal...)
plot_top_20 <- c(up_list, down_list)

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="Disease Control vs Healthy Control",
                caption = paste0('Total Genes = ', nrow(res1)),
                xlim=c(-10, 10),
                ylim=c(0, max_height))

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

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

heatmap

# index must match samples you qre plotting
subset <- rld[, c(1,2,3,7,8,9)]

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

# 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("Disease_control", 3), rep("Healthy_control", 3)))
rownames(ann) <- rownames(mat)
col <- c("forestgreen","blue")
names(col) <- c("Disease_control", "Healthy_control")
ann_col <- list(Condition = col)

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

Top20

subset <- rld[,c(1,2,3,7,8,9)]

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

# 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) == colnames(top_genes)
## [1] TRUE TRUE TRUE TRUE TRUE TRUE
#pheatmap::pheatmap(top_genes,
                   #show_rownames = T,
                   #annotation_col = ann,
                   #annotation_colors = ann_col,
                   #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))

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,919 × 2
##    hgnc_symbol log2foldchange
##    <chr>                <dbl>
##  1 ""                -0.0997 
##  2 "A1BG"            -1.10   
##  3 "A1CF"            -0.138  
##  4 "A2M"              0.674  
##  5 "A2ML1"           -0.117  
##  6 "A2MP1"            0.0961 
##  7 "A4GALT"           1.13   
##  8 "A4GNT"           -0.345  
##  9 "AAAS"            -0.0621 
## 10 "AACS"            -0.00364
## # ℹ 16,909 more rows

Convert to a named list

rank <- deframe(fgsea_rank)
head(rank, 20)
##                      A1BG         A1CF          A2M        A2ML1        A2MP1 
## -0.099679061 -1.096013181 -0.137855094  0.674271064 -0.116994530  0.096099397 
##       A4GALT        A4GNT         AAAS         AACS        AADAT        AAGAB 
##  1.133173678 -0.345157934 -0.062076145 -0.003639835  0.184081423 -0.083064101 
##         AAK1        AAMDC         AAMP        AANAT         AAR2         AARD 
##  0.055429938 -0.027513550 -0.002959917  0.455566321  0.008203131 -0.695340781 
##        AARS1        AARS2 
## -0.060877285  0.031117509

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

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)
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:0034765       BP GO:0034765
## GO:0006813       BP GO:0006813
## GO:1904062       BP GO:1904062
## GO:0010959       BP GO:0010959
## GO:0032412       BP GO:0032412
## GO:0022898       BP GO:0022898
## GO:0006936       BP GO:0006936
## GO:0032409       BP GO:0032409
## GO:0030168       BP GO:0030168
## GO:0071805       BP GO:0071805
## GO:0007528       BP GO:0007528
## GO:0062023       CC GO:0062023
## GO:0031594       CC GO:0031594
## GO:0008076       CC GO:0008076
## GO:0034705       CC GO:0034705
## GO:0044304       CC GO:0044304
## GO:0005201       MF GO:0005201
## GO:0008201       MF GO:0008201
## GO:0005539       MF GO:0005539
## GO:0005178       MF GO:0005178
##                                                     Description GeneRatio
## GO:0034765            regulation of ion transmembrane transport    18/171
## GO:0006813                              potassium ion transport    12/171
## GO:1904062         regulation of cation transmembrane transport    14/171
## GO:0010959                    regulation of metal ion transport    15/171
## GO:0032412 regulation of ion transmembrane transporter activity    12/171
## GO:0022898     regulation of transmembrane transporter activity    12/171
## GO:0006936                                   muscle contraction    13/171
## GO:0032409                   regulation of transporter activity    12/171
## GO:0030168                                  platelet activation     8/171
## GO:0071805                potassium ion transmembrane transport    10/171
## GO:0007528                   neuromuscular junction development     5/171
## GO:0062023             collagen-containing extracellular matrix    20/172
## GO:0031594                               neuromuscular junction     8/172
## GO:0008076              voltage-gated potassium channel complex     6/172
## GO:0034705                            potassium channel complex     6/172
## GO:0044304                                            main axon     5/172
## GO:0005201          extracellular matrix structural constituent    11/170
## GO:0008201                                      heparin binding     9/170
## GO:0005539                            glycosaminoglycan binding    10/170
## GO:0005178                                     integrin binding     8/170
##              BgRatio       pvalue     p.adjust       qvalue
## GO:0034765 476/18800 3.623479e-07 1.067839e-03 9.249406e-04
## GO:0006813 243/18800 2.379814e-06 3.164875e-03 2.741351e-03
## GO:1904062 352/18800 4.308735e-06 3.164875e-03 2.741351e-03
## GO:0010959 403/18800 4.346273e-06 3.164875e-03 2.741351e-03
## GO:0032412 263/18800 5.369656e-06 3.164875e-03 2.741351e-03
## GO:0022898 273/18800 7.843776e-06 3.852601e-03 3.337045e-03
## GO:0006936 349/18800 1.918761e-05 8.077984e-03 6.996986e-03
## GO:0032409 305/18800 2.369618e-05 8.245690e-03 7.142249e-03
## GO:0030168 130/18800 2.518195e-05 8.245690e-03 7.142249e-03
## GO:0071805 219/18800 3.303569e-05 9.735618e-03 8.432795e-03
## GO:0007528  43/18800 4.272834e-05 1.144731e-02 9.915429e-03
## GO:0062023 429/19594 1.301219e-09 3.812573e-07 3.287291e-07
## GO:0031594  67/19594 1.257107e-07 1.841662e-05 1.587925e-05
## GO:0008076  79/19594 6.859350e-05 6.699298e-03 5.776295e-03
## GO:0034705  89/19594 1.334073e-04 9.772083e-03 8.425723e-03
## GO:0044304  61/19594 1.966217e-04 1.152203e-02 9.934572e-03
## GO:0005201 172/18410 5.879645e-07 2.387136e-04 2.060970e-04
## GO:0008201 168/18410 2.660120e-05 5.400043e-03 4.662210e-03
## GO:0005539 234/18410 6.539327e-05 8.849889e-03 7.640687e-03
## GO:0005178 156/18410 1.020102e-04 1.035404e-02 8.939315e-03
##                                                                                                                                      geneID
## GO:0034765                       ADRA2A/ANK3/APP/CACNB4/EPHB2/JPH2/KCNA4/KCND3/KCNH1/KCNN4/KCNQ3/PCSK9/PDE4B/RNF207/SLC31A2/THADA/UTRN/WNK4
## GO:0006813                                                      ADORA1/ADRA2A/ANK3/KCNA4/KCND3/KCNH1/KCNMB4/KCNN4/KCNQ3/RNF207/SLC24A3/WNK4
## GO:1904062                                               ADRA2A/ANK3/APP/CACNB4/EPHB2/JPH2/KCNN4/PCSK9/PDE4B/RNF207/SLC31A2/THADA/UTRN/WNK4
## GO:0010959                                   ADORA1/ADRA2A/ANK3/CACNB4/JPH2/KCNN4/PCSK9/PDE4B/RNF207/SERPINE2/SLC31A2/THADA/TRPV2/UTRN/WNK4
## GO:0032412                                                             ADRA2A/ANK3/APP/CACNB4/EPHB2/JPH2/PCSK9/PDE4B/RNF207/THADA/UTRN/WNK4
## GO:0022898                                                             ADRA2A/ANK3/APP/CACNB4/EPHB2/JPH2/PCSK9/PDE4B/RNF207/THADA/UTRN/WNK4
## GO:0006936                                                          ADORA1/ADRA2A/COMP/DES/DTNA/KCND3/PDE4B/PRKG1/RNF207/TBX3/TPM2/TTN/UTRN
## GO:0032409                                                             ADRA2A/ANK3/APP/CACNB4/EPHB2/JPH2/PCSK9/PDE4B/RNF207/THADA/UTRN/WNK4
## GO:0030168                                                                              ADRA2A/COL3A1/COMP/PLA2G4A/PRKG1/SERPINE2/TLR4/VAV3
## GO:0071805                                                                    ANK3/KCNA4/KCND3/KCNH1/KCNMB4/KCNN4/KCNQ3/RNF207/SLC24A3/WNK4
## GO:0007528                                                                                                    ANK3/APP/CACNB4/COL4A5/PDZRN3
## GO:0062023 ACAN/BCAM/COL12A1/COL3A1/COL4A5/COL8A1/COMP/CTSH/EFEMP1/LAMC2/LGALS3BP/LOXL4/LRRC15/LTBP1/LTBP2/NTN1/PRG4/RARRES2/SERPINE2/SFRP1
## GO:0031594                                                                                    ANK3/APP/COL4A5/DES/NRG1/PDZRN3/SERPINE2/UTRN
## GO:0008076                                                                                             KCNA4/KCND3/KCNH1/KCNMB4/KCNN4/KCNQ3
## GO:0034705                                                                                             KCNA4/KCND3/KCNH1/KCNMB4/KCNN4/KCNQ3
## GO:0044304                                                                                                      ADORA1/ANK3/APP/KCNA4/KCNQ3
## GO:0005201                                                             ACAN/COL12A1/COL3A1/COL4A5/COL8A1/COMP/EFEMP1/LAMC2/LTBP1/LTBP2/PRG4
## GO:0008201                                                                            ADGRG1/APP/COMP/FGF7/LAMC2/LTBP2/SERPINE2/SFRP1/TENM1
## GO:0005539                                                                       ACAN/ADGRG1/APP/COMP/FGF7/LAMC2/LTBP2/SERPINE2/SFRP1/TENM1
## GO:0005178                                                                                       COL3A1/COMP/ESM1/GFAP/ITGB5/NRG1/SPP1/UTRN
##            Count
## GO:0034765    18
## GO:0006813    12
## GO:1904062    14
## GO:0010959    15
## GO:0032412    12
## GO:0022898    12
## GO:0006936    13
## GO:0032409    12
## GO:0030168     8
## GO:0071805    10
## GO:0007528     5
## GO:0062023    20
## GO:0031594     8
## GO:0008076     6
## GO:0034705     6
## GO:0044304     5
## GO:0005201    11
## GO:0008201     9
## GO:0005539    10
## GO:0005178     8
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:0034765       BP GO:0034765
## GO:0006813       BP GO:0006813
## GO:1904062       BP GO:1904062
## GO:0010959       BP GO:0010959
## GO:0032412       BP GO:0032412
## GO:0022898       BP GO:0022898
##                                                     Description GeneRatio
## GO:0034765            regulation of ion transmembrane transport    18/171
## GO:0006813                              potassium ion transport    12/171
## GO:1904062         regulation of cation transmembrane transport    14/171
## GO:0010959                    regulation of metal ion transport    15/171
## GO:0032412 regulation of ion transmembrane transporter activity    12/171
## GO:0022898     regulation of transmembrane transporter activity    12/171
##              BgRatio       pvalue    p.adjust       qvalue
## GO:0034765 476/18800 3.623479e-07 0.001067839 0.0009249406
## GO:0006813 243/18800 2.379814e-06 0.003164875 0.0027413505
## GO:1904062 352/18800 4.308735e-06 0.003164875 0.0027413505
## GO:0010959 403/18800 4.346273e-06 0.003164875 0.0027413505
## GO:0032412 263/18800 5.369656e-06 0.003164875 0.0027413505
## GO:0022898 273/18800 7.843776e-06 0.003852601 0.0033370450
##                                                                                                                geneID
## GO:0034765 ADRA2A/ANK3/APP/CACNB4/EPHB2/JPH2/KCNA4/KCND3/KCNH1/KCNN4/KCNQ3/PCSK9/PDE4B/RNF207/SLC31A2/THADA/UTRN/WNK4
## GO:0006813                                ADORA1/ADRA2A/ANK3/KCNA4/KCND3/KCNH1/KCNMB4/KCNN4/KCNQ3/RNF207/SLC24A3/WNK4
## GO:1904062                         ADRA2A/ANK3/APP/CACNB4/EPHB2/JPH2/KCNN4/PCSK9/PDE4B/RNF207/SLC31A2/THADA/UTRN/WNK4
## GO:0010959             ADORA1/ADRA2A/ANK3/CACNB4/JPH2/KCNN4/PCSK9/PDE4B/RNF207/SERPINE2/SLC31A2/THADA/TRPV2/UTRN/WNK4
## GO:0032412                                       ADRA2A/ANK3/APP/CACNB4/EPHB2/JPH2/PCSK9/PDE4B/RNF207/THADA/UTRN/WNK4
## GO:0022898                                       ADRA2A/ANK3/APP/CACNB4/EPHB2/JPH2/PCSK9/PDE4B/RNF207/THADA/UTRN/WNK4
##            Count
## GO:0034765    18
## GO:0006813    12
## GO:1904062    14
## GO:0010959    15
## GO:0032412    12
## GO:0022898    12
#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)
dotplot(ego,showCategory=20,font.size=6)

subset <- ego[ego$Count ==18, asis=TRUE]
cnetplot(subset, foldChange=geneList)
## Scale for size is already present.
## Adding another scale for size, which will replace the existing scale.

#subset <- ego[ego$Count==21, asis=TRUE]
#gen<-ego[ego$Count==21, asis=TRUE]

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

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

go_bp_skeletal = subset(fgsea, fgsea$pathway=="GOBP_REGULATION_OF_SKELETAL_MUSCLE_TISSUE_DEVELOPMENT")
go_bp_skeletal = unlist(go_bp_skeletal$leadingEdge)


subset <- rld[go_bp_skeletal, c(7,8,9,1,2,3)]

# 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("Disease_control", 3)))
rownames(ann) <- rownames(mat)
col <- c( "blue","forestgreen")
names(col) <- c("Healthy_control","Disease_control")
ann_col <- list(Condition = col)



ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "GOBP_MUSCLE_HYPERTROPHY",
                        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

# read in gmt file
pathway_kegg <- gmtPathways("/Users/aungphyo/Downloads/c2.cp.kegg.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,919 × 2
##    hgnc_symbol log2foldchange
##    <chr>                <dbl>
##  1 ""                -0.0997 
##  2 "A1BG"            -1.10   
##  3 "A1CF"            -0.138  
##  4 "A2M"              0.674  
##  5 "A2ML1"           -0.117  
##  6 "A2MP1"            0.0961 
##  7 "A4GALT"           1.13   
##  8 "A4GNT"           -0.345  
##  9 "AAAS"            -0.0621 
## 10 "AACS"            -0.00364
## # ℹ 16,909 more rows

create named list

rank <- deframe(fgsea_rank)
head(rank, 20)
##                      A1BG         A1CF          A2M        A2ML1        A2MP1 
## -0.099679061 -1.096013181 -0.137855094  0.674271064 -0.116994530  0.096099397 
##       A4GALT        A4GNT         AAAS         AACS        AADAT        AAGAB 
##  1.133173678 -0.345157934 -0.062076145 -0.003639835  0.184081423 -0.083064101 
##         AAK1        AAMDC         AAMP        AANAT         AAR2         AARD 
##  0.055429938 -0.027513550 -0.002959917  0.455566321  0.008203131 -0.695340781 
##        AARS1        AARS2 
## -0.060877285  0.031117509
# 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$pvalue < 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
##        1618      150372        <NA>        6492        1607        6133 
##   6.0942041   5.3145703   4.2613340   3.9179873   3.8230815   3.7581722 
##        5179       10216       10871        1470       26034      341350 
##   3.7425344   3.5911174   3.5755547   3.5724515   3.4437561   3.4044742 
##      138724        9407         941       57419       29986   105378220 
##   3.3647572   3.3103778   3.1018109   3.0999499   3.0739622   3.0549101 
##        7480         438        <NA>      134111        2268        <NA> 
##   3.0289154   2.9870413   2.9747392   2.9200614   2.8753391   2.8096034 
##       80731        1830      131831        2706      131578       23281 
##   2.8093729   2.8078529   2.8010079   2.7915109   2.7615571   2.7345388 
##        <NA>        3356        1311        2861        9547       83844 
##   2.7328306   2.7239659   2.7051081   2.6914716   2.6457138   2.6141961 
##      260293        1118        5224        4248      139411       23493 
##   2.5976734   2.5039145   2.4344058   2.4213782   2.4133449   2.4032831 
##       79024   100288332        3112        <NA>        9423        2202 
##   2.3970962   2.3959117   2.3582548   2.3014860   2.2848611   2.2712503 
##         150       84700       10894       90527       54210      401097 
##   2.2687355   2.2462116   2.2355180   2.2155395   2.2013664   2.1938053 
##       10551       27345        4023       64101        1846        6689 
##   2.1893658   2.1863703   2.1801770   2.1660382   2.1616601   2.1529602 
##        <NA>        2254        6854       22999      647309      342667 
##   2.1267153   2.1138484   2.0980519   2.0840450   2.0699258   2.0569549 
##      128553       80852       84258        4005   107181291        <NA> 
##   2.0543082   2.0533803   2.0258932   2.0034170   1.9840793   1.9789834 
##       10875       57119      114801       10326        7348        6781 
##   1.9768947   1.9696097   1.9656444   1.9194636   1.9087581   1.8962375 
##      143425        8549        1675        3776        3739      338811 
##   1.8882160   1.8748102   1.8729445   1.8639522   1.8456322   1.8431850 
##        5122       80243        7805       91584        5468        2675 
##   1.8421709   1.8411716   1.8379228   1.8164530   1.8135627   1.7990915 
##        <NA>        5806       56603        5320        <NA>        7499 
##   1.7896810   1.7826140   1.7668997   1.7424518   1.7265008   1.7220700 
##   100132596       23263        9001        6751       27019         288 
##   1.7220700   1.7129028   1.7072918   1.6784942   1.6774681   1.6744399 
##       50506        8483      147700      285051        4854        <NA> 
##   1.6711058   1.6561383   1.6474443   1.6466781   1.6456977   1.6426482 
##       23508      220441        6474        5153        7113   124905021 
##   1.6285815   1.6275592   1.6198489   1.5771446   1.5691075   1.5691075 
##       90523        3965      196883        5649       78986         134 
##   1.5635995   1.5467978   1.5363995   1.5278707   1.5245998   1.5204112 
##       27202        6542       11035       84935        9333        1318 
##   1.5181113   1.5117921   1.5048560   1.4966227   1.4936995   1.4900717 
##        1646        3783        1948       51655        7099       57623 
##   1.4834511   1.4820892   1.4775544   1.4676937   1.4664457   1.4628810 
##       79937        5742       64231        1748      644890        9750 
##   1.4346027   1.4344449   1.4285752   1.4161421   1.4147764   1.4137135 
##        5540      151651      254778        2252        5744      347404 
##   1.4131041   1.4114485   1.3726912   1.3708419   1.3657197   1.3582904 
##        2239        3574        9884      728340        3753          28 
##   1.3559597   1.3552316   1.3535971   1.3517230   1.3489139   1.3424514 
##      266722        9699       84466        <NA>       83857       29841 
##   1.3385366   1.3341428   1.3294105   1.3141815   1.2977546   1.2953812 
##         176      151254         785        1187      338322      255738 
##   1.2867742   1.2864286   1.2860724   1.2855705   1.2792885   1.2770272 
##        1295        5142      126393        5270        2246        3604 
##   1.2689237   1.2582745   1.2548223   1.2471040   1.2438967   1.2417051 
##        6524       56127        4133       11096       27129        5144 
##   1.2359967   1.2348621   1.2271856   1.2158750   1.2153083   1.2128219 
##        1462        5321        3892        8291        2888        7133 
##   1.2027806   1.2008444   1.1748280   1.1711701   1.1650031   1.1606267 
##       83988        4137       51285       28513       53947       56131 
##   1.1527156   1.1513734   1.1367057   1.1363289   1.1331737   1.1298135 
##        4053       57528        2306      151354        6671      116328 
##   1.1292520   1.1279293   1.1250485   1.1133531   1.1111086   1.1070895 
##       55790       26664        1827        8013      163227        4703 
##   1.1029780   1.0999672   1.0969119   1.0940862   1.0917520   1.0917180 
##   101060146        8744       23213        9536      389289       25817 
##   1.0848472   1.0752576   1.0701412   1.0680248   1.0679301   1.0535804 
##       11174       81617      145864       29057      727866      727764 
##   1.0522777   1.0522638   1.0484798   1.0465540   1.0465540   1.0459266 
##       84708       57569        1303       80108        3373      115265 
##   1.0457059   1.0414131   1.0356942   1.0342861   1.0325435   1.0315260 
##      152687       91768       81706         196        6853       10156 
##   1.0300745   1.0300076   1.0289350   1.0207174   1.0151242   0.9992664 
##       79899      729993       27185      130497        1545       60676 
##   0.9986589   0.9930202   0.9857035   0.9845376   0.9769526   0.9769468 
##       23138      145258      257194        9839       94031        3786 
##   0.9732736   0.9688462   0.9545545   0.9531112   0.9489209   0.9453504 
##      127396        9510      161291        4094        2643       56114 
##   0.9319050   0.9310158   0.9305613   0.9300841   0.9245860   0.9154873 
##        8835      202915      157506      283383        7881      645158 
##   0.9138358   0.9116069   0.9111440   0.9050435   0.9022806   0.8970461 
##       10512        5396      130940        5577         182       53905 
##   0.8955963   0.8947115   0.8945796   0.8919064   0.8854628   0.8798260 
##       10622        5272       23362       10123       56125       79056 
##   0.8781251   0.8780974   0.8773720   0.8763486   0.8657767   0.8599942 
##        5125      253935        6095        <NA>       10468        5737 
##   0.8534562   0.8518555   0.8517348   0.8405723   0.8382011   0.8340162 
##       92369        4883       57596       64093        8702      644596 
##   0.8295687   0.8246468   0.8171605   0.8138462   0.8121126   0.8070151 
##      153562      151556        <NA>      121512       57562      128272 
##   0.7975096   0.7957241   0.7941095   0.7927333   0.7904755   0.7857461 
##        6649        5168        2820      641371       29121       54438 
##   0.7844787   0.7828600   0.7795530   0.7791858   0.7659493   0.7635582 
##      126231        3624      140290        7402        6617       29969 
##   0.7579113   0.7564180   0.7535819   0.7518838   0.7502474   0.7440035 
##      222235       83648      392255       26137       28999       51427 
##   0.7437909   0.7418787   0.7378005   0.7352692   0.7337037   0.7303919 
##        5154      347344       27106        2745       23336       54557 
##   0.7274672   0.7219137   0.7177613   0.7139089   0.7123481   0.7121326 
##      728819        4241        3756       57568      170067        3304 
##   0.7115186   0.7035872   0.7016202   0.6964896   0.6963681   0.6920434 
##        7639        7273        8605       90594       10370         631 
##   0.6901407   0.6858870   0.6845313   0.6781523   0.6766284   0.6762113 
##       27111        6913       92255      252884      221322       23308 
##   0.6739067   0.6665576   0.6642330   0.6637609   0.6601705   0.6569117 
##   102723996        1796      400954       56243      254827      120534 
##   0.6569117   0.6561687   0.6510661   0.6496138   0.6429180   0.6411493 
##        6511        2619        3693        7378   100507436        7700 
##   0.6406115   0.6360630   0.6332881   0.6255920   0.6253384   0.6251573 
##       57630        4008      284349        3157        5236        1281 
##   0.6249570   0.6246609   0.6244978   0.6222084   0.6187039   0.6164616 
##       51334      201232        7730   100529215       58476        9060 
##   0.6138751   0.6138529   0.6129180   0.6129180   0.6112236   0.6095208 
##      151827       10736       57168        9162       11228       79912 
##   0.6045421   0.6034264   0.6023472   0.6021587   0.5985667   0.5974361 
##      200958      113878        4537        4919       55582       57677 
##   0.5955716   0.5911259   0.5909595   0.5869556   0.5847892   0.5816712 
##        9194        7782      166968       83700       30845       85379 
##   0.5801753   0.5767998   0.5756892   0.5743877   0.5696814   0.5684081 
##   100302736        3556      285605      169841      221078      143689 
##   0.5584288   0.5568973   0.5507838   0.5478196   0.5437020   0.5412513 
##       22841        5587       57337      375346       54165      146691 
##   0.5409717   0.5407884   0.5407687   0.5395943   0.5395191   0.5380134 
##       56103       22809       54464         669        9922      147929 
##   0.5367926   0.5362135   0.5323232   0.5303048   0.5265019   0.5263035 
##        3156      152579        1021       23012        4430      168451 
##   0.5262021   0.5254251   0.5251320   0.5246608   0.5223527   0.5189128 
##       83855       26230         605       89796         463       25925 
##   0.5178280   0.5158931   0.5140271   0.5137948   0.5127061   0.5109387 
##        3775        2012      151176         595      144108        9962 
##   0.5084704   0.5076646   0.5070499   0.5053430   0.5025922   0.5006757 
##        3422       11153        8496       85016        4189        5530 
##   0.5002280   0.5001778   0.4966585   0.4960378   0.4952675   0.4947154 
##      360023        1278      160418       10687       56107       80315 
##   0.4931124   0.4923628   0.4922821   0.4919250   0.4912430   0.4901915 
##       55180        5554       11272        2697      127700       26064 
##   0.4889972   0.4889110   0.4889110   0.4875160   0.4856831   0.4837271 
##       79694      283742       55605      151195       84695       22837 
##   0.4835095   0.4801303   0.4800668   0.4798270   0.4787980   0.4774346 
##       53373        1289        8527        8411        7562        5208 
##   0.4746744   0.4733327   0.4726162   0.4708543   0.4707119   0.4703251 
##       55356       25945       10924       51527       51742         586 
##   0.4689750   0.4673378   0.4661545   0.4636590   0.4607152   0.4583566 
##       57493        6990       26353      340481       54991       79718 
##   0.4578264   0.4577023   0.4569452   0.4550053   0.4499310   0.4485497 
##       57719        3638       22936       79133       57455       81570 
##   0.4476920   0.4473621   0.4459290   0.4453141   0.4439715   0.4424594 
##        9043       49855      345778        4649       57584        2230 
##   0.4419630   0.4417448   0.4406909   0.4392907   0.4386864   0.4361273 
##        5091       89782        4091       23036   100499483       65010 
##   0.4359126   0.4351089   0.4349001   0.4345131   0.4345041   0.4332864 
##        9451       25938        3981      162655       26119       55297 
##   0.4325901   0.4292610   0.4272872   0.4270676   0.4269389   0.4268645 
##       25909        5066      221037      153339       10063       65059 
##   0.4257297   0.4224435   0.4211574   0.4206962   0.4206701   0.4185442 
##       10808       90203       80267      340252       50853       64172 
##   0.4171292   0.4148567   0.4143114   0.4138131   0.4131955   0.4127675 
##       80821       11215      492311        7763       84255        6249 
##   0.4116748   0.4114729   0.4112987   0.4108646   0.4101869   0.4092989 
##      345757       26505       11275       79627       26258       84262 
##   0.4068649   0.4064683   0.4064555   0.4053397   0.4047020   0.4041096 
##        9821       79572        1105       80256         755        5286 
##   0.4034886   0.4034247   0.4020940   0.4014012   0.4006158   0.3996645 
##      254042        7975       11080       56916        4082      253558 
##   0.3994073   0.3990666   0.3989134   0.3968776   0.3951809   0.3948498 
##        7559       92106       51026        8445       23064       54928 
##   0.3944410   0.3944143   0.3944030   0.3930841   0.3928971   0.3922523 
##        1808       22823         373       23387       57704      158358 
##   0.3917337   0.3898800   0.3882438   0.3845996   0.3825967   0.3820762 
##      283635         828        1519        7013       57486       23492 
##   0.3791662   0.3786299   0.3765980   0.3758126   0.3756367   0.3754064 
##       51184      143888        6934        2673       55616       91749 
##   0.3750808   0.3749665   0.3730436   0.3722127   0.3717019   0.3695425 
##        2762        8036       10600       55290       56890       80219 
##   0.3684182   0.3675863   0.3634769   0.3626182   0.3621874   0.3614808 
##      124152        1147      259217       55183        4536        4548 
##   0.3613557   0.3604703   0.3602880   0.3600846   0.3576168   0.3575844 
##       64420        2059        1523        1595       23405      124923 
##   0.3559319   0.3531546   0.3529975   0.3525361   0.3522347   0.3520844 
##        6595       56848        7764        9695        7873        9126 
##   0.3518974   0.3518704   0.3509586   0.3505363   0.3501656   0.3488691 
##        8504       55829       10483       25800      253430       10048 
##   0.3480055   0.3458362   0.3457547   0.3455000   0.3454928   0.3447175 
##        <NA>       84946       55814        4862       91404        3029 
##   0.3444103   0.3437567   0.3433926   0.3433871   0.3429751   0.3423701 
##        4012      153241        1717      375743        9867      160760 
##   0.3404678   0.3396465   0.3384137   0.3380849   0.3374924   0.3370297 
##       10466       23335       51351   109504726       10263       84081 
##   0.3359010   0.3354227   0.3336400   0.3336400   0.3336118   0.3334527 
##       10525        6049       84188        9786       29920        9534 
##   0.3329117   0.3318075   0.3310648   0.3302486   0.3293069   0.3287758 
##      200894       79634       84668       23350       25987       51399 
##   0.3284161   0.3278394   0.3268758   0.3262094   0.3261665   0.3254426 
##        5976       23254         427       55171       60559         516 
##   0.3241924   0.3219628   0.3219292   0.3214736   0.3213925   0.3212441 
##      114823      149371      113174        2135        <NA>        5597 
##   0.3204859   0.3200069   0.3198810   0.3198288   0.3193458   0.3181694 
##       10278        2137      253461       29058       84307        6596 
##   0.3164371   0.3163759   0.3156154   0.3147745   0.3140354   0.3133737 
##        4209       57703      159371        3491      200576       57192 
##   0.3133735   0.3132760   0.3131122   0.3121402   0.3121070   0.3118517 
##      404093      162073       26092       25977      140890      133619 
##   0.3113949   0.3105430   0.3103299   0.3097799   0.3084971   0.3084826 
##         965        9728       79670        1737       23347        3799 
##   0.3083668   0.3074650   0.3072473   0.3065533   0.3063049   0.3059644 
##        9736        5822       28985        4820        6443       55254 
##   0.3059557   0.3050933   0.3049696   0.3042089   0.3036027   0.3035200 
##        4437        5098       51105      221710       55319       83941 
##   0.3026257   0.3022881   0.3012949   0.3011171   0.2987411   0.2984938 
##       58493       84752       26056         331       64840       54878 
##   0.2983570   0.2976166   0.2974132   0.2962454   0.2957742   0.2953516 
##       10042        5817       23585       84641       55074       90701 
##   0.2951005   0.2947903   0.2929112   0.2916849   0.2913484   0.2909221 
##      154881        9337       57182         821        2764       10131 
##   0.2904670   0.2898145   0.2895577   0.2895534   0.2882391   0.2879037 
##      163859       10229       11072       25923       54918       23047 
##   0.2869838   0.2865667   0.2862598   0.2848723   0.2835880   0.2831246 
##        5930      113251       60481       23613       57805       27248 
##   0.2828609   0.2823877   0.2823051   0.2818758   0.2808209   0.2799504 
##      129685       64207       84928      154810       23011        5955 
##   0.2799089   0.2796285   0.2796205   0.2795375   0.2793617   0.2784872 
##       23214        3066       51340       55284       23358       26515 
##   0.2776166   0.2774078   0.2773136   0.2767561   0.2764427   0.2753871 
##       54014       57534       51660        2222       27020       51124 
##   0.2729578   0.2727636   0.2726675   0.2718714   0.2704822   0.2692685 
##        5170      548645        3364        8803        6734      114294 
##   0.2686928   0.2650028   0.2647203   0.2644411   0.2643797   0.2641886 
##        6786      114885       51657       10020       28962        7517 
##   0.2631641   0.2631329   0.2610864   0.2589022   0.2571863   0.2558297 
##       57665       64778      493856        6655        7572       79573 
##   0.2533839   0.2532540   0.2522831   0.2485512   0.2480808   0.2480798 
##       57583       55719        2664        1385       55197      285636 
##   0.2472813   0.2463364   0.2453690   0.2451331   0.2441480   0.2435521 
##       57222          29       51696       84629        2802       83452 
##   0.2419736   0.2412846   0.2407902   0.2402070   0.2395989   0.2379914 
##        6884       55958       81537      440138       55501        8672 
##   0.2379209   0.2377117   0.2374882   0.2368481   0.2346033   0.2344388 
##       56650       57678      399474      254170       91452       66008 
##   0.2342504   0.2341056   0.2338540   0.2337593   0.2333204   0.2327984 
##       29105        4535        8237       11056       26994       51109 
##   0.2301760   0.2300138   0.2294669   0.2291724   0.2285951   0.2273097 
##        4594      439921       23369        8500       56900       54954 
##   0.2272593   0.2265979   0.2262468   0.2247912   0.2245265   0.2243340 
##        5862        2767       84064       56897       64924       51430 
##   0.2234988   0.2208266   0.2206238   0.2198015   0.2173804   0.2166671 
##        8726       87178       55120       23215       51582       84280 
##   0.2156614   0.2149555   0.2119797   0.2103218   0.2091871   0.2088545 
##        5440       84926        2068       10342       10609       29978 
##   0.2084672   0.2075922   0.2068356   0.2036832   0.1981216   0.1973486 
##        9871       55624       90121       10905       11014        7922 
##   0.1971489   0.1971206   0.1969854   0.1952995   0.1922012   0.1905235 
##        5781       29979       10312       51315      116983        2873 
##   0.1888682   0.1866097   0.1856526   0.1834103   0.1816294   0.1791013 
##       90488        9550        3831       55676         529       57634 
##   0.1784776   0.1760771   0.1745841   0.1738178   0.1731750   0.1698541 
##        7514        5707      136319       54700       64426       55239 
##   0.1659000   0.1658960   0.1647149   0.1636050   0.1571846   0.1539990 
##       10605       50813       51108        8666        3735       54461 
##   0.1534959   0.1376746  -0.1476624  -0.1479804  -0.1523751  -0.1616209 
##       29934       93974       10425        5094        8724       64110 
##  -0.1669574  -0.1724021  -0.1788626  -0.1794781  -0.1800403  -0.1801758 
##       51246       81555        2907        5204       92703       51637 
##  -0.1819895  -0.1855098  -0.1885355  -0.1918336  -0.1921727  -0.1926704 
##       50488       55030        3068        5018       23770        1211 
##  -0.1944436  -0.1964580  -0.1980360  -0.2007172  -0.2009916  -0.2040366 
##        5699        8896        6205        6146       84324       64771 
##  -0.2043977  -0.2045707  -0.2074971  -0.2082997  -0.2099482  -0.2106103 
##        5434        6468        9905         689       27018      374882 
##  -0.2108858  -0.2115759  -0.2124501  -0.2128622  -0.2160642  -0.2192795 
##       10127       84619       30968       10474        6155       54926 
##  -0.2216028  -0.2241836  -0.2245951  -0.2255837  -0.2257593  -0.2261445 
##        6294       27246         823       25911       23474       79701 
##  -0.2285942  -0.2350369  -0.2354582  -0.2363979  -0.2379710  -0.2393151 
##         682      115416       80145       29085       51635       51035 
##  -0.2410179  -0.2414817  -0.2416805  -0.2446413  -0.2496676  -0.2500645 
##        4580       26284         381        6230        8574       26040 
##  -0.2503085  -0.2517872  -0.2523219  -0.2529906  -0.2537578  -0.2538486 
##        4869        6187        9520       55054       83933       10204 
##  -0.2543269  -0.2549211  -0.2549454  -0.2553439  -0.2553620  -0.2567326 
##        4350        6132       79751      129285       64743        6147 
##  -0.2574342  -0.2589687  -0.2590711  -0.2597023  -0.2604450  -0.2628570 
##      116988         819      388969        9887        5914        6232 
##  -0.2632177  -0.2633263  -0.2640152  -0.2650525  -0.2651105  -0.2652593 
##       10081        6448       84874        2629        6165        6277 
##  -0.2657417  -0.2663209  -0.2671178  -0.2675871  -0.2678222  -0.2678536 
##       55657        6130        1174      132884        3094        6210 
##  -0.2680081  -0.2688731  -0.2705561  -0.2718460  -0.2718808  -0.2725643 
##        3692        6202        1345       11253      254863        7009 
##  -0.2759699  -0.2768772  -0.2772295  -0.2775587  -0.2778103  -0.2780734 
##       84233        4736        3636        9175       55066   124907803 
##  -0.2782152  -0.2785241  -0.2786790  -0.2788807  -0.2802310  -0.2802310 
##        9246        6233       30008        3688        1777       10493 
##  -0.2811242  -0.2812178  -0.2833348  -0.2834575  -0.2837150  -0.2851963 
##       51073      114984       84795        7178        5190       28974 
##  -0.2855140  -0.2856394  -0.2857802  -0.2858883  -0.2861257  -0.2870913 
##        1891        2319       10007        5910        6737        6156 
##  -0.2875495  -0.2892316  -0.2918472  -0.2927100  -0.2947595  -0.2951859 
##       54925        6138        6158         143        9973        6218 
##  -0.2953321  -0.2957785  -0.2963001  -0.2973083  -0.2974934  -0.2975244 
##        9349       57804         517        6152        7216       55020 
##  -0.2984071  -0.2991261  -0.3010888  -0.3034531  -0.3034927  -0.3047157 
##       55568       10227       83985        1937       51282        6161 
##  -0.3049975  -0.3052962  -0.3063842  -0.3065585  -0.3068093  -0.3069599 
##       25873        6154      339230        6128       81562        6139 
##  -0.3071604  -0.3071646  -0.3078680  -0.3119446  -0.3122126  -0.3132414 
##       51691       23274       79903       56105        6141        5826 
##  -0.3148206  -0.3159920  -0.3165951  -0.3167219  -0.3172029  -0.3174908 
##        6223       28232       55625       10455       23344        5255 
##  -0.3183100  -0.3188265  -0.3188938  -0.3198804  -0.3222069  -0.3225124 
##      112483       65003       55630        6135         967      121053 
##  -0.3252621  -0.3255216  -0.3257546  -0.3262252  -0.3277597  -0.3291780 
##        1774      115992       55252       11224        6188        7311 
##  -0.3298369  -0.3299911  -0.3303798  -0.3305065  -0.3313575  -0.3314478 
##        <NA>        <NA>        6235         648        6222        6166 
##  -0.3316727  -0.3328838  -0.3332265  -0.3335682  -0.3340610  -0.3340791 
##       29937       51029      653583       23608      126003       56993 
##  -0.3346689  -0.3348414  -0.3365802  -0.3366781  -0.3374634  -0.3378538 
##        5696        2549        4048       80169        5784       56967 
##  -0.3382916  -0.3398899  -0.3402171  -0.3413987  -0.3423117  -0.3432290 
##      653519       51642        6142        1186        8569       79641 
##  -0.3433864  -0.3443279  -0.3445559  -0.3459329  -0.3461911  -0.3468012 
##        6159       22904        6201        9487       26873        5600 
##  -0.3476329  -0.3484455  -0.3512846  -0.3539838  -0.3564892  -0.3573120 
##        2879        6169       51665        1292        6925       23366 
##  -0.3573635  -0.3582236  -0.3583420  -0.3594736  -0.3604429  -0.3606308 
##       65005       51622      349565        3430       10384      317749 
##  -0.3613096  -0.3617676  -0.3640130  -0.3651735  -0.3653916  -0.3668697 
##      400818        9587        4814       57658       10399       26010 
##  -0.3695495  -0.3712763  -0.3715759  -0.3717888  -0.3720998  -0.3763491 
##       26007       79091       56947        2091       55893       56672 
##  -0.3781570  -0.3795357  -0.3830477  -0.3833111  -0.3855171  -0.3855964 
##       79661       84866       10626      391356       54149      140823 
##  -0.3866600  -0.3874497  -0.3893602  -0.3894294  -0.3899376  -0.3908837 
##       10076       25832       64598       26013       64900       23583 
##  -0.3921075  -0.3923344  -0.3928936  -0.3938548  -0.3953483  -0.3960309 
##   101410538        5796       23005       23236      729873   101060376 
##  -0.3964532  -0.3968107  -0.3972762  -0.4006044  -0.4007862  -0.4007862 
##        6880      128338       80212      152185        1936      728841 
##  -0.4015000  -0.4043554  -0.4057457  -0.4087944  -0.4091162  -0.4096220 
##       10162       57620       65979        5480       10597       23327 
##  -0.4101606  -0.4124863  -0.4159387  -0.4162462  -0.4163140  -0.4184361 
##   100288142        3269      114793        9540       10953       25956 
##  -0.4191204  -0.4212292  -0.4245313  -0.4246073  -0.4252903  -0.4282214 
##       84680        2180       80727        1291       64398       63892 
##  -0.4288363  -0.4299384  -0.4306677  -0.4344569  -0.4347492  -0.4440888 
##        6167        5083        9045         571   100379661        4216 
##  -0.4479423  -0.4503748  -0.4508469  -0.4510824  -0.4510824  -0.4541552 
##      166336       81029        6385        5337       22846      117584 
##  -0.4572797  -0.4598492  -0.4608528  -0.4629614  -0.4695873  -0.4703064 
##       57519        7538       55225        7431        6764       26025 
##  -0.4709554  -0.4730102  -0.4737319  -0.4755710  -0.4767309  -0.4786339 
##        5836       64857   107282092      149076       57602       93349 
##  -0.4816001  -0.4826466  -0.4831584  -0.4842677  -0.4842966  -0.4857336 
##        3613        9020      150223       51167   123956252       55565 
##  -0.4877409  -0.4877796  -0.4880227  -0.4885729  -0.4885729  -0.4887595 
##         607        4300       23199        6253        7347        7096 
##  -0.4931814  -0.4946815  -0.4948150  -0.4963422  -0.4967445  -0.4975392 
##       29057      727866        1571       10068       64754       81543 
##  -0.4989520  -0.4989520  -0.4991380  -0.4997920  -0.5010945  -0.5022334 
##       10085        6659      388610      137994       23072      150094 
##  -0.5039589  -0.5117052  -0.5141960  -0.5144091  -0.5152216  -0.5171420 
##       91661       57480      255374       27241        5891   100128071 
##  -0.5181877  -0.5183546  -0.5193914  -0.5196519  -0.5202952  -0.5208846 
##      255057       85460         409         677       57335        6461 
##  -0.5238084  -0.5244166  -0.5286727  -0.5291698  -0.5331403  -0.5335334 
##        6208      199223       55876        7162       64744      408050 
##  -0.5335723  -0.5346588  -0.5351096  -0.5357013  -0.5361426  -0.5370244 
##        4157       85301        6094       55544       23313        <NA> 
##  -0.5379251  -0.5381821  -0.5402476  -0.5407829  -0.5425955  -0.5427844 
##        6550        2275       10412       10867       55341      143903 
##  -0.5428300  -0.5433295  -0.5461003  -0.5461363  -0.5474789  -0.5479225 
##       51752       57715      162962        8045        6297       57162 
##  -0.5484714  -0.5487948  -0.5523355  -0.5546288  -0.5561636  -0.5576140 
##      165215   100134934        2294      414059   101060321       51201 
##  -0.5587000  -0.5602719  -0.5605626  -0.5608515  -0.5608515  -0.5634274 
##        7076        <NA>       84885      255043       84911       65009 
##  -0.5647073  -0.5656096  -0.5669627  -0.5671714  -0.5693491  -0.5699568 
##        2568       91373         217       11094         678        2258 
##  -0.5702220  -0.5712448  -0.5733214  -0.5740458  -0.5745025  -0.5745120 
##       23641        6157        <NA>       79956        8714        3074 
##  -0.5757930  -0.5758064  -0.5818802  -0.5837995  -0.5842546  -0.5879950 
##        <NA>        2281        5075       23286        1757        2295 
##  -0.5895605  -0.5917781  -0.5921918  -0.5969961  -0.5985355  -0.5986802 
##       23048        9911      157489        <NA>        <NA>        7026 
##  -0.6040410  -0.6051289  -0.6065377  -0.6117178  -0.6117508  -0.6131080 
##      152110        3930        9122        9414       51162        <NA> 
##  -0.6152297  -0.6165537  -0.6169785  -0.6222613  -0.6228305  -0.6265258 
##      129642      132001       51805       64288       57664       54756 
##  -0.6285470  -0.6348450  -0.6380398  -0.6383264  -0.6392854  -0.6398230 
##       56925       25976        1956       55344        7089         320 
##  -0.6434787  -0.6442295  -0.6454742  -0.6455858  -0.6485285  -0.6544421 
##        3750        2564       10893        3675      259173        <NA> 
##  -0.6576849  -0.6605465  -0.6622688  -0.6637640  -0.6674709  -0.6682318 
##       79839       84224       84940       27201      222950       84875 
##  -0.6768558  -0.6808796  -0.6815260  -0.6822566  -0.6858331  -0.6864792 
##      342132       51205       55258      114876       79822      151056 
##  -0.6871493  -0.6889862  -0.6932146  -0.6993847  -0.7011928  -0.7012081 
##        1284        <NA>       10769       55008       23732       10052 
##  -0.7045146  -0.7049054  -0.7049419  -0.7081533  -0.7083920  -0.7093149 
##         351       10098   101060684        5074        5364      343450 
##  -0.7108726  -0.7109223  -0.7112168  -0.7113073  -0.7142926  -0.7148856 
##      377677       64131       57228         629       64757       80223 
##  -0.7196404  -0.7197358  -0.7279867  -0.7289004  -0.7309469  -0.7326627 
##        4059        7091        1368   101059938      132014       11010 
##  -0.7347512  -0.7352642  -0.7364573  -0.7421281  -0.7435542  -0.7438959 
##      203111       55897       79929        5027        7169        8425 
##  -0.7454893  -0.7459291  -0.7463883  -0.7470481  -0.7479604  -0.7497580 
##       79781      115572      150726       54751        9258       29108 
##  -0.7507681  -0.7508593  -0.7536397  -0.7538058  -0.7539400  -0.7572443 
##       94240      375790        5129       55068        6273       26002 
##  -0.7595707  -0.7598859  -0.7645238  -0.7658669  -0.7684229  -0.7722235 
##        9311       23220        3107        3655       57648        9200 
##  -0.7741101  -0.7741519  -0.7751546  -0.7795690  -0.7832356  -0.7872211 
##        9466        <NA>        8506       26018        3600        7345 
##  -0.7915449  -0.7974341  -0.7981885  -0.8001967  -0.8036807  -0.8149237 
##      135295        2263      140545      285489        9722       23491 
##  -0.8152172  -0.8166720  -0.8190526  -0.8204901  -0.8226632  -0.8259441 
##        2049      256691       55283        4638       84171      113230 
##  -0.8273959  -0.8297762  -0.8333582  -0.8349821  -0.8367692  -0.8375073 
##      221400        6916       57631       79762        6001       64859 
##  -0.8409754  -0.8416975  -0.8424924  -0.8430811  -0.8446510  -0.8449663 
##       10644       79746       56165        <NA>      256329        5613 
##  -0.8489654  -0.8508493  -0.8523324  -0.8539264  -0.8540792  -0.8580175 
##       79668        5698      140738        7739      388389        6236 
##  -0.8583283  -0.8638904  -0.8674664  -0.8684083  -0.8684182  -0.8703207 
##        2289      160622        3899       57535        1474        6590 
##  -0.8734349  -0.8751728  -0.8777848  -0.8840812  -0.8881777  -0.8940945 
##        <NA>      128864      149465         368         135       25797 
##  -0.9009414  -0.9111883  -0.9161020  -0.9167714  -0.9202674  -0.9297384 
##       50848        6556        9124        9770        2810      154141 
##  -0.9374114  -0.9378618  -0.9380951  -0.9393559  -0.9438212  -0.9480520 
##        2192       55504         321       27124      164284        6439 
##  -0.9507534  -0.9539568  -0.9543057  -0.9620525  -0.9657880  -0.9666545 
##       80031        2670        8436      388591        8970        6195 
##  -0.9725154  -0.9728278  -0.9803336  -0.9841858  -0.9857694  -0.9871263 
##        2535       80820        5732        3142         770   100996928 
##  -0.9915443  -0.9921263  -0.9960696  -0.9971160  -0.9978224  -1.0046214 
##        2171        4688       10409        3113      114822      199964 
##  -1.0111869  -1.0119518  -1.0159218  -1.0204274  -1.0264569  -1.0298488 
##        9023      644145       55228       29765       55084        4440 
##  -1.0346555  -1.0422120  -1.0433134  -1.0525498  -1.0565851  -1.0575021 
##        1139       26157       64798        7100        2840        8490 
##  -1.0654560  -1.0655982  -1.0677168  -1.0682627  -1.0732950  -1.0753208 
##       65266        2353       26470        7482      283869       79083 
##  -1.0811282  -1.0811991  -1.0862396  -1.1027362  -1.1068797  -1.1127827 
##      143686       84734       55816       55534        8910       54762 
##  -1.1128397  -1.1208189  -1.1214000  -1.1322059  -1.1387883  -1.1418708 
##        4660       56944       29970       23089       79841       91523 
##  -1.1469089  -1.1501779  -1.1548660  -1.1560597  -1.1589904  -1.1616372 
##      140766        1117      147968        <NA>      400793       81491 
##  -1.1631572  -1.1631765  -1.1637183  -1.1704617  -1.1724991  -1.1735946 
##       55607       27151         972      167681   100506243       60598 
##  -1.1737998  -1.1742147  -1.1760180  -1.1765517  -1.1783643  -1.1835141 
##        6876      220001       27242        1958      340533       23024 
##  -1.1840662  -1.1878095  -1.1887686  -1.1900248  -1.1926914  -1.1942709 
##        8745        5010       84628        2048         781      112755 
##  -1.1945215  -1.1954414  -1.1955835  -1.1991764  -1.2008191  -1.2017128 
##       56911      150209        2152       57482       23705      171024 
##  -1.2025376  -1.2031131  -1.2097985  -1.2112295  -1.2161722  -1.2169824 
##        9289      375307       10158        <NA>       50650        1942 
##  -1.2171340  -1.2271974  -1.2433882  -1.2492530  -1.2513944  -1.2521139 
##       27074      130574         718       10653        1002       84696 
##  -1.2585327  -1.2602102  -1.2728282  -1.2770902  -1.2832885  -1.2851892 
##       10161      440243       57158       54360        7849        4211 
##  -1.2960110  -1.2961853  -1.2973129  -1.3047578  -1.3123813  -1.3194820 
##        6653        2731        4128        7097        9590       55785 
##  -1.3252787  -1.3257149  -1.3331194  -1.3392733  -1.3475328  -1.3593161 
##        2903       79413      345630        5569        2824       23305 
##  -1.3643829  -1.3830378  -1.3839661  -1.3869809  -1.3907433  -1.3909662 
##        9369       84225       57211       89792        8912        1910 
##  -1.3926348  -1.3933023  -1.4055025  -1.4149461  -1.4220581  -1.4293959 
##       64084        9920        6909        5731         348        5803 
##  -1.4309602  -1.4331810  -1.4366660  -1.4424005  -1.4436143  -1.4489735 
##       80781         635        4674       79605      114786       83882 
##  -1.4634013  -1.4657747  -1.4696795  -1.4714482  -1.4744360  -1.4760361 
##        6926       84733        2898        2151      130733        3752 
##  -1.4771806  -1.4788200  -1.4808663  -1.4976071  -1.5003282  -1.5016096 
##      196410   100131187      170679        3294       10279       79962 
##  -1.5034831  -1.5050026  -1.5092512  -1.5143854  -1.5180124  -1.5212935 
##      253982      115330        4648      283298         646      375704 
##  -1.5223140  -1.5237496  -1.5274672  -1.5305311  -1.5318346  -1.5347204 
##         367        9788        6330        5592       55083        3714 
##  -1.5475461  -1.5574709  -1.5580712  -1.5626103  -1.5685691  -1.5738944 
##        5212        5918        5176      203328       10461      223117 
##  -1.5742638  -1.5763330  -1.5771910  -1.5799390  -1.5879020  -1.5913932 
##       92815        4973        2150        3159      145581          19 
##  -1.5968990  -1.5979721  -1.6104242  -1.6123869  -1.6157769  -1.6191874 
##       26049        3959        3084        <NA>      388336       10659 
##  -1.6241572  -1.6269426  -1.6376219  -1.6394240  -1.6423687  -1.6654927 
##       10396       23026        5961       56656        5140       23043 
##  -1.6785604  -1.6872987  -1.6971759  -1.6988577  -1.7026459  -1.7045258 
##        <NA>       64577       51384      221481        5266        5101 
##  -1.7094393  -1.7121096  -1.7159836  -1.7180093  -1.7404357  -1.7411726 
##        6387        4052        3691        4147       25975        1047 
##  -1.7416923  -1.7424261  -1.7462997  -1.7487118  -1.7584526  -1.7636624 
##        1264        1949       11226        5909        7060        9132 
##  -1.7700925  -1.7809042  -1.7931992  -1.7940938  -1.7956395  -1.7963622 
##        2042        3635   119139905       94274         886       90853 
##  -1.8276462  -1.8386285  -1.8414473  -1.8433413  -1.8508958  -1.8620894 
##       25830        <NA>      116071   100128553       79689        3834 
##  -1.8738003  -1.8888376  -1.8943220  -1.8978661  -1.9010375  -1.9265564 
##         347       10642        3606        <NA>        5646        9760 
##  -1.9278579  -1.9475881  -1.9590393  -1.9591645  -1.9650666  -1.9713504 
##        2700      128876       10218         794        5265        1837 
##  -1.9876948  -1.9898698  -1.9908722  -1.9928530  -2.0032001  -2.0135476 
##        7087       83690        8825       79625       51393        <NA> 
##  -2.0325359  -2.0375503  -2.0375823  -2.0523976  -2.0684546  -2.0819557 
##       92421        1512        1287        6813      375033        <NA> 
##  -2.1042468  -2.1125798  -2.1265334  -2.1339844  -2.1365938  -2.1441719 
##        1674       84525        1833        3169        2525       28984 
##  -2.1463267  -2.1480641  -2.1554385  -2.1575542  -2.1590696  -2.1680413 
##      113220        5919       26050        <NA>       64073        8842 
##  -2.1764345  -2.1910524  -2.1917207  -2.1979738  -2.2432584  -2.2492194 
##        1436        3798        3310        3547      126859        3918 
##  -2.2667776  -2.3112442  -2.3120185  -2.3198448  -2.3374118  -2.3418010 
##        <NA>       11330        4948        6344       80323        9478 
##  -2.3645478  -2.3732704  -2.3842270  -2.3927973  -2.4156637  -2.4222799 
##      128178      140578       10942        5673       10699       25759 
##  -2.4429897  -2.4667953  -2.4677295  -2.4784804  -2.4854507  -2.5007111 
##        <NA>        6289      120224      129080         306      133418 
##  -2.5009711  -2.5050462  -2.5062746  -2.5499681  -2.5534068  -2.5545502 
##      345930        3082         767       10451       84632       79057 
##  -2.5563249  -2.5745619  -2.6320324  -2.6359948  -2.6438864  -2.6555455 
##       11082        4081       10863      143503       23057      375057 
##  -2.6730864  -2.6766496  -2.6997159  -2.7555201  -2.7685686  -2.7856056 
##      440356      283768        7135        6422       91752       57863 
##  -2.7968324  -2.8348109  -2.9001047  -2.9245756  -2.9261231  -2.9333797 
##       26011      255119         761       56704        7139        2250 
##  -3.0023824  -3.0090974  -3.0261698  -3.0409106  -3.0843233  -3.0971122 
##        5678      137814      389058        2244       80144       23671 
##  -3.1293017  -3.1429239  -3.1625731  -3.2573430  -3.2889934  -3.3644526 
##         651        <NA>         639       57530        4685        2915 
##  -3.3765767  -3.3964340  -3.4045671  -3.4325578  -3.4903514  -3.5058369 
##        6708       56154   101059953       57216        1586       28965 
##  -3.5452076  -3.6609747  -3.8401321  -3.8733904  -3.9860838  -4.0993515 
##       79098      221981      161436        <NA>       10178       27445 
##  -4.1897004  -4.2550664  -4.2781674  -4.4237810  -4.4884181  -4.6165129 
##        <NA>        9892        9182       29953        <NA>       27255 
##  -4.6366953  -4.8379248  -4.8463507  -4.8494333  -4.8927810  -5.0131294 
##        <NA>       11197        4586        6696         216        4325 
##  -5.0468310  -5.0873421  -5.1806937  -5.2340398  -5.2875744  -5.6629934 
##        6299      117154       57575        <NA>        <NA>   101060389 
##  -5.9348005  -6.1416888  -6.5342709  -6.6567504  -6.8743527  -8.2479086 
##        <NA>   101060321 
## -21.0840353 -24.5323172
#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.05,
             # 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 GeneRatio  BgRatio
## hsa03010 hsa03010                       Ribosome    46/701 167/8466
## hsa05171 hsa05171 Coronavirus disease - COVID-19    54/701 232/8466
##                pvalue     p.adjust       qvalue
## hsa03010 9.451292e-14 3.090573e-11 3.034362e-11
## hsa05171 1.206337e-12 1.972362e-10 1.936489e-10
##                                                                                                                                                                                                                                                                                 geneID
## hsa03010                                    65003/51073/65005/4736/6135/9045/6138/6139/6141/6142/6146/9349/6147/6152/6154/6155/6157/6158/6159/6156/6161/11224/6165/25873/6166/6167/6169/6128/6130/6132/6133/6205/6208/6210/6218/6222/6223/6187/6230/6232/6233/6235/6188/6201/6202/7311
## hsa05171 718/629/1675/1147/1956/2244/2353/5600/4736/6135/9045/6138/6139/6141/6142/6146/9349/6147/6152/6154/6155/6157/6158/6159/6156/6161/11224/6165/25873/6166/6167/6169/6128/6130/6132/6133/6205/6208/6210/6218/6222/6223/6187/6230/6232/6233/6235/6188/6201/6202/7097/7099/7113/7311
##          Count
## hsa03010    46
## hsa05171    54
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  BgRatio
## hsa03010 hsa03010                       Ribosome    46/701 167/8466
## hsa05171 hsa05171 Coronavirus disease - COVID-19    54/701 232/8466
##                pvalue     p.adjust       qvalue
## hsa03010 9.451292e-14 3.090573e-11 3.034362e-11
## hsa05171 1.206337e-12 1.972362e-10 1.936489e-10
##                                                                                                                                                                                                                                                                                 geneID
## hsa03010                                    65003/51073/65005/4736/6135/9045/6138/6139/6141/6142/6146/9349/6147/6152/6154/6155/6157/6158/6159/6156/6161/11224/6165/25873/6166/6167/6169/6128/6130/6132/6133/6205/6208/6210/6218/6222/6223/6187/6230/6232/6233/6235/6188/6201/6202/7311
## hsa05171 718/629/1675/1147/1956/2244/2353/5600/4736/6135/9045/6138/6139/6141/6142/6146/9349/6147/6152/6154/6155/6157/6158/6159/6156/6161/11224/6165/25873/6166/6167/6169/6128/6130/6132/6133/6205/6208/6210/6218/6222/6223/6187/6230/6232/6233/6235/6188/6201/6202/7097/7099/7113/7311
##          Count
## hsa03010    46
## hsa05171    54
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             all.mapped type    x    y width height
## 5       120892   LRRK2                        gene 1180  963    46     17
## 11        7317    UBA1                        gene  730  185    46     17
## 12        6233  RPS27A              6233,7311 gene  730  215    46     17
## 13        9246  UBE2L6                   9246 gene  825  185    46     17
## 14        6233  RPS27A              6233,7311 gene  825  215    46     17
## 15        5071    PRKN                        gene  996  227    46     17
## 16        5413 SEPTIN5                        gene 1102  354    46     17
## 17        9627  SNCAIP                        gene 1102  385    46     17
## 18        2861   GPR37                   2861 gene 1102  322    46     17
## 19       11315   PARK7                        gene 1086 1303    46     17
## 20       65018   PINK1                        gene  915 1183    46     17
## 21        6622    SNCA                        gene 1185  271    46     17
## 22        7345   UCHL1                   7345 gene  825  439    46     17
## 25       54205    CYCS                        gene 1318 1019    46     17
## 26        4535     ND1         4535,4536,4537 gene  869  990    46     17
## 27        6389    SDHA                        gene  869 1025    46     17
## 28        1537    CYC1                        gene  869 1056    46     17
## 29        1345   COX6C                   1345 gene  869 1089    46     17
## 30         516 ATP5MC1                516,517 gene  869 1121    46     17
## 31       27429   HTRA2                        gene 1172 1009    46     17
## 32         291 SLC25A4                        gene 1236 1073    46     17
## 45        6233  RPS27A              6233,7311 gene  911  395    46     17
## 46        6233  RPS27A              6233,7311 gene  911  423    46     17
## 47        6233  RPS27A              6233,7311 gene  911  450    46     17
## 48        6233  RPS27A              6233,7311 gene  730  393    46     17
## 49        6233  RPS27A              6233,7311 gene  730  423    46     17
## 50        6233  RPS27A              6233,7311 gene  730  453    46     17
## 59        6233  RPS27A              6233,7311 gene 1006  283    46     17
## 60        6233  RPS27A              6233,7311 gene 1006  314    46     17
## 61        6233  RPS27A              6233,7311 gene 1006  344    46     17
## 139       7326  UBE2G1                        gene  825  276    46     17
## 149       7054      TH                        gene 1164  720    46     17
## 150       6531  SLC6A3                        gene  616  749    46     17
## 152        842   CASP9                        gene 1435 1019    46     17
## 153        836   CASP3                        gene 1435  969    46     17
## 155        317   APAF1                        gene 1370 1048    46     17
## 159       6570 SLC18A1                        gene  909  863    46     17
## 160       6531  SLC6A3                        gene  616  952    46     17
## 168        135 ADORA2A                    135 gene  407  648    46     17
## 169       1813    DRD2                        gene  407  743    46     17
## 170       1812    DRD1                        gene  407 1023    46     17
## 171       2774    GNAL                        gene  330  648    46     17
## 172       2770   GNAI1                        gene  330  743    46     17
## 173       2774    GNAL                        gene  330 1023    46     17
## 174        111   ADCY5                        gene  294  693    46     17
## 175        111   ADCY5                        gene  294  982    46     17
## 176       5566  PRKACA                        gene  178  693    46     17
## 177       5566  PRKACA                        gene  178  982    46     17
## 229       6622    SNCA                        gene 1250  720    46     17
## 232       9451 EIF2AK3                   9451 gene 1050  654    46     17
## 233       2081    ERN1                        gene 1050  611    46     17
## 234      22926    ATF6                        gene 1050  567    46     17
## 236       1965  EIF2S1                        gene 1135  654    46     17
## 237        468    ATF4                        gene 1219  654    46     17
## 241       7494    XBP1                        gene 1219  611    46     17
## 243       1649   DDIT3                        gene 1394  567    46     17
## 244       1649   DDIT3                        gene 1394  654    46     17
## 248       3309   HSPA5                        gene  980  611    46     17
## 255       6622    SNCA                        gene  947  571    46     17
## 260       5682   PSMA1                        gene 1292  176    46     17
## 261       5707   PSMD1                   5707 gene 1292  193    46     17
## 267       3708   ITPR1                        gene  878  627    46     17
## 271       5335   PLCG1                        gene  781  683    46     17
## 272       6622    SNCA                        gene  616  608    46     17
## 273       5071    PRKN                        gene  679  683    46     17
## 278        801   CALM1                        gene  740  512    46     17
## 279        815  CAMK2A                        gene  818  512    46     17
## 280       4137    MAPT                   4137 gene  896  512    46     17
## 284       6263    RYR3                        gene  878  599    46     17
## 292       3798   KIF5A  3798,3799,3831,147700 gene  840 1338    46     17
## 295       7277  TUBA4A                        gene  751 1359    46     17
## 296       7280  TUBB2A                        gene  797 1359    46     17
## 300       6622    SNCA                        gene  755 1323    46     17
## 304      65018   PINK1                        gene  762 1006    46     17
## 307       5071    PRKN                        gene 1006 1192    46     17
## 314      65018   PINK1                        gene 1250 1149    46     17
## 315       5071    PRKN                        gene 1330 1129    46     17
## 316        581     BAX                        gene 1250 1104    46     17
## 323       6622    SNCA                        gene  844  950    46     17
## 326      11315   PARK7                        gene 1143 1139    46     17
## 327        598  BCL2L1                        gene 1185 1183    46     17
## 332      10131   TRAP1                  10131 gene 1172 1030    46     17
## 335      65018   PINK1                        gene 1250  984    46     17
## 338       7157    TP53                        gene 1352 1330    46     17
## 343       1616    DAXX                        gene 1156 1406    46     17
## 344       4217  MAP3K5                        gene 1156 1423    46     17
## 345       5599   MAPK8                        gene 1240 1415    46     17
## 347       4780  NFE2L2                        gene 1352 1372    46     17
## 361       1843   DUSP1                        gene 1467 1330    46     17
## 362       7295     TXN                        gene 1467 1372    46     17
## 364       6570 SLC18A1                        gene  951  810    46     17
## 365       6622    SNCA                        gene  998  773    46     17
## 368       5071    PRKN                        gene  798  776    46     17
## 374       4128    MAOA                   4128 gene 1196  782    46     17
## 375       5071    PRKN                        gene 1231  747    46     17
## 382      90550     MCU                        gene  965  966    46     17
## 398       9927    MFN2                        gene 1089 1183    46     17
## 402       6622    SNCA                        gene 1102  290    46     17
## 711       6531  SLC6A3                        gene  616 1422    46     17
## 714       9817   KEAP1                        gene 1239 1372    46     17
## 715       7295     TXN                        gene 1140 1469    46     17
## 724       7922 SLC39A7 7922,25800,29986,55630 gene  616 1026    46     17
## 735       6647    SOD1                        gene  967 1438    46     17
##        mol.data mol.col
## 5            NA #FFFFFF
## 11           NA #FFFFFF
## 12  -0.61266554 #BEBEBE
## 13  -0.28112421 #BEBEBE
## 14  -0.61266554 #BEBEBE
## 15           NA #FFFFFF
## 16           NA #FFFFFF
## 17           NA #FFFFFF
## 18   2.69147157 #BEBEBE
## 19           NA #FFFFFF
## 20           NA #FFFFFF
## 21           NA #FFFFFF
## 22  -0.81492370 #BEBEBE
## 25           NA #FFFFFF
## 26   1.17859013 #BEBEBE
## 27           NA #FFFFFF
## 28           NA #FFFFFF
## 29  -0.27722946 #BEBEBE
## 30   0.02015528 #BEBEBE
## 31           NA #FFFFFF
## 32           NA #FFFFFF
## 45  -0.61266554 #BEBEBE
## 46  -0.61266554 #BEBEBE
## 47  -0.61266554 #BEBEBE
## 48  -0.61266554 #BEBEBE
## 49  -0.61266554 #BEBEBE
## 50  -0.61266554 #BEBEBE
## 59  -0.61266554 #BEBEBE
## 60  -0.61266554 #BEBEBE
## 61  -0.61266554 #BEBEBE
## 139          NA #FFFFFF
## 149          NA #FFFFFF
## 150          NA #FFFFFF
## 152          NA #FFFFFF
## 153          NA #FFFFFF
## 155          NA #FFFFFF
## 159          NA #FFFFFF
## 160          NA #FFFFFF
## 168 -0.92026745 #BEBEBE
## 169          NA #FFFFFF
## 170          NA #FFFFFF
## 171          NA #FFFFFF
## 172          NA #FFFFFF
## 173          NA #FFFFFF
## 174          NA #FFFFFF
## 175          NA #FFFFFF
## 176          NA #FFFFFF
## 177          NA #FFFFFF
## 229          NA #FFFFFF
## 232  0.43259014 #BEBEBE
## 233          NA #FFFFFF
## 234          NA #FFFFFF
## 236          NA #FFFFFF
## 237          NA #FFFFFF
## 241          NA #FFFFFF
## 243          NA #FFFFFF
## 244          NA #FFFFFF
## 248          NA #FFFFFF
## 255          NA #FFFFFF
## 260          NA #FFFFFF
## 261  0.16589600 #BEBEBE
## 267          NA #FFFFFF
## 271          NA #FFFFFF
## 272          NA #FFFFFF
## 273          NA #FFFFFF
## 278          NA #FFFFFF
## 279          NA #FFFFFF
## 280  1.15137339 #BEBEBE
## 284          NA #FFFFFF
## 292 -0.18325142 #BEBEBE
## 295          NA #FFFFFF
## 296          NA #FFFFFF
## 300          NA #FFFFFF
## 304          NA #FFFFFF
## 307          NA #FFFFFF
## 314          NA #FFFFFF
## 315          NA #FFFFFF
## 316          NA #FFFFFF
## 323          NA #FFFFFF
## 326          NA #FFFFFF
## 327          NA #FFFFFF
## 332  0.28790372 #BEBEBE
## 335          NA #FFFFFF
## 338          NA #FFFFFF
## 343          NA #FFFFFF
## 344          NA #FFFFFF
## 345          NA #FFFFFF
## 347          NA #FFFFFF
## 361          NA #FFFFFF
## 362          NA #FFFFFF
## 364          NA #FFFFFF
## 365          NA #FFFFFF
## 368          NA #FFFFFF
## 374 -1.33311942 #BEBEBE
## 375          NA #FFFFFF
## 382          NA #FFFFFF
## 398          NA #FFFFFF
## 402          NA #FFFFFF
## 711          NA #FFFFFF
## 714          NA #FFFFFF
## 715          NA #FFFFFF
## 724  3.28423114 #BEBEBE
## 735          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>=5, asis=T]
#cnetplot(ego, foldChange=geneList)
filtered_pathway <- subset(fgsea_kegg, NES < -1.6)

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_arachidonic = subset(fgsea_kegg, fgsea_kegg$pathway=="KEGG_RIBOSOME")
kegg_arachidonic = unlist(kegg_arachidonic$leadingEdge)


subset <- rld[kegg_arachidonic, c(7,8,9,1,2,3)]

# 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("Disease_control", 3)))
rownames(ann) <- rownames(mat)
col <- c( "blue","forestgreen")
names(col) <- c("Healthy_control","Disease_control")
ann_col <- list(Condition = col)



ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "KEGG_RIBOSOME",
                        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,919 × 2
##    hgnc_symbol log2foldchange
##    <chr>                <dbl>
##  1 ""                -0.0997 
##  2 "A1BG"            -1.10   
##  3 "A1CF"            -0.138  
##  4 "A2M"              0.674  
##  5 "A2ML1"           -0.117  
##  6 "A2MP1"            0.0961 
##  7 "A4GALT"           1.13   
##  8 "A4GNT"           -0.345  
##  9 "AAAS"            -0.0621 
## 10 "AACS"            -0.00364
## # ℹ 16,909 more rows
rank <- deframe(fgsea_rank)
head(rank, 20)
##                      A1BG         A1CF          A2M        A2ML1        A2MP1 
## -0.099679061 -1.096013181 -0.137855094  0.674271064 -0.116994530  0.096099397 
##       A4GALT        A4GNT         AAAS         AACS        AADAT        AAGAB 
##  1.133173678 -0.345157934 -0.062076145 -0.003639835  0.184081423 -0.083064101 
##         AAK1        AAMDC         AAMP        AANAT         AAR2         AARD 
##  0.055429938 -0.027513550 -0.002959917  0.455566321  0.008203131 -0.695340781 
##        AARS1        AARS2 
## -0.060877285  0.031117509
# 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-1474244 R-HSA-1474244
## R-HSA-2022090 R-HSA-2022090
##                                                                Description
## R-HSA-1474244                            Extracellular matrix organization
## R-HSA-2022090 Assembly of collagen fibrils and other multimeric structures
##               GeneRatio   BgRatio       pvalue     p.adjust       qvalue
## R-HSA-1474244    15/109 300/10891 2.771788e-07 0.0001929164 0.0001782697
## R-HSA-2022090     6/109  61/10891 3.107604e-05 0.0108144628 0.0099934011
##                                                                                  geneID
## R-HSA-1474244 176/351/1303/1281/1287/1295/1311/2202/3693/3918/84171/4052/4053/4325/6696
## R-HSA-2022090                                            1303/1281/1287/1295/3918/84171
##               Count
## R-HSA-1474244    15
## R-HSA-2022090     6
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-1474244 R-HSA-1474244
## R-HSA-2022090 R-HSA-2022090
##                                                                Description
## R-HSA-1474244                            Extracellular matrix organization
## R-HSA-2022090 Assembly of collagen fibrils and other multimeric structures
##               GeneRatio   BgRatio       pvalue     p.adjust       qvalue
## R-HSA-1474244    15/109 300/10891 2.771788e-07 0.0001929164 0.0001782697
## R-HSA-2022090     6/109  61/10891 3.107604e-05 0.0108144628 0.0099934011
##                                                                                  geneID
## R-HSA-1474244 176/351/1303/1281/1287/1295/1311/2202/3693/3918/84171/4052/4053/4325/6696
## R-HSA-2022090                                            1303/1281/1287/1295/3918/84171
##               Count
## R-HSA-1474244    15
## R-HSA-2022090     6
#Reactome gene set enrichment test
#ego_reactome<-gsePathway(geneList = gene_list,
                         #organism = 'human',
                         #pvalueCutoff = 0.05,
                         #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)

Enrichment plot

filtered_pathway <- subset(fgsea_reactome, NES < -1.8)

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_CD28 = subset(fgsea_reactome, fgsea_reactome$pathway=="REACTOME_ASSEMBLY_OF_COLLAGEN_FIBRILS_AND_OTHER_MULTIMERIC_STRUCTURES")
reactome_CD28 = unlist(reactome_CD28$leadingEdge)


subset <- rld[reactome_CD28, c(7,8,9,1,2,3)]

# 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("Disease_control", 3)))
rownames(ann) <- rownames(mat)
col <- c( "blue","forestgreen")
names(col) <- c("Healthy_control","Disease_control")
ann_col <- list(Condition = col)



ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "REACTOME_ASSEMBLY_OF_COLLAGEN_FIBRILS_AND_OTHER_MULTIMERIC_STRUCTURES",
                        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_platelet = subset(fgsea_reactome, fgsea_reactome$pathway=="REACTOME_SARS_COV_1_MODULATES_HOST_TRANSLATION_MACHINERY")
reactome_platelet = unlist(reactome_platelet$leadingEdge)


subset <- rld[reactome_platelet, c(7,8,9,1,2,3)]

# 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("Disease_control", 3)))
rownames(ann) <- rownames(mat)
col <- c( "blue","forestgreen")
names(col) <- c("Healthy_control","Disease_control")
ann_col <- list(Condition = col)



ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "REACTOME_SARS_COV_1_MODULATES_HOST_TRANSLATION_MACHINERY",
                        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_ECM = subset(fgsea_reactome, fgsea_reactome$pathway=="REACTOME_EXTRACELLULAR_MATRIX_ORGANIZATION")
reactome_ECM = unlist(reactome_ECM$leadingEdge)


subset <- rld[reactome_ECM, c(7,8,9,1,2,3)]

# 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("Disease_control", 3)))
rownames(ann) <- rownames(mat)
col <- c( "blue","forestgreen")
names(col) <- c("Healthy_control","Disease_control")
ann_col <- list(Condition = col)



ComplexHeatmap::pheatmap(t(mat),
                        show_rownames = T,
                        annotation_col = ann,
                        annotation_colors = ann_col,
                        main = "REACTOME_EXTRACELLULAR_MATRIX_ORGANIZATION",
                        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))