changeset 7:2e7245bd643d draft default tip

"planemo upload commit 373a85c4179ac6b5cfc77013eab020badb8c8370-dirty"
author proteore
date Tue, 04 Feb 2020 05:16:19 -0500
parents f53249651add
children
files GO_terms_enrich_comparison.R GO_terms_enrich_comparison.xml test-data/GO_enrich_comparison_BP.png test-data/GO_enrich_comparison_BP.tsv test-data/Gene_ID_BreastDn.txt test-data/Gene_ID_BreastUp.txt
diffstat 5 files changed, 2671 insertions(+), 2671 deletions(-) [+]
line wrap: on
line diff
--- a/GO_terms_enrich_comparison.R	Thu Jan 23 03:16:11 2020 -0500
+++ b/GO_terms_enrich_comparison.R	Tue Feb 04 05:16:19 2020 -0500
@@ -1,327 +1,327 @@
-options(warn=-1)  #TURN OFF WARNINGS !!!!!!
-suppressMessages(library(clusterProfiler,quietly = TRUE))
-suppressMessages(library(plyr, quietly = TRUE))
-suppressMessages(library(ggplot2, quietly = TRUE))
-suppressMessages(library(DOSE, quietly = TRUE))
-
-#return the number of character from the longest description found (from the 10 first)
-max_str_length_10_first <- function(vector){
-  vector <- as.vector(vector)
-  nb_description = length(vector)
-  if (nb_description >= 10){nb_description=10}
-  return(max(nchar(vector[1:nb_description])))
-}
-
-str2bool <- function(x){
-  if (any(is.element(c("t","true"),tolower(x)))){
-    return (TRUE)
-  }else if (any(is.element(c("f","false"),tolower(x)))){
-    return (FALSE)
-  }else{
-    return(NULL)
-  }
-}
-
-get_args <- function(){
-  
-  ## Collect arguments
-  args <- commandArgs(TRUE)
-  #value = character vector of length=nb of arguments
-  
-  ## Default setting when no arguments passed
-  if(length(args) < 1) {
-    args <- c("--help")
-  }
-  
-  ## Help section
-  if("--help" %in% args) {
-    cat("Selection and Annotation HPA
-      Arguments:
-      --inputtype1: type of input (list of id or filename)
-      --inputtype2: type of input (list of id or filename)
-      --inputtype3: type of input (list of id or filename)
-      --input1: input1
-      --input2: input2
-      --input3: input3
-      --column1: the column number which you would like to apply...
-      --column2: the column number which you would like to apply...
-      --column3: the column number which you would like to apply...
-      --header1: true/false if your file contains a header
-      --header2: true/false if your file contains a header
-      --header3: true/false if your file contains a header
-      --ont: ontology to use
-      --org: organism db package
-      --list_name1: name of the first list
-      --list_name2: name of the second list
-      --list_name3: name of the third list \n")
-        
-    q(save="no")
-  }
-  
-  parseArgs <- function(x) strsplit(sub("^--", "", x), "=")
-  argsDF <- as.data.frame(do.call("rbind", parseArgs(args)))
-  args <- as.list(as.character(argsDF$V2))
-  names(args) <- argsDF$V1
-  
-  return(args)
-}
-
-get_ids=function(input, inputtype, header , ncol) {
-
-    if (inputtype == "text") {
-      ids = strsplit(input, "[ \t\n]+")[[1]]
-    } else if (inputtype == "file") {
-      header=str2bool(header)
-      ncol=get_cols(ncol)
-      csv = read.csv(input,header=header, sep="\t", as.is=T)
-      ids=csv[,ncol]
-    }
-
-    ids = unlist(strsplit(as.character(ids),";"))
-    ids = ids[which(!is.na(ids))]
-
-    return(ids)
-}
-
-str2bool <- function(x){
-  if (any(is.element(c("t","true"),tolower(x)))){
-    return (TRUE)
-  }else if (any(is.element(c("f","false"),tolower(x)))){
-    return (FALSE)
-  }else{
-    return(NULL)
-  }
-}
-
-check_ids <- function(vector,type) {
-  uniprot_pattern = "^([OPQ][0-9][A-Z0-9]{3}[0-9]|[A-NR-Z][0-9]([A-Z][A-Z0-9]{2}[0-9]){1,2})$"
-  entrez_id = "^([0-9]+|[A-Z]{1,2}_[0-9]+|[A-Z]{1,2}_[A-Z]{1,4}[0-9]+)$"
-  if (type == "entrez")
-    return(grepl(entrez_id,vector))
-  else if (type == "uniprot") {
-    return(grepl(uniprot_pattern,vector))
-  }
-}
-
-#res.cmp@compareClusterResult$Description <- sapply(as.vector(res.cmp@compareClusterResult$Description), function(x) {ifelse(nchar(x)>50, substr(x,1,50),x)},USE.NAMES = FALSE)
-fortify.compareClusterResult <- function(res.cmp, showCategory=30, by="geneRatio", split=NULL, includeAll=TRUE) {
-  clProf.df <- as.data.frame(res.cmp)
-  .split <- split
-  ## get top 5 (default) categories of each gene cluster.
-  if (is.null(showCategory)) {
-    result <- clProf.df
-  } else {
-    Cluster <- NULL # to satisfy codetools
-    topN <- function(res, showCategory) {
-      ddply(.data = res, .variables = .(Cluster), .fun = function(df, N) {
-              if (length(df$Count) > N) {
-                if (any(colnames(df) == "pvalue")) {
-                  idx <- order(df$pvalue, decreasing=FALSE)[1:N]
-                } else {
-                  ## for groupGO
-                  idx <- order(df$Count, decreasing=T)[1:N]
-                }
-                return(df[idx,])
-              } else {
-                return(df)
-              }
-            },
-            N=showCategory
-      )
-    }
-    if (!is.null(.split) && .split %in% colnames(clProf.df)) {
-      lres <- split(clProf.df, as.character(clProf.df[, .split]))
-      lres <- lapply(lres, topN, showCategory = showCategory)
-      result <- do.call('rbind', lres)
-    } else {
-      result <- topN(clProf.df, showCategory)
-    }    
-  }
-  ID <- NULL
-  if (includeAll == TRUE) {
-    result = subset(clProf.df, ID %in% result$ID)
-  }
-  ## remove zero count
-  result$Description <- as.character(result$Description) ## un-factor
-  GOlevel <- result[,c("ID", "Description")] ## GO ID and Term
-  #GOlevel <- unique(GOlevel)
-  result <- result[result$Count != 0, ]
-  #bug 19.11.2019
-  #result$Description <- factor(result$Description,levels=rev(GOlevel[,2]))
-  if (by=="rowPercentage") {
-    Description <- Count <- NULL # to satisfy codetools
-    result <- ddply(result,.(Description),transform,Percentage = Count/sum(Count),Total = sum(Count))
-    ## label GO Description with gene counts.
-    x <- mdply(result[, c("Description", "Total")], paste, sep=" (")
-    y <- sapply(x[,3], paste, ")", sep="")
-    result$Description <- y
-    
-    ## restore the original order of GO Description
-    xx <- result[,c(2,3)]
-    xx <- unique(xx)
-    rownames(xx) <- xx[,1]
-    Termlevel <- xx[as.character(GOlevel[,1]),2]
-    
-    ##drop the *Total* column
-    result <- result[, colnames(result) != "Total"]
-    result$Description <- factor(result$Description, levels=rev(Termlevel))
-    
-  } else if (by == "count") {
-    ## nothing
-  } else if (by == "geneRatio") { ##default
-    gsize <- as.numeric(sub("/\\d+$", "", as.character(result$GeneRatio)))
-    gcsize <- as.numeric(sub("^\\d+/", "", as.character(result$GeneRatio)))
-    result$GeneRatio = gsize/gcsize
-    cluster <- paste(as.character(result$Cluster),"\n", "(", gcsize, ")", sep="")
-    lv <- unique(cluster)[order(as.numeric(unique(result$Cluster)))]
-    result$Cluster <- factor(cluster, levels = lv)
-  } else {
-    ## nothing
-  }
-  return(result)
-}
-
-##function plotting.clusteProfile from clusterProfiler pkg
-plotting.clusterProfile <- function(clProf.reshape.df,x = ~Cluster,type = "dot", colorBy = "p.adjust",by = "geneRatio",title="",font.size=12) {
-  
-  Description <- Percentage <- Count <- Cluster <- GeneRatio <- p.adjust <- pvalue <- NULL # to
-  if (type == "dot") {
-    if (by == "rowPercentage") {
-      p <- ggplot(clProf.reshape.df,
-                  aes_(x = x, y = ~Description, size = ~Percentage))
-    } else if (by == "count") {
-      p <- ggplot(clProf.reshape.df,
-                  aes_(x = x, y = ~Description, size = ~Count))
-    } else if (by == "geneRatio") { ##DEFAULT
-      p <- ggplot(clProf.reshape.df,
-                  aes_(x = x, y = ~Description, size = ~GeneRatio))
-    } else {
-      ## nothing here
-    }
-    if (any(colnames(clProf.reshape.df) == colorBy)) {
-      p <- p +
-        geom_point() +
-        aes_string(color=colorBy) +
-        scale_color_continuous(low="red", high="blue", guide=guide_colorbar(reverse=TRUE))
-      ## scale_color_gradientn(guide=guide_colorbar(reverse=TRUE), colors = enrichplot:::sig_palette)
-    } else {
-      p <- p + geom_point(colour="steelblue")
-    }
-  }
-  
-  p <- p + xlab("") + ylab("") + ggtitle(title) +
-    theme_dose(font.size)
-  
-  ## theme(axis.text.x = element_text(colour="black", size=font.size, vjust = 1)) +
-  ##     theme(axis.text.y = element_text(colour="black",
-  ##           size=font.size, hjust = 1)) +
-  ##               ggtitle(title)+theme_bw()
-  ## p <- p + theme(axis.text.x = element_text(angle=angle.axis.x,
-  ##                    hjust=hjust.axis.x,
-  ##                    vjust=vjust.axis.x))
-  
-  return(p)
-}
-
-make_dotplot<-function(res.cmp,ontology) {
-
-  dfok<-fortify.compareClusterResult(res.cmp)
-  dfok$Description <- sapply(as.vector(dfok$Description), function(x) {ifelse(nchar(x)>50, substr(x,1,50),x)},USE.NAMES = FALSE)
-  p<-plotting.clusterProfile(dfok, title="")
-
-  #plot(p, type="dot") #
-  output_path= paste("GO_enrich_comp_",ontology,".png",sep="")
-  png(output_path,height = 720, width = 600)
-  pl <- plot(p, type="dot")
-  print(pl)
-  dev.off()
-}
-
-get_cols <-function(input_cols) {
-  input_cols <- gsub("c","",gsub("C","",gsub(" ","",input_cols)))
-  if (grepl(":",input_cols)) {
-    first_col=unlist(strsplit(input_cols,":"))[1]
-    last_col=unlist(strsplit(input_cols,":"))[2]
-    cols=first_col:last_col
-  } else {
-    cols = as.integer(unlist(strsplit(input_cols,",")))
-  }
-  return(cols)
-}
-
-#to check
-cmp.GO <- function(l,fun="enrichGO",orgdb, ontology, readable=TRUE) {
-  cmpGO<-compareCluster(geneClusters = l,
-                        fun=fun, 
-                        OrgDb = orgdb, 
-                        ont=ontology, 
-                        readable=TRUE)
-  
-  return(cmpGO)
-}
-
-check_ids <- function(vector,type) {
-  uniprot_pattern = "^([OPQ][0-9][A-Z0-9]{3}[0-9]|[A-NR-Z][0-9]([A-Z][A-Z0-9]{2}[0-9]){1,2})$"
-  entrez_id = "^([0-9]+|[A-Z]{1,2}_[0-9]+|[A-Z]{1,2}_[A-Z]{1,4}[0-9]+)$"
-  if (type == "entrez")
-    return(grepl(entrez_id,vector))
-  else if (type == "uniprot") {
-    return(grepl(uniprot_pattern,vector))
-  }
-}
-
-main = function() {
-  
-  #to get the args of the command line
-  args=get_args()  
-
-  #saved
-  #l<-list()
-  #for(j in 1:args$nb){
-  #  i<-j-1
-  #  ids<-get_ids(args$input.i, args$inputtype.i, args$header.i, args$column.i) 
-  #  l[[args$name.i]]<-ids
-
-  #}
-  #saved
-
-
-  l<-list()
-  for(j in 1:args$nb){
-  i<-j-1
-  ids<-get_ids( args[[paste("input",i,sep=".")]], 
-                args[[paste("inputtype",i,sep=".")]], 
-                args[[paste("header",i,sep=".")]], 
-                args[[paste("column",i,sep=".")]] ) 
-
-  l[[args[[paste("name",i,sep=".")]]]]<-ids
-  
-}
-
-  ont = strsplit(args$ont, ",")[[1]] 
-  org=args$org
-  
-  #load annot package 
-  suppressMessages(library(args$org, character.only = TRUE, quietly = TRUE))
-  
-  # Extract OrgDb
-  if (args$org=="org.Hs.eg.db") {
-    orgdb<-org.Hs.eg.db
-  } else if (args$org=="org.Mm.eg.db") {
-    orgdb<-org.Mm.eg.db
-  } else if (args$org=="org.Rn.eg.db") {
-    orgdb<-org.Rn.eg.db
-  }
-
-  for(ontology in ont) {
-    
-    res.cmp<-cmp.GO(l=l,fun="enrichGO",orgdb, ontology, readable=TRUE)
-    make_dotplot(res.cmp,ontology)  
-    output_path = paste("GO_enrich_comp_",ontology,".tsv",sep="")
-    write.table(res.cmp@compareClusterResult, output_path, sep="\t", row.names=F, quote=F)
-  }
-  
-} #end main 
-
-main()
-
+options(warn=-1)  #TURN OFF WARNINGS !!!!!!
+suppressMessages(library(clusterProfiler,quietly = TRUE))
+suppressMessages(library(plyr, quietly = TRUE))
+suppressMessages(library(ggplot2, quietly = TRUE))
+suppressMessages(library(DOSE, quietly = TRUE))
+
+#return the number of character from the longest description found (from the 10 first)
+max_str_length_10_first <- function(vector){
+  vector <- as.vector(vector)
+  nb_description = length(vector)
+  if (nb_description >= 10){nb_description=10}
+  return(max(nchar(vector[1:nb_description])))
+}
+
+str2bool <- function(x){
+  if (any(is.element(c("t","true"),tolower(x)))){
+    return (TRUE)
+  }else if (any(is.element(c("f","false"),tolower(x)))){
+    return (FALSE)
+  }else{
+    return(NULL)
+  }
+}
+
+get_args <- function(){
+  
+  ## Collect arguments
+  args <- commandArgs(TRUE)
+  #value = character vector of length=nb of arguments
+  
+  ## Default setting when no arguments passed
+  if(length(args) < 1) {
+    args <- c("--help")
+  }
+  
+  ## Help section
+  if("--help" %in% args) {
+    cat("Selection and Annotation HPA
+      Arguments:
+      --inputtype1: type of input (list of id or filename)
+      --inputtype2: type of input (list of id or filename)
+      --inputtype3: type of input (list of id or filename)
+      --input1: input1
+      --input2: input2
+      --input3: input3
+      --column1: the column number which you would like to apply...
+      --column2: the column number which you would like to apply...
+      --column3: the column number which you would like to apply...
+      --header1: true/false if your file contains a header
+      --header2: true/false if your file contains a header
+      --header3: true/false if your file contains a header
+      --ont: ontology to use
+      --org: organism db package
+      --list_name1: name of the first list
+      --list_name2: name of the second list
+      --list_name3: name of the third list \n")
+        
+    q(save="no")
+  }
+  
+  parseArgs <- function(x) strsplit(sub("^--", "", x), "=")
+  argsDF <- as.data.frame(do.call("rbind", parseArgs(args)))
+  args <- as.list(as.character(argsDF$V2))
+  names(args) <- argsDF$V1
+  
+  return(args)
+}
+
+get_ids=function(input, inputtype, header , ncol) {
+
+    if (inputtype == "text") {
+      ids = strsplit(input, "[ \t\n]+")[[1]]
+    } else if (inputtype == "file") {
+      header=str2bool(header)
+      ncol=get_cols(ncol)
+      csv = read.csv(input,header=header, sep="\t", as.is=T)
+      ids=csv[,ncol]
+    }
+
+    ids = unlist(strsplit(as.character(ids),";"))
+    ids = ids[which(!is.na(ids))]
+
+    return(ids)
+}
+
+str2bool <- function(x){
+  if (any(is.element(c("t","true"),tolower(x)))){
+    return (TRUE)
+  }else if (any(is.element(c("f","false"),tolower(x)))){
+    return (FALSE)
+  }else{
+    return(NULL)
+  }
+}
+
+check_ids <- function(vector,type) {
+  uniprot_pattern = "^([OPQ][0-9][A-Z0-9]{3}[0-9]|[A-NR-Z][0-9]([A-Z][A-Z0-9]{2}[0-9]){1,2})$"
+  entrez_id = "^([0-9]+|[A-Z]{1,2}_[0-9]+|[A-Z]{1,2}_[A-Z]{1,4}[0-9]+)$"
+  if (type == "entrez")
+    return(grepl(entrez_id,vector))
+  else if (type == "uniprot") {
+    return(grepl(uniprot_pattern,vector))
+  }
+}
+
+#res.cmp@compareClusterResult$Description <- sapply(as.vector(res.cmp@compareClusterResult$Description), function(x) {ifelse(nchar(x)>50, substr(x,1,50),x)},USE.NAMES = FALSE)
+fortify.compareClusterResult <- function(res.cmp, showCategory=30, by="geneRatio", split=NULL, includeAll=TRUE) {
+  clProf.df <- as.data.frame(res.cmp)
+  .split <- split
+  ## get top 5 (default) categories of each gene cluster.
+  if (is.null(showCategory)) {
+    result <- clProf.df
+  } else {
+    Cluster <- NULL # to satisfy codetools
+    topN <- function(res, showCategory) {
+      ddply(.data = res, .variables = .(Cluster), .fun = function(df, N) {
+              if (length(df$Count) > N) {
+                if (any(colnames(df) == "pvalue")) {
+                  idx <- order(df$pvalue, decreasing=FALSE)[1:N]
+                } else {
+                  ## for groupGO
+                  idx <- order(df$Count, decreasing=T)[1:N]
+                }
+                return(df[idx,])
+              } else {
+                return(df)
+              }
+            },
+            N=showCategory
+      )
+    }
+    if (!is.null(.split) && .split %in% colnames(clProf.df)) {
+      lres <- split(clProf.df, as.character(clProf.df[, .split]))
+      lres <- lapply(lres, topN, showCategory = showCategory)
+      result <- do.call('rbind', lres)
+    } else {
+      result <- topN(clProf.df, showCategory)
+    }    
+  }
+  ID <- NULL
+  if (includeAll == TRUE) {
+    result = subset(clProf.df, ID %in% result$ID)
+  }
+  ## remove zero count
+  result$Description <- as.character(result$Description) ## un-factor
+  GOlevel <- result[,c("ID", "Description")] ## GO ID and Term
+  #GOlevel <- unique(GOlevel)
+  result <- result[result$Count != 0, ]
+  #bug 19.11.2019
+  #result$Description <- factor(result$Description,levels=rev(GOlevel[,2]))
+  if (by=="rowPercentage") {
+    Description <- Count <- NULL # to satisfy codetools
+    result <- ddply(result,.(Description),transform,Percentage = Count/sum(Count),Total = sum(Count))
+    ## label GO Description with gene counts.
+    x <- mdply(result[, c("Description", "Total")], paste, sep=" (")
+    y <- sapply(x[,3], paste, ")", sep="")
+    result$Description <- y
+    
+    ## restore the original order of GO Description
+    xx <- result[,c(2,3)]
+    xx <- unique(xx)
+    rownames(xx) <- xx[,1]
+    Termlevel <- xx[as.character(GOlevel[,1]),2]
+    
+    ##drop the *Total* column
+    result <- result[, colnames(result) != "Total"]
+    result$Description <- factor(result$Description, levels=rev(Termlevel))
+    
+  } else if (by == "count") {
+    ## nothing
+  } else if (by == "geneRatio") { ##default
+    gsize <- as.numeric(sub("/\\d+$", "", as.character(result$GeneRatio)))
+    gcsize <- as.numeric(sub("^\\d+/", "", as.character(result$GeneRatio)))
+    result$GeneRatio = gsize/gcsize
+    cluster <- paste(as.character(result$Cluster),"\n", "(", gcsize, ")", sep="")
+    lv <- unique(cluster)[order(as.numeric(unique(result$Cluster)))]
+    result$Cluster <- factor(cluster, levels = lv)
+  } else {
+    ## nothing
+  }
+  return(result)
+}
+
+##function plotting.clusteProfile from clusterProfiler pkg
+plotting.clusterProfile <- function(clProf.reshape.df,x = ~Cluster,type = "dot", colorBy = "p.adjust",by = "geneRatio",title="",font.size=12) {
+  
+  Description <- Percentage <- Count <- Cluster <- GeneRatio <- p.adjust <- pvalue <- NULL # to
+  if (type == "dot") {
+    if (by == "rowPercentage") {
+      p <- ggplot(clProf.reshape.df,
+                  aes_(x = x, y = ~Description, size = ~Percentage))
+    } else if (by == "count") {
+      p <- ggplot(clProf.reshape.df,
+                  aes_(x = x, y = ~Description, size = ~Count))
+    } else if (by == "geneRatio") { ##DEFAULT
+      p <- ggplot(clProf.reshape.df,
+                  aes_(x = x, y = ~Description, size = ~GeneRatio))
+    } else {
+      ## nothing here
+    }
+    if (any(colnames(clProf.reshape.df) == colorBy)) {
+      p <- p +
+        geom_point() +
+        aes_string(color=colorBy) +
+        scale_color_continuous(low="red", high="blue", guide=guide_colorbar(reverse=TRUE))
+      ## scale_color_gradientn(guide=guide_colorbar(reverse=TRUE), colors = enrichplot:::sig_palette)
+    } else {
+      p <- p + geom_point(colour="steelblue")
+    }
+  }
+  
+  p <- p + xlab("") + ylab("") + ggtitle(title) +
+    theme_dose(font.size)
+  
+  ## theme(axis.text.x = element_text(colour="black", size=font.size, vjust = 1)) +
+  ##     theme(axis.text.y = element_text(colour="black",
+  ##           size=font.size, hjust = 1)) +
+  ##               ggtitle(title)+theme_bw()
+  ## p <- p + theme(axis.text.x = element_text(angle=angle.axis.x,
+  ##                    hjust=hjust.axis.x,
+  ##                    vjust=vjust.axis.x))
+  
+  return(p)
+}
+
+make_dotplot<-function(res.cmp,ontology) {
+
+  dfok<-fortify.compareClusterResult(res.cmp)
+  dfok$Description <- sapply(as.vector(dfok$Description), function(x) {ifelse(nchar(x)>50, substr(x,1,50),x)},USE.NAMES = FALSE)
+  p<-plotting.clusterProfile(dfok, title="")
+
+  #plot(p, type="dot") #
+  output_path= paste("GO_enrich_comp_",ontology,".png",sep="")
+  png(output_path,height = 720, width = 600)
+  pl <- plot(p, type="dot")
+  print(pl)
+  dev.off()
+}
+
+get_cols <-function(input_cols) {
+  input_cols <- gsub("c","",gsub("C","",gsub(" ","",input_cols)))
+  if (grepl(":",input_cols)) {
+    first_col=unlist(strsplit(input_cols,":"))[1]
+    last_col=unlist(strsplit(input_cols,":"))[2]
+    cols=first_col:last_col
+  } else {
+    cols = as.integer(unlist(strsplit(input_cols,",")))
+  }
+  return(cols)
+}
+
+#to check
+cmp.GO <- function(l,fun="enrichGO",orgdb, ontology, readable=TRUE) {
+  cmpGO<-compareCluster(geneClusters = l,
+                        fun=fun, 
+                        OrgDb = orgdb, 
+                        ont=ontology, 
+                        readable=TRUE)
+  
+  return(cmpGO)
+}
+
+check_ids <- function(vector,type) {
+  uniprot_pattern = "^([OPQ][0-9][A-Z0-9]{3}[0-9]|[A-NR-Z][0-9]([A-Z][A-Z0-9]{2}[0-9]){1,2})$"
+  entrez_id = "^([0-9]+|[A-Z]{1,2}_[0-9]+|[A-Z]{1,2}_[A-Z]{1,4}[0-9]+)$"
+  if (type == "entrez")
+    return(grepl(entrez_id,vector))
+  else if (type == "uniprot") {
+    return(grepl(uniprot_pattern,vector))
+  }
+}
+
+main = function() {
+  
+  #to get the args of the command line
+  args=get_args()  
+
+  #saved
+  #l<-list()
+  #for(j in 1:args$nb){
+  #  i<-j-1
+  #  ids<-get_ids(args$input.i, args$inputtype.i, args$header.i, args$column.i) 
+  #  l[[args$name.i]]<-ids
+
+  #}
+  #saved
+
+
+  l<-list()
+  for(j in 1:args$nb){
+  i<-j-1
+  ids<-get_ids( args[[paste("input",i,sep=".")]], 
+                args[[paste("inputtype",i,sep=".")]], 
+                args[[paste("header",i,sep=".")]], 
+                args[[paste("column",i,sep=".")]] ) 
+
+  l[[args[[paste("name",i,sep=".")]]]]<-ids
+  
+}
+
+  ont = strsplit(args$ont, ",")[[1]] 
+  org=args$org
+  
+  #load annot package 
+  suppressMessages(library(args$org, character.only = TRUE, quietly = TRUE))
+  
+  # Extract OrgDb
+  if (args$org=="org.Hs.eg.db") {
+    orgdb<-org.Hs.eg.db
+  } else if (args$org=="org.Mm.eg.db") {
+    orgdb<-org.Mm.eg.db
+  } else if (args$org=="org.Rn.eg.db") {
+    orgdb<-org.Rn.eg.db
+  }
+
+  for(ontology in ont) {
+    
+    res.cmp<-cmp.GO(l=l,fun="enrichGO",orgdb, ontology, readable=TRUE)
+    make_dotplot(res.cmp,ontology)  
+    output_path = paste("GO_enrich_comp_",ontology,".tsv",sep="")
+    write.table(res.cmp@compareClusterResult, output_path, sep="\t", row.names=F, quote=F)
+  }
+  
+} #end main 
+
+main()
+
--- a/GO_terms_enrich_comparison.xml	Thu Jan 23 03:16:11 2020 -0500
+++ b/GO_terms_enrich_comparison.xml	Tue Feb 04 05:16:19 2020 -0500
@@ -1,201 +1,201 @@
-<tool id="go_terms_enrich_comparison" name="GO terms enrich comparison " version="2020.01.23">
-    <description>(Human, Mouse, Rat)[clusterProfiler]</description>
-    <requirements>
-        <requirement type="package">R</requirement>
-        <requirement type="package" version="3.8.2">bioconductor-org.hs.eg.db</requirement>
-        <requirement type="package" version="3.8.2">bioconductor-org.mm.eg.db</requirement>
-        <requirement type="package" version="3.8.2">bioconductor-org.rn.eg.db</requirement>
-        <requirement type="package" version="3.10.2">bioconductor-dose</requirement>
-        <requirement type="package" version="3.12.0">bioconductor-clusterprofiler</requirement>
-    </requirements>
-    <command detect_errors="exit_code"><![CDATA[
-
-
-       Rscript $__tool_directory__/GO_terms_enrich_comparison.R
-
-        --nb=$len($lists)
-
-        #for $index, $list in enumerate($lists)
-        		    
-            #if $list.input.ids == "file"
-		        --input.$index="$list.input.file" --name.$index="$list.list_name" --inputtype.$index="file" --header.$index="$list.input.header" --column.$index="$list.input.ncol" 
-            #else
-                --input.$index="$list.input.txt" --name.$index="$list.list_name" --inputtype.$index="text"  
- 		    #end if
-            
-        #end for
-
-        --org="$species"
-        --ont="$ontology"
-       
-
-            > $log
-
-
-    ]]></command>
-    <inputs>
-
-        <repeat name="lists" title="List to compare" min="2" max="5" >
-
-            <conditional name="input" >
-                <param name="ids" type="select" label="Enter your ID list (Entrez gene ID, e.g. 2810)" help="Copy/paste or from a file (e.g. table)" >
-                    <option value="text">Copy/paste your IDs</option>
-                    <option value="file" selected="true">Input file containing your list of IDs</option>
-                </param>
-                <when value="text" >
-                    <param name="txt" type="text" label="Copy/paste your identifiers" help='IDs must be separated by spaces into the form field, for example: 2810 7534' >
-                        <sanitizer>
-                            <valid initial="string.printable">
-                                <remove value="&apos;"/>
-                            </valid>
-                            <mapping initial="none">
-                                <add source="&apos;" target="__sq__"/>
-                            </mapping>
-                        </sanitizer>
-                    </param>
-                </when>
-                <when value="file" >
-                    <param name="file" type="data" format="txt,tabular" label="Choose a file that contains your list of IDs" help="" />
-                    <param name="header" type="boolean" checked="true" truevalue="true" falsevalue="false" label="Does file contain header?" />
-                    <param name="ncol" type="text" value="c1" label="Column number of IDs" help='For example, fill in "c1" if it is the first column, "c2" if it is the second column and so on'>
-                        <validator type="regex" message="Please enter a column number, for example: 'c1' for the first column">[c]{0,1}[0-9]+</validator>
-                    </param>
-                </when>
-            </conditional>
-                
-            <param name="list_name" type="text" label="name of your list" value="List" optional="false">
-                <sanitizer>
-                    <valid initial="string.printable">
-                        <remove value="&apos;"/>
-                    </valid>
-                    <mapping initial="none">
-                        <add source="&apos;" target="__sq__"/>
-                    </mapping>
-                </sanitizer>
-                <validator type="regex" message="Please enter a list name">[a-zA-Z0-9._-]+</validator>
-            </param>
-        
-        </repeat>
-        
-        <param name="species" type="select" label="Species" >
-            <option value="org.Hs.eg.db">Human (Homo sapiens) </option>
-            <option value="org.Mm.eg.db">Mouse (Mus musculus) </option>
-            <option value="org.Rn.eg.db">Rat (Rattus norvegicus)</option>
-        </param>
-		<param name="ontology" type="select" display="checkboxes" multiple="true" label="Select GO terms category" optional="false" >
-            <option value="CC">Cellular Component</option>
-            <option value="BP">Biological Process</option>
-            <option value="MF">Molecular Function</option>
-        </param>
-    </inputs>
-    
-    <outputs>
-        <data name="log" format="txt" label="GO enrich comparison" />
-        <collection type="list" label="GO enrichComparison results Table" name="text_output">
-            <discover_datasets pattern="(?P&lt;designation&gt;.+\.tsv)" ext="tsv"/>
-        </collection>
-        <collection type="list" label="GO enrichComparison results Diagram" name="graph_output" >
-	        <discover_datasets pattern="(?P&lt;designation&gt;.+.png)" ext="png" />
-	    </collection>
-    </outputs>
-
-    <tests>
-        <test>
-            <repeat name="lists">
-	            <conditional name="input">
-	                <param name="ids" value="file" />
-	                <param name="file" value="Gene_ID_BreastUp.txt" />
-	                <param name="header" value="true" />
-	                <param name="ncol" value="c7" />
-	                <param name="name" value="UP" />
-	            </conditional>
-	        </repeat>
-            <repeat name="lists">
-	            <conditional name="input">
-	                <param name="ids" value="file" />
-	                <param name="file" value="Gene_ID_BreastDn.txt" />
-	                <param name="header" value="true" />
-	                <param name="ncol" value="c7" />
-	                <param name="name" value="DN" />
-	            </conditional>
-	        </repeat>
-
-            <param name="species" value="org.Hs.eg.db"/>
-            <param name="ontology" value="BP"/>
-            <output name="log" file="log.txt" />
-            <output_collection name="text_output">
-                <element name="GO_enrich_comparison_BP.tsv" file="GO_enrich_comparison_BP.tsv" ftype="tsv"/>
-            </output_collection>
-            <output_collection name="graph_output">
-                <element name="GO_enrich_comparison_BP.png" file="GO_enrich_comparison_BP.png" ftype="png"/>
-            </output_collection>
-        </test>
-    </tests>
-    <help><![CDATA[
-
-**Description**
-
-This tool is based on the R package clusterProfiler and was developed for biological theme comparison; it provides a function to automatically calculate enriched functional categories of each gene clusters provided by the user and to compare them. 
-Given a list of gene set, this function will compute GO enrichment profiles of each gene list.
-
------
-
-**Input**
-
-Two modes are allowed: either by supplying a tabular file (.csv, .tsv, .txt, .tab) including your IDs (identifiers) or by copy/pasting your IDs (separated by a space).
-
-"Enter your Gene ID list": only Entrez Gene ID (e.g : 4151, 7412).  
-If your IDs are not Entrez Gene IDs, please use the ID_Converter tool of ProteoRE. 
-
-"Does file contain header?": specify if there is header in your input file. 
-
-"Column number of IDs": in which column are your IDs. (e.g. for column 2, type "c2")
-
-"name of your list": enter a name for each list ("List" by default); this name will be used in the output files. up to five lists can be considered
-
------
-
-**Parameters**
-
-"Species": the following three species are currently supported: Homo sapiens, Mus musculus and Rattus norvegicus 
-
-"Select GO terms category": allows you to perform analysis on one, two or three categories of the Gene Ontology. The categories are 
-Cellular Component (CC), Biological Process (BP) and Molecular Function (MF). 
-
------ 
-
-**Output**
-
-Diagram output: graphical output in the form of a dot-plot (png, jpeg or pdf format), one figure for each GO category. The dots size correspond to the value of the GeneRatio (i.e. gene counts / total number of gene list), the bigger the dot size, the higher the GeneRatio. The dots in the plot are color-coded based on their corresponding (adjusted) p-values. Color gradient ranging from red to blue correspond to in order of increasing p-values. That is, red indicate low p-values (high enrichment), and blue indicate high p-values (low enrichment).
-Text tables with the following information: GO category description (e.g.BP.Description), GO term identifier (e.g. BP.GOID) 
-and GO term frequency (e.g. BP.Frequency). 
-One table and one graphic are created for each GO category. 
-
------
-
-**Authors**
-G Yu, LG Wang, Y Han, QY He. clusterProfiler: an R package for comparing biological themes among gene clusters. 
-OMICS: A Journal of Integrative Biology 2012, 16(5):284-287. doi:[10.1089/omi.2011.0118](http://dx.doi.org/10.1089/omi.2011.0118)
-
-User manual / Documentation of the clusterProfiler R package (functions and parameters):
-https://bioconductor.org/packages/3.7/bioc/vignettes/clusterProfiler/inst/doc/clusterProfiler.html
-
------
-
-.. class:: infomark
-
-**Galaxy integration**
-
-Florence Combes, Yves Vandenbrouck - CEA, INSERM, CNRS, Grenoble-Alpes University, BIG Institute, FR
-
-David Christiany, Valentin Loux - INRA, Paris-Saclay University, MAIAGE Unit, Migale Bioinformatics platform, FR
-
-This work has been partially funded through the French National Agency for Research (ANR) IFB project.
-
-Contact support@proteore.org for any questions or concerns about the Galaxy implementation of this tool.
-
-
-    ]]></help>
-    <citations>
-    </citations>
-</tool>
+<tool id="go_terms_enrich_comparison" name="Biological theme comparison" version="2020.02.04">
+    <description>(Human, Mouse, Rat)[clusterProfiler]</description>
+    <requirements>
+        <requirement type="package">R</requirement>
+        <requirement type="package" version="3.8.2">bioconductor-org.hs.eg.db</requirement>
+        <requirement type="package" version="3.8.2">bioconductor-org.mm.eg.db</requirement>
+        <requirement type="package" version="3.8.2">bioconductor-org.rn.eg.db</requirement>
+        <requirement type="package" version="3.10.2">bioconductor-dose</requirement>
+        <requirement type="package" version="3.12.0">bioconductor-clusterprofiler</requirement>
+    </requirements>
+    <command detect_errors="exit_code"><![CDATA[
+
+
+       Rscript $__tool_directory__/GO_terms_enrich_comparison.R
+
+        --nb=$len($lists)
+
+        #for $index, $list in enumerate($lists)
+        		    
+            #if $list.input.ids == "file"
+		        --input.$index="$list.input.file" --name.$index="$list.list_name" --inputtype.$index="file" --header.$index="$list.input.header" --column.$index="$list.input.ncol" 
+            #else
+                --input.$index="$list.input.txt" --name.$index="$list.list_name" --inputtype.$index="text"  
+ 		    #end if
+            
+        #end for
+
+        --org="$species"
+        --ont="$ontology"
+       
+
+            > $log
+
+
+    ]]></command>
+    <inputs>
+
+        <repeat name="lists" title="List to compare" min="2" max="5" >
+
+            <conditional name="input" >
+                <param name="ids" type="select" label="Enter your ID list (Entrez gene ID, e.g. 2810)" help="Copy/paste or from a file (e.g. table)" >
+                    <option value="text">Copy/paste your IDs</option>
+                    <option value="file" selected="true">Input file containing your list of IDs</option>
+                </param>
+                <when value="text" >
+                    <param name="txt" type="text" label="Copy/paste your identifiers" help='IDs must be separated by spaces into the form field, for example: 2810 7534' >
+                        <sanitizer>
+                            <valid initial="string.printable">
+                                <remove value="&apos;"/>
+                            </valid>
+                            <mapping initial="none">
+                                <add source="&apos;" target="__sq__"/>
+                            </mapping>
+                        </sanitizer>
+                    </param>
+                </when>
+                <when value="file" >
+                    <param name="file" type="data" format="txt,tabular" label="Choose a file that contains your list of IDs" help="" />
+                    <param name="header" type="boolean" checked="true" truevalue="true" falsevalue="false" label="Does file contain header?" />
+                    <param name="ncol" type="text" value="c1" label="Column number of IDs" help='For example, fill in "c1" if it is the first column, "c2" if it is the second column and so on'>
+                        <validator type="regex" message="Please enter a column number, for example: 'c1' for the first column">[c]{0,1}[0-9]+</validator>
+                    </param>
+                </when>
+            </conditional>
+                
+            <param name="list_name" type="text" label="name of your list" value="List" optional="false">
+                <sanitizer>
+                    <valid initial="string.printable">
+                        <remove value="&apos;"/>
+                    </valid>
+                    <mapping initial="none">
+                        <add source="&apos;" target="__sq__"/>
+                    </mapping>
+                </sanitizer>
+                <validator type="regex" message="Please enter a list name">[a-zA-Z0-9._-]+</validator>
+            </param>
+        
+        </repeat>
+        
+        <param name="species" type="select" label="Species" >
+            <option value="org.Hs.eg.db">Human (Homo sapiens) </option>
+            <option value="org.Mm.eg.db">Mouse (Mus musculus) </option>
+            <option value="org.Rn.eg.db">Rat (Rattus norvegicus)</option>
+        </param>
+		<param name="ontology" type="select" display="checkboxes" multiple="true" label="Select GO terms category" optional="false" >
+            <option value="CC">Cellular Component</option>
+            <option value="BP">Biological Process</option>
+            <option value="MF">Molecular Function</option>
+        </param>
+    </inputs>
+    
+    <outputs>
+        <data name="log" format="txt" label="GO enrich comparison" />
+        <collection type="list" label="GO enrichComparison results Table" name="text_output">
+            <discover_datasets pattern="(?P&lt;designation&gt;.+\.tsv)" ext="tsv"/>
+        </collection>
+        <collection type="list" label="GO enrichComparison results Diagram" name="graph_output" >
+	        <discover_datasets pattern="(?P&lt;designation&gt;.+.png)" ext="png" />
+	    </collection>
+    </outputs>
+
+    <tests>
+        <test>
+            <repeat name="lists">
+	            <conditional name="input">
+	                <param name="ids" value="file" />
+	                <param name="file" value="Gene_ID_BreastUp.txt" />
+	                <param name="header" value="true" />
+	                <param name="ncol" value="c7" />
+	                <param name="name" value="UP" />
+	            </conditional>
+	        </repeat>
+            <repeat name="lists">
+	            <conditional name="input">
+	                <param name="ids" value="file" />
+	                <param name="file" value="Gene_ID_BreastDn.txt" />
+	                <param name="header" value="true" />
+	                <param name="ncol" value="c7" />
+	                <param name="name" value="DN" />
+	            </conditional>
+	        </repeat>
+
+            <param name="species" value="org.Hs.eg.db"/>
+            <param name="ontology" value="BP"/>
+            <output name="log" file="log.txt" />
+            <output_collection name="text_output">
+                <element name="GO_enrich_comparison_BP.tsv" file="GO_enrich_comparison_BP.tsv" ftype="tsv"/>
+            </output_collection>
+            <output_collection name="graph_output">
+                <element name="GO_enrich_comparison_BP.png" file="GO_enrich_comparison_BP.png" ftype="png"/>
+            </output_collection>
+        </test>
+    </tests>
+    <help><![CDATA[
+
+**Description**
+
+This tool is based on the R package clusterProfiler and was developed for biological theme comparison; it provides a function to automatically calculate enriched functional categories of each gene clusters provided by the user and to compare them. 
+Given a list of gene set, this function will compute GO enrichment profiles of each gene list.
+
+-----
+
+**Input**
+
+Two modes are allowed: either by supplying a tabular file (.csv, .tsv, .txt, .tab) including your IDs (identifiers) or by copy/pasting your IDs (separated by a space).
+
+"Enter your Gene ID list": only Entrez Gene ID (e.g : 4151, 7412).  
+If your IDs are not Entrez Gene IDs, please use the ID_Converter tool of ProteoRE. 
+
+"Does file contain header?": specify if there is header in your input file. 
+
+"Column number of IDs": in which column are your IDs. (e.g. for column 2, type "c2")
+
+"name of your list": enter a name for each list ("List" by default); this name will be used in the output files. up to five lists can be considered
+
+-----
+
+**Parameters**
+
+"Species": the following three species are currently supported: Homo sapiens, Mus musculus and Rattus norvegicus 
+
+"Select GO terms category": allows you to perform analysis on one, two or three categories of the Gene Ontology. The categories are 
+Cellular Component (CC), Biological Process (BP) and Molecular Function (MF). 
+
+----- 
+
+**Output**
+
+Diagram output: graphical output in the form of a dot-plot (png, jpeg or pdf format), one figure for each GO category. The dots size correspond to the value of the GeneRatio (i.e. gene counts / total number of gene list), the bigger the dot size, the higher the GeneRatio. The dots in the plot are color-coded based on their corresponding (adjusted) p-values. Color gradient ranging from red to blue correspond to in order of increasing p-values. That is, red indicate low p-values (high enrichment), and blue indicate high p-values (low enrichment).
+Text tables with the following information: GO category description (e.g.BP.Description), GO term identifier (e.g. BP.GOID) 
+and GO term frequency (e.g. BP.Frequency). 
+One table and one graphic are created for each GO category. 
+
+-----
+
+**Authors**
+G Yu, LG Wang, Y Han, QY He. clusterProfiler: an R package for comparing biological themes among gene clusters. 
+OMICS: A Journal of Integrative Biology 2012, 16(5):284-287. doi:[10.1089/omi.2011.0118](http://dx.doi.org/10.1089/omi.2011.0118)
+
+User manual / Documentation of the clusterProfiler R package (functions and parameters):
+https://bioconductor.org/packages/3.7/bioc/vignettes/clusterProfiler/inst/doc/clusterProfiler.html
+
+-----
+
+.. class:: infomark
+
+**Galaxy integration**
+
+Florence Combes, Yves Vandenbrouck - CEA, INSERM, CNRS, Grenoble-Alpes University, BIG Institute, FR
+
+David Christiany, Valentin Loux - INRA, Paris-Saclay University, MAIAGE Unit, Migale Bioinformatics platform, FR
+
+This work has been partially funded through the French National Agency for Research (ANR) IFB project.
+
+Contact support@proteore.org for any questions or concerns about the Galaxy implementation of this tool.
+
+
+    ]]></help>
+    <citations>
+    </citations>
+</tool>
--- a/test-data/GO_enrich_comparison_BP.tsv	Thu Jan 23 03:16:11 2020 -0500
+++ b/test-data/GO_enrich_comparison_BP.tsv	Tue Feb 04 05:16:19 2020 -0500
@@ -1,876 +1,876 @@
-"Cluster"	"ID"	"Description"	"GeneRatio"	"BgRatio"	"pvalue"	"p.adjust"	"qvalue"	"geneID"	"Count"
-"1"	"Up"	"GO:0006614"	"SRP-dependent cotranslational protein targeting to membrane"	"61/549"	"103/17913"	7.17614589176342e-66	1.81750996844429e-62	1.60912586893586e-62	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/6204/6228/6169/6209"	61
-"2"	"Up"	"GO:0045047"	"protein targeting to ER"	"62/549"	"108/17913"	9.7089207716041e-66	1.81750996844429e-62	1.60912586893586e-62	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/23480/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/6204/6228/6169/6209"	62
-"3"	"Up"	"GO:0006613"	"cotranslational protein targeting to membrane"	"61/549"	"106/17913"	8.98858148601582e-65	1.12177496945477e-61	9.93159406998731e-62	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/6204/6228/6169/6209"	61
-"4"	"Up"	"GO:0072599"	"establishment of protein localization to endoplasmic reticulum"	"62/549"	"112/17913"	2.34767791127495e-64	2.19742652495335e-61	1.94548361647495e-61	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/23480/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/6204/6228/6169/6209"	62
-"5"	"Up"	"GO:0000184"	"nuclear-transcribed mRNA catabolic process, nonsense-mediated decay"	"63/549"	"118/17913"	5.05435682980006e-64	3.78470239415428e-61	3.35077255937692e-61	"6189/6125/4736/9775/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/9939/6165/6235/84305/6231/6144/6160/6207/6204/6228/55110/6169/6209"	63
-"6"	"Up"	"GO:0070972"	"protein localization to endoplasmic reticulum"	"63/549"	"128/17913"	4.87731822380499e-61	3.04344657165431e-58	2.6945044011863e-58	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/9218/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/23480/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/6204/6228/6169/6209"	63
-"7"	"Up"	"GO:0006413"	"translational initiation"	"66/549"	"183/17913"	5.72293424787441e-53	3.0609522605774e-50	2.71000299948218e-50	"6189/6125/8668/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/1967/6138/6232/6156/6143/6229/6230/6227/3315/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/1974/6193/6139/6133/9349/6210/1964/9086/6234/6224/6181/6201/6208/6173/6218/6164/6165/6235/6231/6144/6160/6207/6204/1975/6228/6169/6209"	66
-"8"	"Up"	"GO:0000956"	"nuclear-transcribed mRNA catabolic process"	"67/549"	"197/17913"	8.288062004923e-52	3.87881301830396e-49	3.43409305967138e-49	"6189/6125/4736/9775/9967/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/25804/6188/28960/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/9939/6165/6235/84305/6231/6144/6160/6207/6204/6228/55110/6169/6209/27258"	67
-"9"	"Up"	"GO:0006612"	"protein targeting to membrane"	"62/549"	"167/17913"	1.11916964762208e-50	4.65574573410786e-48	4.12194762615431e-48	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/11261/6204/6228/6169/6209"	62
-"10"	"Up"	"GO:0019083"	"viral transcription"	"63/549"	"177/17913"	3.77298649972469e-50	1.41260614549692e-47	1.25064573554032e-47	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/129401/10410/6165/6235/2963/6231/6144/6160/6207/64710/6204/6228/6169/6209"	63
-"11"	"Up"	"GO:0019080"	"viral gene expression"	"64/549"	"191/17913"	5.04504447661761e-49	1.71714968367785e-46	1.52027225424582e-46	"6189/6125/4736/6142/5725/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/129401/10410/6165/6235/2963/6231/6144/6160/6207/64710/6204/6228/6169/6209"	64
-"12"	"Up"	"GO:0006402"	"mRNA catabolic process"	"80/549"	"338/17913"	2.67096248988706e-48	8.33340296844763e-46	7.37794814092487e-46	"6189/6125/4736/9775/9967/6142/5689/6136/6191/6192/6206/6154/1994/6217/6202/10949/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/3315/6187/6205/6161/6135/6223/6168/6159/23521/5686/6147/6203/3921/5690/9261/5692/6132/6155/6157/25804/5682/6188/28960/6193/6139/6133/9349/6210/6234/6224/5691/6181/6201/6208/6173/6218/6164/9939/6165/7431/6235/84305/6231/6144/6160/6207/6204/6228/55110/1153/5696/6169/6209/27258"	80
-"13"	"Up"	"GO:0006401"	"RNA catabolic process"	"81/549"	"368/17913"	2.59008045976733e-46	7.45943172412991e-44	6.60418086462131e-44	"6189/6125/4736/9775/9967/6142/5689/6136/6191/6192/6206/6154/1994/6217/6202/10949/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/3315/6187/6205/6161/6135/6223/6168/6159/23521/5686/6147/6203/3921/5690/9261/5692/6132/6155/6157/25804/5682/6188/28960/6193/6139/6133/9349/6210/6234/6224/5691/6181/6201/6208/6173/6218/6164/9939/6165/7431/6235/84305/6231/6144/6160/6207/6204/6228/55110/8635/1153/5696/6169/6209/27258"	81
-"14"	"Up"	"GO:0006605"	"protein targeting"	"80/549"	"364/17913"	1.10426751108592e-45	2.95312682964691e-43	2.61454014466884e-43	"6189/6125/4736/7879/3295/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/1891/56993/4924/6155/6157/6188/7332/6193/6139/6133/9349/30/6210/6234/23480/950/373156/6224/6181/6201/6208/6173/706/6218/6164/6165/131118/401505/6235/6747/6231/6144/6160/10965/6207/6726/26517/11261/26519/2053/6204/6228/26520/6169/6209"	80
-"15"	"Up"	"GO:0090150"	"establishment of protein localization to membrane"	"70/549"	"287/17913"	3.55324102399244e-43	8.86888959588513e-41	7.85203928740505e-41	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/9230/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/4218/56993/8266/6155/6157/6188/6193/6139/6133/9349/439/6210/6234/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/9341/6207/6726/11261/26519/6204/6228/26520/6169/6209"	70
-"16"	"Up"	"GO:0072594"	"establishment of protein localization to organelle"	"83/549"	"452/17913"	4.72092352077339e-41	1.10469610386097e-38	9.78038695191803e-39	"6189/6125/4736/7879/11331/3295/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/1891/56993/5594/6155/6157/6188/7332/6193/6139/6133/9349/30/6210/6234/23480/950/373156/6224/6181/10204/6201/6208/6173/706/6218/6164/6165/131118/401505/6235/7251/6747/6231/6144/6160/10965/6207/6726/26517/11261/26519/2053/6204/6228/26520/6169/6209"	83
-"17"	"Up"	"GO:0006119"	"oxidative phosphorylation"	"32/549"	"131/17913"	3.09299229045743e-20	6.81186066792506e-18	6.03085617501575e-18	"387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/4700/513/521"	32
-"18"	"Up"	"GO:0043312"	"neutrophil degranulation"	"56/549"	"485/17913"	9.02573847185842e-18	1.87735360214655e-15	1.66210821332644e-15	"7879/3608/5478/1650/5689/10549/387/10493/57826/5686/9218/1508/5908/4282/51552/5594/30/1509/10159/5878/5906/8673/1992/5476/55004/9545/10092/29108/5049/23593/5547/2760/684/12/25801/4125/1727/51382/5265/55313/2992/8635/54472/567/5660/8649/2717/2896/2990/2548/4680/29952/427/1522/175/2512"	56
-"19"	"Up"	"GO:0042775"	"mitochondrial ATP synthesis coupled electron transport"	"25/549"	"89/17913"	1.13691215084136e-17	2.24031531197371e-15	1.98345504875315e-15	"29796/4723/1345/4728/11315/9377/4697/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/4700"	25
-"20"	"Up"	"GO:0002283"	"neutrophil activation involved in immune response"	"56/549"	"488/17913"	1.19704694613467e-17	2.2408718831641e-15	1.98394780704109e-15	"7879/3608/5478/1650/5689/10549/387/10493/57826/5686/9218/1508/5908/4282/51552/5594/30/1509/10159/5878/5906/8673/1992/5476/55004/9545/10092/29108/5049/23593/5547/2760/684/12/25801/4125/1727/51382/5265/55313/2992/8635/54472/567/5660/8649/2717/2896/2990/2548/4680/29952/427/1522/175/2512"	56
-"21"	"Up"	"GO:0042773"	"ATP synthesis coupled electron transport"	"25/549"	"90/17913"	1.52982454473e-17	2.72745861689006e-15	2.41474560970164e-15	"29796/4723/1345/4728/11315/9377/4697/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/4700"	25
-"22"	"Up"	"GO:0002446"	"neutrophil mediated immunity"	"56/549"	"499/17913"	3.3032901933791e-17	5.37718194957015e-15	4.76066856702553e-15	"7879/3608/5478/1650/5689/10549/387/10493/57826/5686/9218/1508/5908/4282/51552/5594/30/1509/10159/5878/5906/8673/1992/5476/55004/9545/10092/29108/5049/23593/5547/2760/684/12/25801/4125/1727/51382/5265/55313/2992/8635/54472/567/5660/8649/2717/2896/2990/2548/4680/29952/427/1522/175/2512"	56
-"23"	"Up"	"GO:0042119"	"neutrophil activation"	"56/549"	"499/17913"	3.3032901933791e-17	5.37718194957015e-15	4.76066856702553e-15	"7879/3608/5478/1650/5689/10549/387/10493/57826/5686/9218/1508/5908/4282/51552/5594/30/1509/10159/5878/5906/8673/1992/5476/55004/9545/10092/29108/5049/23593/5547/2760/684/12/25801/4125/1727/51382/5265/55313/2992/8635/54472/567/5660/8649/2717/2896/2990/2548/4680/29952/427/1522/175/2512"	56
-"24"	"Up"	"GO:0006414"	"translational elongation"	"27/549"	"124/17913"	6.50920470770029e-16	1.01543593440124e-13	8.99012527392465e-14	"9775/6156/64978/64969/90480/11222/51649/54534/65003/6181/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28998/6726/51650/54948/10573"	27
-"25"	"Up"	"GO:0070125"	"mitochondrial translational elongation"	"23/549"	"86/17913"	7.63921449202343e-16	1.14404876232543e-13	1.01287942885818e-13	"64978/64969/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28998/51650/54948/10573"	23
-"26"	"Up"	"GO:0022904"	"respiratory electron transport chain"	"25/549"	"106/17913"	1.06286230376542e-15	1.5305217174222e-13	1.35504186014466e-13	"29796/4723/1345/4728/11315/9377/4697/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/4700"	25
-"27"	"Up"	"GO:0070126"	"mitochondrial translational termination"	"23/549"	"88/17913"	1.32780109741345e-15	1.84121752174665e-13	1.63011526540154e-13	"64978/64969/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28998/51650/54948/10573"	23
-"28"	"Up"	"GO:0009141"	"nucleoside triphosphate metabolic process"	"42/549"	"337/17913"	9.66883073925286e-15	1.29286079599153e-12	1.14462962398148e-12	"7167/204/387/29796/4723/498/506/51727/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/3704/4729/1340/7381/4724/4702/4698/4704/1329/79077/4513/126328/4713/4695/2026/4700/513/521/4832"	42
-"29"	"Up"	"GO:0022900"	"electron transport chain"	"30/549"	"175/17913"	1.50350020251755e-14	1.94107060628473e-12	1.71851983220609e-12	"29796/4723/1345/4728/11315/9377/4697/10327/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/1347/4704/8574/5860/1329/4513/126328/4713/4695/4700/1528"	30
-"30"	"Up"	"GO:0000377"	"RNA splicing, via transesterification reactions with bulged adenosine as nucleophile"	"42/549"	"344/17913"	1.98893279661731e-14	2.39842530414397e-12	2.12343715776804e-12	"9775/4670/27316/9967/5725/708/220988/1994/10949/6426/3185/11338/8683/25804/28960/6625/6626/10189/10250/6431/6629/83443/6634/7536/29896/10284/6428/51645/9939/6628/2963/51691/6427/10772/135295/6430/55110/11051/6632/6636/6637/27258"	42
-"31"	"Up"	"GO:0000398"	"mRNA splicing, via spliceosome"	"42/549"	"344/17913"	1.98893279661731e-14	2.39842530414397e-12	2.12343715776804e-12	"9775/4670/27316/9967/5725/708/220988/1994/10949/6426/3185/11338/8683/25804/28960/6625/6626/10189/10250/6431/6629/83443/6634/7536/29896/10284/6428/51645/9939/6628/2963/51691/6427/10772/135295/6430/55110/11051/6632/6636/6637/27258"	42
-"32"	"Up"	"GO:0009205"	"purine ribonucleoside triphosphate metabolic process"	"40/549"	"314/17913"	2.04993615738801e-14	2.39842530414397e-12	2.12343715776804e-12	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/3704/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521/4832"	40
-"33"	"Up"	"GO:0006415"	"translational termination"	"23/549"	"100/17913"	2.693444125697e-14	2.97149793720018e-12	2.63080493821507e-12	"64978/64969/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28998/51650/54948/10573"	23
-"34"	"Up"	"GO:0046034"	"ATP metabolic process"	"38/549"	"287/17913"	2.6984756908335e-14	2.97149793720018e-12	2.63080493821507e-12	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521"	38
-"35"	"Up"	"GO:0000375"	"RNA splicing, via transesterification reactions"	"42/549"	"348/17913"	2.97669365945596e-14	3.18421173171518e-12	2.81913032590281e-12	"9775/4670/27316/9967/5725/708/220988/1994/10949/6426/3185/11338/8683/25804/28960/6625/6626/10189/10250/6431/6629/83443/6634/7536/29896/10284/6428/51645/9939/6628/2963/51691/6427/10772/135295/6430/55110/11051/6632/6636/6637/27258"	42
-"36"	"Up"	"GO:0009199"	"ribonucleoside triphosphate metabolic process"	"40/549"	"319/17913"	3.49043773315543e-14	3.63005524248165e-12	3.21385626365686e-12	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/3704/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521/4832"	40
-"37"	"Up"	"GO:0009144"	"purine nucleoside triphosphate metabolic process"	"40/549"	"321/17913"	4.30489150343961e-14	4.35608480780484e-12	3.85664391019384e-12	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/3704/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521/4832"	40
-"38"	"Up"	"GO:0032543"	"mitochondrial translation"	"25/549"	"125/17913"	6.29911919435496e-14	6.20629006938551e-12	5.49471643851074e-12	"708/64978/64969/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28958/28998/51650/54948/10573"	25
-"39"	"Up"	"GO:0045333"	"cellular respiration"	"29/549"	"176/17913"	1.19851495984731e-13	1.15057436145342e-11	1.01865684441543e-11	"29796/4723/1345/4728/6390/11315/9377/81889/4697/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/55847/4513/126328/4713/4695/4700/513"	29
-"40"	"Up"	"GO:0006120"	"mitochondrial electron transport, NADH to ubiquinone"	"17/549"	"55/17913"	3.37257771557936e-13	3.15230834582046e-11	2.79088477873049e-11	"4723/4728/11315/4697/55967/4726/4715/4725/4729/4724/4702/4698/4704/126328/4713/4695/4700"	17
-"41"	"Up"	"GO:0008380"	"RNA splicing"	"46/549"	"440/17913"	3.45204706673715e-13	3.15230834582046e-11	2.79088477873049e-11	"9775/4670/27316/9967/5725/708/51493/220988/1994/10949/6426/3185/11338/8683/25804/28960/6625/6626/10189/10250/51637/6431/6629/83443/6634/7536/29896/10284/6428/51645/9939/6628/2963/6231/6207/51691/6427/10772/135295/6430/55110/11051/6632/6636/6637/27258"	46
-"42"	"Up"	"GO:0140053"	"mitochondrial gene expression"	"26/549"	"148/17913"	4.85823242211427e-13	4.3307671877133e-11	3.83422904692678e-11	"708/64978/64969/3028/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28958/28998/51650/54948/10573"	26
-"43"	"Up"	"GO:0009161"	"ribonucleoside monophosphate metabolic process"	"39/549"	"331/17913"	5.53282059044524e-13	4.81741402107604e-11	4.26508005858312e-11	"7167/204/387/29796/4723/498/506/51727/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521"	39
-"44"	"Up"	"GO:0009167"	"purine ribonucleoside monophosphate metabolic process"	"38/549"	"317/17913"	6.46564273830756e-13	5.49292757739715e-11	4.86314353948033e-11	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521"	38
-"45"	"Up"	"GO:0022613"	"ribonucleoprotein complex biogenesis"	"42/549"	"381/17913"	6.60207641514081e-13	5.49292757739715e-11	4.86314353948033e-11	"6125/8668/9775/708/6154/6217/6426/6129/6232/6229/6187/6135/6223/23521/6203/8683/6155/6431/6234/6634/7536/6201/26065/6208/6218/55651/6628/6165/10772/135295/54433/6430/6228/2752/1153/55505/11051/6632/6636/6169/6637/6209"	42
-"46"	"Up"	"GO:0009126"	"purine nucleoside monophosphate metabolic process"	"38/549"	"318/17913"	7.13681455714417e-13	5.80874645694517e-11	5.14275264083455e-11	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521"	38
-"47"	"Up"	"GO:0002181"	"cytoplasmic translation"	"18/549"	"69/17913"	1.74544590325192e-12	1.3904147791011e-10	1.23099868966188e-10	"8668/4736/6142/6152/6156/6143/6227/6161/6135/23521/6132/6234/6173/6235/6231/6160/6228/6169"	18
-"48"	"Up"	"GO:0009150"	"purine ribonucleotide metabolic process"	"48/549"	"500/17913"	2.40221916155885e-12	1.8737309460159e-10	1.65890090783965e-10	"7167/204/3295/387/29796/4723/498/506/10632/3094/1345/4728/11315/9377/4697/25874/27089/522/55967/4726/4715/5538/2987/706/4725/129401/84836/3704/4729/1340/7381/4724/4702/4698/4704/641371/10965/1329/4513/126328/4713/79717/4695/2026/4700/513/521/4832"	48
-"49"	"Up"	"GO:0009123"	"nucleoside monophosphate metabolic process"	"39/549"	"349/17913"	2.96090953946444e-12	2.26237659505201e-10	2.00298692583749e-10	"7167/204/387/29796/4723/498/506/51727/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521"	39
-"50"	"Up"	"GO:0032984"	"protein-containing complex disassembly"	"35/549"	"298/17913"	9.72617175568067e-12	7.28295741065369e-10	6.44793997023967e-10	"11034/11344/64978/29979/64969/9349/90480/11222/51649/8673/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/822/7251/84305/63931/51373/28998/51650/23557/27243/136319/54948/10573/3159"	35
-"51"	"Up"	"GO:0015980"	"energy derivation by oxidation of organic compounds"	"32/549"	"264/17913"	3.34434934782912e-11	2.45514587417102e-09	2.17365450904312e-09	"29796/4723/1345/4728/6390/11315/9377/81889/4697/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/55847/4513/2992/126328/112464/4713/4695/4700/513/2548"	32
-"52"	"Up"	"GO:0033119"	"negative regulation of RNA splicing"	"11/549"	"24/17913"	3.52929497833582e-11	2.54109238440179e-09	2.24974694064363e-09	"27316/5725/708/11338/8683/6431/10284/6231/6207/10772/135295"	11
-"53"	"Up"	"GO:0043624"	"cellular protein complex disassembly"	"27/549"	"195/17913"	5.60328929654272e-11	3.95824813702943e-09	3.50442065438193e-09	"11034/11344/64978/64969/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/822/63931/51373/28998/51650/136319/54948/10573"	27
-"54"	"Up"	"GO:0006397"	"mRNA processing"	"44/549"	"499/17913"	3.26684528710972e-10	2.26501273239607e-08	2.00532082048899e-08	"9775/4670/27316/9967/5725/708/220988/1994/10949/6426/3185/11338/8683/25804/28960/6625/6626/10189/10250/6431/6629/83443/6634/7536/29896/10284/6428/51645/9939/26097/6628/2963/5566/51691/6427/10772/135295/6430/55110/11051/6632/6636/6637/27258"	44
-"55"	"Up"	"GO:0007005"	"mitochondrion organization"	"42/549"	"466/17913"	4.30245943061338e-10	2.92880147422118e-08	2.59300377933044e-08	"11331/5245/10493/4723/498/493856/506/3028/10632/56993/4728/6742/7332/11315/522/55967/4726/4715/706/4725/131118/29108/4729/401505/23593/4724/4702/4698/4704/28958/26517/26519/2876/10935/126328/4713/4695/26520/4700/513/521/1890"	42
-"56"	"Up"	"GO:0010257"	"NADH dehydrogenase complex assembly"	"15/549"	"64/17913"	6.52939938714452e-10	4.28878443955598e-08	3.79705977287499e-08	"4723/4728/55967/4726/4715/4725/4729/4724/4702/4698/4704/126328/4713/4695/4700"	15
-"57"	"Up"	"GO:0032981"	"mitochondrial respiratory chain complex I assembly"	"15/549"	"64/17913"	6.52939938714452e-10	4.28878443955598e-08	3.79705977287499e-08	"4723/4728/55967/4726/4715/4725/4729/4724/4702/4698/4704/126328/4713/4695/4700"	15
-"58"	"Up"	"GO:0048025"	"negative regulation of mRNA splicing, via spliceosome"	"9/549"	"19/17913"	1.57058442594358e-09	1.01383932598841e-07	8.97598975915853e-08	"27316/5725/708/11338/8683/6431/10284/10772/135295"	9
-"59"	"Up"	"GO:0006900"	"vesicle budding from membrane"	"17/549"	"91/17913"	2.04227197401249e-09	1.29597733401742e-07	1.14738883963699e-07	"7879/8775/5861/9218/56681/9217/9871/375/10016/27095/10342/8724/81876/5265/10959/54732/1522"	17
-"60"	"Up"	"GO:1902600"	"proton transmembrane transport"	"21/549"	"148/17913"	4.97814877916924e-09	3.1063648382016e-07	2.75020886063227e-07	"11331/9114/498/506/10632/537/1345/11315/9377/4697/522/1340/1347/9550/534/11261/4513/51382/513/521/1528"	21
-"61"	"Up"	"GO:0033108"	"mitochondrial respiratory chain complex assembly"	"16/549"	"87/17913"	7.7295800837394e-09	4.74418816942956e-07	4.20024981599575e-07	"4723/4728/55967/4726/4715/4725/4729/4724/4702/4698/4704/28958/126328/4713/4695/4700"	16
-"62"	"Up"	"GO:0006364"	"rRNA processing"	"21/549"	"154/17913"	1.02720717389609e-08	6.2030059017209e-07	5.4918088125616e-07	"6125/9775/6154/6217/6129/6232/6229/6187/6135/6223/6203/6155/6234/6201/6208/6218/55651/6165/54433/55505/6209"	21
-"63"	"Up"	"GO:0042254"	"ribosome biogenesis"	"24/549"	"202/17913"	1.47064841691768e-08	8.73985344911079e-07	7.73779760212829e-07	"6125/9775/708/6154/6217/6129/6232/6229/6187/6135/6223/6203/6155/6234/6201/6208/6218/55651/6165/54433/2752/55505/6169/6209"	24
-"64"	"Up"	"GO:1903312"	"negative regulation of mRNA metabolic process"	"14/549"	"69/17913"	1.79564001067656e-08	1.05044940624579e-06	9.30011577898105e-07	"27316/9967/5725/708/1994/10949/11338/8683/9261/6431/10284/10772/135295/1153"	14
-"65"	"Up"	"GO:0042274"	"ribosomal small subunit biogenesis"	"9/549"	"24/17913"	1.9379833863472e-08	1.11627843053599e-06	9.8829306617123e-07	"6217/6229/6223/6234/6201/6208/6218/6169/6209"	9
-"66"	"Up"	"GO:0051169"	"nuclear transport"	"30/549"	"305/17913"	2.02481310890717e-08	1.14862125450734e-06	1.01692766825338e-06	"9775/11331/6426/11338/8683/3267/5594/9349/11315/10189/10250/6431/6634/10204/6428/9939/129401/26097/6628/5566/11261/6427/6430/55110/8815/6632/3159/6636/6637/6209"	30
-"67"	"Up"	"GO:0050657"	"nucleic acid transport"	"22/549"	"176/17913"	2.3278989778501e-08	1.28171379015747e-06	1.13476066273219e-06	"9775/220988/6426/11338/7263/8683/3267/10189/10250/51637/6431/29074/10204/6428/9939/129401/26097/5813/6427/6430/55110/6209"	22
-"68"	"Up"	"GO:0050658"	"RNA transport"	"22/549"	"176/17913"	2.3278989778501e-08	1.28171379015747e-06	1.13476066273219e-06	"9775/220988/6426/11338/7263/8683/3267/10189/10250/51637/6431/29074/10204/6428/9939/129401/26097/5813/6427/6430/55110/6209"	22
-"69"	"Up"	"GO:0006403"	"RNA localization"	"24/549"	"208/17913"	2.6105691284491e-08	1.40144097946013e-06	1.24076069622131e-06	"9775/220988/6426/11338/7263/8683/3267/10189/10250/51637/6431/29074/10204/6428/9939/129401/55651/26097/5813/6427/6430/55110/55505/6209"	24
-"70"	"Up"	"GO:0031123"	"RNA 3'-end processing"	"17/549"	"107/17913"	2.62021550646926e-08	1.40144097946013e-06	1.24076069622131e-06	"9775/6426/11338/8683/3028/6626/10189/10250/6431/6428/26024/9939/26097/6427/6430/55110/11051"	17
-"71"	"Up"	"GO:0022618"	"ribonucleoprotein complex assembly"	"24/549"	"209/17913"	2.86621570600715e-08	1.49393478458136e-06	1.32264975164381e-06	"6125/8668/708/6426/6135/6223/23521/8683/6431/6634/7536/26065/6208/6628/10772/135295/6430/6228/1153/11051/6632/6636/6169/6637"	24
-"72"	"Up"	"GO:1903311"	"regulation of mRNA metabolic process"	"28/549"	"275/17913"	2.8729515088103e-08	1.49393478458136e-06	1.32264975164381e-06	"27316/9967/5689/5725/708/1994/10949/3315/11338/5686/8683/5690/9261/5692/5682/6625/6626/6431/5691/10284/6428/9939/7431/10772/135295/1153/11051/5696"	28
-"73"	"Up"	"GO:0051236"	"establishment of RNA localization"	"22/549"	"179/17913"	3.1746671547249e-08	1.62821285305343e-06	1.44153235331344e-06	"9775/220988/6426/11338/7263/8683/3267/10189/10250/51637/6431/29074/10204/6428/9939/129401/26097/5813/6427/6430/55110/6209"	22
-"74"	"Up"	"GO:0048194"	"Golgi vesicle budding"	"14/549"	"75/17913"	5.49991868777868e-08	2.78266156311397e-06	2.46361933823828e-06	"8775/5861/9218/56681/9217/9871/10016/27095/10342/81876/5265/10959/54732/1522"	14
-"75"	"Up"	"GO:0022411"	"cellular component disassembly"	"39/549"	"492/17913"	6.33070837672959e-08	3.15204693245381e-06	2.79065333735297e-06	"11034/11344/64978/29979/493856/64969/826/9349/11315/90480/11222/51649/8673/54534/65003/29074/92259/51073/64928/740/65993/116540/706/51642/63875/84545/822/7251/84305/63931/51373/28998/51650/23557/27243/136319/54948/10573/3159"	39
-"76"	"Up"	"GO:0050686"	"negative regulation of mRNA processing"	"9/549"	"27/17913"	6.3983858671605e-08	3.15204693245381e-06	2.79065333735297e-06	"27316/5725/708/11338/8683/6431/10284/10772/135295"	9
-"77"	"Up"	"GO:0048193"	"Golgi vesicle transport"	"29/549"	"304/17913"	6.82929452978033e-08	3.32063359993475e-06	2.93991093291569e-06	"8775/10652/5861/9218/11079/51552/4218/56681/830/381/9217/9871/8673/375/377/10016/22818/27095/6892/378/10342/81876/9341/403/5265/10959/54732/400/1522"	29
-"78"	"Up"	"GO:0031124"	"mRNA 3'-end processing"	"15/549"	"89/17913"	7.71019293868709e-08	3.7008926105698e-06	3.27657187097512e-06	"9775/6426/11338/8683/6626/10189/10250/6431/6428/9939/26097/6427/6430/55110/11051"	15
-"79"	"Up"	"GO:0043484"	"regulation of RNA splicing"	"17/549"	"115/17913"	7.85058040008697e-08	3.72057886302856e-06	3.29400102330098e-06	"27316/9967/5725/708/3185/11338/8683/6625/6431/10284/6428/9939/6231/6207/10772/135295/6430"	17
-"80"	"Up"	"GO:0071826"	"ribonucleoprotein complex subunit organization"	"24/549"	"221/17913"	8.39533156186242e-08	3.92901517095161e-06	3.47853935372431e-06	"6125/8668/708/6426/6135/6223/23521/8683/6431/6634/7536/26065/6208/6628/10772/135295/6430/6228/1153/11051/6632/6636/6169/6637"	24
-"81"	"Up"	"GO:0007033"	"vacuole organization"	"18/549"	"131/17913"	1.03113250758305e-07	4.76612359060608e-06	4.21967026170112e-06	"7879/5868/5861/29979/950/5899/375/55004/5538/29978/4669/81876/23557/11151/53/2896/2548/1200"	18
-"82"	"Up"	"GO:0007040"	"lysosome organization"	"12/549"	"57/17913"	1.22524234711674e-07	5.52687632241576e-06	4.89319993794625e-06	"7879/950/375/55004/5538/4669/23557/11151/53/2896/2548/1200"	12
-"83"	"Up"	"GO:0080171"	"lytic vacuole organization"	"12/549"	"57/17913"	1.22524234711674e-07	5.52687632241576e-06	4.89319993794625e-06	"7879/950/375/55004/5538/4669/23557/11151/53/2896/2548/1200"	12
-"84"	"Up"	"GO:0006611"	"protein export from nucleus"	"20/549"	"163/17913"	1.37886551563217e-07	6.14580058396055e-06	5.44116229163624e-06	"9775/6426/11338/8683/3267/11315/10189/10250/6431/10204/6428/9939/129401/26097/5566/11261/6427/6430/55110/6209"	20
-"85"	"Up"	"GO:0016050"	"vesicle organization"	"27/549"	"280/17913"	1.55859305968489e-07	6.86514401818849e-06	6.07803039622007e-06	"7879/8775/5861/9218/4218/56681/3267/9217/9871/950/375/10016/55004/27095/6892/10342/8724/7251/81876/9341/23557/27243/5265/11151/10959/54732/1522"	27
-"86"	"Up"	"GO:0090114"	"COPII-coated vesicle budding"	"13/549"	"70/17913"	1.75130380061156e-07	7.62428073196473e-06	6.75012933675127e-06	"8775/5861/9218/56681/9217/9871/10016/27095/10342/81876/5265/10959/1522"	13
-"87"	"Up"	"GO:0006913"	"nucleocytoplasmic transport"	"28/549"	"302/17913"	2.08447670611737e-07	8.97043768701545e-06	7.94194452215803e-06	"9775/11331/6426/11338/8683/3267/5594/9349/11315/10189/10250/6431/6634/10204/6428/9939/129401/26097/6628/5566/11261/6427/6430/55110/6632/6636/6637/6209"	28
-"88"	"Up"	"GO:0016054"	"organic acid catabolic process"	"25/549"	"250/17913"	2.25211973377463e-07	9.47408571151934e-06	8.38784747682591e-06	"1666/2806/3295/7263/3028/1891/2746/30/55347/10327/55577/4357/23564/3073/1632/587/23576/3712/5860/2184/11261/2752/51181/5092/2990"	25
-"89"	"Up"	"GO:0046395"	"carboxylic acid catabolic process"	"25/549"	"250/17913"	2.25211973377463e-07	9.47408571151934e-06	8.38784747682591e-06	"1666/2806/3295/7263/3028/1891/2746/30/55347/10327/55577/4357/23564/3073/1632/587/23576/3712/5860/2184/11261/2752/51181/5092/2990"	25
-"90"	"Up"	"GO:0048002"	"antigen processing and presentation of peptide antigen"	"21/549"	"188/17913"	3.36535952519222e-07	1.38565862040824e-05	1.22678784178631e-05	"7879/5689/1211/5686/5690/5692/5682/830/51752/1509/9871/8673/375/5691/6892/29108/9341/567/5696/3123/3122"	21
-"91"	"Up"	"GO:0031503"	"protein-containing complex localization"	"24/549"	"238/17913"	3.36792025793669e-07	1.38565862040824e-05	1.22678784178631e-05	"9775/6426/11338/8683/4218/3267/10189/10250/6431/5906/5899/6428/9939/129401/26097/83658/83657/5813/23557/403/6427/6430/55110/6209"	24
-"92"	"Up"	"GO:0048024"	"regulation of mRNA splicing, via spliceosome"	"13/549"	"75/17913"	4.06058726897433e-07	1.65248247119999e-05	1.46301937185356e-05	"27316/9967/5725/708/11338/8683/6625/6431/10284/6428/9939/10772/135295"	13
-"93"	"Up"	"GO:0016072"	"rRNA metabolic process"	"21/549"	"191/17913"	4.39083964308986e-07	1.76766705631489e-05	1.56499762717487e-05	"6125/9775/6154/6217/6129/6232/6229/6187/6135/6223/6203/6155/6234/6201/6208/6218/55651/6165/54433/55505/6209"	21
-"94"	"Up"	"GO:0051168"	"nuclear export"	"20/549"	"176/17913"	4.85279134748809e-07	1.93285646861653e-05	1.71124747516685e-05	"9775/6426/11338/8683/3267/11315/10189/10250/6431/10204/6428/9939/129401/26097/5566/11261/6427/6430/55110/6209"	20
-"95"	"Up"	"GO:0071426"	"ribonucleoprotein complex export from nucleus"	"16/549"	"116/17913"	4.99401922811749e-07	1.96816926211283e-05	1.74251152901296e-05	"9775/6426/11338/8683/3267/10189/10250/6431/6428/9939/129401/26097/6427/6430/55110/6209"	16
-"96"	"Up"	"GO:0071166"	"ribonucleoprotein complex localization"	"16/549"	"117/17913"	5.62404914036554e-07	2.19337916474256e-05	1.94190030076876e-05	"9775/6426/11338/8683/3267/10189/10250/6431/6428/9939/129401/26097/6427/6430/55110/6209"	16
-"97"	"Up"	"GO:0006406"	"mRNA export from nucleus"	"15/549"	"107/17913"	9.17252782245069e-07	3.50428001706688e-05	3.10250162329723e-05	"9775/6426/11338/8683/3267/10189/10250/6431/6428/9939/129401/26097/6427/6430/55110"	15
-"98"	"Up"	"GO:0071427"	"mRNA-containing ribonucleoprotein complex export from nucleus"	"15/549"	"107/17913"	9.17252782245069e-07	3.50428001706688e-05	3.10250162329723e-05	"9775/6426/11338/8683/3267/10189/10250/6431/6428/9939/129401/26097/6427/6430/55110"	15
-"99"	"Up"	"GO:0006405"	"RNA export from nucleus"	"16/549"	"122/17913"	9.98911105937536e-07	3.75548895142822e-05	3.32490854364807e-05	"9775/6426/11338/8683/3267/10189/10250/6431/6428/9939/129401/26097/6427/6430/55110/6209"	16
-"100"	"Up"	"GO:0044282"	"small molecule catabolic process"	"32/549"	"404/17913"	1.00306863018916e-06	3.75548895142822e-05	3.32490854364807e-05	"7167/1666/2806/3295/2582/7263/3028/1891/2746/30/55347/10327/55577/4357/23564/3073/1632/587/23576/3712/3029/5860/26007/2184/11261/2752/2026/51181/5092/30833/2990/1890"	32
-"101"	"Up"	"GO:0050684"	"regulation of mRNA processing"	"15/549"	"108/17913"	1.03561934893679e-06	3.83896915091024e-05	3.39881743595826e-05	"27316/9967/5725/708/11338/8683/6625/6626/6431/10284/6428/9939/10772/135295/11051"	15
-"102"	"Up"	"GO:0051438"	"regulation of ubiquitin-protein transferase activity"	"10/549"	"47/17913"	1.25646804036922e-06	4.61197680700232e-05	4.08319696503889e-05	"6125/5861/6187/6135/7332/9349/11315/6201/7334/5300"	10
-"103"	"Up"	"GO:0015931"	"nucleobase-containing compound transport"	"22/549"	"221/17913"	1.29025509673501e-06	4.6900146428892e-05	4.15228748044818e-05	"9775/220988/6426/11338/7263/8683/3267/10189/10250/51637/6431/29074/10204/6428/9939/129401/26097/5813/6427/6430/55110/6209"	22
-"104"	"Up"	"GO:0034470"	"ncRNA processing"	"26/549"	"293/17913"	1.30581435928588e-06	4.70093169342915e-05	4.16195285161055e-05	"6125/9775/51493/6154/6217/6129/6232/6229/6187/6135/6223/6203/3028/6155/51637/6234/6201/6208/26024/6218/55651/6165/55644/54433/55505/6209"	26
-"105"	"Up"	"GO:0006888"	"ER to Golgi vesicle-mediated transport"	"19/549"	"172/17913"	1.44158298806751e-06	5.14027305459501e-05	4.5509221347615e-05	"8775/10652/5861/9218/56681/830/9217/9871/375/10016/22818/27095/378/10342/81876/5265/10959/54732/1522"	19
-"106"	"Up"	"GO:0002478"	"antigen processing and presentation of exogenous peptide antigen"	"19/549"	"174/17913"	1.71766122480869e-06	6.06690908083372e-05	5.37131598502738e-05	"7879/5689/1211/5686/5690/5692/5682/830/1509/9871/8673/375/5691/6892/9341/567/5696/3123/3122"	19
-"107"	"Up"	"GO:0019884"	"antigen processing and presentation of exogenous antigen"	"19/549"	"176/17913"	2.04090103528622e-06	7.14124623935663e-05	6.32247649790093e-05	"7879/5689/1211/5686/5690/5692/5682/830/1509/9871/8673/375/5691/6892/9341/567/5696/3123/3122"	19
-"108"	"Up"	"GO:0051028"	"mRNA transport"	"17/549"	"146/17913"	2.48537673196095e-06	8.61597267079796e-05	7.62812020365013e-05	"9775/220988/6426/11338/8683/3267/10189/10250/6431/10204/6428/9939/129401/26097/6427/6430/55110"	17
-"109"	"Up"	"GO:0045727"	"positive regulation of translation"	"15/549"	"117/17913"	2.89866867604576e-06	9.95652800285809e-05	8.81497601242693e-05	"6125/9775/6191/387/708/6154/1994/6156/5594/7431/84305/28958/51065/1153/5935"	15
-"110"	"Up"	"GO:0006885"	"regulation of pH"	"12/549"	"76/17913"	3.16453953145972e-06	0.000107709418234411	9.53601433929825e-05	"7879/9114/506/537/5594/5538/9550/534/11261/23557/51382/2896"	12
-"111"	"Up"	"GO:0030641"	"regulation of cellular pH"	"11/549"	"65/17913"	4.05096760251682e-06	0.000136638042376784	0.000120971996020156	"7879/9114/506/5594/5538/9550/534/11261/23557/51382/2896"	11
-"112"	"Up"	"GO:0019882"	"antigen processing and presentation"	"21/549"	"220/17913"	4.37480412926923e-06	0.000146243452321286	0.000129476110931098	"7879/5689/1211/5686/5690/5692/5682/830/51752/1509/9871/8673/375/5691/6892/29108/9341/567/5696/3123/3122"	21
-"113"	"Up"	"GO:1990542"	"mitochondrial transmembrane transport"	"11/549"	"66/17913"	4.72846816070739e-06	0.00015666712206804	0.000138704669194854	"7263/498/506/10632/522/29074/81855/26519/26520/513/521"	11
-"114"	"Up"	"GO:0006901"	"vesicle coating"	"11/549"	"67/17913"	5.50288059964626e-06	0.000180726183904172	0.000160005272468015	"8775/5861/9871/10016/27095/10342/81876/5265/10959/54732/1522"	11
-"115"	"Up"	"GO:0002474"	"antigen processing and presentation of peptide antigen via MHC class I"	"13/549"	"95/17913"	6.39820047467655e-06	0.000208303152845122	0.000184420442057267	"5689/5686/5690/5692/5682/51752/9871/8673/5691/6892/9341/567/5696"	13
-"116"	"Up"	"GO:0048199"	"vesicle targeting, to, from or within Golgi"	"11/549"	"70/17913"	8.52813923143081e-06	0.000275253045538594	0.000243694287112301	"8775/5861/9871/10016/27095/10342/81876/5265/10959/54732/1522"	11
-"117"	"Up"	"GO:0006123"	"mitochondrial electron transport, cytochrome c to oxygen"	"6/549"	"18/17913"	1.09320677914168e-05	0.000346861540771735	0.000307092609055947	"1345/9377/4697/1340/1329/4513"	6
-"118"	"Up"	"GO:0019646"	"aerobic electron transport chain"	"6/549"	"18/17913"	1.09320677914168e-05	0.000346861540771735	0.000307092609055947	"1345/9377/4697/1340/1329/4513"	6
-"119"	"Up"	"GO:0007007"	"inner mitochondrial membrane organization"	"8/549"	"37/17913"	1.30303923895766e-05	0.000409964614340965	0.00036296068672956	"498/506/10632/522/26519/26520/513/521"	8
-"120"	"Up"	"GO:0051453"	"regulation of intracellular pH"	"10/549"	"61/17913"	1.48895278797333e-05	0.000464553269847678	0.000411290555204211	"7879/9114/506/5538/9550/534/11261/23557/51382/2896"	10
-"121"	"Up"	"GO:0002479"	"antigen processing and presentation of exogenous peptide antigen via MHC class I, TAP-dependent"	"11/549"	"75/17913"	1.68133797711367e-05	0.000517740876698616	0.000458380010324995	"5689/5686/5690/5692/5682/8673/5691/6892/9341/567/5696"	11
-"122"	"Up"	"GO:0006903"	"vesicle targeting"	"12/549"	"89/17913"	1.68708298496878e-05	0.000517740876698616	0.000458380010324995	"8775/10652/5861/9871/10016/27095/10342/81876/5265/10959/54732/1522"	12
-"123"	"Up"	"GO:0045851"	"pH reduction"	"9/549"	"50/17913"	1.82476610286479e-05	0.000555440999115917	0.000491757677186241	"7879/9114/537/5538/9550/534/23557/51382/2896"	9
-"124"	"Up"	"GO:1903320"	"regulation of protein modification by small protein conjugation or removal"	"20/549"	"223/17913"	1.85400154983666e-05	0.000559788855047458	0.000495607035690633	"6125/5861/6187/11338/6135/29979/6188/7332/7329/9349/11315/10016/6201/706/408/7334/11261/9636/54472/5300"	20
-"125"	"Up"	"GO:0006890"	"retrograde vesicle-mediated transport, Golgi to ER"	"11/549"	"76/17913"	1.91231835040052e-05	0.000568231738404725	0.000503081911897346	"8775/5861/11079/381/377/22818/6892/378/81876/10959/54732"	11
-"126"	"Up"	"GO:0031397"	"negative regulation of protein ubiquitination"	"11/549"	"76/17913"	1.91231835040052e-05	0.000568231738404725	0.000503081911897346	"6125/11338/6135/6188/9349/11315/6201/706/408/11261/9636"	11
-"127"	"Up"	"GO:0006914"	"autophagy"	"32/549"	"471/17913"	2.40627372949795e-05	0.000703835065878149	0.000623137826824756	"7879/5868/5861/3315/9114/29979/493856/4218/56993/6625/826/11315/8673/5899/5476/55004/706/29108/5049/29978/401505/7251/81876/5566/9550/534/23557/27243/51382/54472/5660/8649"	32
-"128"	"Up"	"GO:0061919"	"process utilizing autophagic mechanism"	"32/549"	"471/17913"	2.40627372949795e-05	0.000703835065878149	0.000623137826824756	"7879/5868/5861/3315/9114/29979/493856/4218/56993/6625/826/11315/8673/5899/5476/55004/706/29108/5049/29978/401505/7251/81876/5566/9550/534/23557/27243/51382/54472/5660/8649"	32
-"129"	"Up"	"GO:0042590"	"antigen processing and presentation of exogenous peptide antigen via MHC class I"	"11/549"	"78/17913"	2.45778685477072e-05	0.000713329766221828	0.000631543925391514	"5689/5686/5690/5692/5682/8673/5691/6892/9341/567/5696"	11
-"130"	"Up"	"GO:0034250"	"positive regulation of cellular amide metabolic process"	"15/549"	"140/17913"	2.6305034155649e-05	0.000751215460972616	0.000665085888046212	"6125/9775/6191/387/708/6154/1994/6156/5594/7431/84305/28958/51065/1153/5935"	15
-"131"	"Up"	"GO:0048207"	"vesicle targeting, rough ER to cis-Golgi"	"10/549"	"65/17913"	2.64851604830089e-05	0.000751215460972616	0.000665085888046212	"8775/5861/9871/10016/27095/10342/81876/5265/10959/1522"	10
-"132"	"Up"	"GO:0048208"	"COPII vesicle coating"	"10/549"	"65/17913"	2.64851604830089e-05	0.000751215460972616	0.000665085888046212	"8775/5861/9871/10016/27095/10342/81876/5265/10959/1522"	10
-"133"	"Up"	"GO:0042776"	"mitochondrial ATP synthesis coupled proton transport"	"6/549"	"21/17913"	2.95439202934483e-05	0.000831672462997523	0.000736318203435448	"498/506/10632/522/513/521"	6
-"134"	"Up"	"GO:0030004"	"cellular monovalent inorganic cation homeostasis"	"11/549"	"80/17913"	3.13278724770172e-05	0.000875310108611585	0.000774952634957794	"7879/9114/506/5594/5538/9550/534/11261/23557/51382/2896"	11
-"135"	"Up"	"GO:0000380"	"alternative mRNA splicing, via spliceosome"	"9/549"	"54/17913"	3.47370636343083e-05	0.000963374564791483	0.00085292018233479	"4670/27316/9967/5725/6426/6431/10284/9939/135295"	9
-"136"	"Up"	"GO:0031396"	"regulation of protein ubiquitination"	"18/549"	"196/17913"	3.51261722750091e-05	0.00096700286027672	0.000856132480603743	"6125/5861/6187/11338/6135/29979/6188/7332/9349/11315/10016/6201/706/408/7334/11261/9636/5300"	18
-"137"	"Up"	"GO:0016236"	"macroautophagy"	"22/549"	"272/17913"	3.5895222681902e-05	0.000980961414022197	0.000868490635615132	"7879/5868/5861/9114/29979/56993/826/8673/5899/55004/5049/29978/401505/7251/81876/5566/9550/534/23557/27243/51382/8649"	22
-"138"	"Up"	"GO:0009063"	"cellular amino acid catabolic process"	"13/549"	"115/17913"	5.12900894023702e-05	0.00139152242552517	0.00123197934041239	"2806/7263/3028/2746/4357/23564/587/23576/3712/5860/2184/2752/5092"	13
-"139"	"Up"	"GO:0015985"	"energy coupled proton transport, down electrochemical gradient"	"6/549"	"23/17913"	5.21633147150505e-05	0.00139499607352249	0.00123505472208793	"498/506/10632/522/513/521"	6
-"140"	"Up"	"GO:0015986"	"ATP synthesis coupled proton transport"	"6/549"	"23/17913"	5.21633147150505e-05	0.00139499607352249	0.00123505472208793	"498/506/10632/522/513/521"	6
-"141"	"Up"	"GO:1903321"	"negative regulation of protein modification by small protein conjugation or removal"	"11/549"	"86/17913"	6.19932970738211e-05	0.00164611988825806	0.00145738628208632	"6125/11338/6135/6188/9349/11315/6201/706/408/11261/9636"	11
-"142"	"Up"	"GO:0035722"	"interleukin-12-mediated signaling pathway"	"8/549"	"47/17913"	8.1077420952753e-05	0.00213770326793738	0.00189260784714766	"5478/9987/3185/5908/4282/6647/375/5898"	8
-"143"	"Up"	"GO:0009065"	"glutamine family amino acid catabolic process"	"6/549"	"25/17913"	8.68623333840219e-05	0.00227421381950894	0.00201346696964509	"2806/2746/23564/23576/2184/2752"	6
-"144"	"Up"	"GO:0051444"	"negative regulation of ubiquitin-protein transferase activity"	"5/549"	"16/17913"	8.76113491566878e-05	0.00227789507807388	0.00201672615858487	"6125/6135/9349/11315/6201"	5
-"145"	"Up"	"GO:0051452"	"intracellular pH reduction"	"8/549"	"48/17913"	9.47131828134386e-05	0.00244555969967941	0.00216516742417073	"7879/9114/5538/9550/534/23557/51382/2896"	8
-"146"	"Up"	"GO:0006417"	"regulation of translation"	"27/549"	"397/17913"	0.000101354418145478	0.0025991160379224	0.00230111797217095	"6125/9775/6191/387/708/6154/1994/6156/3315/23521/5594/6188/1974/26065/6208/9939/5813/7431/84305/28958/6726/136319/1975/51065/1153/5935/6169"	27
-"147"	"Up"	"GO:0042255"	"ribosome assembly"	"6/549"	"26/17913"	0.00011001582567521	0.00278759961265426	0.00246799122251695	"6125/708/6135/6223/6208/6169"	6
-"148"	"Up"	"GO:0071349"	"cellular response to interleukin-12"	"8/549"	"49/17913"	0.000110193574431846	0.00278759961265426	0.00246799122251695	"5478/9987/3185/5908/4282/6647/375/5898"	8
-"149"	"Up"	"GO:0070671"	"response to interleukin-12"	"8/549"	"50/17913"	0.000127707081746741	0.0032089618393275	0.00284104274405148	"5478/9987/3185/5908/4282/6647/375/5898"	8
-"150"	"Up"	"GO:0042273"	"ribosomal large subunit biogenesis"	"6/549"	"27/17913"	0.000137811826569068	0.00343978319116393	0.00304539959204206	"6125/6154/6129/6135/6165/6169"	6
-"151"	"Up"	"GO:0034248"	"regulation of cellular amide metabolic process"	"29/549"	"452/17913"	0.000156349093715087	0.00387662918456481	0.0034321596103786	"6125/9775/6191/387/708/6154/1994/6156/3315/23521/5594/6188/1974/6625/5476/26065/6208/9939/5813/7431/84305/28958/6726/136319/1975/51065/1153/5935/6169"	29
-"152"	"Up"	"GO:0030833"	"regulation of actin filament polymerization"	"13/549"	"129/17913"	0.000167465575319725	0.00412494153945427	0.00365200205458319	"10095/387/10109/11344/10093/2885/375/10092/10094/29108/822/136319/11151"	13
-"153"	"Up"	"GO:0008064"	"regulation of actin polymerization or depolymerization"	"14/549"	"147/17913"	0.000173878415415797	0.00425490710664539	0.00376706659886031	"11034/10095/387/10109/11344/10093/2885/375/10092/10094/29108/822/136319/11151"	14
-"154"	"Up"	"GO:0019058"	"viral life cycle"	"23/549"	"324/17913"	0.00017537530595724	0.00426366977599938	0.0037748245964412	"7879/5868/1487/5478/5861/9218/3921/1508/51495/9217/950/8673/129401/10410/8724/7251/81876/3956/684/64710/27243/9636/8815"	23
-"155"	"Up"	"GO:0030832"	"regulation of actin filament length"	"14/549"	"148/17913"	0.000186766177133915	0.00451130688509276	0.00399406921422546	"11034/10095/387/10109/11344/10093/2885/375/10092/10094/29108/822/136319/11151"	14
-"156"	"Up"	"GO:0006839"	"mitochondrial transport"	"18/549"	"224/17913"	0.000195607645436147	0.00469458349046752	0.00415633249310679	"7263/498/506/10632/56993/7332/522/29074/706/131118/401505/23593/26517/81855/26519/26520/513/521"	18
-"157"	"Up"	"GO:0009060"	"aerobic respiration"	"9/549"	"68/17913"	0.000220147852934787	0.00524989529546397	0.0046479757887472	"1345/6390/9377/81889/4697/1340/1329/4513/513"	9
-"158"	"Up"	"GO:0000381"	"regulation of alternative mRNA splicing, via spliceosome"	"7/549"	"41/17913"	0.000222241278687851	0.0052662743506792	0.00466247692596964	"27316/9967/5725/6431/10284/9939/135295"	7
-"159"	"Up"	"GO:0019042"	"viral latency"	"4/549"	"11/17913"	0.00024256058450578	0.00568388257075972	0.00503220485136144	"5478/64710/8815/3159"	4
-"160"	"Up"	"GO:0030838"	"positive regulation of actin filament polymerization"	"10/549"	"84/17913"	0.000242900964562381	0.00568388257075972	0.00503220485136144	"10095/387/10109/10093/2885/375/10092/10094/29108/11151"	10
-"161"	"Up"	"GO:0061025"	"membrane fusion"	"12/549"	"117/17913"	0.000250843748603082	0.00583328568180085	0.00516447835469829	"7879/5478/8775/10652/9218/4218/6892/9341/25801/11261/23557/11151"	12
-"162"	"Up"	"GO:0034314"	"Arp2/3 complex-mediated actin nucleation"	"6/549"	"30/17913"	0.00025568319254502	0.00587287038581936	0.00519952452905566	"10095/10109/10093/375/10092/10094"	6
-"163"	"Up"	"GO:0042407"	"cristae formation"	"6/549"	"30/17913"	0.00025568319254502	0.00587287038581936	0.00519952452905566	"498/506/10632/522/513/521"	6
-"164"	"Up"	"GO:0006376"	"mRNA splice site selection"	"7/549"	"42/17913"	0.000259726808432233	0.0059293729925017	0.00524954890727279	"6426/8683/6431/7536/10772/135295/6430"	7
-"165"	"Up"	"GO:0002429"	"immune response-activating cell surface receptor signaling pathway"	"26/549"	"399/17913"	0.00026603332355071	0.00603653795984157	0.00534442702303788	"5689/10095/10109/1967/10093/5686/10163/5690/5692/5594/5682/6188/2885/1399/5906/5691/10092/10094/29085/1398/5566/7334/4582/5696/3123/3122"	26
-"166"	"Up"	"GO:0006826"	"iron ion transport"	"8/549"	"56/17913"	0.000287673289870447	0.00648605843669643	0.00574240834940313	"9230/9114/537/9550/534/51382/567/2512"	8
-"167"	"Up"	"GO:0010506"	"regulation of autophagy"	"22/549"	"314/17913"	0.000289308696294953	0.00648605843669643	0.00574240834940313	"5868/3315/9114/493856/4218/6625/826/11315/5899/5476/55004/706/29108/5049/29978/81876/5566/9550/534/51382/5660/8649"	22
-"168"	"Up"	"GO:0045010"	"actin nucleation"	"7/549"	"43/17913"	0.000302133568122818	0.00673326237530851	0.00596126946127038	"10095/10109/10093/375/10092/10094/11151"	7
-"169"	"Up"	"GO:0000245"	"spliceosomal complex assembly"	"9/549"	"71/17913"	0.000306749392288887	0.00679567884455381	0.00601652965629216	"6426/8683/6431/7536/10772/135295/6430/6632/6637"	9
-"170"	"Up"	"GO:0051650"	"establishment of vesicle localization"	"19/549"	"253/17913"	0.000312580713234674	0.00688413053147422	0.00609484003700302	"5868/8775/10652/5861/9230/5908/79083/9871/5906/375/10016/27095/10342/81876/23557/5265/10959/54732/1522"	19
-"171"	"Up"	"GO:0006081"	"cellular aldehyde metabolic process"	"9/549"	"72/17913"	0.00034121559622028	0.00747082568566508	0.00661426846720629	"7167/2806/11315/10327/25796/3029/8574/55163/26007"	9
-"172"	"Up"	"GO:1901136"	"carbohydrate derivative catabolic process"	"15/549"	"176/17913"	0.00035014135064828	0.00762168149318117	0.0067478281101067	"3094/55347/55577/3073/3704/4669/2760/6448/79077/11261/5660/2717/30833/2990/1890"	15
-"173"	"Up"	"GO:0043488"	"regulation of mRNA stability"	"14/549"	"158/17913"	0.000368013318072001	0.00796299022338638	0.00705000455843559	"9967/5689/1994/10949/3315/5686/5690/9261/5692/5682/5691/7431/1153/5696"	14
-"174"	"Up"	"GO:0055067"	"monovalent inorganic cation homeostasis"	"12/549"	"122/17913"	0.000370074866150969	0.00796299022338638	0.00705000455843559	"7879/9114/506/537/5594/5538/9550/534/11261/23557/51382/2896"	12
-"175"	"Up"	"GO:0071453"	"cellular response to oxygen levels"	"18/549"	"237/17913"	0.000389590062044763	0.00833500109883196	0.00737936303987343	"11331/5689/2782/6921/26608/9114/29979/5686/5690/5692/537/5682/5691/23576/9550/6923/51142/5696"	18
-"176"	"Up"	"GO:1903902"	"positive regulation of viral life cycle"	"8/549"	"59/17913"	0.000414419149332083	0.00881582554033704	0.00780505921798283	"5478/9218/51495/9217/7251/3956/64710/27243"	8
-"177"	"Up"	"GO:1990748"	"cellular detoxification"	"11/549"	"107/17913"	0.000440795698871702	0.0093051794047728	0.00823830688979688	"10549/25824/4259/6647/11315/10327/373156/84817/2879/2876/10935"	11
-"178"	"Up"	"GO:0032271"	"regulation of protein polymerization"	"15/549"	"180/17913"	0.000444879036713229	0.0093051794047728	0.00823830688979688	"10095/387/10109/11344/10093/24139/6188/2885/375/10092/10094/29108/822/136319/11151"	15
-"179"	"Up"	"GO:0050852"	"T cell receptor signaling pathway"	"15/549"	"180/17913"	0.000444879036713229	0.0093051794047728	0.00823830688979688	"5689/1967/5686/5690/5692/5594/5682/6188/1399/5691/29085/7334/5696/3123/3122"	15
-"180"	"Up"	"GO:1904666"	"regulation of ubiquitin protein ligase activity"	"5/549"	"22/17913"	0.000453564976482124	0.00943415151082819	0.00835249187685503	"6125/5861/6135/9349/6201"	5
-"181"	"Up"	"GO:0006520"	"cellular amino acid metabolic process"	"23/549"	"347/17913"	0.000466866493174278	0.0096571721019033	0.00854994234955395	"2806/5689/10549/7263/5686/5690/3028/5692/2746/5682/11315/5691/4357/23564/587/23576/3712/5860/2184/670/2752/5696/5092"	23
-"182"	"Up"	"GO:0043487"	"regulation of RNA stability"	"14/549"	"163/17913"	0.000504695418364813	0.0103255718380211	0.00914170763549494	"9967/5689/1994/10949/3315/5686/5690/9261/5692/5682/5691/7431/1153/5696"	14
-"183"	"Up"	"GO:2001242"	"regulation of intrinsic apoptotic signaling pathway"	"14/549"	"163/17913"	0.000504695418364813	0.0103255718380211	0.00914170763549494	"6154/3315/6135/29979/4282/6647/6188/51060/11315/7178/6201/29108/2876/4582"	14
-"184"	"Up"	"GO:0006521"	"regulation of cellular amino acid metabolic process"	"8/549"	"61/17913"	0.00052169000938565	0.0106152575822819	0.00939817986015683	"5689/5686/5690/5692/5682/11315/5691/5696"	8
-"185"	"Up"	"GO:0030041"	"actin filament polymerization"	"13/549"	"145/17913"	0.000527522279887021	0.0106759103562	0.00945187857390742	"10095/387/10109/11344/10093/2885/375/10092/10094/29108/822/136319/11151"	13
-"186"	"Up"	"GO:0061418"	"regulation of transcription from RNA polymerase II promoter in response to hypoxia"	"9/549"	"77/17913"	0.000565005628347534	0.0113730165189955	0.0100690589907549	"5689/6921/5686/5690/5692/5682/5691/6923/5696"	9
-"187"	"Up"	"GO:1903900"	"regulation of viral life cycle"	"13/549"	"147/17913"	0.000601050009975673	0.0120338568842188	0.0106541316150487	"5478/9218/51495/9217/10410/8724/7251/3956/684/64710/27243/9636/8815"	13
-"188"	"Up"	"GO:0006749"	"glutathione metabolic process"	"7/549"	"48/17913"	0.000604966312449686	0.0120478397543172	0.010666511298455	"6647/11315/26873/55748/2879/3029/2876"	7
-"189"	"Up"	"GO:0051648"	"vesicle localization"	"19/549"	"270/17913"	0.000696580174612443	0.0137989215542274	0.0122168252289311	"5868/8775/10652/5861/9230/5908/79083/9871/5906/375/10016/27095/10342/81876/23557/5265/10959/54732/1522"	19
-"190"	"Up"	"GO:0098754"	"detoxification"	"11/549"	"113/17913"	0.000701686737404817	0.0138269218149665	0.012241615158381	"10549/25824/4259/6647/11315/10327/373156/84817/2879/2876/10935"	11
-"191"	"Up"	"GO:0015682"	"ferric iron transport"	"6/549"	"36/17913"	0.00071780202948794	0.0139246155357661	0.0123281079403192	"9230/9114/537/9550/534/51382"	6
-"192"	"Up"	"GO:0033572"	"transferrin transport"	"6/549"	"36/17913"	0.00071780202948794	0.0139246155357661	0.0123281079403192	"9230/9114/537/9550/534/51382"	6
-"193"	"Up"	"GO:0072512"	"trivalent inorganic cation transport"	"6/549"	"36/17913"	0.00071780202948794	0.0139246155357661	0.0123281079403192	"9230/9114/537/9550/534/51382"	6
-"194"	"Up"	"GO:0008154"	"actin polymerization or depolymerization"	"14/549"	"170/17913"	0.000766976771921465	0.0148018610003813	0.0131047740357064	"11034/10095/387/10109/11344/10093/2885/375/10092/10094/29108/822/136319/11151"	14
-"195"	"Up"	"GO:0043687"	"post-translational protein modification"	"23/549"	"360/17913"	0.000773660614865668	0.0148542838054208	0.013151186376313	"5868/5689/6921/5861/9230/5686/5690/5692/4218/4924/5682/25870/5862/10920/5691/4738/81876/6923/3956/5265/5696/2335/3371"	23
-"196"	"Up"	"GO:0000387"	"spliceosomal snRNP assembly"	"7/549"	"50/17913"	0.000778545865125719	0.0148718148930137	0.0131667074612293	"6634/6628/10772/135295/6632/6636/6637"	7
-"197"	"Up"	"GO:0051258"	"protein polymerization"	"17/549"	"232/17913"	0.000837841173874837	0.0159123833113466	0.01408797094226	"10095/387/10109/11344/10093/24139/6188/2885/375/10092/10094/29108/2879/822/27243/136319/11151"	17
-"198"	"Up"	"GO:1901606"	"alpha-amino acid catabolic process"	"10/549"	"98/17913"	0.000841520271273136	0.0159123833113466	0.01408797094226	"2806/2746/23564/587/23576/3712/5860/2184/2752/5092"	10
-"199"	"Up"	"GO:0000038"	"very long-chain fatty acid metabolic process"	"5/549"	"25/17913"	0.000848203638723657	0.0159581629315647	0.0141285017632415	"3295/51495/30/641371/10965"	5
-"200"	"Up"	"GO:0032273"	"positive regulation of protein polymerization"	"11/549"	"116/17913"	0.000873944669046536	0.0163602442045511	0.0144844829622502	"10095/387/10109/10093/6188/2885/375/10092/10094/29108/11151"	11
-"201"	"Up"	"GO:0032956"	"regulation of actin cytoskeleton organization"	"20/549"	"297/17913"	0.000882230104815222	0.0164331816538716	0.0145490578688826	"11034/10095/387/10109/11344/10093/10163/2885/375/396/10092/10094/29108/29085/822/1398/684/136319/11151/397"	20
-"202"	"Up"	"GO:0045921"	"positive regulation of exocytosis"	"9/549"	"82/17913"	0.000896864486983607	0.0166230724716169	0.0147171770167346	"7879/5868/537/8673/375/9545/7251/27243/5874"	9
-"203"	"Up"	"GO:0098869"	"cellular oxidant detoxification"	"10/549"	"99/17913"	0.000910976750280902	0.0168014628229148	0.0148751142682632	"10549/25824/4259/6647/11315/373156/84817/2879/2876/10935"	10
-"204"	"Up"	"GO:0002768"	"immune response-regulating cell surface receptor signaling pathway"	"26/549"	"434/17913"	0.000937534408096482	0.0172065138427119	0.0152337247218567	"5689/10095/10109/1967/10093/5686/10163/5690/5692/5594/5682/6188/2885/1399/5906/5691/10092/10094/29085/1398/5566/7334/4582/5696/3123/3122"	26
-"205"	"Up"	"GO:0044088"	"regulation of vacuole organization"	"6/549"	"38/17913"	0.000966037123837354	0.0176431365446198	0.0156202870498784	"5868/950/5899/29978/81876/2896"	6
-"206"	"Up"	"GO:0030149"	"sphingolipid catabolic process"	"5/549"	"26/17913"	0.00102396264183043	0.0185203677826722	0.0163969405498298	"5538/2760/5660/2717/427"	5
-"207"	"Up"	"GO:1902175"	"regulation of oxidative stress-induced intrinsic apoptotic signaling pathway"	"5/549"	"26/17913"	0.00102396264183043	0.0185203677826722	0.0163969405498298	"3315/29979/6647/11315/2876"	5
-"208"	"Up"	"GO:0019079"	"viral genome replication"	"11/549"	"120/17913"	0.00115674199770094	0.0208213559586169	0.0184341120989891	"5868/1487/5478/9218/51495/9217/10410/684/64710/9636/8815"	11
-"209"	"Up"	"GO:0035459"	"cargo loading into vesicle"	"4/549"	"16/17913"	0.00118400740798662	0.0212101614138847	0.0187783396008556	"5861/56681/9871/10959"	4
-"210"	"Up"	"GO:0061013"	"regulation of mRNA catabolic process"	"14/549"	"178/17913"	0.00119949293670121	0.0213852455000444	0.0189333496625168	"9967/5689/1994/10949/3315/5686/5690/9261/5692/5682/5691/7431/1153/5696"	14
-"211"	"Up"	"GO:0048524"	"positive regulation of viral process"	"10/549"	"103/17913"	0.00123747674036962	0.0219424036937419	0.0194266276517075	"7879/5478/9218/51495/9217/7251/2963/3956/64710/27243"	10
-"212"	"Up"	"GO:0099132"	"ATP hydrolysis coupled cation transmembrane transport"	"7/549"	"54/17913"	0.00124246516641914	0.0219424036937419	0.0194266276517075	"308/9114/498/506/10632/537/513"	7
-"213"	"Up"	"GO:0034446"	"substrate adhesion-dependent cell spreading"	"9/549"	"86/17913"	0.0012636221383235	0.0221467531360595	0.0196075476904666	"708/10109/5861/1399/55742/1398/9341/2335/10631"	9
-"214"	"Up"	"GO:0016482"	"cytosolic transport"	"12/549"	"140/17913"	0.00126586676578973	0.0221467531360595	0.0196075476904666	"7879/5868/51699/10652/51552/5594/29934/8724/9341/11151/10772/400"	12
-"215"	"Up"	"GO:0038093"	"Fc receptor signaling pathway"	"17/549"	"241/17913"	0.0012726102912222	0.022161176420167	0.0196203172928211	"5689/10095/10109/10093/5686/10163/5690/5692/5594/5682/2885/5906/5691/10092/10094/1398/5696"	17
-"216"	"Up"	"GO:0034660"	"ncRNA metabolic process"	"27/549"	"470/17913"	0.00139660724874951	0.0242078589783248	0.0214323402841725	"6125/9775/51493/6154/6217/6129/6232/6229/6187/6135/6223/6203/3028/6155/51637/6234/6201/6208/26024/6218/55651/6165/55644/2963/54433/55505/6209"	27
-"217"	"Up"	"GO:0051443"	"positive regulation of ubiquitin-protein transferase activity"	"5/549"	"28/17913"	0.00145459340152638	0.0248919439338786	0.0220379924223413	"5861/6187/7332/7334/5300"	5
-"218"	"Up"	"GO:0090383"	"phagosome acidification"	"5/549"	"28/17913"	0.00145459340152638	0.0248919439338786	0.0220379924223413	"7879/9114/9550/534/51382"	5
-"219"	"Up"	"GO:0098927"	"vesicle-mediated transport between endosomal compartments"	"6/549"	"41/17913"	0.00145601915638873	0.0248919439338786	0.0220379924223413	"7879/5868/5594/29934/8724/11151"	6
-"220"	"Up"	"GO:0042177"	"negative regulation of protein catabolic process"	"11/549"	"124/17913"	0.00151092568268702	0.0255995909974151	0.0226645051874888	"6125/5245/6135/6625/9349/11315/29934/5476/6201/8724/5300"	11
-"221"	"Up"	"GO:0046514"	"ceramide catabolic process"	"4/549"	"17/17913"	0.00151108696859742	0.0255995909974151	0.0226645051874888	"2760/5660/2717/427"	4
-"222"	"Up"	"GO:0050792"	"regulation of viral process"	"15/549"	"204/17913"	0.00160215428815683	0.0270201155624288	0.0239221614670738	"7879/5478/9218/51495/9217/10410/8724/7251/2963/3956/684/64710/27243/9636/8815"	15
-"223"	"Up"	"GO:0090382"	"phagosome maturation"	"6/549"	"42/17913"	0.00165540121438148	0.0277929244244138	0.0246063649945116	"7879/9114/9550/534/51382/11151"	6
-"224"	"Up"	"GO:0006879"	"cellular iron ion homeostasis"	"7/549"	"57/17913"	0.00171423994188654	0.0286522961715322	0.025367206658838	"9114/537/6647/4738/6717/9550/2512"	7
-"225"	"Up"	"GO:0016241"	"regulation of macroautophagy"	"13/549"	"166/17913"	0.00184132380859796	0.0306396281750701	0.0271266838515789	"5868/9114/826/5899/55004/5049/29978/81876/5566/9550/534/51382/8649"	13
-"226"	"Up"	"GO:1990090"	"cellular response to nerve growth factor stimulus"	"6/549"	"43/17913"	0.00187485002188289	0.0310015740449967	0.0274471313168282	"9775/6132/5906/10094/1398/11151"	6
-"227"	"Up"	"GO:0000041"	"transition metal ion transport"	"9/549"	"91/17913"	0.00188275046778388	0.0310015740449967	0.0274471313168282	"9230/9114/537/9550/534/51382/475/567/2512"	9
-"228"	"Up"	"GO:0055072"	"iron ion homeostasis"	"8/549"	"74/17913"	0.0018879163681248	0.0310015740449967	0.0274471313168282	"9114/537/6647/4738/6717/9550/567/2512"	8
-"229"	"Up"	"GO:0043618"	"regulation of transcription from RNA polymerase II promoter in response to stress"	"10/549"	"109/17913"	0.00190060154219496	0.0310735902793796	0.0275108906291516	"5689/6921/5686/5690/5692/5682/5691/6923/4582/5696"	10
-"230"	"Up"	"GO:0017157"	"regulation of exocytosis"	"14/549"	"187/17913"	0.00191364730314127	0.0311508500128736	0.027579292254425	"7879/5868/5908/537/5906/8673/5899/375/9545/7251/23557/5898/27243/5874"	14
-"231"	"Up"	"GO:0032970"	"regulation of actin filament-based process"	"21/549"	"341/17913"	0.00201891795151327	0.0327222026427086	0.0289704836150161	"11034/10095/387/10109/11344/10093/10163/2885/375/396/10092/10094/29108/29085/822/1398/6717/684/136319/11151/397"	21
-"232"	"Up"	"GO:0072332"	"intrinsic apoptotic signaling pathway by p53 class mediator"	"8/549"	"75/17913"	0.00205790146010657	0.0332102718389612	0.0294025939105063	"6154/6135/3094/4282/6201/29108/4582/51065"	8
-"233"	"Up"	"GO:0071456"	"cellular response to hypoxia"	"15/549"	"210/17913"	0.00212738599750445	0.0341842625521745	0.0302649130614028	"11331/5689/2782/6921/26608/29979/5686/5690/5692/5682/5691/23576/6923/51142/5696"	15
-"234"	"Up"	"GO:0051701"	"interaction with host"	"15/549"	"211/17913"	0.0022274806249521	0.0356396899992336	0.0315534704812153	"7879/5478/9218/3921/1508/2885/10189/9217/950/8673/10410/8724/7251/3956/27243"	15
-"235"	"Up"	"GO:0097193"	"intrinsic apoptotic signaling pathway"	"18/549"	"277/17913"	0.0023155909758405	0.0365285042505257	0.0323403789599937	"6154/3315/6135/29979/3094/4282/6647/6188/51060/11315/7178/6201/29108/56616/2876/4582/51065/1396"	18
-"236"	"Up"	"GO:0006369"	"termination of RNA polymerase II transcription"	"5/549"	"31/17913"	0.0023318142403514	0.0365285042505257	0.0323403789599937	"6634/6628/11051/6636/6637"	5
-"237"	"Up"	"GO:0033120"	"positive regulation of RNA splicing"	"5/549"	"31/17913"	0.0023318142403514	0.0365285042505257	0.0323403789599937	"27316/9967/11338/6625/6430"	5
-"238"	"Up"	"GO:0046466"	"membrane lipid catabolic process"	"5/549"	"31/17913"	0.0023318142403514	0.0365285042505257	0.0323403789599937	"5538/2760/5660/2717/427"	5
-"239"	"Up"	"GO:1902253"	"regulation of intrinsic apoptotic signaling pathway by p53 class mediator"	"5/549"	"31/17913"	0.0023318142403514	0.0365285042505257	0.0323403789599937	"6154/6135/4282/6201/4582"	5
-"240"	"Up"	"GO:0045069"	"regulation of viral genome replication"	"9/549"	"95/17913"	0.00253516019037862	0.0395484989699064	0.0350141203486941	"5478/9218/51495/9217/10410/684/64710/9636/8815"	9
-"241"	"Up"	"GO:1990089"	"response to nerve growth factor"	"6/549"	"46/17913"	0.00266633175821917	0.0414221829990564	0.0366729797188564	"9775/6132/5906/10094/1398/11151"	6
-"242"	"Up"	"GO:0043620"	"regulation of DNA-templated transcription in response to stress"	"10/549"	"115/17913"	0.00282491706192693	0.0437045019828695	0.0386936225663676	"5689/6921/5686/5690/5692/5682/5691/6923/4582/5696"	10
-"243"	"Up"	"GO:0006527"	"arginine catabolic process"	"3/549"	"10/17913"	0.00292482389951376	0.0450639534147305	0.0398972079686759	"23564/23576/2184"	3
-"244"	"Up"	"GO:0051656"	"establishment of organelle localization"	"25/549"	"448/17913"	0.00303420278437146	0.0465576033798637	0.0412196055564527	"5868/55968/8775/10652/5861/9230/5908/537/79083/9871/5906/8673/375/10016/6284/27095/10342/81876/23557/27243/5265/10959/54732/6209/1522"	25
-"245"	"Up"	"GO:0140029"	"exocytic process"	"7/549"	"63/17913"	0.00306527486687197	0.0468150062316486	0.0414474962391648	"8775/10652/4218/8673/5899/9341/23557"	7
-"246"	"Up"	"GO:0006457"	"protein folding"	"13/549"	"176/17913"	0.00307598598637434	0.0468150062316486	0.0414474962391648	"5478/10549/2782/2784/3315/3336/6625/5204/10471/51645/131118/567/2896"	13
-"247"	"Up"	"GO:0033238"	"regulation of cellular amine metabolic process"	"8/549"	"80/17913"	0.00309632379390914	0.0469337501392544	0.0415526257277643	"5689/5686/5690/5692/5682/11315/5691/5696"	8
-"248"	"Dn"	"GO:0022613"	"ribonucleoprotein complex biogenesis"	"47/388"	"381/17913"	2.44547086221445e-22	9.9017115211063e-19	7.55779205417012e-19	"55226/117246/9188/23481/27340/51096/3326/23246/4931/10607/84916/84135/9136/23560/25929/22984/10528/3320/4869/23517/51202/4839/51602/55646/51068/22894/55127/1983/24148/317781/23020/27339/1778/25926/10594/10514/1736/103/7514/51386/8662/8663/728689/1656/1660/3646/5036"	47
-"249"	"Dn"	"GO:0034660"	"ncRNA metabolic process"	"46/388"	"470/17913"	8.50850090523618e-18	1.72254600826506e-14	1.31478729777755e-14	"55226/117246/9188/23481/27340/51096/51520/23246/4931/4790/10607/84916/84135/9136/5430/23560/22984/10528/23517/51202/8565/51602/80222/3376/55646/22894/55699/55127/5917/6897/7965/284119/2058/317781/2617/25926/6597/4691/16/3735/84365/10056/1736/103/7407/5036"	46
-"250"	"Dn"	"GO:0042254"	"ribosome biogenesis"	"30/388"	"202/17913"	7.37550764793263e-17	9.95447682215973e-14	7.59806682608077e-14	"55226/117246/9188/23481/27340/51096/23246/4931/10607/84916/84135/9136/23560/22984/10528/4869/23517/51202/4839/51602/55646/51068/22894/55127/317781/25926/10514/1736/7514/5036"	30
-"251"	"Dn"	"GO:0016072"	"rRNA metabolic process"	"29/388"	"191/17913"	1.33848573434903e-16	1.35488218459481e-13	1.03415634632862e-13	"55226/117246/9188/23481/27340/51096/23246/4931/10607/84916/84135/9136/23560/22984/10528/23517/51202/51602/55646/22894/55127/284119/317781/25926/6597/4691/84365/1736/5036"	29
-"252"	"Dn"	"GO:0006403"	"RNA localization"	"29/388"	"208/17913"	1.37594727683273e-15	1.11424210477915e-12	8.50480253638086e-13	"10644/7175/11260/55308/11269/51602/10482/8607/10128/51068/9631/24148/9793/4928/10574/10576/3192/170506/10694/23165/4641/1736/7203/6950/7514/10575/5976/1660/908"	29
-"253"	"Dn"	"GO:0006364"	"rRNA processing"	"25/388"	"154/17913"	3.57055040370491e-15	2.40952643076686e-12	1.83914666408379e-12	"55226/117246/9188/23481/27340/51096/23246/4931/10607/84916/84135/9136/23560/22984/10528/23517/51202/51602/55646/22894/55127/317781/25926/1736/5036"	25
-"254"	"Dn"	"GO:0051054"	"positive regulation of DNA metabolic process"	"28/388"	"222/17913"	5.72639763762856e-14	3.31231200496543e-11	2.52822608482368e-11	"7037/26354/5984/4436/306/3326/4931/3320/1956/5591/142/983/10574/10576/10111/170506/8239/10694/1499/10155/1736/7203/7520/6950/10575/5111/1660/908"	28
-"255"	"Dn"	"GO:0006457"	"protein folding"	"25/388"	"176/17913"	8.5371359336571e-14	4.3208579244222e-11	3.2980304080549e-11	"1410/3329/10808/6905/80273/3320/22824/10845/7184/10574/10576/3312/10694/821/3309/3301/10131/5700/7203/10961/6950/10575/9601/908/2288"	25
-"256"	"Dn"	"GO:0006418"	"tRNA aminoacylation for protein translation"	"14/388"	"42/17913"	1.20836021786644e-13	5.00734817832744e-11	3.82201563779734e-11	"51520/8565/80222/3376/55699/5917/6897/7965/2058/2617/16/3735/10056/7407"	14
-"257"	"Dn"	"GO:0051052"	"regulation of DNA metabolic process"	"37/388"	"403/17913"	1.23668762122189e-13	5.00734817832744e-11	3.82201563779734e-11	"7037/55226/26354/5984/4436/306/3326/4931/2956/23560/3320/4869/1956/5591/142/3838/983/10574/10576/10111/3192/170506/8239/10694/7913/1499/3980/10155/1736/7203/7520/6950/10575/5111/5976/1660/908"	37
-"258"	"Dn"	"GO:0034329"	"cell junction assembly"	"27/388"	"214/17913"	1.62050168787829e-13	5.96491939474474e-11	4.55291191924466e-11	"3909/3852/857/3655/3691/100506658/3918/7205/3673/5339/23603/2316/1365/81/6093/6624/3728/87/1495/5586/10015/1739/1499/4641/8826/7094/7414"	27
-"259"	"Dn"	"GO:1904816"	"positive regulation of protein localization to chromosome, telomeric region"	"9/388"	"12/17913"	1.98891176555923e-13	6.20479272737643e-11	4.73600276808496e-11	"26354/10574/10576/10694/1736/7203/6950/10575/908"	9
-"260"	"Dn"	"GO:0006520"	"cellular amino acid metabolic process"	"34/388"	"347/17913"	1.99215375292402e-13	6.20479272737643e-11	4.73600276808496e-11	"8140/440/26227/445/1503/8833/51520/29968/2618/5713/493/2744/8565/790/80222/56922/3376/55699/5917/6897/7965/2058/5707/2617/16/3735/5708/6472/191/5701/10056/4942/5700/7407"	34
-"261"	"Dn"	"GO:0000723"	"telomere maintenance"	"23/388"	"154/17913"	2.90021175929588e-13	8.3878267238493e-11	6.40227197390429e-11	"55226/26354/5984/3326/3320/5591/142/10574/10576/10111/3192/170506/10694/1499/1736/7203/7520/6950/10575/5111/2547/5976/908"	23
-"262"	"Dn"	"GO:0043039"	"tRNA aminoacylation"	"14/388"	"45/17913"	3.59599403426069e-13	9.70678656314768e-11	7.40900946286974e-11	"51520/8565/80222/3376/55699/5917/6897/7965/2058/2617/16/3735/10056/7407"	14
-"263"	"Dn"	"GO:0034330"	"cell junction organization"	"30/388"	"277/17913"	4.14120854344535e-13	1.04798458702564e-10	7.99907123918128e-11	"3909/3852/857/3655/3691/100506658/1832/3918/7205/3673/5339/5962/23603/2316/1365/81/6093/6624/3728/87/1495/5586/10015/1739/1829/1499/4641/8826/7094/7414"	30
-"264"	"Dn"	"GO:0034504"	"protein localization to nucleus"	"27/388"	"223/17913"	4.43432595276929e-13	1.0561521048684e-10	8.06141238224808e-11	"1277/4931/79711/7175/3843/2316/5905/23650/51068/142/3728/3838/4000/5530/25942/983/10574/10576/3192/10694/10155/1736/7203/6950/7514/10575/908"	27
-"265"	"Dn"	"GO:0043038"	"amino acid activation"	"14/388"	"46/17913"	5.06855512560059e-13	1.14014331686427e-10	8.70250166594348e-11	"51520/8565/80222/3376/55699/5917/6897/7965/2058/2617/16/3735/10056/7407"	14
-"266"	"Dn"	"GO:1900180"	"regulation of protein localization to nucleus"	"20/388"	"117/17913"	7.89817667598184e-13	1.6244761171277e-10	1.2399323757359e-10	"4931/7175/3843/2316/23650/51068/142/3728/4000/25942/983/10574/10576/10694/10155/1736/7203/6950/10575/908"	20
-"267"	"Dn"	"GO:0010833"	"telomere maintenance via telomere lengthening"	"17/388"	"79/17913"	8.42528981469046e-13	1.6244761171277e-10	1.2399323757359e-10	"55226/3326/3320/142/10574/10576/10111/3192/170506/10694/1499/1736/7203/7520/6950/10575/908"	17
-"268"	"Dn"	"GO:0032204"	"regulation of telomere maintenance"	"17/388"	"79/17913"	8.42528981469046e-13	1.6244761171277e-10	1.2399323757359e-10	"55226/26354/142/10574/10576/10111/3192/170506/10694/1499/1736/7203/7520/6950/10575/5976/908"	17
-"269"	"Dn"	"GO:0032200"	"telomere organization"	"23/388"	"167/17913"	1.66563621652372e-12	2.93154829788725e-10	2.23759623626287e-10	"55226/26354/5984/3326/3320/5591/142/10574/10576/10111/3192/170506/10694/1499/1736/7203/7520/6950/10575/5111/2547/5976/908"	23
-"270"	"Dn"	"GO:1904814"	"regulation of protein localization to chromosome, telomeric region"	"9/388"	"14/17913"	1.74163789559959e-12	2.93154829788725e-10	2.23759623626287e-10	"26354/10574/10576/10694/1736/7203/6950/10575/908"	9
-"271"	"Dn"	"GO:0043312"	"neutrophil degranulation"	"39/388"	"485/17913"	1.76211344167147e-12	2.93154829788725e-10	2.23759623626287e-10	"1832/306/3326/4790/3934/161/6814/5713/3320/302/6709/47/3043/1729/6093/5317/23191/3728/5707/1778/1938/10576/3615/3312/3482/5708/10694/5701/10970/7520/8826/55832/2547/226/7414/5036/1915/5315/10383"	39
-"272"	"Dn"	"GO:1903405"	"protein localization to nuclear body"	"8/388"	"10/17913"	1.95484821049532e-12	2.93154829788725e-10	2.23759623626287e-10	"10574/10576/10694/1736/7203/6950/10575/908"	8
-"273"	"Dn"	"GO:1904851"	"positive regulation of establishment of protein localization to telomere"	"8/388"	"10/17913"	1.95484821049532e-12	2.93154829788725e-10	2.23759623626287e-10	"10574/10576/10694/1736/7203/6950/10575/908"	8
-"274"	"Dn"	"GO:1904867"	"protein localization to Cajal body"	"8/388"	"10/17913"	1.95484821049532e-12	2.93154829788725e-10	2.23759623626287e-10	"10574/10576/10694/1736/7203/6950/10575/908"	8
-"275"	"Dn"	"GO:0002283"	"neutrophil activation involved in immune response"	"39/388"	"488/17913"	2.13450545231724e-12	3.0866473487259e-10	2.35598045413662e-10	"1832/306/3326/4790/3934/161/6814/5713/3320/302/6709/47/3043/1729/6093/5317/23191/3728/5707/1778/1938/10576/3615/3312/3482/5708/10694/5701/10970/7520/8826/55832/2547/226/7414/5036/1915/5315/10383"	39
-"276"	"Dn"	"GO:1903829"	"positive regulation of cellular protein localization"	"31/388"	"318/17913"	2.75637246499718e-12	3.84846624509434e-10	2.93746263420389e-10	"26354/6711/3326/7175/5962/3675/57707/2181/3843/2316/3799/1956/51068/142/3728/3688/983/10574/10576/10694/1739/10155/4641/1736/7203/8826/8878/6950/10575/4926/908"	31
-"277"	"Dn"	"GO:1900182"	"positive regulation of protein localization to nucleus"	"16/388"	"74/17913"	3.69627759135333e-12	4.98874265579655e-10	3.8078143888468e-10	"7175/3843/2316/51068/142/3728/983/10574/10576/10694/10155/1736/7203/6950/10575/908"	16
-"278"	"Dn"	"GO:0002446"	"neutrophil mediated immunity"	"39/388"	"499/17913"	4.25304855721911e-12	5.2406367640603e-10	4.00008047192446e-10	"1832/306/3326/4790/3934/161/6814/5713/3320/302/6709/47/3043/1729/6093/5317/23191/3728/5707/1778/1938/10576/3615/3312/3482/5708/10694/5701/10970/7520/8826/55832/2547/226/7414/5036/1915/5315/10383"	39
-"279"	"Dn"	"GO:0042119"	"neutrophil activation"	"39/388"	"499/17913"	4.25304855721911e-12	5.2406367640603e-10	4.00008047192446e-10	"1832/306/3326/4790/3934/161/6814/5713/3320/302/6709/47/3043/1729/6093/5317/23191/3728/5707/1778/1938/10576/3615/3312/3482/5708/10694/5701/10970/7520/8826/55832/2547/226/7414/5036/1915/5315/10383"	39
-"280"	"Dn"	"GO:1904874"	"positive regulation of telomerase RNA localization to Cajal body"	"9/388"	"15/17913"	4.27120309246702e-12	5.2406367640603e-10	4.00008047192446e-10	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
-"281"	"Dn"	"GO:0070203"	"regulation of establishment of protein localization to telomere"	"8/388"	"11/17913"	7.03260822690415e-12	8.37500903256909e-10	6.39248846878965e-10	"10574/10576/10694/1736/7203/6950/10575/908"	8
-"282"	"Dn"	"GO:0043487"	"regulation of RNA stability"	"22/388"	"163/17913"	7.73430646675185e-12	8.94748768110807e-10	6.82945076282209e-10	"10644/5713/4869/6093/22894/8531/5707/3312/3192/170506/5708/1981/5701/1736/10605/5700/23367/7514/5976/10492/1660/26986"	22
-"283"	"Dn"	"GO:0007004"	"telomere maintenance via telomerase"	"15/388"	"67/17913"	1.02804559774823e-11	1.15626572924516e-09	8.82556103797898e-10	"55226/3326/3320/10574/10576/10111/3192/10694/1499/1736/7203/7520/6950/10575/908"	15
-"284"	"Dn"	"GO:0070202"	"regulation of establishment of protein localization to chromosome"	"8/388"	"12/17913"	2.07000423276007e-11	2.20564398380145e-09	1.68352698819489e-09	"10574/10576/10694/1736/7203/6950/10575/908"	8
-"285"	"Dn"	"GO:1990173"	"protein localization to nucleoplasm"	"8/388"	"12/17913"	2.07000423276007e-11	2.20564398380145e-09	1.68352698819489e-09	"10574/10576/10694/1736/7203/6950/10575/908"	8
-"286"	"Dn"	"GO:0043488"	"regulation of mRNA stability"	"21/388"	"158/17913"	3.14070210899822e-11	3.26069303572661e-09	2.48882628664474e-09	"10644/5713/4869/6093/22894/8531/5707/3312/3192/170506/5708/1981/5701/10605/5700/23367/7514/5976/10492/1660/26986"	21
-"287"	"Dn"	"GO:1904356"	"regulation of telomere maintenance via telomere lengthening"	"14/388"	"61/17913"	3.54184784843248e-11	3.58523548457578e-09	2.73654349552573e-09	"55226/142/10574/10576/3192/170506/10694/1499/1736/7203/7520/6950/10575/908"	14
-"288"	"Dn"	"GO:1904872"	"regulation of telomerase RNA localization to Cajal body"	"9/388"	"18/17913"	3.91674844514993e-11	3.86802791571026e-09	2.95239369318619e-09	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
-"289"	"Dn"	"GO:0006417"	"regulation of translation"	"33/388"	"397/17913"	4.10382040973098e-11	3.95627829500018e-09	3.01975356465418e-09	"55226/10644/7175/3673/25929/4869/6093/10128/23191/1983/2058/10985/8531/1938/4691/16/170506/9669/5936/6472/1981/10605/10131/23367/8662/8663/5976/10492/1660/3646/5036/2597/26986"	33
-"290"	"Dn"	"GO:0032206"	"positive regulation of telomere maintenance"	"13/388"	"51/17913"	4.27774656743704e-11	4.02804554687269e-09	3.07453217184704e-09	"26354/10574/10576/10111/170506/10694/1499/1736/7203/7520/6950/10575/908"	13
-"291"	"Dn"	"GO:0061013"	"regulation of mRNA catabolic process"	"22/388"	"178/17913"	4.54247494594551e-11	4.1801093309394e-09	3.19059962710431e-09	"10644/5713/4869/6093/22894/5317/8531/5707/3312/3192/170506/5708/1981/5701/10605/5700/23367/7514/5976/10492/1660/26986"	22
-"292"	"Dn"	"GO:0006278"	"RNA-dependent DNA biosynthetic process"	"15/388"	"74/17913"	4.72451305182108e-11	4.25101185484968e-09	3.24471820354309e-09	"55226/3326/3320/10574/10576/10111/3192/10694/1499/1736/7203/7520/6950/10575/908"	15
-"293"	"Dn"	"GO:0034470"	"ncRNA processing"	"28/388"	"293/17913"	5.209951433991e-11	4.58588986004991e-09	3.50032435015963e-09	"55226/117246/9188/23481/27340/51096/23246/4931/10607/84916/84135/9136/23560/22984/10528/23517/51202/51602/55646/22894/55127/317781/25926/16/3735/1736/103/5036"	28
-"294"	"Dn"	"GO:0090670"	"RNA localization to Cajal body"	"9/388"	"19/17913"	7.30023219177044e-11	5.9117280288957e-09	4.512311940008e-09	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
-"295"	"Dn"	"GO:0090671"	"telomerase RNA localization to Cajal body"	"9/388"	"19/17913"	7.30023219177044e-11	5.9117280288957e-09	4.512311940008e-09	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
-"296"	"Dn"	"GO:0090672"	"telomerase RNA localization"	"9/388"	"19/17913"	7.30023219177044e-11	5.9117280288957e-09	4.512311940008e-09	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
-"297"	"Dn"	"GO:0090685"	"RNA localization to nucleus"	"9/388"	"19/17913"	7.30023219177044e-11	5.9117280288957e-09	4.512311940008e-09	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
-"298"	"Dn"	"GO:0071103"	"DNA conformation change"	"27/388"	"279/17913"	8.73298006926895e-11	6.93330123538627e-09	5.29205974889033e-09	"23397/10592/10051/79711/7175/4171/4175/7150/4869/4176/64151/8607/7153/142/1108/26155/6832/983/10111/4173/170506/3009/4678/7520/8467/2547/1660"	27
-"299"	"Dn"	"GO:2000573"	"positive regulation of DNA biosynthetic process"	"14/388"	"66/17913"	1.10392789377821e-10	8.59577700366919e-09	6.56099655087618e-09	"5984/3326/4931/3320/10574/10576/10694/1499/1736/7203/7520/6950/10575/908"	14
-"300"	"Dn"	"GO:2001252"	"positive regulation of chromosome organization"	"21/388"	"169/17913"	1.14115225160125e-10	8.71797257874235e-09	6.65426615829446e-09	"26354/7175/8452/4000/25942/10574/10576/10111/3192/170506/10694/3009/1499/10155/1736/7203/7520/6950/10575/4926/908"	21
-"301"	"Dn"	"GO:0050821"	"protein stabilization"	"21/388"	"171/17913"	1.42665965950194e-10	1.06973054839321e-08	8.16505411364072e-09	"1410/3329/3326/23560/2319/3320/2316/80155/8774/56926/10574/10576/8239/10694/3009/7203/7917/6950/10575/908/2597"	21
-"302"	"Dn"	"GO:0070198"	"protein localization to chromosome, telomeric region"	"10/388"	"28/17913"	1.87766832892535e-10	1.38230528433068e-08	1.05508788779422e-08	"26354/10574/10576/10694/1736/7203/7520/6950/10575/908"	10
-"303"	"Dn"	"GO:0033044"	"regulation of chromosome organization"	"28/388"	"311/17913"	2.09838540615776e-10	1.517207590988e-08	1.15805630685699e-08	"55226/26354/7175/4171/8452/7153/142/4000/26155/25942/10574/4288/10576/10111/3192/170506/10694/3009/1499/10155/1736/7203/7520/6950/10575/4926/5976/908"	28
-"304"	"Dn"	"GO:1904358"	"positive regulation of telomere maintenance via telomere lengthening"	"11/388"	"37/17913"	2.20601567122392e-10	1.56704516715537e-08	1.19609640087044e-08	"10574/10576/170506/10694/1499/1736/7203/7520/6950/10575/908"	11
-"305"	"Dn"	"GO:0034248"	"regulation of cellular amide metabolic process"	"34/388"	"452/17913"	3.01274531867193e-10	2.10320789574183e-08	1.60533942933226e-08	"55226/10644/7175/3673/25929/4869/6093/10128/23191/1983/2058/10985/8531/1938/4691/16/170506/9669/5936/6472/1981/10605/10131/23367/8662/8663/5976/10492/1660/3646/5036/1915/2597/26986"	34
-"306"	"Dn"	"GO:1903311"	"regulation of mRNA metabolic process"	"26/388"	"275/17913"	3.27988670884035e-10	2.25089174306688e-08	1.71806376042021e-08	"10644/5713/4869/6093/22894/5317/8531/27339/5707/4928/6829/3312/3192/170506/5708/5936/1981/5701/10605/5700/23367/7514/5976/10492/1660/26986"	26
-"307"	"Dn"	"GO:0070200"	"establishment of protein localization to telomere"	"8/388"	"16/17913"	4.98763826786423e-10	3.36582455776371e-08	2.56907122007884e-08	"10574/10576/10694/1736/7203/6950/10575/908"	8
-"308"	"Dn"	"GO:0006401"	"RNA catabolic process"	"30/388"	"368/17913"	5.22799640758341e-10	3.47018974660741e-08	2.64873122565399e-08	"10644/5713/4869/6093/10128/22894/5317/9652/8531/5707/7812/6832/3312/23644/3192/170506/5708/1981/5701/1736/10605/5700/23367/7514/5976/10492/1656/1660/3646/26986"	30
-"309"	"Dn"	"GO:0032508"	"DNA duplex unwinding"	"14/388"	"76/17913"	8.05229507393188e-10	5.25866818618552e-08	4.01384352072394e-08	"4171/4175/4176/8607/7153/142/1108/6832/10111/4173/170506/7520/2547/1660"	14
-"310"	"Dn"	"GO:0070199"	"establishment of protein localization to chromosome"	"9/388"	"24/17913"	9.38679500238654e-10	6.03287824835922e-08	4.60478364695186e-08	"10574/10576/10694/3009/1736/7203/6950/10575/908"	9
-"311"	"Dn"	"GO:2000278"	"regulation of DNA biosynthetic process"	"16/388"	"106/17913"	1.07803363921405e-09	6.72054986323485e-08	5.12967058752844e-08	"55226/5984/3326/4931/3320/10574/10576/3192/10694/1499/1736/7203/7520/6950/10575/908"	16
-"312"	"Dn"	"GO:0032210"	"regulation of telomere maintenance via telomerase"	"12/388"	"53/17913"	1.07887315660722e-09	6.72054986323485e-08	5.12967058752844e-08	"55226/10574/10576/3192/10694/1499/1736/7203/7520/6950/10575/908"	12
-"313"	"Dn"	"GO:0031647"	"regulation of protein stability"	"25/388"	"272/17913"	1.30670873864235e-09	8.01646012539827e-08	6.11881476340339e-08	"1410/3329/3326/23560/8452/2319/3320/2316/80155/5591/8774/4000/56926/10574/10576/3312/8239/10694/3009/7203/7917/6950/10575/908/2597"	25
-"314"	"Dn"	"GO:0006402"	"mRNA catabolic process"	"28/388"	"338/17913"	1.40329352484763e-09	8.48050071956428e-08	6.47300830943072e-08	"10644/5713/4869/6093/22894/5317/9652/8531/5707/7812/6832/3312/23644/3192/170506/5708/1981/5701/10605/5700/23367/7514/5976/10492/1656/1660/3646/26986"	28
-"315"	"Dn"	"GO:0032212"	"positive regulation of telomere maintenance via telomerase"	"10/388"	"34/17913"	1.67069779919562e-09	9.94802263079865e-08	7.59314046197887e-08	"10574/10576/10694/1499/1736/7203/7520/6950/10575/908"	10
-"316"	"Dn"	"GO:0002181"	"cytoplasmic translation"	"13/388"	"69/17913"	2.43983708491153e-09	1.43172468939229e-07	1.09280879958814e-07	"1983/8531/1938/16/170506/5936/1981/51386/8662/8663/728689/1660/3646"	13
-"317"	"Dn"	"GO:0071826"	"ribonucleoprotein complex subunit organization"	"22/388"	"221/17913"	2.97429215230903e-09	1.72041556067132e-07	1.31316116679388e-07	"3326/23246/25929/3320/4869/3799/4839/1983/24148/23020/27339/1778/3831/10594/103/51386/8662/8663/728689/1656/1660/3646"	22
-"318"	"Dn"	"GO:0032392"	"DNA geometric change"	"14/388"	"86/17913"	4.36934085190412e-09	2.49175508582532e-07	1.90191026555827e-07	"4171/4175/4176/8607/7153/142/1108/6832/10111/4173/170506/7520/2547/1660"	14
-"319"	"Dn"	"GO:1902369"	"negative regulation of RNA catabolic process"	"11/388"	"49/17913"	5.95367955271699e-09	3.34811784846543e-07	2.55555601853466e-07	"10128/5317/8531/3192/170506/1736/10605/23367/10492/1660/26986"	11
-"320"	"Dn"	"GO:0071897"	"DNA biosynthetic process"	"20/388"	"192/17913"	7.21680605674208e-09	4.00285585256831e-07	3.05530534716579e-07	"55226/5984/3326/4931/3320/10574/10576/10111/3192/10694/1499/3980/7706/1736/7203/7520/6950/10575/5111/908"	20
-"321"	"Dn"	"GO:0019058"	"viral life cycle"	"26/388"	"324/17913"	1.06811858274294e-08	5.84434073179211e-07	4.46087647074434e-07	"857/7037/3326/7175/3673/140564/6510/1956/7153/9631/3838/3688/4928/5586/983/3312/10015/7913/23165/7706/10155/103/23367/7514/1656/26986"	26
-"322"	"Dn"	"GO:0045216"	"cell-cell junction organization"	"16/388"	"128/17913"	1.76884716126984e-08	9.54941620797546e-07	7.28889160068528e-07	"857/100506658/1832/1365/81/6093/6624/3728/1495/5586/10015/1739/1829/4641/7094/7414"	16
-"323"	"Dn"	"GO:0034502"	"protein localization to chromosome"	"13/388"	"82/17913"	2.18339889403352e-08	1.16323448972918e-06	8.87875228931084e-07	"26354/4436/983/10574/10576/10694/3009/1736/7203/7520/6950/10575/908"	13
-"324"	"Dn"	"GO:0009165"	"nucleotide biosynthetic process"	"27/388"	"360/17913"	2.31423073285874e-08	1.21692470614871e-06	9.2885597152061e-07	"1503/8833/7175/3099/2618/2181/5214/47/2180/790/9631/5208/142/6240/2617/4928/10111/3615/10135/471/3735/23165/2023/3939/226/2597/5315"	27
-"325"	"Dn"	"GO:0007043"	"cell-cell junction assembly"	"14/388"	"98/17913"	2.48210257971983e-08	1.28846581349815e-06	9.83461966809367e-07	"857/100506658/1365/81/6093/6624/3728/1495/5586/10015/1739/4641/7094/7414"	14
-"326"	"Dn"	"GO:0022618"	"ribonucleoprotein complex assembly"	"20/388"	"209/17913"	3.06640087126027e-08	1.5614257439409e-06	1.19180719975315e-06	"3326/23246/25929/3320/4869/4839/1983/24148/23020/27339/1778/10594/103/51386/8662/8663/728689/1656/1660/3646"	20
-"327"	"Dn"	"GO:1901293"	"nucleoside phosphate biosynthetic process"	"27/388"	"365/17913"	3.08505950889779e-08	1.5614257439409e-06	1.19180719975315e-06	"1503/8833/7175/3099/2618/2181/5214/47/2180/790/9631/5208/142/6240/2617/4928/10111/3615/10135/471/3735/23165/2023/3939/226/2597/5315"	27
-"328"	"Dn"	"GO:0031581"	"hemidesmosome assembly"	"6/388"	"11/17913"	4.18862288502721e-08	2.09379432857718e-06	1.59815422877711e-06	"3909/3852/3655/3691/3918/5339"	6
-"329"	"Dn"	"GO:0006913"	"nucleocytoplasmic transport"	"24/388"	"302/17913"	4.78530392270377e-08	2.36288970524726e-06	1.80354971977642e-06	"79711/7175/11260/11269/25929/4869/3843/2316/5905/10482/51068/9631/3728/3838/4000/5530/4928/3313/5936/23165/10155/7514/5976/1660"	24
-"330"	"Dn"	"GO:0051973"	"positive regulation of telomerase activity"	"9/388"	"36/17913"	5.36948379986094e-08	2.61940239826951e-06	1.99934108261151e-06	"3326/4931/3320/10576/1499/1736/7520/6950/10575"	9
-"331"	"Dn"	"GO:0051169"	"nuclear transport"	"24/388"	"305/17913"	5.7711202767248e-08	2.76560826247013e-06	2.11093729669764e-06	"79711/7175/11260/11269/25929/4869/3843/2316/5905/10482/51068/9631/3728/3838/4000/5530/4928/3313/5936/23165/10155/7514/5976/1660"	24
-"332"	"Dn"	"GO:0046394"	"carboxylic acid biosynthetic process"	"29/388"	"426/17913"	5.80579655001138e-08	2.76560826247013e-06	2.11093729669764e-06	"440/26227/445/25902/220/11160/4790/29968/7175/3099/2618/2181/5214/493/2744/8644/9631/5208/1213/4928/471/6472/23165/4942/2023/3939/226/2597/5315"	29
-"333"	"Dn"	"GO:0072594"	"establishment of protein localization to organelle"	"30/388"	"452/17913"	5.97331877038304e-08	2.81232182573034e-06	2.14659288982186e-06	"51520/79711/7175/3099/3320/3843/2316/10953/3308/8540/6731/3728/3838/4000/5530/10574/10576/10531/3312/8239/10694/3009/10155/3309/3301/1736/7203/6950/10575/908"	30
-"334"	"Dn"	"GO:0016053"	"organic acid biosynthetic process"	"29/388"	"427/17913"	6.10678416755052e-08	2.84211139016231e-06	2.1693307097312e-06	"440/26227/445/25902/220/11160/4790/29968/7175/3099/2618/2181/5214/493/2744/8644/9631/5208/1213/4928/471/6472/23165/4942/2023/3939/226/2597/5315"	29
-"335"	"Dn"	"GO:0046390"	"ribose phosphate biosynthetic process"	"23/388"	"284/17913"	6.48257671645674e-08	2.98272194601515e-06	2.27665612912883e-06	"2539/1503/8833/7175/3099/2618/2181/5214/47/2180/790/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	23
-"336"	"Dn"	"GO:0002183"	"cytoplasmic translational initiation"	"8/388"	"27/17913"	6.98125948457149e-08	3.17608085989101e-06	2.42424338813742e-06	"1983/5936/1981/51386/8662/8663/728689/3646"	8
-"337"	"Dn"	"GO:0009895"	"negative regulation of catabolic process"	"23/388"	"288/17913"	8.37018217078436e-08	3.76565195661176e-06	2.8742520296401e-06	"3326/51520/302/2801/493/2316/6093/1956/10128/5317/8531/10135/3192/170506/1981/1736/10605/23367/7917/23450/10492/1660/26986"	23
-"338"	"Dn"	"GO:0106074"	"aminoacyl-tRNA metabolism involved in translational fidelity"	"6/388"	"13/17913"	1.49950511055894e-07	6.48798833905647e-06	4.95216070594944e-06	"51520/80222/3376/55699/16/7407"	6
-"339"	"Dn"	"GO:0009156"	"ribonucleoside monophosphate biosynthetic process"	"18/388"	"188/17913"	1.49955596618236e-07	6.48798833905647e-06	4.95216070594944e-06	"8833/7175/3099/2618/5214/790/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	18
-"340"	"Dn"	"GO:0007044"	"cell-substrate junction assembly"	"13/388"	"96/17913"	1.50238933759725e-07	6.48798833905647e-06	4.95216070594944e-06	"3909/3852/3655/3691/3918/7205/3673/5339/23603/6093/87/8826/7094"	13
-"341"	"Dn"	"GO:0009991"	"response to extracellular stimulus"	"31/388"	"498/17913"	1.50622599128503e-07	6.48798833905647e-06	4.95216070594944e-06	"440/3655/445/2539/1277/23394/51520/3934/3673/57707/2181/3157/2180/790/1956/5019/8644/7184/10985/1938/10135/3312/191/1981/10514/7706/3309/23367/23376/5111/5315"	31
-"342"	"Dn"	"GO:0030048"	"actin filament-based movement"	"15/388"	"132/17913"	1.78273954014836e-07	7.59822357690602e-06	5.79958259265994e-06	"857/1832/476/2316/81/6093/9631/4627/4430/3728/79784/4628/1739/1829/4641"	15
-"343"	"Dn"	"GO:0043489"	"RNA stabilization"	"9/388"	"41/17913"	1.81575387594368e-07	7.65832025384995e-06	5.84545326729237e-06	"8531/3192/170506/1736/10605/23367/10492/1660/26986"	9
-"344"	"Dn"	"GO:0009123"	"nucleoside monophosphate metabolic process"	"25/388"	"349/17913"	1.87163511230093e-07	7.81262945330565e-06	5.96323460631095e-06	"8833/4436/7175/3099/2618/5214/790/9631/5208/142/10845/4928/983/10111/3615/471/3312/1739/6472/23165/2023/3939/226/2597/5315"	25
-"345"	"Dn"	"GO:0009260"	"ribonucleotide biosynthetic process"	"22/388"	"279/17913"	2.00318120621822e-07	8.27640888160977e-06	6.31722880929828e-06	"1503/8833/7175/3099/2618/2181/5214/47/2180/790/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	22
-"346"	"Dn"	"GO:0009127"	"purine nucleoside monophosphate biosynthetic process"	"17/388"	"174/17913"	2.49004356048702e-07	1.00821863764119e-05	7.69554515114725e-06	"8833/7175/3099/2618/5214/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	17
-"347"	"Dn"	"GO:0009168"	"purine ribonucleoside monophosphate biosynthetic process"	"17/388"	"174/17913"	2.49004356048702e-07	1.00821863764119e-05	7.69554515114725e-06	"8833/7175/3099/2618/5214/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	17
-"348"	"Dn"	"GO:0006260"	"DNA replication"	"21/388"	"260/17913"	2.55073683870595e-07	1.02256766929905e-05	7.80506863829148e-06	"5984/4171/23560/4175/4172/4176/1956/4174/6240/25942/4928/983/10111/4173/4678/6749/3980/11198/5111/5976/1660"	21
-"349"	"Dn"	"GO:0009161"	"ribonucleoside monophosphate metabolic process"	"24/388"	"331/17913"	2.64753806123495e-07	1.05096878528826e-05	8.0218490689224e-06	"8833/4436/7175/3099/2618/5214/790/9631/5208/142/10845/4928/983/3615/471/3312/1739/6472/23165/2023/3939/226/2597/5315"	24
-"350"	"Dn"	"GO:0035966"	"response to topologically incorrect protein"	"17/388"	"175/17913"	2.70413644748852e-07	1.06301441513408e-05	8.11379111888226e-06	"440/3329/3326/10808/8452/3320/22824/3308/4000/7184/3312/201595/3309/3301/7917/10525/7094"	17
-"351"	"Dn"	"GO:0009124"	"nucleoside monophosphate biosynthetic process"	"18/388"	"196/17913"	2.80888013278894e-07	1.09357265939062e-05	8.34703650796388e-06	"8833/7175/3099/2618/5214/790/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	18
-"352"	"Dn"	"GO:0050657"	"nucleic acid transport"	"17/388"	"176/17913"	2.93484479934698e-07	1.12105533892037e-05	8.55680668409408e-06	"10644/7175/11260/55308/11269/10482/10128/51068/9631/9793/4928/3192/23165/4641/7514/5976/1660"	17
-"353"	"Dn"	"GO:0050658"	"RNA transport"	"17/388"	"176/17913"	2.93484479934698e-07	1.12105533892037e-05	8.55680668409408e-06	"10644/7175/11260/55308/11269/10482/10128/51068/9631/9793/4928/3192/23165/4641/7514/5976/1660"	17
-"354"	"Dn"	"GO:0051236"	"establishment of RNA localization"	"17/388"	"179/17913"	3.73848258435056e-07	1.41468373682574e-05	1.07980175776225e-05	"10644/7175/11260/55308/11269/10482/10128/51068/9631/9793/4928/3192/23165/4641/7514/5976/1660"	17
-"355"	"Dn"	"GO:0031667"	"response to nutrient levels"	"29/388"	"466/17913"	3.86762560358988e-07	1.4488262293072e-05	1.10586208660902e-05	"440/445/2539/1277/51520/3934/3673/57707/2181/3157/2180/790/1956/5019/8644/7184/10985/1938/10135/3312/191/1981/10514/7706/3309/23367/23376/5111/5315"	29
-"356"	"Dn"	"GO:0031330"	"negative regulation of cellular catabolic process"	"20/388"	"244/17913"	3.90027312903149e-07	1.4488262293072e-05	1.10586208660902e-05	"3326/51520/302/2801/493/6093/10128/5317/8531/10135/3192/170506/1981/1736/10605/23367/7917/10492/1660/26986"	20
-"357"	"Dn"	"GO:0006732"	"coenzyme metabolic process"	"25/388"	"366/17913"	4.57704436551638e-07	1.68476842145235e-05	1.28595236910585e-05	"80221/2539/25902/7175/3099/2618/2181/5214/47/2180/56922/9631/5208/4928/10135/471/6472/7086/23165/2023/3939/226/2597/5226/5315"	25
-"358"	"Dn"	"GO:0009167"	"purine ribonucleoside monophosphate metabolic process"	"23/388"	"317/17913"	4.66107557394709e-07	1.70024279269475e-05	1.2977636685736e-05	"8833/4436/7175/3099/2618/5214/9631/5208/142/10845/4928/983/3615/471/3312/1739/6472/23165/2023/3939/226/2597/5315"	23
-"359"	"Dn"	"GO:0009126"	"purine nucleoside monophosphate metabolic process"	"23/388"	"318/17913"	4.92599971067224e-07	1.78083685968856e-05	1.35927961941106e-05	"8833/4436/7175/3099/2618/5214/9631/5208/142/10845/4928/983/3615/471/3312/1739/6472/23165/2023/3939/226/2597/5315"	23
-"360"	"Dn"	"GO:0072524"	"pyridine-containing compound metabolic process"	"17/388"	"184/17913"	5.5317293829197e-07	1.98212143995061e-05	1.51291639201232e-05	"2539/29968/7175/3099/5214/9631/5208/4928/10135/7086/23165/2023/3939/226/2597/5226/5315"	17
-"361"	"Dn"	"GO:0006450"	"regulation of translational fidelity"	"6/388"	"16/17913"	6.62182870582946e-07	2.35191091490381e-05	1.79516981351018e-05	"51520/80222/3376/55699/16/7407"	6
-"362"	"Dn"	"GO:0051972"	"regulation of telomerase activity"	"9/388"	"48/17913"	7.6027340590302e-07	2.67682349608811e-05	2.04316953751146e-05	"3326/4931/3320/10576/1499/1736/7520/6950/10575"	9
-"363"	"Dn"	"GO:0043903"	"regulation of symbiosis, encompassing mutualism through parasitism"	"19/388"	"232/17913"	7.72995283514953e-07	2.69815336461383e-05	2.05945022903802e-05	"857/3853/140564/5430/302/7153/3838/6597/6829/5586/3312/7706/10155/103/23367/8878/1660/2597/26986"	19
-"364"	"Dn"	"GO:0043297"	"apical junction assembly"	"10/388"	"63/17913"	9.30675229180867e-07	3.22077265209686e-05	2.45835580105715e-05	"100506658/1365/81/6093/1495/5586/10015/1739/4641/7414"	10
-"365"	"Dn"	"GO:0060249"	"anatomical structure homeostasis"	"26/388"	"413/17913"	1.26562614836834e-06	4.34281379215542e-05	3.31478891312171e-05	"7037/55226/26354/5984/3326/3320/1956/5591/142/10574/10576/10111/3192/170506/10694/1499/1736/7203/7520/6950/10575/5111/2547/5976/226/908"	26
-"366"	"Dn"	"GO:0009152"	"purine ribonucleotide biosynthetic process"	"20/388"	"266/17913"	1.51914575472068e-06	5.15895194839767e-05	3.93773197293563e-05	"8833/7175/3099/2618/2181/5214/47/2180/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	20
-"367"	"Dn"	"GO:0034605"	"cellular response to heat"	"13/388"	"117/17913"	1.52895587504994e-06	5.15895194839767e-05	3.93773197293563e-05	"1410/3326/10808/7175/3320/9631/4928/3312/170506/488/23165/26509/2288"	13
-"368"	"Dn"	"GO:0009108"	"coenzyme biosynthetic process"	"19/388"	"245/17913"	1.75597500630071e-06	5.87598578554675e-05	4.4850305511082e-05	"25902/7175/3099/2618/2181/5214/47/2180/9631/5208/4928/10135/471/23165/2023/3939/226/2597/5315"	19
-"369"	"Dn"	"GO:0019362"	"pyridine nucleotide metabolic process"	"16/388"	"179/17913"	1.84857975038222e-06	6.08528407259967e-05	4.64478403690389e-05	"2539/7175/3099/5214/9631/5208/4928/10135/7086/23165/2023/3939/226/2597/5226/5315"	16
-"370"	"Dn"	"GO:0046496"	"nicotinamide nucleotide metabolic process"	"16/388"	"179/17913"	1.84857975038222e-06	6.08528407259967e-05	4.64478403690389e-05	"2539/7175/3099/5214/9631/5208/4928/10135/7086/23165/2023/3939/226/2597/5226/5315"	16
-"371"	"Dn"	"GO:0006399"	"tRNA metabolic process"	"15/388"	"160/17913"	2.13993614174965e-06	6.98758180479381e-05	5.33349109692442e-05	"55226/51520/8565/80222/3376/55699/5917/6897/7965/2058/2617/16/3735/10056/7407"	15
-"372"	"Dn"	"GO:0006986"	"response to unfolded protein"	"15/388"	"161/17913"	2.31395881567717e-06	7.49537539574149e-05	5.72108049080267e-05	"440/3329/3326/10808/3320/22824/3308/4000/7184/3312/201595/3309/3301/10525/7094"	15
-"373"	"Dn"	"GO:0006413"	"translational initiation"	"16/388"	"183/17913"	2.47181584076924e-06	7.94316058672591e-05	6.0628665902243e-05	"7175/4869/1983/9669/5936/1981/10605/23367/51386/8662/8663/728689/3646/8894/26986/1973"	16
-"374"	"Dn"	"GO:0086004"	"regulation of cardiac muscle cell contraction"	"8/388"	"42/17913"	2.79347298377231e-06	8.9061197726725e-05	6.7978754085002e-05	"857/1832/476/2316/3728/1739/1829/488"	8
-"375"	"Dn"	"GO:0072525"	"pyridine-containing compound biosynthetic process"	"14/388"	"145/17913"	3.30138015088066e-06	0.00010443193930403	7.97109549587633e-05	"29968/7175/3099/5214/9631/5208/4928/10135/23165/2023/3939/226/2597/5315"	14
-"376"	"Dn"	"GO:0006164"	"purine nucleotide biosynthetic process"	"20/388"	"280/17913"	3.33662018854475e-06	0.000104728489483858	7.99373061898604e-05	"8833/7175/3099/2618/2181/5214/47/2180/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	20
-"377"	"Dn"	"GO:1902373"	"negative regulation of mRNA catabolic process"	"8/388"	"43/17913"	3.36768547327704e-06	0.000104890449856144	8.0060927526651e-05	"5317/8531/3192/10605/23367/10492/1660/26986"	8
-"378"	"Dn"	"GO:0006090"	"pyruvate metabolic process"	"14/388"	"147/17913"	3.88108184271983e-06	0.00011995801817689	9.15617218981553e-05	"3945/7175/3099/5214/9631/5208/4928/682/23165/2023/3939/226/2597/5315"	14
-"379"	"Dn"	"GO:0051291"	"protein heterooligomerization"	"13/388"	"128/17913"	4.2194222237973e-06	0.000129427580182994	9.87896622732765e-05	"1277/6814/302/1365/3043/56922/3728/6240/1495/3710/10056/8878/2547"	13
-"380"	"Dn"	"GO:0006733"	"oxidoreduction coenzyme metabolic process"	"16/388"	"192/17913"	4.61269929647673e-06	0.000140427213920559	0.000107185477914172	"2539/7175/3099/5214/9631/5208/4928/10135/7086/23165/2023/3939/226/2597/5226/5315"	16
-"381"	"Dn"	"GO:0006096"	"glycolytic process"	"12/388"	"110/17913"	4.68798367852334e-06	0.000141654073987619	0.000108121917361701	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
-"382"	"Dn"	"GO:0006757"	"ATP generation from ADP"	"12/388"	"111/17913"	5.15513986269248e-06	0.000154616009659569	0.000118015521535011	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
-"383"	"Dn"	"GO:0006541"	"glutamine metabolic process"	"6/388"	"22/17913"	5.52576078339346e-06	0.000164513275087942	0.000125569919969375	"440/26227/1503/8833/2744/790"	6
-"384"	"Dn"	"GO:0003012"	"muscle system process"	"26/388"	"448/17913"	5.59218372698074e-06	0.000165275561390839	0.000126151758912143	"857/2539/1832/476/1410/3673/493/2316/6093/9631/142/3728/4000/5530/1938/79784/10848/1739/1829/488/2023/26509/10539/7094/226/7414"	26
-"385"	"Dn"	"GO:0072522"	"purine-containing compound biosynthetic process"	"20/388"	"291/17913"	5.96120626965193e-06	0.000174905247723338	0.000133501919204409	"8833/7175/3099/2618/2181/5214/47/2180/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	20
-"386"	"Dn"	"GO:0034109"	"homotypic cell-cell adhesion"	"10/388"	"77/17913"	6.1025896519684e-06	0.000177382497304851	0.000135392757688589	"1832/5962/6814/2316/3043/4627/3728/1829/7094/7414"	10
-"387"	"Dn"	"GO:1904377"	"positive regulation of protein localization to cell periphery"	"9/388"	"61/17913"	6.13325503153351e-06	0.000177382497304851	0.000135392757688589	"6711/3675/2181/3799/1956/3688/1739/8878/4926"	9
-"388"	"Dn"	"GO:0009135"	"purine nucleoside diphosphate metabolic process"	"13/388"	"133/17913"	6.4551430494689e-06	0.000184062494417603	0.000140491475116684	"7175/3099/5214/9631/5208/4928/1739/23165/2023/3939/226/2597/5315"	13
-"389"	"Dn"	"GO:0009179"	"purine ribonucleoside diphosphate metabolic process"	"13/388"	"133/17913"	6.4551430494689e-06	0.000184062494417603	0.000140491475116684	"7175/3099/5214/9631/5208/4928/1739/23165/2023/3939/226/2597/5315"	13
-"390"	"Dn"	"GO:0045815"	"positive regulation of gene expression, epigenetic"	"8/388"	"47/17913"	6.77118801141935e-06	0.000188249381900482	0.000143687248380969	"9188/9533/9031/7913/10514/1499/4641/8467"	8
-"391"	"Dn"	"GO:0070849"	"response to epidermal growth factor"	"8/388"	"47/17913"	6.77118801141935e-06	0.000188249381900482	0.000143687248380969	"1277/7175/790/4176/1956/4691/8826/1915"	8
-"392"	"Dn"	"GO:1903115"	"regulation of actin filament-based movement"	"8/388"	"47/17913"	6.77118801141935e-06	0.000188249381900482	0.000143687248380969	"857/1832/476/2316/3728/1739/1829/488"	8
-"393"	"Dn"	"GO:0042866"	"pyruvate biosynthetic process"	"12/388"	"114/17913"	6.81122498788055e-06	0.000188249381900482	0.000143687248380969	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
-"394"	"Dn"	"GO:0015931"	"nucleobase-containing compound transport"	"17/388"	"221/17913"	6.85728208779562e-06	0.000188249381900482	0.000143687248380969	"10644/7175/11260/55308/11269/10482/10128/51068/9631/9793/4928/3192/23165/4641/7514/5976/1660"	17
-"395"	"Dn"	"GO:0098901"	"regulation of cardiac muscle cell action potential"	"7/388"	"34/17913"	6.88093566838018e-06	0.000188249381900482	0.000143687248380969	"857/1832/2316/3728/1739/1829/488"	7
-"396"	"Dn"	"GO:0009185"	"ribonucleoside diphosphate metabolic process"	"13/388"	"135/17913"	7.60808327893472e-06	0.000206745833532931	0.000157805245545407	"7175/3099/5214/9631/5208/4928/1739/23165/2023/3939/226/2597/5315"	13
-"397"	"Dn"	"GO:1900034"	"regulation of cellular response to heat"	"10/388"	"79/17913"	7.71244591402337e-06	0.000208184623372538	0.000158903447042615	"1410/3326/10808/7175/3320/9631/4928/3312/23165/2288"	10
-"398"	"Dn"	"GO:0001732"	"formation of cytoplasmic translation initiation complex"	"5/388"	"14/17913"	7.91828767567541e-06	0.000212325475488806	0.000162064082368651	"51386/8662/8663/728689/3646"	5
-"399"	"Dn"	"GO:0007339"	"binding of sperm to zona pellucida"	"7/388"	"35/17913"	8.44218141138908e-06	0.000223414330292251	0.000170527998788017	"10574/10576/10694/7203/6950/10575/226"	7
-"400"	"Dn"	"GO:1901998"	"toxin transport"	"7/388"	"35/17913"	8.44218141138908e-06	0.000223414330292251	0.000170527998788017	"10574/10576/10694/3309/7203/6950/10575"	7
-"401"	"Dn"	"GO:0045727"	"positive regulation of translation"	"12/388"	"117/17913"	8.91702611700349e-06	0.000233587261779696	0.000178292807992926	"55226/3673/4869/8531/1938/170506/10605/23367/8663/1660/3646/26986"	12
-"402"	"Dn"	"GO:0002244"	"hematopoietic progenitor cell differentiation"	"14/388"	"158/17913"	8.99965740618241e-06	0.000233587261779696	0.000178292807992926	"54443/5713/5591/7153/5707/1938/25942/3313/170506/5708/5701/103/5700/7520"	14
-"403"	"Dn"	"GO:0009408"	"response to heat"	"14/388"	"158/17913"	8.99965740618241e-06	0.000233587261779696	0.000178292807992926	"1410/3326/10808/7175/3320/9631/4928/3312/170506/488/23165/3301/26509/2288"	14
-"404"	"Dn"	"GO:0006007"	"glucose catabolic process"	"7/388"	"36/17913"	1.02862878006518e-05	0.000263602400663538	0.000201202804681636	"3099/5214/5208/2023/226/2597/5315"	7
-"405"	"Dn"	"GO:0048255"	"mRNA stabilization"	"7/388"	"36/17913"	1.02862878006518e-05	0.000263602400663538	0.000201202804681636	"8531/3192/10605/23367/10492/1660/26986"	7
-"406"	"Dn"	"GO:0043588"	"skin development"	"24/388"	"412/17913"	1.20910539629021e-05	0.000307903632048998	0.000235017109798614	"3852/3655/3691/6699/3853/1832/1277/3892/1830/3673/301/3675/6093/1956/1718/8644/5317/10999/3728/5493/2317/1829/1499/4926"	24
-"407"	"Dn"	"GO:1904951"	"positive regulation of establishment of protein localization"	"25/388"	"440/17913"	1.21874821055385e-05	0.000308419469033284	0.000235410838564875	"6711/7175/2181/3843/2316/3799/1956/5019/5208/3728/4628/10574/10576/3735/170506/10694/10155/4641/1736/7203/6950/10575/1660/908/2597"	25
-"408"	"Dn"	"GO:0046031"	"ADP metabolic process"	"12/388"	"121/17913"	1.26000508835779e-05	0.000316879540544144	0.000241868253639653	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
-"409"	"Dn"	"GO:1901607"	"alpha-amino acid biosynthetic process"	"8/388"	"51/17913"	1.27138006565112e-05	0.000317766536161815	0.000242545280880552	"440/26227/445/29968/493/2744/6472/4942"	8
-"410"	"Dn"	"GO:0019359"	"nicotinamide nucleotide biosynthetic process"	"13/388"	"142/17913"	1.32021105717262e-05	0.000325947229908044	0.000248789452109037	"7175/3099/5214/9631/5208/4928/10135/23165/2023/3939/226/2597/5315"	13
-"411"	"Dn"	"GO:0019363"	"pyridine nucleotide biosynthetic process"	"13/388"	"142/17913"	1.32021105717262e-05	0.000325947229908044	0.000248789452109037	"7175/3099/5214/9631/5208/4928/10135/23165/2023/3939/226/2597/5315"	13
-"412"	"Dn"	"GO:0009150"	"purine ribonucleotide metabolic process"	"27/388"	"500/17913"	1.36814908972862e-05	0.000335735494806739	0.000256260652468468	"80221/8833/4436/7175/3099/2618/2181/5214/47/2180/9631/5208/142/10845/4928/983/3615/471/3312/1739/6472/23165/2023/3939/226/2597/5315"	27
-"413"	"Dn"	"GO:0009201"	"ribonucleoside triphosphate biosynthetic process"	"14/388"	"164/17913"	1.37921823629808e-05	0.000336412930046442	0.000256777726174456	"1503/7175/3099/5214/9631/5208/142/4928/23165/2023/3939/226/2597/5315"	14
-"414"	"Dn"	"GO:0048524"	"positive regulation of viral process"	"11/388"	"103/17913"	1.43230816657112e-05	0.000347270405176434	0.000265065034796899	"5430/7153/3838/6597/6829/5586/3312/103/23367/1660/26986"	11
-"415"	"Dn"	"GO:0043331"	"response to dsRNA"	"7/388"	"38/17913"	1.49819040983757e-05	0.000361081724370971	0.000275606957599192	"857/9188/6520/4790/4869/170506/1660"	7
-"416"	"Dn"	"GO:0051188"	"cofactor biosynthetic process"	"20/388"	"310/17913"	1.5134897019354e-05	0.000361221917358426	0.000275713964296406	"25902/29968/7175/3099/2618/2181/5214/47/2180/9631/5208/4928/10135/471/23165/2023/3939/226/2597/5315"	20
-"417"	"Dn"	"GO:0009064"	"glutamine family amino acid metabolic process"	"9/388"	"68/17913"	1.5251832145365e-05	0.000361221917358426	0.000275713964296406	"440/26227/445/1503/8833/493/2744/790/4942"	9
-"418"	"Dn"	"GO:0034404"	"nucleobase-containing small molecule biosynthetic process"	"16/388"	"211/17913"	1.52553588215092e-05	0.000361221917358426	0.000275713964296406	"1503/8833/7175/3099/5214/790/9631/5208/4928/3615/23165/2023/3939/226/2597/5315"	16
-"419"	"Dn"	"GO:0051131"	"chaperone-mediated protein complex assembly"	"5/388"	"16/17913"	1.66686911914853e-05	0.000392392619967	0.000299505981261939	"3329/3326/3320/3308/10576"	5
-"420"	"Dn"	"GO:0006446"	"regulation of translational initiation"	"9/388"	"69/17913"	1.72086934750637e-05	0.000400448275175477	0.000305654712902523	"7175/4869/1983/9669/5936/1981/23367/8662/3646"	9
-"421"	"Dn"	"GO:1903312"	"negative regulation of mRNA metabolic process"	"9/388"	"69/17913"	1.72086934750637e-05	0.000400448275175477	0.000305654712902523	"5317/8531/6829/3192/10605/23367/10492/1660/26986"	9
-"422"	"Dn"	"GO:0051028"	"mRNA transport"	"13/388"	"146/17913"	1.78075955340498e-05	0.000412016881813529	0.000314484814965234	"10644/7175/55308/11269/10482/10128/9631/4928/23165/4641/7514/5976/1660"	13
-"423"	"Dn"	"GO:0007051"	"spindle organization"	"13/388"	"147/17913"	1.91586752205222e-05	0.000440594413761034	0.000336297513044779	"6905/7175/9493/2801/29127/2316/4627/1213/1778/9793/3192/1739/4926"	13
-"424"	"Dn"	"GO:0007584"	"response to nutrient"	"16/388"	"215/17913"	1.92603633577928e-05	0.000440594413761034	0.000336297513044779	"445/1277/3673/2181/3157/2180/1956/5019/8644/7184/1938/191/7706/23376/5111/5315"	16
-"425"	"Dn"	"GO:1903078"	"positive regulation of protein localization to plasma membrane"	"8/388"	"54/17913"	1.96309408387926e-05	0.000446548760990289	0.000340842355426938	"6711/3675/2181/3799/1956/3688/1739/8878"	8
-"426"	"Dn"	"GO:0006735"	"NADH regeneration"	"6/388"	"27/17913"	2.00017179535776e-05	0.000447441745823401	0.000341523954124477	"3099/5214/2023/226/2597/5315"	6
-"427"	"Dn"	"GO:0061621"	"canonical glycolysis"	"6/388"	"27/17913"	2.00017179535776e-05	0.000447441745823401	0.000341523954124477	"3099/5214/2023/226/2597/5315"	6
-"428"	"Dn"	"GO:0061718"	"glucose catabolic process to pyruvate"	"6/388"	"27/17913"	2.00017179535776e-05	0.000447441745823401	0.000341523954124477	"3099/5214/2023/226/2597/5315"	6
-"429"	"Dn"	"GO:0006936"	"muscle contraction"	"21/388"	"343/17913"	2.04115747433126e-05	0.000454101462283916	0.000346607191708304	"857/1832/476/1410/3673/493/2316/6093/9631/3728/1938/79784/10848/1739/1829/488/2023/26509/7094/226/7414"	21
-"430"	"Dn"	"GO:0006323"	"DNA packaging"	"15/388"	"194/17913"	2.23455450215036e-05	0.000494410446951192	0.000377374289232871	"23397/10592/10051/79711/7175/4171/4869/64151/8607/7153/26155/983/3009/4678/8467"	15
-"431"	"Dn"	"GO:0007163"	"establishment or maintenance of cell polarity"	"14/388"	"172/17913"	2.36172424444143e-05	0.000519707688355616	0.000396683202613274	"3326/9181/2319/3320/3993/6093/6624/4627/4000/9793/1495/10015/1739/4926"	14
-"432"	"Dn"	"GO:0006754"	"ATP biosynthetic process"	"13/388"	"150/17913"	2.3766171160142e-05	0.000520157983931972	0.000397026904843111	"7175/3099/5214/9631/5208/142/4928/23165/2023/3939/226/2597/5315"	13
-"433"	"Dn"	"GO:0006165"	"nucleoside diphosphate phosphorylation"	"12/388"	"129/17913"	2.41168978745954e-05	0.000523400489186941	0.000399501848735323	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
-"434"	"Dn"	"GO:0009266"	"response to temperature stimulus"	"16/388"	"219/17913"	2.41728553909503e-05	0.000523400489186941	0.000399501848735323	"1410/3329/3326/10808/7175/3320/9631/8531/4928/3312/170506/488/23165/3301/26509/2288"	16
-"435"	"Dn"	"GO:0061615"	"glycolytic process through fructose-6-phosphate"	"6/388"	"28/17913"	2.49947167019262e-05	0.000535468825005815	0.000408713384777807	"3099/5214/2023/226/2597/5315"	6
-"436"	"Dn"	"GO:0061620"	"glycolytic process through glucose-6-phosphate"	"6/388"	"28/17913"	2.49947167019262e-05	0.000535468825005815	0.000408713384777807	"3099/5214/2023/226/2597/5315"	6
-"437"	"Dn"	"GO:0086002"	"cardiac muscle cell action potential involved in contraction"	"8/388"	"56/17913"	2.58090958043034e-05	0.000550005415324339	0.000419808893525954	"857/1832/476/2316/9631/3728/1739/1829"	8
-"438"	"Dn"	"GO:0046939"	"nucleotide phosphorylation"	"12/388"	"131/17913"	2.81368708310145e-05	0.000596472198925539	0.000455276124330993	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
-"439"	"Dn"	"GO:0009142"	"nucleoside triphosphate biosynthetic process"	"14/388"	"175/17913"	2.86478707608665e-05	0.000604141816201814	0.000461130200405175	"1503/7175/3099/5214/9631/5208/142/4928/23165/2023/3939/226/2597/5315"	14
-"440"	"Dn"	"GO:0009132"	"nucleoside diphosphate metabolic process"	"13/388"	"153/17913"	2.93159687198937e-05	0.00061490854178263	0.000469348241586305	"7175/3099/5214/9631/5208/4928/1739/23165/2023/3939/226/2597/5315"	13
-"441"	"Dn"	"GO:0032507"	"maintenance of protein location in cell"	"8/388"	"57/17913"	2.9462152903391e-05	0.00061490854178263	0.000469348241586305	"857/3099/5905/3728/2317/3192/3309/7094"	8
-"442"	"Dn"	"GO:0032481"	"positive regulation of type I interferon production"	"9/388"	"74/17913"	3.05140448993297e-05	0.000630364121415234	0.000481145197768163	"3329/4790/5591/9533/170506/1499/7520/2547/1660"	9
-"443"	"Dn"	"GO:0086001"	"cardiac muscle cell action potential"	"9/388"	"74/17913"	3.05140448993297e-05	0.000630364121415234	0.000481145197768163	"857/1832/476/2316/9631/3728/1739/1829/488"	9
-"444"	"Dn"	"GO:0062012"	"regulation of small molecule metabolic process"	"24/388"	"439/17913"	3.39326734976836e-05	0.000697428400975233	0.000532334113754737	"857/11160/1717/4790/7175/2222/5713/493/3157/8644/9631/5208/142/1213/5707/6713/4928/983/5708/6472/5701/23165/2023/5700"	24
-"445"	"Dn"	"GO:0071364"	"cellular response to epidermal growth factor stimulus"	"7/388"	"43/17913"	3.48526655681898e-05	0.000710711382520325	0.00054247276626579	"1277/790/4176/1956/4691/8826/1915"	7
-"446"	"Dn"	"GO:1990778"	"protein localization to cell periphery"	"18/388"	"276/17913"	3.49299987951456e-05	0.000710711382520325	0.00054247276626579	"857/6711/5962/3675/2803/2319/2181/2316/3799/6093/1956/1213/3728/3688/1739/682/8878/4926"	18
-"447"	"Dn"	"GO:0034332"	"adherens junction organization"	"12/388"	"134/17913"	3.52565555967537e-05	0.000713768968056279	0.00054480656437931	"1832/7205/3673/5962/23603/6093/3728/87/1495/1499/8826/7414"	12
-"448"	"Dn"	"GO:0090257"	"regulation of muscle system process"	"17/388"	"251/17913"	3.57550227600574e-05	0.000720259140076977	0.000549760391848801	"857/2539/1832/476/3673/493/2316/6093/142/3728/4000/5530/1739/1829/488/2023/10539"	17
-"449"	"Dn"	"GO:0006270"	"DNA replication initiation"	"6/388"	"30/17913"	3.79776888784157e-05	0.000761245852815372	0.000581044786592123	"4171/4175/4172/4176/4174/4173"	6
-"450"	"Dn"	"GO:0007052"	"mitotic spindle organization"	"10/388"	"95/17913"	3.97976850630228e-05	0.000793797176454086	0.000605890605885585	"6905/7175/9493/2801/29127/2316/1213/1778/3192/4926"	10
-"451"	"Dn"	"GO:0044539"	"long-chain fatty acid import"	"4/388"	"10/17913"	4.10463469886189e-05	0.000810715409545942	0.000618803978221233	"2181/2180/10999/2058"	4
-"452"	"Dn"	"GO:2000767"	"positive regulation of cytoplasmic translation"	"4/388"	"10/17913"	4.10463469886189e-05	0.000810715409545942	0.000618803978221233	"8531/1938/170506/1660"	4
-"453"	"Dn"	"GO:0098911"	"regulation of ventricular cardiac muscle cell action potential"	"5/388"	"19/17913"	4.20562415322678e-05	0.000826629718272584	0.00063095107377996	"857/1832/3728/1739/1829"	5
-"454"	"Dn"	"GO:0009206"	"purine ribonucleoside triphosphate biosynthetic process"	"13/388"	"159/17913"	4.38975563096458e-05	0.000855163179196138	0.000652730133267437	"7175/3099/5214/9631/5208/142/4928/23165/2023/3939/226/2597/5315"	13
-"455"	"Dn"	"GO:1902850"	"microtubule cytoskeleton organization involved in mitosis"	"11/388"	"116/17913"	4.39303386694978e-05	0.000855163179196138	0.000652730133267437	"6905/7175/9493/9181/2801/29127/2316/1213/1778/3192/4926"	11
-"456"	"Dn"	"GO:0035690"	"cellular response to drug"	"21/388"	"362/17913"	4.49950529624349e-05	0.000871698418396646	0.000665351173496394	"7037/445/3326/4790/3934/9181/493/790/1956/3728/5530/7184/25942/1495/983/1499/3309/10131/23367/5111/9343"	21
-"457"	"Dn"	"GO:0030866"	"cortical actin cytoskeleton organization"	"6/388"	"31/17913"	4.62386144555929e-05	0.000891524523479503	0.000680484070384064	"9493/29127/6093/10015/1739/7094"	6
-"458"	"Dn"	"GO:0009145"	"purine nucleoside triphosphate biosynthetic process"	"13/388"	"160/17913"	4.68598872486257e-05	0.00089497963900795	0.000683121295739648	"7175/3099/5214/9631/5208/142/4928/23165/2023/3939/226/2597/5315"	13
-"459"	"Dn"	"GO:0046661"	"male sex differentiation"	"13/388"	"160/17913"	4.68598872486257e-05	0.00089497963900795	0.000683121295739648	"4436/3157/2316/1718/8644/6240/8531/7812/1495/4678/1499/8894/2288"	13
-"460"	"Dn"	"GO:0060968"	"regulation of gene silencing"	"12/388"	"139/17913"	5.06137916548024e-05	0.000962137288311244	0.000734381479112923	"7175/5430/1956/9631/5530/25942/4928/1981/23165/10155/103/1660"	12
-"461"	"Dn"	"GO:0017038"	"protein import"	"12/388"	"140/17913"	5.42975785995164e-05	0.00102256230581136	0.00078050276997885	"79711/7175/3320/3843/2316/3308/3728/3838/4000/5530/3312/10155"	12
-"462"	"Dn"	"GO:0034250"	"positive regulation of cellular amide metabolic process"	"12/388"	"140/17913"	5.42975785995164e-05	0.00102256230581136	0.00078050276997885	"55226/3673/4869/8531/1938/170506/10605/23367/8663/1660/3646/26986"	12
-"463"	"Dn"	"GO:0006360"	"transcription by RNA polymerase I"	"8/388"	"62/17913"	5.48653120943775e-05	0.00102847059569507	0.000785012457646649	"84135/2316/55127/9533/284119/25926/6597/4691"	8
-"464"	"Dn"	"GO:0006356"	"regulation of transcription by RNA polymerase I"	"6/388"	"32/17913"	5.58777705593212e-05	0.00103783987612244	0.000792163854959764	"84135/2316/55127/25926/6597/4691"	6
-"465"	"Dn"	"GO:0030261"	"chromosome condensation"	"6/388"	"32/17913"	5.58777705593212e-05	0.00103783987612244	0.000792163854959764	"23397/10592/10051/64151/7153/983"	6
-"466"	"Dn"	"GO:0046034"	"ATP metabolic process"	"18/388"	"287/17913"	5.81254825930323e-05	0.00106977308645085	0.000816537879871497	"4436/7175/3099/5214/9631/5208/142/10845/4928/983/3312/6472/23165/2023/3939/226/2597/5315"	18
-"467"	"Dn"	"GO:0048511"	"rhythmic process"	"18/388"	"287/17913"	5.81254825930323e-05	0.00106977308645085	0.000816537879871497	"445/23394/7150/1956/5591/7153/25942/983/3615/10135/3192/8239/5936/191/10514/3309/5111/1660"	18
-"468"	"Dn"	"GO:0044843"	"cell cycle G1/S phase transition"	"18/388"	"288/17913"	6.07931757557624e-05	0.00111380800287367	0.00085014891173574	"5962/4171/8452/4175/493/4172/4176/1956/5591/4174/3688/5530/983/4173/4678/1981/3276/5111"	18
-"469"	"Dn"	"GO:0072659"	"protein localization to plasma membrane"	"16/388"	"237/17913"	6.27897874807737e-05	0.00114520652932276	0.000874114822397115	"6711/5962/3675/2803/2319/2181/2316/3799/6093/1956/1213/3728/3688/1739/682/8878"	16
-"470"	"Dn"	"GO:0051260"	"protein homooligomerization"	"20/388"	"345/17913"	6.87730752763583e-05	0.00124870933539899	0.000953116587261686	"857/10938/220/1410/9043/3934/6510/2801/25814/2744/1365/9361/3710/3615/10015/6472/3276/81502/226/5315"	20
-"471"	"Dn"	"GO:0006405"	"RNA export from nucleus"	"11/388"	"122/17913"	6.9864952487206e-05	0.00126287139562811	0.000963926224165587	"7175/11260/11269/10482/51068/9631/4928/23165/7514/5976/1660"	11
-"472"	"Dn"	"GO:0009199"	"ribonucleoside triphosphate metabolic process"	"19/388"	"319/17913"	7.28407917629695e-05	0.00131081051488117	0.00100051726136177	"1503/4436/7175/3099/5214/9631/5208/142/10845/4928/983/3312/6472/23165/2023/3939/226/2597/5315"	19
-"473"	"Dn"	"GO:0035036"	"sperm-egg recognition"	"7/388"	"49/17913"	8.30993626427407e-05	0.00148880229796662	0.00113637507554302	"10574/10576/10694/7203/6950/10575/226"	7
-"474"	"Dn"	"GO:0000082"	"G1/S transition of mitotic cell cycle"	"17/388"	"269/17913"	8.46518133473877e-05	0.00150993476759283	0.00115250509616476	"5962/4171/8452/4175/4172/4176/1956/5591/4174/3688/5530/983/4173/4678/1981/3276/5111"	17
-"475"	"Dn"	"GO:0006941"	"striated muscle contraction"	"13/388"	"170/17913"	8.74637936163769e-05	0.00155324956295048	0.00118556647302716	"857/1832/476/2316/9631/3728/1938/79784/10848/1739/1829/488/226"	13
-"476"	"Dn"	"GO:0045943"	"positive regulation of transcription by RNA polymerase I"	"5/388"	"22/17913"	9.02784501990575e-05	0.00159623338365059	0.00121837522309553	"84135/55127/25926/6597/4691"	5
-"477"	"Dn"	"GO:0045185"	"maintenance of protein location"	"9/388"	"85/17913"	9.22272622712953e-05	0.00162360080407163	0.00123926426557677	"857/3099/2316/5905/3728/2317/3192/3309/7094"	9
-"478"	"Dn"	"GO:0007015"	"actin filament organization"	"19/388"	"325/17913"	9.31765312857845e-05	0.00163139667540159	0.00124521470901953	"6711/5962/9181/8452/6709/2316/81/1729/6093/6624/4430/23191/6712/7184/87/1495/1739/4641/226"	19
-"479"	"Dn"	"GO:0000460"	"maturation of 5.8S rRNA"	"4/388"	"12/17913"	9.34759270667251e-05	0.00163139667540159	0.00124521470901953	"23481/27340/23246/23517"	4
-"480"	"Dn"	"GO:0030865"	"cortical cytoskeleton organization"	"6/388"	"35/17913"	9.47482914303378e-05	0.00163946936752751	0.00125137644462201	"9493/29127/6093/10015/1739/7094"	6
-"481"	"Dn"	"GO:0045070"	"positive regulation of viral genome replication"	"6/388"	"35/17913"	9.47482914303378e-05	0.00163946936752751	0.00125137644462201	"7153/5586/3312/103/23367/26986"	6
-"482"	"Dn"	"GO:0006397"	"mRNA processing"	"25/388"	"499/17913"	9.57658400673656e-05	0.00165002504865006	0.00125943339949736	"5430/8449/25929/22984/23517/51202/9128/988/24148/23020/27339/284695/4928/6829/3312/3192/170506/10594/5936/103/23450/10492/1660/9343/26986"	25
-"483"	"Dn"	"GO:0001649"	"osteoblast differentiation"	"15/388"	"222/17913"	0.000104907629563451	0.00179987708517971	0.00137381266903788	"9188/1277/23560/3376/1213/23020/3192/26156/5701/10514/1499/103/23376/10492/1660"	15
-"484"	"Dn"	"GO:0086003"	"cardiac muscle cell contraction"	"8/388"	"68/17913"	0.000107147070115037	0.00183054213880077	0.0013972187335454	"857/1832/476/2316/9631/3728/1739/1829"	8
-"485"	"Dn"	"GO:0002478"	"antigen processing and presentation of exogenous peptide antigen"	"13/388"	"174/17913"	0.00011071950042644	0.00187637832019212	0.0014322046374242	"9493/161/5713/29127/1213/6712/5707/1778/3831/5708/5701/821/5700"	13
-"486"	"Dn"	"GO:0007059"	"chromosome segregation"	"17/388"	"275/17913"	0.000110756833422059	0.00187637832019212	0.0014322046374242	"23397/10592/10051/7175/9493/8452/29127/64151/7153/23047/1778/4288/3192/8239/1499/7917/4926"	17
-"487"	"Dn"	"GO:0006734"	"NADH metabolic process"	"6/388"	"36/17913"	0.000111640692156275	0.00188347151058649	0.00143761873759133	"3099/5214/2023/226/2597/5315"	6
-"488"	"Dn"	"GO:0009988"	"cell-cell recognition"	"8/388"	"69/17913"	0.000118942267051427	0.00199832879373953	0.00152528716341117	"10574/10576/10694/1739/7203/6950/10575/226"	8
-"489"	"Dn"	"GO:0048193"	"Golgi vesicle transport"	"18/388"	"304/17913"	0.000120939505990151	0.00202348785022364	0.00154449060281462	"6711/375056/9493/2803/8452/2181/2801/6709/29127/10067/4430/8774/9950/6712/1778/3831/10525/1314"	18
-"490"	"Dn"	"GO:1901605"	"alpha-amino acid metabolic process"	"14/388"	"200/17913"	0.000122181676561747	0.00203585847077578	0.00155393286716608	"440/26227/445/1503/8833/29968/2618/493/2744/790/56922/6472/191/4942"	14
-"491"	"Dn"	"GO:0019884"	"antigen processing and presentation of exogenous antigen"	"13/388"	"176/17913"	0.000124226863609073	0.00205303906429852	0.001567046494334	"9493/161/5713/29127/1213/6712/5707/1778/3831/5708/5701/821/5700"	13
-"492"	"Dn"	"GO:0051168"	"nuclear export"	"13/388"	"176/17913"	0.000124226863609073	0.00205303906429852	0.001567046494334	"7175/11260/11269/5905/10482/51068/9631/4928/3313/23165/7514/5976/1660"	13
-"493"	"Dn"	"GO:0007623"	"circadian rhythm"	"14/388"	"201/17913"	0.000128796656891827	0.00211990920225613	0.00161808722565	"445/7150/1956/5591/7153/25942/983/3615/10135/3192/8239/5936/191/10514"	14
-"494"	"Dn"	"GO:0034976"	"response to endoplasmic reticulum stress"	"16/388"	"254/17913"	0.000141271748237535	0.00231582716037967	0.00176762775548861	"440/857/11160/4000/7184/1938/488/201595/81502/7706/3309/7917/23376/10961/10525/7094"	16
-"495"	"Dn"	"GO:0000070"	"mitotic sister chromatid segregation"	"11/388"	"132/17913"	0.000142155312993326	0.00232091476737894	0.00177151103119018	"23397/10592/10051/7175/9493/8452/29127/64151/23047/3192/4926"	11
-"496"	"Dn"	"GO:0009141"	"nucleoside triphosphate metabolic process"	"19/388"	"337/17913"	0.000149412283843492	0.00242959974812169	0.00185446825349606	"1503/4436/7175/3099/5214/9631/5208/142/10845/4928/983/3312/6472/23165/2023/3939/226/2597/5315"	19
-"497"	"Dn"	"GO:0050792"	"regulation of viral process"	"14/388"	"204/17913"	0.000150537871950899	0.00243811137411676	0.0018609650191488	"140564/5430/7153/3838/6597/6829/5586/3312/7706/10155/103/23367/1660/26986"	14
-"498"	"Dn"	"GO:0070830"	"bicellular tight junction assembly"	"7/388"	"54/17913"	0.000156138882758658	0.00251311944049232	0.00191821727971441	"100506658/1365/81/6093/10015/1739/4641"	7
-"499"	"Dn"	"GO:0090068"	"positive regulation of cell cycle process"	"17/388"	"283/17913"	0.000156410496172898	0.00251311944049232	0.00191821727971441	"7175/9493/5962/8452/4869/29127/1956/1778/25942/5586/983/3192/1981/10514/3276/5111/4926"	17
-"500"	"Dn"	"GO:0006695"	"cholesterol biosynthetic process"	"8/388"	"72/17913"	0.000160929281170536	0.00254654036321676	0.00194372684779983	"2539/11160/1717/2222/3157/47/1718/6713"	8
-"501"	"Dn"	"GO:0051651"	"maintenance of location in cell"	"8/388"	"72/17913"	0.000160929281170536	0.00254654036321676	0.00194372684779983	"857/3099/5905/3728/2317/3192/3309/7094"	8
-"502"	"Dn"	"GO:1902653"	"secondary alcohol biosynthetic process"	"8/388"	"72/17913"	0.000160929281170536	0.00254654036321676	0.00194372684779983	"2539/11160/1717/2222/3157/47/1718/6713"	8
-"503"	"Dn"	"GO:0070268"	"cornification"	"10/388"	"112/17913"	0.000161006256602492	0.00254654036321676	0.00194372684779983	"3852/6699/3853/1832/3892/1830/5317/3728/5493/1829"	10
-"504"	"Dn"	"GO:0000819"	"sister chromatid segregation"	"12/388"	"157/17913"	0.000163182314660403	0.00257091514420222	0.00196233166431678	"23397/10592/10051/7175/9493/8452/29127/64151/23047/3192/1499/4926"	12
-"505"	"Dn"	"GO:0051099"	"positive regulation of binding"	"13/388"	"181/17913"	0.000164371034323597	0.00257465640296073	0.00196518729747246	"857/3326/4931/3673/302/51068/142/1981/1499/10155/8663/1660/3646"	13
-"506"	"Dn"	"GO:0051098"	"regulation of binding"	"20/388"	"368/17913"	0.00016469153083893	0.00257465640296073	0.00196518729747246	"857/3326/23394/4931/3673/23560/302/2801/6093/51068/142/5530/25942/1981/1499/10155/3309/8663/1660/3646"	20
-"507"	"Dn"	"GO:0097305"	"response to alcohol"	"15/388"	"232/17913"	0.00017072251960961	0.00265867493038197	0.00202931707519764	"2539/3157/1365/790/5019/8644/142/3728/1938/1495/983/1981/1499/23367/7284"	15
-"508"	"Dn"	"GO:1904375"	"regulation of protein localization to cell periphery"	"10/388"	"113/17913"	0.000173295693028947	0.0026698379437611	0.00203783759547714	"6711/3675/2181/3799/1956/1213/3688/1739/8878/4926"	10
-"509"	"Dn"	"GO:0090263"	"positive regulation of canonical Wnt signaling pathway"	"11/388"	"135/17913"	0.000173509476490713	0.0026698379437611	0.00203783759547714	"857/1277/4790/5713/1956/8607/3728/5707/5708/5701/5700"	11
-"510"	"Dn"	"GO:0009435"	"NAD biosynthetic process"	"7/388"	"55/17913"	0.000175621590662851	0.0026698379437611	0.00203783759547714	"3099/5214/10135/2023/226/2597/5315"	7
-"511"	"Dn"	"GO:0019320"	"hexose catabolic process"	"7/388"	"55/17913"	0.000175621590662851	0.0026698379437611	0.00203783759547714	"3099/5214/5208/2023/226/2597/5315"	7
-"512"	"Dn"	"GO:0098900"	"regulation of action potential"	"7/388"	"55/17913"	0.000175621590662851	0.0026698379437611	0.00203783759547714	"857/1832/2316/3728/1739/1829/488"	7
-"513"	"Dn"	"GO:0120192"	"tight junction assembly"	"7/388"	"55/17913"	0.000175621590662851	0.0026698379437611	0.00203783759547714	"100506658/1365/81/6093/10015/1739/4641"	7
-"514"	"Dn"	"GO:0008652"	"cellular amino acid biosynthetic process"	"8/388"	"73/17913"	0.0001773737729987	0.0026698379437611	0.00203783759547714	"440/26227/445/29968/493/2744/6472/4942"	8
-"515"	"Dn"	"GO:0044766"	"multi-organism transport"	"8/388"	"73/17913"	0.0001773737729987	0.0026698379437611	0.00203783759547714	"857/7175/9631/3838/4928/23165/6950/7514"	8
-"516"	"Dn"	"GO:1902579"	"multi-organism localization"	"8/388"	"73/17913"	0.0001773737729987	0.0026698379437611	0.00203783759547714	"857/7175/9631/3838/4928/23165/6950/7514"	8
-"517"	"Dn"	"GO:0009205"	"purine ribonucleoside triphosphate metabolic process"	"18/388"	"314/17913"	0.000180925760017743	0.00271321630485867	0.00207094749088535	"4436/7175/3099/5214/9631/5208/142/10845/4928/983/3312/6472/23165/2023/3939/226/2597/5315"	18
-"518"	"Dn"	"GO:1903076"	"regulation of protein localization to plasma membrane"	"9/388"	"93/17913"	0.00018511318951704	0.0027657686507546	0.00211105971808907	"6711/3675/2181/3799/1956/1213/3688/1739/8878"	9
-"519"	"Dn"	"GO:0000226"	"microtubule cytoskeleton organization"	"23/388"	"460/17913"	0.000186835504492095	0.00278123881503123	0.00212286780645817	"1410/6905/7175/9493/9181/2801/4869/29127/2316/4627/1213/4000/1778/9793/983/3192/10015/1739/1499/7514/4926/2288/2597"	23
-"520"	"Dn"	"GO:0000377"	"RNA splicing, via transesterification reactions with bulged adenosine as nucleophile"	"19/388"	"344/17913"	0.000194483454334971	0.00287395440365802	0.00219363588907981	"5430/8449/25929/23517/9128/988/24148/23020/27339/4928/3312/3192/10594/5936/23450/10492/1660/9343/26986"	19
-"521"	"Dn"	"GO:0000398"	"mRNA splicing, via spliceosome"	"19/388"	"344/17913"	0.000194483454334971	0.00287395440365802	0.00219363588907981	"5430/8449/25929/23517/9128/988/24148/23020/27339/4928/3312/3192/10594/5936/23450/10492/1660/9343/26986"	19
-"522"	"Dn"	"GO:0086065"	"cell communication involved in cardiac conduction"	"7/388"	"56/17913"	0.000197023375642644	0.00290090053809842	0.00221420337181552	"857/1832/476/2316/9631/3728/1829"	7
-"523"	"Dn"	"GO:0007229"	"integrin-mediated signaling pathway"	"9/388"	"94/17913"	0.000200870164562017	0.00292562336802736	0.00223307384761106	"3655/3673/3675/8452/2316/4627/3688/1495/7094"	9
-"524"	"Dn"	"GO:1990823"	"response to leukemia inhibitory factor"	"9/388"	"94/17913"	0.000200870164562017	0.00292562336802736	0.00223307384761106	"7037/3099/5214/4691/9774/3192/7706/7520/8467"	9
-"525"	"Dn"	"GO:1990830"	"cellular response to leukemia inhibitory factor"	"9/388"	"94/17913"	0.000200870164562017	0.00292562336802736	0.00223307384761106	"7037/3099/5214/4691/9774/3192/7706/7520/8467"	9
-"526"	"Dn"	"GO:2000765"	"regulation of cytoplasmic translation"	"5/388"	"26/17913"	0.000209993504384793	0.00304754014069544	0.00232613065034428	"8531/1938/16/170506/1660"	5
-"527"	"Dn"	"GO:1901987"	"regulation of cell cycle phase transition"	"23/388"	"464/17913"	0.000211718146920102	0.00305953353136486	0.00233528498214952	"54443/7277/7175/5962/8452/5713/3320/4869/493/1956/5591/5707/1778/25942/9793/983/5708/1981/5701/3276/5700/5111/10383"	23
-"528"	"Dn"	"GO:0051701"	"interaction with host"	"14/388"	"211/17913"	0.000213966171325141	0.00305953353136486	0.00233528498214952	"857/7037/3853/3673/6510/1956/3838/3688/983/1499/7706/10155/6950/2597"	14
-"529"	"Dn"	"GO:0016126"	"sterol biosynthetic process"	"8/388"	"75/17913"	0.000214417144339912	0.00305953353136486	0.00233528498214952	"2539/11160/1717/2222/3157/47/1718/6713"	8
-"530"	"Dn"	"GO:0031100"	"animal organ regeneration"	"8/388"	"75/17913"	0.000214417144339912	0.00305953353136486	0.00233528498214952	"306/790/1956/983/471/3482/5111/5315"	8
-"531"	"Dn"	"GO:0071426"	"ribonucleoprotein complex export from nucleus"	"10/388"	"116/17913"	0.000215000797850494	0.00305953353136486	0.00233528498214952	"7175/11260/11269/10482/51068/9631/4928/23165/7514/5976"	10
-"532"	"Dn"	"GO:0140014"	"mitotic nuclear division"	"15/388"	"237/17913"	0.000215353681511234	0.00305953353136486	0.00233528498214952	"23397/10592/54443/10051/7175/9493/8452/2801/29127/2316/64151/23047/4288/3192/4926"	15
-"533"	"Dn"	"GO:0000375"	"RNA splicing, via transesterification reactions"	"19/388"	"348/17913"	0.000225262648819096	0.00318912050723259	0.00243419630818133	"5430/8449/25929/23517/9128/988/24148/23020/27339/4928/3312/3192/10594/5936/23450/10492/1660/9343/26986"	19
-"534"	"Dn"	"GO:0071496"	"cellular response to external stimulus"	"18/388"	"320/17913"	0.000228255364753365	0.00322022986719992	0.00245794150345088	"440/3655/476/1277/23394/51520/4790/3934/3673/1956/8644/7184/10985/10135/3312/1981/10514/3309"	18
-"535"	"Dn"	"GO:0060147"	"regulation of posttranscriptional gene silencing"	"10/388"	"117/17913"	0.000230649115814793	0.00322033886184172	0.0024580246970317	"7175/5430/1956/9631/5530/4928/1981/23165/103/1660"	10
-"536"	"Dn"	"GO:0060966"	"regulation of gene silencing by RNA"	"10/388"	"117/17913"	0.000230649115814793	0.00322033886184172	0.0024580246970317	"7175/5430/1956/9631/5530/4928/1981/23165/103/1660"	10
-"537"	"Dn"	"GO:0071166"	"ribonucleoprotein complex localization"	"10/388"	"117/17913"	0.000230649115814793	0.00322033886184172	0.0024580246970317	"7175/11260/11269/10482/51068/9631/4928/23165/7514/5976"	10
-"538"	"Dn"	"GO:0006611"	"protein export from nucleus"	"12/388"	"163/17913"	0.000231673894193026	0.0032235312631875	0.00246046139754286	"7175/11260/11269/5905/10482/51068/9631/4928/3313/23165/7514/5976"	12
-"539"	"Dn"	"GO:0009144"	"purine nucleoside triphosphate metabolic process"	"18/388"	"321/17913"	0.000237114146232046	0.00328792869210122	0.00250961475608251	"4436/7175/3099/5214/9631/5208/142/10845/4928/983/3312/6472/23165/2023/3939/226/2597/5315"	18
-"540"	"Dn"	"GO:0048002"	"antigen processing and presentation of peptide antigen"	"13/388"	"188/17913"	0.000239011234117177	0.00329244273140124	0.00251306023823791	"9493/161/5713/29127/1213/6712/5707/1778/3831/5708/5701/821/5700"	13
-"541"	"Dn"	"GO:0071356"	"cellular response to tumor necrosis factor"	"16/388"	"266/17913"	0.000239065982472701	0.00329244273140124	0.00251306023823791	"445/100506658/1277/4790/3934/9181/5713/81/8531/5707/3735/10594/5708/5701/5700/1660"	16
-"542"	"Dn"	"GO:0007076"	"mitotic chromosome condensation"	"4/388"	"15/17913"	0.00024480832883169	0.00333747112269196	0.00254742957097233	"23397/10592/10051/64151"	4
-"543"	"Dn"	"GO:0046931"	"pore complex assembly"	"4/388"	"15/17913"	0.00024480832883169	0.00333747112269196	0.00254742957097233	"4928/10694/23165/7203"	4
-"544"	"Dn"	"GO:0071474"	"cellular hyperosmotic response"	"4/388"	"15/17913"	0.00024480832883169	0.00333747112269196	0.00254742957097233	"9181/8531/7520/2547"	4
-"545"	"Dn"	"GO:0030433"	"ubiquitin-dependent ERAD pathway"	"7/388"	"58/17913"	0.000246140918261676	0.00334437777866284	0.0025527012928869	"857/11160/7184/201595/7706/3309/7917"	7
-"546"	"Dn"	"GO:0043254"	"regulation of protein complex assembly"	"21/388"	"409/17913"	0.000247649844606895	0.00335362615656628	0.00255976040755446	"6711/1410/5962/9181/3320/6709/6624/23191/142/6712/56926/9774/3312/170506/1739/1981/1499/4641/55832/4926/2288"	21
-"547"	"Dn"	"GO:0002026"	"regulation of the force of heart contraction"	"5/388"	"27/17913"	0.000253173455846433	0.00340564559043923	0.00259946587293278	"857/476/493/488/10539"	5
-"548"	"Dn"	"GO:0042273"	"ribosomal large subunit biogenesis"	"5/388"	"27/17913"	0.000253173455846433	0.00340564559043923	0.00259946587293278	"23481/23246/4931/23560/4839"	5
-"549"	"Dn"	"GO:0008380"	"RNA splicing"	"22/388"	"440/17913"	0.000256823087808256	0.00344330027329679	0.00262820699130373	"79026/5430/8449/25929/23517/51202/9128/988/24148/23020/27339/284695/4928/3312/3192/10594/5936/23450/10492/1660/9343/26986"	22
-"550"	"Dn"	"GO:0010639"	"negative regulation of organelle organization"	"19/388"	"352/17913"	0.000260227096553206	0.00347742413842881	0.00265425310224149	"55226/6711/7175/5962/9181/4171/6709/4869/7153/142/6712/4000/26155/25942/10111/3192/3980/7520/2288"	19
-"551"	"Dn"	"GO:0120193"	"tight junction organization"	"7/388"	"59/17913"	0.000274149838708593	0.00362862451886302	0.00276966153758091	"100506658/1365/81/6093/10015/1739/4641"	7
-"552"	"Dn"	"GO:1903902"	"positive regulation of viral life cycle"	"7/388"	"59/17913"	0.000274149838708593	0.00362862451886302	0.00276966153758091	"7153/3838/5586/3312/103/23367/26986"	7
-"553"	"Dn"	"GO:0051262"	"protein tetramerization"	"12/388"	"166/17913"	0.000274230452648082	0.00362862451886302	0.00276966153758091	"220/302/2801/2744/6240/3615/6472/81502/10056/2547/226/5315"	12
-"554"	"Dn"	"GO:0016925"	"protein sumoylation"	"8/388"	"78/17913"	0.000281683752186176	0.00371510590424048	0.00283567116893061	"26354/7175/5905/9631/4928/1499/23165/10155"	8
-"555"	"Dn"	"GO:0046794"	"transport of virus"	"7/388"	"60/17913"	0.000304664212265991	0.00400514738787337	0.00305705443340037	"857/7175/9631/3838/4928/23165/7514"	7
-"556"	"Dn"	"GO:0036503"	"ERAD pathway"	"8/388"	"79/17913"	0.000307601095242931	0.00403066936776254	0.00307653488548201	"857/11160/7184/201595/81502/7706/3309/7917"	8
-"557"	"Dn"	"GO:0009166"	"nucleotide catabolic process"	"12/388"	"169/17913"	0.000323251474631049	0.00422208135735844	0.00322263609343552	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
-"558"	"Dn"	"GO:0098813"	"nuclear chromosome segregation"	"14/388"	"220/17913"	0.00032833068759345	0.00427463329281633	0.00326274800735951	"23397/10592/10051/7175/9493/8452/29127/64151/23047/1778/3192/1499/7917/4926"	14
-"559"	"Dn"	"GO:0070482"	"response to oxygen levels"	"20/388"	"389/17913"	0.00034015743628121	0.00441327287435913	0.00336856901876185	"857/1410/1277/3673/3099/5713/1365/81/9361/4000/7184/5707/10135/5708/191/5701/2023/5700/10525/5315"	20
-"560"	"Dn"	"GO:0030177"	"positive regulation of Wnt signaling pathway"	"12/388"	"170/17913"	0.000341159399771402	0.00441327287435913	0.00336856901876185	"857/1277/4790/5713/1956/8607/3728/5707/6597/5708/5701/5700"	12
-"561"	"Dn"	"GO:0001508"	"action potential"	"10/388"	"123/17913"	0.000345970402141168	0.00444709256593521	0.00339438295968745	"857/1832/476/2316/9631/3728/79784/1739/1829/488"	10
-"562"	"Dn"	"GO:0032479"	"regulation of type I interferon production"	"10/388"	"123/17913"	0.000345970402141168	0.00444709256593521	0.00339438295968745	"3329/4790/5591/9533/170506/1499/7706/7520/2547/1660"	10
-"563"	"Dn"	"GO:0055117"	"regulation of cardiac muscle contraction"	"8/388"	"81/17913"	0.000365282236498675	0.00468046764425042	0.00357251381199237	"857/1832/476/2316/3728/1739/1829/488"	8
-"564"	"Dn"	"GO:0008360"	"regulation of cell shape"	"10/388"	"124/17913"	0.000369212049939251	0.00471589776089598	0.00359955696039064	"301/5962/1729/23654/4627/23191/79784/4628/1739/226"	10
-"565"	"Dn"	"GO:0046365"	"monosaccharide catabolic process"	"7/388"	"62/17913"	0.000373861171354771	0.00476026378243858	0.0036334207186283	"3099/5214/5208/2023/226/2597/5315"	7
-"566"	"Dn"	"GO:0032606"	"type I interferon production"	"10/388"	"125/17913"	0.000393740095310103	0.00496481186377929	0.00378954846084309	"3329/4790/5591/9533/170506/1499/7706/7520/2547/1660"	10
-"567"	"Dn"	"GO:0051170"	"import into nucleus"	"10/388"	"125/17913"	0.000393740095310103	0.00496481186377929	0.00378954846084309	"79711/7175/25929/3843/2316/3728/3838/4000/5530/10155"	10
-"568"	"Dn"	"GO:2001251"	"negative regulation of chromosome organization"	"10/388"	"125/17913"	0.000393740095310103	0.00496481186377929	0.00378954846084309	"55226/7175/4171/7153/142/26155/25942/10111/3192/7520"	10
-"569"	"Dn"	"GO:0017148"	"negative regulation of translation"	"13/388"	"198/17913"	0.000394830679213863	0.00496481186377929	0.00378954846084309	"10644/7175/6093/2058/4691/170506/5936/1981/23367/5976/10492/3646/2597"	13
-"570"	"Dn"	"GO:0006606"	"protein import into nucleus"	"9/388"	"103/17913"	0.000399696343672547	0.00501043497068156	0.00382437172893139	"79711/7175/3843/2316/3728/3838/4000/5530/10155"	9
-"571"	"Dn"	"GO:0036293"	"response to decreased oxygen levels"	"19/388"	"365/17913"	0.000408724866172363	0.00510779933065401	0.00389868813217043	"857/1410/3673/3099/5713/1365/81/9361/4000/7184/5707/10135/5708/191/5701/2023/5700/10525/5315"	19
-"572"	"Dn"	"GO:0009303"	"rRNA transcription"	"5/388"	"30/17913"	0.00042369604944411	0.00527860093599755	0.00402905781754788	"284119/25926/6597/4691/84365"	5
-"573"	"Dn"	"GO:1901292"	"nucleoside phosphate catabolic process"	"12/388"	"175/17913"	0.00044382472226018	0.00551241196451371	0.00420752142252466	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
-"574"	"Dn"	"GO:1901990"	"regulation of mitotic cell cycle phase transition"	"21/388"	"428/17913"	0.000452494520117713	0.00557648438440143	0.00425642670772578	"54443/7277/7175/5962/8452/5713/3320/1956/5591/5707/1778/25942/9793/983/5708/1981/5701/3276/5700/5111/10383"	21
-"575"	"Dn"	"GO:0071214"	"cellular response to abiotic stimulus"	"17/388"	"310/17913"	0.000453115179666108	0.00557648438440143	0.00425642670772578	"476/1410/1277/4790/3673/9181/4869/1956/142/8531/26155/10135/170506/3309/7520/5111/2547"	17
-"576"	"Dn"	"GO:0104004"	"cellular response to environmental stimulus"	"17/388"	"310/17913"	0.000453115179666108	0.00557648438440143	0.00425642670772578	"476/1410/1277/4790/3673/9181/4869/1956/142/8531/26155/10135/170506/3309/7520/5111/2547"	17
-"577"	"Dn"	"GO:1902749"	"regulation of cell cycle G2/M phase transition"	"13/388"	"202/17913"	0.000477801863204622	0.00586248407307732	0.00447472494535493	"7277/5713/3320/4869/5707/1778/25942/9793/983/5708/5701/5700/10383"	13
-"578"	"Dn"	"GO:0034612"	"response to tumor necrosis factor"	"16/388"	"284/17913"	0.000493926158906728	0.00602653283467477	0.00459994031082531	"445/100506658/1277/4790/3934/9181/5713/81/8531/5707/3735/10594/5708/5701/5700/1660"	16
-"579"	"Dn"	"GO:0043200"	"response to amino acid"	"9/388"	"106/17913"	0.000494148901237842	0.00602653283467477	0.00459994031082531	"440/445/1277/51520/57707/3843/1956/23376/5111"	9
-"580"	"Dn"	"GO:0043330"	"response to exogenous dsRNA"	"5/388"	"31/17913"	0.000496284017711133	0.00603439635949663	0.00460594239291888	"857/9188/6520/170506/1660"	5
-"581"	"Dn"	"GO:0032388"	"positive regulation of intracellular transport"	"13/388"	"203/17913"	0.000500711909865261	0.00607000755402527	0.004633123754694	"10938/7175/5962/302/3843/2316/3799/3728/1778/10155/4641/4926/1660"	13
-"582"	"Dn"	"GO:0006333"	"chromatin assembly or disassembly"	"12/388"	"178/17913"	0.00051710679991377	0.0062500460682115	0.00477054380061847	"79711/7175/4171/4869/8607/9031/26155/6597/3009/4678/11198/8467"	12
-"583"	"Dn"	"GO:0045947"	"negative regulation of translational initiation"	"4/388"	"18/17913"	0.000521269532693891	0.00628160814844513	0.00479463454883855	"7175/5936/23367/3646"	4
-"584"	"Dn"	"GO:0045787"	"positive regulation of cell cycle"	"19/388"	"373/17913"	0.000532850165560517	0.00640210777553274	0.00488660967073459	"440/3326/7175/9493/5962/8452/4869/29127/1956/1778/25942/5586/983/3192/1981/10514/3276/5111/4926"	19
-"585"	"Dn"	"GO:0001889"	"liver development"	"10/388"	"130/17913"	0.000537655194645485	0.00642172826878929	0.00490158562794331	"440/445/3673/8452/3157/790/1956/3482/5111/5315"	10
-"586"	"Dn"	"GO:0006261"	"DNA-dependent DNA replication"	"10/388"	"130/17913"	0.000537655194645485	0.00642172826878929	0.00490158562794331	"5984/4171/4175/4172/4176/4174/4173/3980/5111/5976"	10
-"587"	"Dn"	"GO:0045931"	"positive regulation of mitotic cell cycle"	"11/388"	"154/17913"	0.000540740256451825	0.00643958028933364	0.00491521174285622	"440/7175/5962/8452/1956/25942/5586/983/3192/1981/4926"	11
-"588"	"Dn"	"GO:0043902"	"positive regulation of multi-organism process"	"12/388"	"180/17913"	0.000571414935173204	0.00678492396632346	0.00517880614190006	"5430/7153/3838/6597/6829/5586/3312/103/23367/1660/2597/26986"	12
-"589"	"Dn"	"GO:0006338"	"chromatin remodeling"	"11/388"	"156/17913"	0.000602662397293887	0.00713440287385224	0.00544555688542465	"7175/86/7150/4869/8607/1108/9031/6597/4678/1499/8467"	11
-"590"	"Dn"	"GO:0072330"	"monocarboxylic acid biosynthetic process"	"17/388"	"318/17913"	0.000604371495611588	0.00713440287385224	0.00544555688542465	"440/220/11160/7175/3099/2181/5214/8644/9631/5208/4928/23165/2023/3939/226/2597/5315"	17
-"591"	"Dn"	"GO:1901657"	"glycosyl compound metabolic process"	"10/388"	"132/17913"	0.000606271408601723	0.00713602596926854	0.00544679576393715	"1503/8833/9582/140564/790/8644/3615/471/1739/191"	10
-"592"	"Dn"	"GO:0043900"	"regulation of multi-organism process"	"20/388"	"408/17913"	0.000621993930822151	0.00729986500260548	0.005571851047731	"857/3853/140564/5430/302/7153/3838/25942/6597/6829/5586/3312/7706/10155/103/23367/8878/1660/2597/26986"	20
-"593"	"Dn"	"GO:0061008"	"hepaticobiliary system development"	"10/388"	"133/17913"	0.000643202271644411	0.00752695375112203	0.00574518366153937	"440/445/3673/8452/3157/790/1956/3482/5111/5315"	10
-"594"	"Dn"	"GO:1903578"	"regulation of ATP metabolic process"	"9/388"	"110/17913"	0.000647860746932355	0.00755184741988836	0.00576418453543883	"7175/9631/5208/142/4928/983/6472/23165/2023"	9
-"595"	"Dn"	"GO:0046653"	"tetrahydrofolate metabolic process"	"4/388"	"19/17913"	0.000649059743670326	0.00755184741988836	0.00576418453543883	"25902/2618/471/6472"	4
-"596"	"Dn"	"GO:0051493"	"regulation of cytoskeleton organization"	"22/388"	"472/17913"	0.000664213742712486	0.00769599814795274	0.00587421210237466	"6711/7175/5962/9181/6709/4869/2316/1729/6093/6624/23191/1213/6712/1778/3192/10015/1739/1499/4641/7514/4926/2288"	22
-"597"	"Dn"	"GO:0006409"	"tRNA export from nucleus"	"5/388"	"33/17913"	0.000669051950624688	0.00769599814795274	0.00587421210237466	"7175/11260/9631/4928/23165"	5
-"598"	"Dn"	"GO:0051031"	"tRNA transport"	"5/388"	"33/17913"	0.000669051950624688	0.00769599814795274	0.00587421210237466	"7175/11260/9631/4928/23165"	5
-"599"	"Dn"	"GO:0071431"	"tRNA-containing ribonucleoprotein complex export from nucleus"	"5/388"	"33/17913"	0.000669051950624688	0.00769599814795274	0.00587421210237466	"7175/11260/9631/4928/23165"	5
-"600"	"Dn"	"GO:0030260"	"entry into host cell"	"10/388"	"134/17913"	0.000681971469938506	0.00775646764545227	0.00592036734399602	"857/7037/3853/3673/6510/1956/3688/983/1499/7706"	10
-"601"	"Dn"	"GO:0044409"	"entry into host"	"10/388"	"134/17913"	0.000681971469938506	0.00775646764545227	0.00592036734399602	"857/7037/3853/3673/6510/1956/3688/983/1499/7706"	10
-"602"	"Dn"	"GO:0051806"	"entry into cell of other organism involved in symbiotic interaction"	"10/388"	"134/17913"	0.000681971469938506	0.00775646764545227	0.00592036734399602	"857/7037/3853/3673/6510/1956/3688/983/1499/7706"	10
-"603"	"Dn"	"GO:0051828"	"entry into other organism involved in symbiotic interaction"	"10/388"	"134/17913"	0.000681971469938506	0.00775646764545227	0.00592036734399602	"857/7037/3853/3673/6510/1956/3688/983/1499/7706"	10
-"604"	"Dn"	"GO:0009119"	"ribonucleoside metabolic process"	"8/388"	"89/17913"	0.000690534097157769	0.00780997921617823	0.00596121172965366	"1503/8833/9582/140564/790/3615/1739/191"	8
-"605"	"Dn"	"GO:0051289"	"protein homotetramerization"	"8/388"	"89/17913"	0.000690534097157769	0.00780997921617823	0.00596121172965366	"220/2801/2744/3615/6472/81502/226/5315"	8
-"606"	"Dn"	"GO:0031589"	"cell-substrate adhesion"	"17/388"	"322/17913"	0.000695031742083796	0.00783895131949106	0.00598332559671023	"3655/3691/7205/1277/3673/3675/23603/2316/81/6093/2049/3728/3688/87/1499/8826/7414"	17
-"607"	"Dn"	"GO:0010498"	"proteasomal protein catabolic process"	"19/388"	"382/17913"	0.000710315997653862	0.00798908187361247	0.0060979174535431	"857/11160/3326/8452/5713/7184/27339/5707/983/5708/5701/1499/201595/81502/7706/3309/5700/7917/23376"	19
-"608"	"Dn"	"GO:0031503"	"protein-containing complex localization"	"14/388"	"238/17913"	0.00071917441374188	0.00806630803667832	0.00615686274601592	"7175/11260/11269/10482/51068/9631/4928/3192/1739/1742/23165/7514/5976/2288"	14
-"609"	"Dn"	"GO:0010389"	"regulation of G2/M transition of mitotic cell cycle"	"12/388"	"185/17913"	0.000728509468167239	0.00812599128542466	0.00620241785860233	"7277/5713/3320/5707/1778/25942/9793/983/5708/5701/5700/10383"	12
-"610"	"Dn"	"GO:0016052"	"carbohydrate catabolic process"	"12/388"	"185/17913"	0.000728509468167239	0.00812599128542466	0.00620241785860233	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
-"611"	"Dn"	"GO:0034333"	"adherens junction assembly"	"8/388"	"90/17913"	0.000743866240212747	0.00825182029211345	0.00629846079672567	"7205/3673/23603/6093/87/1499/8826/7414"	8
-"612"	"Dn"	"GO:0051225"	"spindle assembly"	"8/388"	"90/17913"	0.000743866240212747	0.00825182029211345	0.00629846079672567	"7175/9493/2801/29127/2316/1778/3192/4926"	8
-"613"	"Dn"	"GO:0001666"	"response to hypoxia"	"18/388"	"354/17913"	0.000756560895960699	0.00834690754153916	0.00637103912387957	"857/1410/3673/3099/5713/1365/81/9361/4000/7184/5707/5708/191/5701/2023/5700/10525/5315"	18
-"614"	"Dn"	"GO:0042176"	"regulation of protein catabolic process"	"18/388"	"354/17913"	0.000756560895960699	0.00834690754153916	0.00637103912387957	"857/3326/4898/5962/3320/302/2316/6093/1956/5707/5708/5701/5700/7917/23376/7514/23450/1915"	18
-"615"	"Dn"	"GO:0032781"	"positive regulation of ATPase activity"	"6/388"	"51/17913"	0.000785611339313615	0.00863686148855277	0.0065923555732776	"23397/29128/10598/3192/3301/1660"	6
-"616"	"Dn"	"GO:0060964"	"regulation of gene silencing by miRNA"	"9/388"	"113/17913"	0.000787108394486533	0.00863686148855277	0.0065923555732776	"7175/5430/1956/9631/5530/4928/1981/23165/1660"	9
-"617"	"Dn"	"GO:0008584"	"male gonad development"	"10/388"	"137/17913"	0.000810011588730854	0.00886415384532765	0.00676584359747877	"4436/3157/2316/8644/6240/8531/7812/1495/4678/8894"	10
-"618"	"Dn"	"GO:0007160"	"cell-matrix adhesion"	"13/388"	"214/17913"	0.000820533507607921	0.00895509480405518	0.00683525713813834	"3655/3691/7205/3673/3675/23603/6093/3728/3688/87/1499/8826/7414"	13
-"619"	"Dn"	"GO:0000280"	"nuclear division"	"18/388"	"357/17913"	0.000833528858602547	0.00907246867871428	0.0069248464314009	"23397/10592/54443/10051/7175/9493/8452/2801/29127/2316/64151/7153/23047/4288/10111/3192/7917/4926"	18
-"620"	"Dn"	"GO:0009116"	"nucleoside metabolic process"	"9/388"	"114/17913"	0.000838600678942837	0.00910320147195589	0.00694830420029962	"1503/8833/9582/140564/790/3615/471/1739/191"	9
-"621"	"Dn"	"GO:0043161"	"proteasome-mediated ubiquitin-dependent protein catabolic process"	"17/388"	"328/17913"	0.000852776968804786	0.00920255976674058	0.00702414253685779	"857/11160/3326/8452/5713/7184/5707/983/5708/5701/1499/201595/7706/3309/5700/7917/23376"	17
-"622"	"Dn"	"GO:0019674"	"NAD metabolic process"	"7/388"	"71/17913"	0.000856106505430838	0.00920255976674058	0.00702414253685779	"3099/5214/10135/2023/226/2597/5315"	7
-"623"	"Dn"	"GO:1903313"	"positive regulation of mRNA metabolic process"	"7/388"	"71/17913"	0.000856106505430838	0.00920255976674058	0.00702414253685779	"6093/27339/4928/3312/170506/5976/26986"	7
-"624"	"Dn"	"GO:0046546"	"development of primary male sexual characteristics"	"10/388"	"138/17913"	0.000856844907893603	0.00920255976674058	0.00702414253685779	"4436/3157/2316/8644/6240/8531/7812/1495/4678/8894"	10
-"625"	"Dn"	"GO:2001242"	"regulation of intrinsic apoptotic signaling pathway"	"11/388"	"163/17913"	0.000867856060924374	0.00929616188011321	0.00709558728731262	"857/9181/142/8531/26155/9774/2023/3301/10131/10961/10525"	11
-"626"	"Dn"	"GO:0090307"	"mitotic spindle assembly"	"6/388"	"52/17913"	0.000872115973523584	0.00931714400210289	0.00711160255038257	"7175/9493/2801/29127/2316/3192"	6
-"627"	"Dn"	"GO:0061077"	"chaperone-mediated protein folding"	"5/388"	"35/17913"	0.000883266150903722	0.00941143327633992	0.00718357179793165	"10808/10576/10131/9601/2288"	5
-"628"	"Dn"	"GO:0043620"	"regulation of DNA-templated transcription in response to stress"	"9/388"	"115/17913"	0.00089279998092614	0.0094632123632721	0.00722309381096486	"5713/10985/5707/25942/9774/5708/5701/3309/5700"	9
-"629"	"Dn"	"GO:0070252"	"actin-mediated cell contraction"	"9/388"	"115/17913"	0.00089279998092614	0.0094632123632721	0.00722309381096486	"857/1832/476/2316/6093/9631/3728/1739/1829"	9
-"630"	"Dn"	"GO:0008544"	"epidermis development"	"21/388"	"452/17913"	0.00091135382859773	0.00963465183287783	0.0073539503662579	"3909/3852/6699/3853/1832/3918/3892/1830/301/2319/6093/1956/8644/5317/3728/5493/2317/1829/1499/488/4926"	21
-"631"	"Dn"	"GO:0006310"	"DNA recombination"	"14/388"	"244/17913"	0.00091606614487166	0.00965924953277435	0.00737272533262937	"7037/3329/4436/2956/86/5591/8607/142/3838/6832/10111/3980/7520/2547"	14
-"632"	"Dn"	"GO:0051983"	"regulation of chromosome segregation"	"8/388"	"93/17913"	0.000924032387678846	0.00971794061743285	0.00741752314483962	"7175/8452/29127/1778/4288/3192/1499/4926"	8
-"633"	"Dn"	"GO:0034249"	"negative regulation of cellular amide metabolic process"	"13/388"	"217/17913"	0.000932832405099269	0.00978507359649466	0.00746876449787688	"10644/7175/6093/2058/4691/170506/5936/1981/23367/5976/10492/3646/2597"	13
-"634"	"Dn"	"GO:1901654"	"response to ketone"	"12/388"	"191/17913"	0.000963226476644387	0.0100777881238582	0.00769218804685957	"857/445/790/1956/8644/142/988/25942/4678/1829/23367/5111"	12
-"635"	"Dn"	"GO:0051156"	"glucose 6-phosphate metabolic process"	"4/388"	"21/17913"	0.000968504116800292	0.0100809078892658	0.00769456930571142	"2539/3099/7086/5226"	4
-"636"	"Dn"	"GO:2000144"	"positive regulation of DNA-templated transcription, initiation"	"4/388"	"21/17913"	0.000968504116800292	0.0100809078892658	0.00769456930571142	"9774/170506/1499/55832"	4
-"637"	"Dn"	"GO:0032205"	"negative regulation of telomere maintenance"	"5/388"	"36/17913"	0.00100772187005654	0.0104150871545177	0.00794964211713457	"55226/142/10111/3192/7520"	5
-"638"	"Dn"	"GO:0097064"	"ncRNA export from nucleus"	"5/388"	"36/17913"	0.00100772187005654	0.0104150871545177	0.00794964211713457	"7175/11260/9631/4928/23165"	5
-"639"	"Dn"	"GO:0051053"	"negative regulation of DNA metabolic process"	"10/388"	"141/17913"	0.00101086943154714	0.0104150871545177	0.00794964211713457	"55226/4436/2956/23560/142/10111/3192/3980/10155/7520"	10
-"640"	"Dn"	"GO:0006283"	"transcription-coupled nucleotide-excision repair"	"7/388"	"73/17913"	0.00101089880259952	0.0104150871545177	0.00794964211713457	"5984/5430/27339/6917/3980/5111/2873"	7
-"641"	"Dn"	"GO:0035637"	"multicellular organismal signaling"	"12/388"	"193/17913"	0.00105423709012427	0.0107814700038329	0.00822929532470745	"857/1832/476/3673/493/2316/9631/3728/79784/3710/1829/488"	12
-"642"	"Dn"	"GO:0048285"	"organelle fission"	"19/388"	"395/17913"	0.00105542050210055	0.0107814700038329	0.00822929532470745	"23397/10592/54443/10051/7175/9493/8452/2801/29127/2316/64151/7153/23047/64423/4288/10111/3192/7917/4926"	19
-"643"	"Dn"	"GO:0048608"	"reproductive structure development"	"20/388"	"426/17913"	0.00105672429126994	0.0107814700038329	0.00822929532470745	"5268/4436/3326/3157/2316/1956/1718/8644/6240/8531/7812/1495/4678/1739/682/1499/10155/3309/8894/2288"	20
-"644"	"Dn"	"GO:0019882"	"antigen processing and presentation"	"13/388"	"220/17913"	0.00105773761189487	0.0107814700038329	0.00822929532470745	"9493/161/5713/29127/1213/6712/5707/1778/3831/5708/5701/821/5700"	13
-"645"	"Dn"	"GO:0045069"	"regulation of viral genome replication"	"8/388"	"95/17913"	0.00106243678229917	0.0107814700038329	0.00822929532470745	"140564/7153/5586/3312/10155/103/23367/26986"	8
-"646"	"Dn"	"GO:0050810"	"regulation of steroid biosynthetic process"	"8/388"	"95/17913"	0.00106243678229917	0.0107814700038329	0.00822929532470745	"476/11160/1717/4790/2222/3157/8644/6713"	8
-"647"	"Dn"	"GO:0001778"	"plasma membrane repair"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"4627/4628/26509"	3
-"648"	"Dn"	"GO:0006563"	"L-serine metabolic process"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"26227/29968/6472"	3
-"649"	"Dn"	"GO:0007016"	"cytoskeletal anchoring at plasma membrane"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"3728/2317/7094"	3
-"650"	"Dn"	"GO:0051231"	"spindle elongation"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"9493/29127/4926"	3
-"651"	"Dn"	"GO:0061635"	"regulation of protein complex stability"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"56926/3312/8878"	3
-"652"	"Dn"	"GO:1901838"	"positive regulation of transcription of nucleolar large rRNA by RNA polymerase I"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"25926/6597/4691"	3
-"653"	"Dn"	"GO:0097193"	"intrinsic apoptotic signaling pathway"	"15/388"	"277/17913"	0.00109576362726118	0.0109279480955185	0.00834109932496456	"857/2956/9181/8452/142/8531/26155/9774/10514/2023/3301/10131/7917/10961/10525"	15
-"654"	"Dn"	"GO:2000377"	"regulation of reactive oxygen species metabolic process"	"12/388"	"194/17913"	0.00110235550713108	0.0109666767773311	0.00837066020674214	"857/445/2539/1410/3326/3099/3320/493/3043/1956/8644/10131"	12
-"655"	"Dn"	"GO:0006942"	"regulation of striated muscle contraction"	"8/388"	"96/17913"	0.00113759089809882	0.0112618717515945	0.00859597703466259	"857/1832/476/2316/3728/1739/1829/488"	8
-"656"	"Dn"	"GO:0097327"	"response to antineoplastic agent"	"8/388"	"96/17913"	0.00113759089809882	0.0112618717515945	0.00859597703466259	"440/445/1956/3728/1495/1499/23367/5111"	8
-"657"	"Dn"	"GO:0042307"	"positive regulation of protein import into nucleus"	"5/388"	"37/17913"	0.00114473489767396	0.0112774491500776	0.008607866972905	"7175/3843/2316/3728/10155"	5
-"658"	"Dn"	"GO:0060236"	"regulation of mitotic spindle organization"	"5/388"	"37/17913"	0.00114473489767396	0.0112774491500776	0.008607866972905	"7175/1213/1778/3192/4926"	5
-"659"	"Dn"	"GO:0061458"	"reproductive system development"	"20/388"	"429/17913"	0.00115006143248235	0.0113024241265073	0.00862692990743018	"5268/4436/3326/3157/2316/1956/1718/8644/6240/8531/7812/1495/4678/1739/682/1499/10155/3309/8894/2288"	20
-"660"	"Dn"	"GO:0071359"	"cellular response to dsRNA"	"4/388"	"22/17913"	0.00116366537604501	0.0114084288319764	0.00870784132552095	"857/4790/4869/1660"	4
-"661"	"Dn"	"GO:0010332"	"response to gamma radiation"	"6/388"	"55/17913"	0.00117612702566059	0.0115027495818834	0.00877983459786291	"1410/5591/142/3309/7520/2547"	6
-"662"	"Dn"	"GO:0010212"	"response to ionizing radiation"	"10/388"	"144/17913"	0.00118686524816557	0.0115519648793808	0.00881739971815316	"1410/4436/5591/142/6240/10135/3735/3309/7520/2547"	10
-"663"	"Dn"	"GO:0061337"	"cardiac conduction"	"10/388"	"144/17913"	0.00118686524816557	0.0115519648793808	0.00881739971815316	"857/1832/476/493/2316/9631/3728/3710/1829/488"	10
-"664"	"Dn"	"GO:0031668"	"cellular response to extracellular stimulus"	"14/388"	"251/17913"	0.00120137991875939	0.0116651973406637	0.00890382794769041	"440/3655/1277/23394/51520/3934/8644/7184/10985/10135/3312/1981/10514/3309"	14
-"665"	"Dn"	"GO:0019079"	"viral genome replication"	"9/388"	"120/17913"	0.00120815277241707	0.0116749655740256	0.00891128385835077	"140564/7153/5586/3312/7913/10155/103/23367/26986"	9
-"666"	"Dn"	"GO:1905477"	"positive regulation of protein localization to membrane"	"9/388"	"120/17913"	0.00120815277241707	0.0116749655740256	0.00891128385835077	"6711/3675/2181/3799/1956/3688/1739/4641/8878"	9
-"667"	"Dn"	"GO:0019886"	"antigen processing and presentation of exogenous peptide antigen via MHC class II"	"8/388"	"97/17913"	0.00121692705946666	0.0117317563423345	0.00895463119447144	"9493/161/29127/1213/6712/1778/3831/821"	8
-"668"	"Dn"	"GO:0070507"	"regulation of microtubule cytoskeleton organization"	"11/388"	"170/17913"	0.00122318364121965	0.0117640630957205	0.00897929033784444	"7175/9181/4869/1213/1778/3192/10015/1499/7514/4926/2288"	11
-"669"	"Dn"	"GO:0010611"	"regulation of cardiac muscle hypertrophy"	"7/388"	"76/17913"	0.00128343682061151	0.0123143025750142	0.00939927788804039	"2539/493/6093/142/4000/5530/10539"	7
-"670"	"Dn"	"GO:0086005"	"ventricular cardiac muscle cell action potential"	"5/388"	"38/17913"	0.00129506418462741	0.0123964890864217	0.00946200932205067	"857/1832/3728/1739/1829"	5
-"671"	"Dn"	"GO:0032970"	"regulation of actin filament-based process"	"17/388"	"341/17913"	0.00130195440825074	0.0124330504693567	0.00948991594494584	"857/6711/1832/476/5962/6709/2316/6093/6624/4627/23191/3728/6712/1739/1829/488/4641"	17
-"672"	"Dn"	"GO:0009314"	"response to radiation"	"20/388"	"435/17913"	0.00135807959599384	0.0129385041980684	0.00987571936554285	"440/1410/4436/2956/4869/3157/1956/5591/142/3688/6240/26155/10135/3735/170506/5936/3309/7520/5111/2547"	20
-"673"	"Dn"	"GO:0032886"	"regulation of microtubule-based process"	"12/388"	"199/17913"	0.00137115130908234	0.0130323747663719	0.00994736902264829	"7175/9181/4869/1729/1213/1778/3192/10015/1499/7514/4926/2288"	12
-"674"	"Dn"	"GO:0031579"	"membrane raft organization"	"4/388"	"23/17913"	0.00138479137483635	0.0130918632163738	0.00999277544897989	"857/2319/302/1739"	4
-"675"	"Dn"	"GO:0043044"	"ATP-dependent chromatin remodeling"	"7/388"	"77/17913"	0.00138602262938595	0.0130918632163738	0.00999277544897989	"86/4869/8607/1108/6597/4678/8467"	7
-"676"	"Dn"	"GO:1903900"	"regulation of viral life cycle"	"10/388"	"147/17913"	0.00138711022964297	0.0130918632163738	0.00999277544897989	"140564/7153/3838/5586/3312/7706/10155/103/23367/26986"	10
-"677"	"Dn"	"GO:0075733"	"intracellular transport of virus"	"6/388"	"57/17913"	0.00141987093623176	0.0133699009786102	0.0102049964963928	"7175/9631/3838/4928/23165/7514"	6
-"678"	"Dn"	"GO:1904591"	"positive regulation of protein import"	"5/388"	"39/17913"	0.00145947928248147	0.0135763332266125	0.010362562387941	"7175/3843/2316/3728/10155"	5
-"679"	"Dn"	"GO:1990138"	"neuron projection extension"	"10/388"	"148/17913"	0.00145966026413997	0.0135763332266125	0.010362562387941	"3326/23394/2803/3320/23191/3688/8239/1499/8826/7414"	10
-"680"	"Dn"	"GO:0019321"	"pentose metabolic process"	"3/388"	"11/17913"	0.00146191190091456	0.0135763332266125	0.010362562387941	"2539/7086/5226"	3
-"681"	"Dn"	"GO:0032351"	"negative regulation of hormone metabolic process"	"3/388"	"11/17913"	0.00146191190091456	0.0135763332266125	0.010362562387941	"476/4790/8644"	3
-"682"	"Dn"	"GO:0055015"	"ventricular cardiac muscle cell development"	"3/388"	"11/17913"	0.00146191190091456	0.0135763332266125	0.010362562387941	"4000/4628/983"	3
-"683"	"Dn"	"GO:1905214"	"regulation of RNA binding"	"3/388"	"11/17913"	0.00146191190091456	0.0135763332266125	0.010362562387941	"1981/8663/3646"	3
-"684"	"Dn"	"GO:0002495"	"antigen processing and presentation of peptide antigen via MHC class II"	"8/388"	"100/17913"	0.00148169183382656	0.0136971923177254	0.010454811882035	"9493/161/29127/1213/6712/1778/3831/821"	8
-"685"	"Dn"	"GO:0046822"	"regulation of nucleocytoplasmic transport"	"8/388"	"100/17913"	0.00148169183382656	0.0136971923177254	0.010454811882035	"7175/3843/2316/5905/3728/5936/10155/1660"	8
-"686"	"Dn"	"GO:0070527"	"platelet aggregation"	"6/388"	"58/17913"	0.00155530132292061	0.0143123069466035	0.0109243174260644	"6814/2316/3043/4627/7094/7414"	6
-"687"	"Dn"	"GO:1904589"	"regulation of protein import"	"6/388"	"58/17913"	0.00155530132292061	0.0143123069466035	0.0109243174260644	"7175/3843/2316/3728/3312/10155"	6
-"688"	"Dn"	"GO:0070997"	"neuron death"	"17/388"	"347/17913"	0.00156889253182579	0.0144046391414119	0.0109947928713224	"2539/4436/3326/23394/57707/6093/1718/142/7965/10135/16/1981/1499/3309/5700/10525/2597"	17
-"689"	"Dn"	"GO:0002504"	"antigen processing and presentation of peptide or polysaccharide antigen via MHC class II"	"8/388"	"101/17913"	0.00157943647299844	0.0144359780568187	0.0110187132819851	"9493/161/29127/1213/6712/1778/3831/821"	8
-"690"	"Dn"	"GO:0048675"	"axon extension"	"8/388"	"101/17913"	0.00157943647299844	0.0144359780568187	0.0110187132819851	"3326/23394/2803/3320/23191/3688/8239/7414"	8
-"691"	"Dn"	"GO:0014743"	"regulation of muscle hypertrophy"	"7/388"	"79/17913"	0.00161033305613879	0.014685221946635	0.0112089565026635	"2539/493/6093/142/4000/5530/10539"	7
-"692"	"Dn"	"GO:0007568"	"aging"	"16/388"	"318/17913"	0.00162859087261985	0.0148183470634557	0.0113105684258117	"445/1410/4436/2956/4869/5591/9361/4000/5530/1938/25942/1495/983/10135/26156/821"	16
-"693"	"Dn"	"GO:0021680"	"cerebellar Purkinje cell layer development"	"4/388"	"24/17913"	0.0016336279592448	0.0148308511367314	0.0113201125521424	"6712/4628/16/3309"	4
-"694"	"Dn"	"GO:0006289"	"nucleotide-excision repair"	"8/388"	"102/17913"	0.0016822194041532	0.0152378218510432	0.011630745721403	"5984/5430/142/27339/6917/3980/5111/2873"	8
-"695"	"Dn"	"GO:0051258"	"protein polymerization"	"13/388"	"232/17913"	0.00170594598019284	0.0154182483790197	0.0117684619310296	"6711/5962/3320/2801/6709/1729/23191/6712/9793/1739/4641/4926/2288"	13
-"696"	"Dn"	"GO:0090224"	"regulation of spindle organization"	"5/388"	"41/17913"	0.00183369002881934	0.0165358817966358	0.0126215307106167	"7175/1213/1778/3192/4926"	5
-"697"	"Dn"	"GO:0046824"	"positive regulation of nucleocytoplasmic transport"	"6/388"	"60/17913"	0.00185541213197179	0.0166945860496751	0.0127426667122086	"7175/3843/2316/3728/10155/1660"	6
-"698"	"Dn"	"GO:0031145"	"anaphase-promoting complex-dependent catabolic process"	"7/388"	"81/17913"	0.00186192315682532	0.0167160240842255	0.012759029964848	"8452/5713/5707/983/5708/5701/5700"	7
-"699"	"Dn"	"GO:0071346"	"cellular response to interferon-gamma"	"10/388"	"153/17913"	0.00187012650396843	0.0167525270233809	0.0127868919786943	"445/3326/6814/3799/2058/2317/7706/4641/10492/2597"	10
-"700"	"Dn"	"GO:0032355"	"response to estradiol"	"9/388"	"128/17913"	0.00189460033185366	0.0168969972327654	0.0128971633997736	"445/1410/1277/3673/1956/8886/1938/1499/5111"	9
-"701"	"Dn"	"GO:1900542"	"regulation of purine nucleotide metabolic process"	"9/388"	"128/17913"	0.00189460033185366	0.0168969972327654	0.0128971633997736	"7175/9631/5208/142/4928/983/6472/23165/2023"	9
-"702"	"Dn"	"GO:0001765"	"membrane raft assembly"	"3/388"	"12/17913"	0.00191805722553051	0.0169471748529038	0.0129354630430192	"857/2319/302"	3
-"703"	"Dn"	"GO:0002566"	"somatic diversification of immune receptors via somatic mutation"	"3/388"	"12/17913"	0.00191805722553051	0.0169471748529038	0.0129354630430192	"4436/2956/103"	3
-"704"	"Dn"	"GO:0006999"	"nuclear pore organization"	"3/388"	"12/17913"	0.00191805722553051	0.0169471748529038	0.0129354630430192	"7175/4928/23165"	3
-"705"	"Dn"	"GO:0051095"	"regulation of helicase activity"	"3/388"	"12/17913"	0.00191805722553051	0.0169471748529038	0.0129354630430192	"4436/2956/4171"	3
-"706"	"Dn"	"GO:0051656"	"establishment of organelle localization"	"20/388"	"448/17913"	0.00192115417571816	0.0169471748529038	0.0129354630430192	"55717/9493/9181/8452/2801/3799/81/10128/51068/4627/1778/89941/4628/3192/1739/1499/488/4641/7514/4926"	20
-"707"	"Dn"	"GO:0072331"	"signal transduction by p53 class mediator"	"14/388"	"264/17913"	0.00192957182262783	0.0169844267604785	0.0129638967305156	"5984/23246/4839/1108/26155/983/10111/6749/10848/10514/3276/11198/7917/5111"	14
-"708"	"Dn"	"GO:0006970"	"response to osmotic stress"	"7/388"	"82/17913"	0.00199862508960858	0.0175172484558477	0.013370589610526	"3326/3673/9181/1956/8531/7520/2547"	7
-"709"	"Dn"	"GO:0008037"	"cell recognition"	"9/388"	"129/17913"	0.00199875741827652	0.0175172484558477	0.013370589610526	"2049/10574/10576/10694/1739/7203/6950/10575/226"	9
-"710"	"Dn"	"GO:0006521"	"regulation of cellular amino acid metabolic process"	"6/388"	"61/17913"	0.00202096485438777	0.0176736213723889	0.0134899461463737	"5713/493/5707/5708/5701/5700"	6
-"711"	"Dn"	"GO:0060218"	"hematopoietic stem cell differentiation"	"7/388"	"83/17913"	0.00214296773032269	0.0186583597351117	0.0142415786047986	"5713/5707/3313/5708/5701/5700/7520"	7
-"712"	"Dn"	"GO:0006354"	"DNA-templated transcription, elongation"	"8/388"	"106/17913"	0.00214739334071673	0.0186583597351117	0.0142415786047986	"5430/9533/6917/284695/6829/3192/6749/11198"	8
-"713"	"Dn"	"GO:0043502"	"regulation of muscle adaptation"	"8/388"	"106/17913"	0.00214739334071673	0.0186583597351117	0.0142415786047986	"2539/493/6093/142/4000/5530/488/10539"	8
-"714"	"Dn"	"GO:0045739"	"positive regulation of DNA repair"	"6/388"	"62/17913"	0.00219744024899845	0.0190523245571621	0.0145422846186396	"1956/5591/142/10155/5111/1660"	6
-"715"	"Dn"	"GO:1900027"	"regulation of ruffle assembly"	"4/388"	"26/17913"	0.00222134712884925	0.0192184498391253	0.0146690849534445	"857/5962/23603/23191"	4
-"716"	"Dn"	"GO:0046677"	"response to antibiotic"	"16/388"	"328/17913"	0.00222642105863364	0.0192212769006559	0.0146712427968766	"2539/1410/1277/3934/3320/1365/3043/5019/1938/983/1981/3309/10131/23367/5111/7284"	16
-"717"	"Dn"	"GO:0030216"	"keratinocyte differentiation"	"15/388"	"298/17913"	0.00224228926346156	0.0193170834633103	0.0147443701624258	"3852/6699/3853/1832/3892/1830/301/6093/8644/5317/3728/5493/2317/1829/4926"	15
-"718"	"Dn"	"GO:0007548"	"sex differentiation"	"14/388"	"269/17913"	0.00229315247045574	0.0197133213436843	0.0150468111593654	"4436/3157/2316/1718/8644/6240/8531/7812/1495/4678/1499/3309/8894/2288"	14
-"719"	"Dn"	"GO:0006140"	"regulation of nucleotide metabolic process"	"9/388"	"132/17913"	0.00233890379847515	0.0200216098943464	0.0152821220703751	"7175/9631/5208/142/4928/983/6472/23165/2023"	9
-"720"	"Dn"	"GO:0060048"	"cardiac muscle contraction"	"9/388"	"132/17913"	0.00233890379847515	0.0200216098943464	0.0152821220703751	"857/1832/476/2316/9631/3728/10848/1739/1829"	9
-"721"	"Dn"	"GO:0001101"	"response to acid chemical"	"16/388"	"330/17913"	0.00236564653530984	0.0202078118596404	0.015424246563779	"440/445/1277/51520/3673/57707/3843/493/2180/1956/8644/1938/3482/7520/23376/5111"	16
-"722"	"Dn"	"GO:0003300"	"cardiac muscle hypertrophy"	"8/388"	"108/17913"	0.00241504909434247	0.0204591727966475	0.015616105687163	"2539/493/6093/142/4000/5530/488/10539"	8
-"723"	"Dn"	"GO:0050684"	"regulation of mRNA processing"	"8/388"	"108/17913"	0.00241504909434247	0.0204591727966475	0.015616105687163	"27339/4928/6829/3312/3192/170506/5936/1660"	8
-"724"	"Dn"	"GO:0009084"	"glutamine family amino acid biosynthetic process"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"445/2744/4942"	3
-"725"	"Dn"	"GO:0030490"	"maturation of SSU-rRNA"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"27340/84916/25926"	3
-"726"	"Dn"	"GO:0032802"	"low-density lipoprotein particle receptor catabolic process"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"161/302/1213"	3
-"727"	"Dn"	"GO:0042559"	"pteridine-containing compound biosynthetic process"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"25902/2618/471"	3
-"728"	"Dn"	"GO:0042790"	"nucleolar large rRNA transcription by RNA polymerase I"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"25926/6597/4691"	3
-"729"	"Dn"	"GO:0062033"	"positive regulation of mitotic sister chromatid segregation"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"8452/3192/4926"	3
-"730"	"Dn"	"GO:0098903"	"regulation of membrane repolarization during action potential"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"857/2316/1739"	3
-"731"	"Dn"	"GO:1901836"	"regulation of transcription of nucleolar large rRNA by RNA polymerase I"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"25926/6597/4691"	3
-"732"	"Dn"	"GO:1902414"	"protein localization to cell junction"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"1832/2316/81"	3
-"733"	"Dn"	"GO:1901532"	"regulation of hematopoietic progenitor cell differentiation"	"7/388"	"85/17913"	0.0024557070830256	0.0204591727966475	0.015616105687163	"5713/5707/3313/170506/5708/5701/5700"	7
-"734"	"Dn"	"GO:0006898"	"receptor-mediated endocytosis"	"15/388"	"301/17913"	0.00246749473259946	0.0205151666782242	0.0156588447744775	"857/7037/7036/10808/161/3320/302/3043/1213/3688/7184/3482/1742/821/10525"	15
-"735"	"Dn"	"GO:0043618"	"regulation of transcription from RNA polymerase II promoter in response to stress"	"8/388"	"109/17913"	0.00255832463117473	0.0211408779665543	0.0161364385513781	"5713/10985/5707/25942/5708/5701/3309/5700"	8
-"736"	"Dn"	"GO:0022411"	"cellular component disassembly"	"21/388"	"492/17913"	0.00256139342929797	0.0211408779665543	0.0161364385513781	"857/6711/3099/5962/9181/2801/6709/3799/6624/7153/6712/3831/9793/6597/983/3312/682/1499/11198/8878/5976"	21
-"737"	"Dn"	"GO:0006760"	"folic acid-containing compound metabolic process"	"4/388"	"27/17913"	0.00256363820241496	0.0211408779665543	0.0161364385513781	"25902/2618/471/6472"	4
-"738"	"Dn"	"GO:0090169"	"regulation of spindle assembly"	"4/388"	"27/17913"	0.00256363820241496	0.0211408779665543	0.0161364385513781	"7175/1778/3192/4926"	4
-"739"	"Dn"	"GO:2000378"	"negative regulation of reactive oxygen species metabolic process"	"6/388"	"64/17913"	0.00258496335740686	0.0212734077929683	0.0162375961004419	"857/2539/1410/3099/493/10131"	6
-"740"	"Dn"	"GO:0010256"	"endomembrane system organization"	"17/388"	"365/17913"	0.00266173537722537	0.0218607840616339	0.0166859294705534	"857/6711/375056/653145/2801/23603/9631/4627/9950/4000/4628/983/10015/488/26509/7917/8878"	17
-"741"	"Dn"	"GO:0010038"	"response to metal ion"	"16/388"	"335/17913"	0.00274573016419698	0.0225049826616064	0.0171776342682342	"857/7036/445/2539/1956/8644/9361/142/5530/983/3710/1742/682/3309/8826/5111"	16
-"742"	"Dn"	"GO:0022604"	"regulation of cell morphogenesis"	"19/388"	"430/17913"	0.0027667178041008	0.0226311927046548	0.0172739680443167	"23394/301/5962/2803/23603/2316/81/1729/23654/4627/2049/23191/5530/79784/4628/170506/1739/1742/226"	19
-"743"	"Dn"	"GO:0045428"	"regulation of nitric oxide biosynthetic process"	"6/388"	"65/17913"	0.00279692457327429	0.0228321524136847	0.0174273568487549	"857/445/3326/3320/493/3043"	6
-"744"	"Dn"	"GO:0051017"	"actin filament bundle assembly"	"9/388"	"136/17913"	0.00286230368325411	0.0232920993667408	0.0177784257947384	"5962/8452/2316/81/6093/6624/4430/7184/87"	9
-"745"	"Dn"	"GO:0014897"	"striated muscle hypertrophy"	"8/388"	"111/17913"	0.0028647729030963	0.0232920993667408	0.0177784257947384	"2539/493/6093/142/4000/5530/488/10539"	8
-"746"	"Dn"	"GO:0006972"	"hyperosmotic response"	"4/388"	"28/17913"	0.00294044831455521	0.0237237237621408	0.0181078766597718	"9181/8531/7520/2547"	4
-"747"	"Dn"	"GO:0050685"	"positive regulation of mRNA processing"	"4/388"	"28/17913"	0.00294044831455521	0.0237237237621408	0.0181078766597718	"27339/4928/3312/170506"	4
-"748"	"Dn"	"GO:1990776"	"response to angiotensin"	"4/388"	"28/17913"	0.00294044831455521	0.0237237237621408	0.0181078766597718	"857/4790/6093/8826"	4
-"749"	"Dn"	"GO:0006694"	"steroid biosynthetic process"	"11/388"	"190/17913"	0.00294129645062847	0.0237237237621408	0.0181078766597718	"2539/476/11160/1717/4790/2222/3157/47/1718/8644/6713"	11
-"750"	"Dn"	"GO:0061572"	"actin filament bundle organization"	"9/388"	"137/17913"	0.00300660547115027	0.0242022774407305	0.0184731477729354	"5962/8452/2316/81/6093/6624/4430/7184/87"	9
-"751"	"Dn"	"GO:0006984"	"ER-nucleus signaling pathway"	"5/388"	"46/17913"	0.00307103673139945	0.0244934909699602	0.0186954256379881	"440/11160/7184/488/3309"	5
-"752"	"Dn"	"GO:0014075"	"response to amine"	"5/388"	"46/17913"	0.00307103673139945	0.0244934909699602	0.0186954256379881	"445/3673/790/5530/983"	5
-"753"	"Dn"	"GO:0019081"	"viral translation"	"3/388"	"14/17913"	0.00307302875098537	0.0244934909699602	0.0186954256379881	"51386/8662/1660"	3
-"754"	"Dn"	"GO:0046037"	"GMP metabolic process"	"3/388"	"14/17913"	0.00307302875098537	0.0244934909699602	0.0186954256379881	"8833/3615/1739"	3
-"755"	"Dn"	"GO:0086069"	"bundle of His cell to Purkinje myocyte communication"	"3/388"	"14/17913"	0.00307302875098537	0.0244934909699602	0.0186954256379881	"1832/3728/1829"	3
-"756"	"Dn"	"GO:0006937"	"regulation of muscle contraction"	"10/388"	"164/17913"	0.00310361298553385	0.0246886620401307	0.0188443960821577	"857/1832/476/3673/2316/3728/1739/1829/488/2023"	10
-"757"	"Dn"	"GO:0031669"	"cellular response to nutrient levels"	"12/388"	"220/17913"	0.00315744989830642	0.0250676757612602	0.0191336901990251	"440/1277/51520/3934/8644/7184/10985/10135/3312/1981/10514/3309"	12
-"758"	"Dn"	"GO:0014896"	"muscle hypertrophy"	"8/388"	"113/17913"	0.00319911540322922	0.0253487637332194	0.0193482394147307	"2539/493/6093/142/4000/5530/488/10539"	8
-"759"	"Dn"	"GO:0002200"	"somatic diversification of immune receptors"	"6/388"	"67/17913"	0.00325955946508489	0.0257772583479076	0.019675301376417	"7037/3329/4436/2956/5591/103"	6
-"760"	"Dn"	"GO:0031331"	"positive regulation of cellular catabolic process"	"16/388"	"341/17913"	0.00326738156227081	0.0257887484320361	0.01968407154371	"857/4898/3099/5962/3320/6093/5208/6832/6829/170506/5701/5700/23367/7917/5976/26986"	16
-"761"	"Dn"	"GO:0071480"	"cellular response to gamma radiation"	"4/388"	"29/17913"	0.0033534144999214	0.0264162943777855	0.0201630656804612	"1410/3309/7520/2547"	4
-"762"	"Dn"	"GO:0001701"	"in utero embryonic development"	"16/388"	"342/17913"	0.00336180212551809	0.0264309452548015	0.0201742484221178	"4436/8452/86/1956/4627/84295/3688/8531/27339/25942/4628/4678/1499/3276/10155/8894"	16
-"763"	"Dn"	"GO:2001169"	"regulation of ATP biosynthetic process"	"7/388"	"90/17913"	0.00339144968952873	0.0266123639397322	0.0203127219266756	"7175/9631/5208/142/4928/23165/2023"	7
-"764"	"Dn"	"GO:1903320"	"regulation of protein modification by small protein conjugation or removal"	"12/388"	"223/17913"	0.00352213839270095	0.0275844068704955	0.021054664198249	"857/26354/3326/23560/8452/3320/2801/7965/1499/3309/3301/23376"	12
-"765"	"Dn"	"GO:0043484"	"regulation of RNA splicing"	"8/388"	"115/17913"	0.00356302203560945	0.0278051761471947	0.0212231732768751	"79026/5430/27339/284695/4928/3312/3192/5936"	8
-"766"	"Dn"	"GO:1902903"	"regulation of supramolecular fiber organization"	"15/388"	"313/17913"	0.00356406184746705	0.0278051761471947	0.0212231732768751	"6711/1410/5962/9181/79709/6709/2316/6093/23191/6712/3312/1739/4641/4926/2288"	15
-"767"	"Dn"	"GO:0046434"	"organophosphate catabolic process"	"12/388"	"224/17913"	0.00365098968220813	0.0284285715831937	0.0216989994068079	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
-"768"	"Dn"	"GO:2000736"	"regulation of stem cell differentiation"	"8/388"	"116/17913"	0.00375659321401265	0.0289878021497441	0.0221258496865109	"5713/5707/3313/3192/170506/5708/5701/5700"	8
-"769"	"Dn"	"GO:0009913"	"epidermal cell differentiation"	"16/388"	"346/17913"	0.00376228967918882	0.0289878021497441	0.0221258496865109	"3852/6699/3853/1832/3892/1830/301/6093/8644/5317/3728/5493/2317/1829/1499/4926"	16
-"770"	"Dn"	"GO:0000281"	"mitotic cytokinesis"	"6/388"	"69/17913"	0.00377693246647603	0.0289878021497441	0.0221258496865109	"6711/54443/9493/29127/4628/10015"	6
-"771"	"Dn"	"GO:0006098"	"pentose-phosphate shunt"	"3/388"	"15/17913"	0.0037800838565238	0.0289878021497441	0.0221258496865109	"2539/7086/5226"	3
-"772"	"Dn"	"GO:0009070"	"serine family amino acid biosynthetic process"	"3/388"	"15/17913"	0.0037800838565238	0.0289878021497441	0.0221258496865109	"26227/29968/6472"	3
-"773"	"Dn"	"GO:0035635"	"entry of bacterium into host cell"	"3/388"	"15/17913"	0.0037800838565238	0.0289878021497441	0.0221258496865109	"857/3853/1499"	3
-"774"	"Dn"	"GO:0045091"	"regulation of single stranded viral RNA replication via double stranded DNA intermediate"	"3/388"	"15/17913"	0.0037800838565238	0.0289878021497441	0.0221258496865109	"140564/7153/10155"	3
-"775"	"Dn"	"GO:0090136"	"epithelial cell-cell adhesion"	"3/388"	"15/17913"	0.0037800838565238	0.0289878021497441	0.0221258496865109	"3728/1495/7414"	3
-"776"	"Dn"	"GO:2000142"	"regulation of DNA-templated transcription, initiation"	"4/388"	"30/17913"	0.00380414041537944	0.0291171352398324	0.0222245672262542	"9774/170506/1499/55832"	4
-"777"	"Dn"	"GO:2001022"	"positive regulation of response to DNA damage stimulus"	"7/388"	"92/17913"	0.00383358016877374	0.0292871058554054	0.0223543026326111	"1956/5591/142/9774/10155/5111/1660"	7
-"778"	"Dn"	"GO:0051235"	"maintenance of location"	"14/388"	"286/17913"	0.00397647193583231	0.0303215345916856	0.0231438628280378	"857/10938/4790/3934/3099/2316/5905/1729/3728/7184/2317/3192/3309/7094"	14
-"779"	"Dn"	"GO:0051261"	"protein depolymerization"	"7/388"	"93/17913"	0.00407040382537448	0.0309794456559047	0.0236460340943797	"6711/5962/9181/6709/6712/9793/3312"	7
-"780"	"Dn"	"GO:0044839"	"cell cycle G2/M phase transition"	"13/388"	"257/17913"	0.00412616057101955	0.0313448858387582	0.0239249677821929	"7277/5713/3320/4869/5707/1778/25942/9793/983/5708/5701/5700/10383"	13
-"781"	"Dn"	"GO:0006997"	"nucleus organization"	"8/388"	"118/17913"	0.00416805135341836	0.031603820093616	0.0241226074780925	"23481/7175/9631/4000/4928/983/23165/4926"	8
-"782"	"Dn"	"GO:0033120"	"positive regulation of RNA splicing"	"4/388"	"31/17913"	0.004294193215034	0.0324387841934192	0.0247599200301254	"5430/27339/4928/3312"	4
-"783"	"Dn"	"GO:0086011"	"membrane repolarization during action potential"	"4/388"	"31/17913"	0.004294193215034	0.0324387841934192	0.0247599200301254	"857/476/2316/1739"	4
-"784"	"Dn"	"GO:2001243"	"negative regulation of intrinsic apoptotic signaling pathway"	"7/388"	"94/17913"	0.00431814754643813	0.0325589933250056	0.0248516734222138	"9181/8531/26155/2023/3301/10131/10525"	7
-"785"	"Dn"	"GO:0000288"	"nuclear-transcribed mRNA catabolic process, deadenylation-dependent decay"	"6/388"	"71/17913"	0.00435282274573556	0.032759441073389	0.0250046714566222	"22894/9652/23644/170506/1656/26986"	6
-"786"	"Dn"	"GO:0035567"	"non-canonical Wnt signaling pathway"	"9/388"	"145/17913"	0.00437865305161911	0.032771102044373	0.0250135720586705	"161/5713/1213/5530/5707/5708/5701/1499/5700"	9
-"787"	"Dn"	"GO:0042133"	"neurotransmitter metabolic process"	"9/388"	"145/17913"	0.00437865305161911	0.032771102044373	0.0250135720586705	"857/26227/445/3326/2618/3320/493/3043/6472"	9
-"788"	"Dn"	"GO:0046165"	"alcohol biosynthetic process"	"9/388"	"145/17913"	0.00437865305161911	0.032771102044373	0.0250135720586705	"2539/11160/1717/4790/2222/3157/47/1718/6713"	9
-"789"	"Dn"	"GO:0002931"	"response to ischemia"	"5/388"	"50/17913"	0.00442441263496153	0.0329309683069104	0.025135595000478	"857/3099/1938/8878/10525"	5
-"790"	"Dn"	"GO:0045540"	"regulation of cholesterol biosynthetic process"	"5/388"	"50/17913"	0.00442441263496153	0.0329309683069104	0.025135595000478	"11160/1717/2222/3157/6713"	5
-"791"	"Dn"	"GO:0106118"	"regulation of sterol biosynthetic process"	"5/388"	"50/17913"	0.00442441263496153	0.0329309683069104	0.025135595000478	"11160/1717/2222/3157/6713"	5
-"792"	"Dn"	"GO:0034341"	"response to interferon-gamma"	"10/388"	"173/17913"	0.00453402952295067	0.0336232335868631	0.0256639882000832	"445/3326/6814/3799/2058/2317/7706/4641/10492/2597"	10
-"793"	"Dn"	"GO:0071478"	"cellular response to radiation"	"10/388"	"173/17913"	0.00453402952295067	0.0336232335868631	0.0256639882000832	"1410/4869/142/26155/10135/170506/3309/7520/5111/2547"	10
-"794"	"Dn"	"GO:0039692"	"single stranded viral RNA replication via double stranded DNA intermediate"	"3/388"	"16/17913"	0.00457836746771118	0.0337665025077643	0.0257733427000288	"140564/7153/10155"	3
-"795"	"Dn"	"GO:0055012"	"ventricular cardiac muscle cell differentiation"	"3/388"	"16/17913"	0.00457836746771118	0.0337665025077643	0.0257733427000288	"4000/4628/983"	3
-"796"	"Dn"	"GO:0061684"	"chaperone-mediated autophagy"	"3/388"	"16/17913"	0.00457836746771118	0.0337665025077643	0.0257733427000288	"3320/3312/1915"	3
-"797"	"Dn"	"GO:0006352"	"DNA-templated transcription, initiation"	"12/388"	"231/17913"	0.00466310046908456	0.0342103832303079	0.0261121485913829	"5430/9533/284119/6597/983/9774/170506/1499/10155/8467/55832/2969"	12
-"798"	"Dn"	"GO:0043462"	"regulation of ATPase activity"	"6/388"	"72/17913"	0.00466390010944183	0.0342103832303079	0.0261121485913829	"23397/29128/10598/3192/3301/1660"	6
-"799"	"Dn"	"GO:1902036"	"regulation of hematopoietic stem cell differentiation"	"6/388"	"72/17913"	0.00466390010944183	0.0342103832303079	0.0261121485913829	"5713/5707/3313/5708/5701/5700"	6
-"800"	"Dn"	"GO:0042594"	"response to starvation"	"10/388"	"174/17913"	0.00472055891779214	0.0345633690020621	0.0263815760590801	"440/51520/790/5019/8644/10985/3312/10514/3309/23367"	10
-"801"	"Dn"	"GO:0000910"	"cytokinesis"	"9/388"	"147/17913"	0.004787964881025	0.0349496114247425	0.0266763877092574	"6711/54443/9493/8452/29127/4627/4628/5586/10015"	9
-"802"	"Dn"	"GO:0003299"	"muscle hypertrophy in response to stress"	"4/388"	"32/17913"	0.00482510071287505	0.0349496114247425	0.0266763877092574	"493/4000/5530/488"	4
-"803"	"Dn"	"GO:0014887"	"cardiac muscle adaptation"	"4/388"	"32/17913"	0.00482510071287505	0.0349496114247425	0.0266763877092574	"493/4000/5530/488"	4
-"804"	"Dn"	"GO:0014898"	"cardiac muscle hypertrophy in response to stress"	"4/388"	"32/17913"	0.00482510071287505	0.0349496114247425	0.0266763877092574	"493/4000/5530/488"	4
-"805"	"Dn"	"GO:0051693"	"actin filament capping"	"4/388"	"32/17913"	0.00482510071287505	0.0349496114247425	0.0266763877092574	"6711/5962/6709/6712"	4
-"806"	"Dn"	"GO:0071709"	"membrane assembly"	"4/388"	"32/17913"	0.00482510071287505	0.0349496114247425	0.0266763877092574	"857/6711/2319/302"	4
-"807"	"Dn"	"GO:0043500"	"muscle adaptation"	"8/388"	"121/17913"	0.00484932198823541	0.0349998301789041	0.026714718749337	"2539/493/6093/142/4000/5530/488/10539"	8
-"808"	"Dn"	"GO:0046718"	"viral entry into host cell"	"8/388"	"121/17913"	0.00484932198823541	0.0349998301789041	0.026714718749337	"857/7037/3673/6510/1956/3688/983/7706"	8
-"809"	"Dn"	"GO:0001503"	"ossification"	"17/388"	"388/17913"	0.00491744768671625	0.0354283731023383	0.0270418175841898	"9188/1277/23560/1956/3376/1213/23020/3192/26156/170506/5701/10514/1499/103/23376/10492/1660"	17
-"810"	"Dn"	"GO:0072401"	"signal transduction involved in DNA integrity checkpoint"	"6/388"	"73/17913"	0.00499103455483069	0.035767608694707	0.0273007497959626	"5591/988/27339/983/3276/5111"	6
-"811"	"Dn"	"GO:0072422"	"signal transduction involved in DNA damage checkpoint"	"6/388"	"73/17913"	0.00499103455483069	0.035767608694707	0.0273007497959626	"5591/988/27339/983/3276/5111"	6
-"812"	"Dn"	"GO:1903779"	"regulation of cardiac conduction"	"6/388"	"73/17913"	0.00499103455483069	0.035767608694707	0.0273007497959626	"857/476/493/2316/3710/488"	6
-"813"	"Dn"	"GO:0048732"	"gland development"	"18/388"	"422/17913"	0.00508667777595131	0.0363795206001112	0.0277678107607926	"5268/440/857/445/220/3673/3099/8452/3157/790/1956/5591/2049/3482/1499/5111/2288/5315"	18
-"814"	"Dn"	"GO:1902904"	"negative regulation of supramolecular fiber organization"	"8/388"	"122/17913"	0.00509439075827688	0.0363795206001112	0.0277678107607926	"6711/1410/5962/9181/6709/6712/3312/2288"	8
-"815"	"Dn"	"GO:1901989"	"positive regulation of cell cycle phase transition"	"7/388"	"97/17913"	0.0051300391922203	0.0365695927628521	0.0279128893038525	"5962/8452/4869/1956/25942/983/1981"	7
-"816"	"Dn"	"GO:0060828"	"regulation of canonical Wnt signaling pathway"	"13/388"	"264/17913"	0.00515842333129993	0.0367073041624489	0.0280180018512563	"857/1277/4790/8452/5713/1956/8607/3728/5707/5708/5701/1499/5700"	13
-"817"	"Dn"	"GO:0043010"	"camera-type eye development"	"14/388"	"295/17913"	0.00521062387983968	0.0370137124376682	0.0282518775830273	"220/1410/86/493/1956/23047/23770/6240/6597/4628/3615/10848/1739/1499"	14
-"818"	"Dn"	"GO:0072395"	"signal transduction involved in cell cycle checkpoint"	"6/388"	"74/17913"	0.00533470316121317	0.0378287444829284	0.0288739763689222	"5591/988/27339/983/3276/5111"	6
-"819"	"Dn"	"GO:0042455"	"ribonucleoside biosynthetic process"	"4/388"	"33/17913"	0.00539834881801304	0.0380137641115388	0.0290151984067483	"1503/8833/790/3615"	4
-"820"	"Dn"	"GO:0042558"	"pteridine-containing compound metabolic process"	"4/388"	"33/17913"	0.00539834881801304	0.0380137641115388	0.0290151984067483	"25902/2618/471/6472"	4
-"821"	"Dn"	"GO:0043928"	"exonucleolytic nuclear-transcribed mRNA catabolic process involved in deadenylation-dependent decay"	"4/388"	"33/17913"	0.00539834881801304	0.0380137641115388	0.0290151984067483	"22894/9652/23644/1656"	4
-"822"	"Dn"	"GO:0071353"	"cellular response to interleukin-4"	"4/388"	"33/17913"	0.00539834881801304	0.0380137641115388	0.0290151984067483	"3326/4171/3615/3309"	4
-"823"	"Dn"	"GO:0060537"	"muscle tissue development"	"17/388"	"392/17913"	0.00543606387351233	0.0381936982506278	0.0291525387851044	"857/2539/1832/4000/3688/5530/8531/1938/2317/79784/4628/983/3192/10848/1739/1829/1499"	17
-"824"	"Dn"	"GO:0022406"	"membrane docking"	"9/388"	"150/17913"	0.00545700162857321	0.0381936982506278	0.0291525387851044	"7277/6814/3320/6093/1778/9793/983/23344/10383"	9
-"825"	"Dn"	"GO:0030902"	"hindbrain development"	"9/388"	"150/17913"	0.00545700162857321	0.0381936982506278	0.0291525387851044	"2618/2316/6712/3688/4628/471/16/1499/3309"	9
-"826"	"Dn"	"GO:0006266"	"DNA ligation"	"3/388"	"17/17913"	0.00547106569161871	0.0381936982506278	0.0291525387851044	"7153/3980/2547"	3
-"827"	"Dn"	"GO:0006544"	"glycine metabolic process"	"3/388"	"17/17913"	0.00547106569161871	0.0381936982506278	0.0291525387851044	"26227/2618/6472"	3
-"828"	"Dn"	"GO:0019218"	"regulation of steroid metabolic process"	"8/388"	"124/17913"	0.00561284759970279	0.0391160411896671	0.0298565459783085	"476/11160/1717/4790/2222/3157/8644/6713"	8
-"829"	"Dn"	"GO:0032984"	"protein-containing complex disassembly"	"14/388"	"298/17913"	0.00568468192501153	0.0394163079082209	0.0300857339742201	"857/6711/5962/9181/6709/3799/6712/3831/9793/6597/3312/1499/11198/5976"	14
-"830"	"Dn"	"GO:0006336"	"DNA replication-independent nucleosome assembly"	"5/388"	"53/17913"	0.00568513801392961	0.0394163079082209	0.0300857339742201	"79711/4869/8607/4678/8467"	5
-"831"	"Dn"	"GO:0034724"	"DNA replication-independent nucleosome organization"	"5/388"	"53/17913"	0.00568513801392961	0.0394163079082209	0.0300857339742201	"79711/4869/8607/4678/8467"	5
-"832"	"Dn"	"GO:1903046"	"meiotic cell cycle process"	"9/388"	"151/17913"	0.00569537422021613	0.0394197781498378	0.0300883827450374	"23397/10592/2956/10051/2801/7153/4627/10111/7917"	9
-"833"	"Dn"	"GO:0000086"	"G2/M transition of mitotic cell cycle"	"12/388"	"238/17913"	0.00588817204761187	0.0406846563494547	0.0310538407253251	"7277/5713/3320/5707/1778/25942/9793/983/5708/5701/5700/10383"	12
-"834"	"Dn"	"GO:0032271"	"regulation of protein polymerization"	"10/388"	"180/17913"	0.00596994794341208	0.0411794194597539	0.0314314841959255	"6711/5962/3320/6709/23191/6712/1739/4641/4926/2288"	10
-"835"	"Dn"	"GO:0000291"	"nuclear-transcribed mRNA catabolic process, exonucleolytic"	"4/388"	"34/17913"	0.00601537922809378	0.0413519023676599	0.0315631371882465	"22894/9652/23644/1656"	4
-"836"	"Dn"	"GO:0072595"	"maintenance of protein localization in organelle"	"4/388"	"34/17913"	0.00601537922809378	0.0413519023676599	0.0315631371882465	"3099/5905/3192/3309"	4
-"837"	"Dn"	"GO:0006809"	"nitric oxide biosynthetic process"	"6/388"	"76/17913"	0.00607354957220722	0.0416702507830138	0.0318061266066809	"857/445/3326/3320/493/3043"	6
-"838"	"Dn"	"GO:0031334"	"positive regulation of protein complex assembly"	"12/388"	"239/17913"	0.00608227172456437	0.0416702507830138	0.0318061266066809	"3320/6624/23191/142/9774/170506/1739/1981/1499/4641/55832/4926"	12
-"839"	"Dn"	"GO:0030010"	"establishment of cell polarity"	"8/388"	"126/17913"	0.00617058111344896	0.0422038562978967	0.032213417761533	"3326/9181/2319/3320/6093/6624/4627/4926"	8
-"840"	"Dn"	"GO:0031497"	"chromatin assembly"	"9/388"	"153/17913"	0.00619618553282634	0.0422698849242393	0.0322638161827005	"79711/7175/4171/4869/8607/26155/3009/4678/8467"	9
-"841"	"Dn"	"GO:1905475"	"regulation of protein localization to membrane"	"10/388"	"181/17913"	0.00620111426154561	0.0422698849242393	0.0322638161827005	"6711/3675/2181/3799/1956/1213/3688/1739/4641/8878"	10
-"842"	"Dn"	"GO:0070498"	"interleukin-1-mediated signaling pathway"	"7/388"	"101/17913"	0.00638460594735134	0.0433746132228617	0.033107034725227	"4790/5713/5707/5708/5701/5700/8878"	7
-"843"	"Dn"	"GO:1903426"	"regulation of reactive oxygen species biosynthetic process"	"7/388"	"101/17913"	0.00638460594735134	0.0433746132228617	0.033107034725227	"857/445/3326/3320/493/3043/10131"	7
-"844"	"Dn"	"GO:0038083"	"peptidyl-tyrosine autophosphorylation"	"3/388"	"18/17913"	0.00646102492340366	0.0436011498581024	0.0332799459212511	"857/1956/8826"	3
-"845"	"Dn"	"GO:0042026"	"protein refolding"	"3/388"	"18/17913"	0.00646102492340366	0.0436011498581024	0.0332799459212511	"3329/3320/3312"	3
-"846"	"Dn"	"GO:0048026"	"positive regulation of mRNA splicing, via spliceosome"	"3/388"	"18/17913"	0.00646102492340366	0.0436011498581024	0.0332799459212511	"27339/4928/3312"	3
-"847"	"Dn"	"GO:0060546"	"negative regulation of necroptotic process"	"3/388"	"18/17913"	0.00646102492340366	0.0436011498581024	0.0332799459212511	"857/9181/8531"	3
-"848"	"Dn"	"GO:0032386"	"regulation of intracellular transport"	"17/388"	"400/17913"	0.0066073298474443	0.0445142737975075	0.0339769164236737	"10938/1410/7175/5962/302/3843/2316/5905/3799/3728/1778/5936/488/10155/4641/4926/1660"	17
-"849"	"Dn"	"GO:0042306"	"regulation of protein import into nucleus"	"5/388"	"55/17913"	0.00665440367799074	0.0446164212035171	0.0340548836369022	"7175/3843/2316/3728/10155"	5
-"850"	"Dn"	"GO:0030835"	"negative regulation of actin filament depolymerization"	"4/388"	"35/17913"	0.00667758736708604	0.0446164212035171	0.0340548836369022	"6711/5962/6709/6712"	4
-"851"	"Dn"	"GO:0045740"	"positive regulation of DNA replication"	"4/388"	"35/17913"	0.00667758736708604	0.0446164212035171	0.0340548836369022	"1956/983/5111/1660"	4
-"852"	"Dn"	"GO:0046131"	"pyrimidine ribonucleoside metabolic process"	"4/388"	"35/17913"	0.00667758736708604	0.0446164212035171	0.0340548836369022	"1503/9582/140564/790"	4
-"853"	"Dn"	"GO:0048333"	"mesodermal cell differentiation"	"4/388"	"35/17913"	0.00667758736708604	0.0446164212035171	0.0340548836369022	"3691/3673/3675/3688"	4
-"854"	"Dn"	"GO:0031960"	"response to corticosteroid"	"9/388"	"155/17913"	0.0067302369979465	0.0448260100843544	0.0342148589275232	"445/1277/301/790/1956/8644/142/3192/5111"	9
-"855"	"Dn"	"GO:0006275"	"regulation of DNA replication"	"7/388"	"102/17913"	0.00673109758737651	0.0448260100843544	0.0342148589275232	"5984/23560/1956/983/3980/5111/1660"	7
-"856"	"Dn"	"GO:1903008"	"organelle disassembly"	"6/388"	"78/17913"	0.00688424340124475	0.0457706100683744	0.0349358545087799	"3099/2801/3799/3831/983/8878"	6
-"857"	"Dn"	"GO:0071347"	"cellular response to interleukin-1"	"9/388"	"156/17913"	0.00701016282583304	0.0465313922652426	0.0355165453954198	"4790/3934/5713/5707/5708/5701/5700/8878/5976"	9
-"858"	"Dn"	"GO:0051222"	"positive regulation of protein transport"	"17/388"	"403/17913"	0.00709607243490644	0.0470245454810739	0.0358929600635461	"6711/7175/2181/3843/2316/3799/1956/5019/5208/3728/4628/3735/170506/10155/4641/1660/2597"	17
-"859"	"Dn"	"GO:0060560"	"developmental growth involved in morphogenesis"	"11/388"	"214/17913"	0.00713490529815798	0.0472046267193491	0.0360304127199722	"3326/23394/2803/3320/23191/3688/8239/1499/10155/8826/7414"	11
-"860"	"Dn"	"GO:0033619"	"membrane protein proteolysis"	"5/388"	"56/17913"	0.00717997075782683	0.0473344982192462	0.0361295412178984	"4790/4898/6093/4627/81502"	5
-"861"	"Dn"	"GO:1901880"	"negative regulation of protein depolymerization"	"5/388"	"56/17913"	0.00717997075782683	0.0473344982192462	0.0361295412178984	"6711/5962/9181/6709/6712"	5
-"862"	"Dn"	"GO:0060047"	"heart contraction"	"13/388"	"275/17913"	0.00718960642253308	0.0473344982192462	0.0361295412178984	"857/1832/476/493/2316/9631/3728/3710/10848/1739/1829/488/10539"	13
-"863"	"Dn"	"GO:0043434"	"response to peptide hormone"	"17/388"	"404/17913"	0.00726533169876073	0.0477554026757828	0.036450809753181	"857/445/1277/4790/6814/57707/5905/790/6093/5591/23191/142/988/2058/682/4641/8826"	17
-"864"	"Dn"	"GO:0006368"	"transcription elongation from RNA polymerase II promoter"	"6/388"	"79/17913"	0.00731771548440415	0.04802176660673	0.036654120382514	"5430/6917/6829/3192/6749/11198"	6
-"865"	"Dn"	"GO:0051293"	"establishment of spindle localization"	"4/388"	"36/17913"	0.00738632055421473	0.0482374385871217	0.0368187387897699	"9181/4627/1778/4926"	4
-"866"	"Dn"	"GO:0070670"	"response to interleukin-4"	"4/388"	"36/17913"	0.00738632055421473	0.0482374385871217	0.0368187387897699	"3326/4171/3615/3309"	4
-"867"	"Dn"	"GO:0086091"	"regulation of heart rate by cardiac conduction"	"4/388"	"36/17913"	0.00738632055421473	0.0482374385871217	0.0368187387897699	"857/1832/3728/1829"	4
-"868"	"Dn"	"GO:0010612"	"regulation of cardiac muscle adaptation"	"3/388"	"19/17913"	0.00755076839460367	0.0489952904322921	0.0373971929935162	"493/4000/5530"	3
-"869"	"Dn"	"GO:0032042"	"mitochondrial DNA metabolic process"	"3/388"	"19/17913"	0.00755076839460367	0.0489952904322921	0.0373971929935162	"9361/142/3980"	3
-"870"	"Dn"	"GO:0032069"	"regulation of nuclease activity"	"3/388"	"19/17913"	0.00755076839460367	0.0489952904322921	0.0373971929935162	"4869/6917/5111"	3
-"871"	"Dn"	"GO:1903242"	"regulation of cardiac muscle hypertrophy in response to stress"	"3/388"	"19/17913"	0.00755076839460367	0.0489952904322921	0.0373971929935162	"493/4000/5530"	3
-"872"	"Dn"	"GO:0021537"	"telencephalon development"	"12/388"	"246/17913"	0.00758701664783955	0.0491357851508118	0.0375044299964341	"220/306/2618/493/2316/3799/1956/55236/2049/4628/471/1499"	12
-"873"	"Dn"	"GO:0099173"	"postsynapse organization"	"9/388"	"158/17913"	0.00759669091242485	0.0491357851508118	0.0375044299964341	"3675/2049/6712/87/4628/3312/170506/1739/1742"	9
-"874"	"Dn"	"GO:0048588"	"developmental cell growth"	"11/388"	"216/17913"	0.00762846499804647	0.0492626072999843	0.0376012309817249	"2539/3326/23394/2803/3320/23191/3688/8239/1499/8826/7414"	11
-"875"	"Dn"	"GO:0030111"	"regulation of Wnt signaling pathway"	"15/388"	"341/17913"	0.00771552670270342	0.0497454898395639	0.0379698062338874	"857/1277/4790/3675/8452/5713/1956/8607/3728/5707/6597/5708/5701/1499/5700"	15
+"Cluster"	"ID"	"Description"	"GeneRatio"	"BgRatio"	"pvalue"	"p.adjust"	"qvalue"	"geneID"	"Count"
+"1"	"Up"	"GO:0006614"	"SRP-dependent cotranslational protein targeting to membrane"	"61/549"	"103/17913"	7.17614589176342e-66	1.81750996844429e-62	1.60912586893586e-62	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/6204/6228/6169/6209"	61
+"2"	"Up"	"GO:0045047"	"protein targeting to ER"	"62/549"	"108/17913"	9.7089207716041e-66	1.81750996844429e-62	1.60912586893586e-62	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/23480/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/6204/6228/6169/6209"	62
+"3"	"Up"	"GO:0006613"	"cotranslational protein targeting to membrane"	"61/549"	"106/17913"	8.98858148601582e-65	1.12177496945477e-61	9.93159406998731e-62	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/6204/6228/6169/6209"	61
+"4"	"Up"	"GO:0072599"	"establishment of protein localization to endoplasmic reticulum"	"62/549"	"112/17913"	2.34767791127495e-64	2.19742652495335e-61	1.94548361647495e-61	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/23480/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/6204/6228/6169/6209"	62
+"5"	"Up"	"GO:0000184"	"nuclear-transcribed mRNA catabolic process, nonsense-mediated decay"	"63/549"	"118/17913"	5.05435682980006e-64	3.78470239415428e-61	3.35077255937692e-61	"6189/6125/4736/9775/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/9939/6165/6235/84305/6231/6144/6160/6207/6204/6228/55110/6169/6209"	63
+"6"	"Up"	"GO:0070972"	"protein localization to endoplasmic reticulum"	"63/549"	"128/17913"	4.87731822380499e-61	3.04344657165431e-58	2.6945044011863e-58	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/9218/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/23480/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/6204/6228/6169/6209"	63
+"7"	"Up"	"GO:0006413"	"translational initiation"	"66/549"	"183/17913"	5.72293424787441e-53	3.0609522605774e-50	2.71000299948218e-50	"6189/6125/8668/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/1967/6138/6232/6156/6143/6229/6230/6227/3315/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/1974/6193/6139/6133/9349/6210/1964/9086/6234/6224/6181/6201/6208/6173/6218/6164/6165/6235/6231/6144/6160/6207/6204/1975/6228/6169/6209"	66
+"8"	"Up"	"GO:0000956"	"nuclear-transcribed mRNA catabolic process"	"67/549"	"197/17913"	8.288062004923e-52	3.87881301830396e-49	3.43409305967138e-49	"6189/6125/4736/9775/9967/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/25804/6188/28960/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/9939/6165/6235/84305/6231/6144/6160/6207/6204/6228/55110/6169/6209/27258"	67
+"9"	"Up"	"GO:0006612"	"protein targeting to membrane"	"62/549"	"167/17913"	1.11916964762208e-50	4.65574573410786e-48	4.12194762615431e-48	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/6207/6726/11261/6204/6228/6169/6209"	62
+"10"	"Up"	"GO:0019083"	"viral transcription"	"63/549"	"177/17913"	3.77298649972469e-50	1.41260614549692e-47	1.25064573554032e-47	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/129401/10410/6165/6235/2963/6231/6144/6160/6207/64710/6204/6228/6169/6209"	63
+"11"	"Up"	"GO:0019080"	"viral gene expression"	"64/549"	"191/17913"	5.04504447661761e-49	1.71714968367785e-46	1.52027225424582e-46	"6189/6125/4736/6142/5725/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/6155/6157/6188/6193/6139/6133/9349/6210/6234/6224/6181/6201/6208/6173/6218/6164/129401/10410/6165/6235/2963/6231/6144/6160/6207/64710/6204/6228/6169/6209"	64
+"12"	"Up"	"GO:0006402"	"mRNA catabolic process"	"80/549"	"338/17913"	2.67096248988706e-48	8.33340296844763e-46	7.37794814092487e-46	"6189/6125/4736/9775/9967/6142/5689/6136/6191/6192/6206/6154/1994/6217/6202/10949/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/3315/6187/6205/6161/6135/6223/6168/6159/23521/5686/6147/6203/3921/5690/9261/5692/6132/6155/6157/25804/5682/6188/28960/6193/6139/6133/9349/6210/6234/6224/5691/6181/6201/6208/6173/6218/6164/9939/6165/7431/6235/84305/6231/6144/6160/6207/6204/6228/55110/1153/5696/6169/6209/27258"	80
+"13"	"Up"	"GO:0006401"	"RNA catabolic process"	"81/549"	"368/17913"	2.59008045976733e-46	7.45943172412991e-44	6.60418086462131e-44	"6189/6125/4736/9775/9967/6142/5689/6136/6191/6192/6206/6154/1994/6217/6202/10949/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/3315/6187/6205/6161/6135/6223/6168/6159/23521/5686/6147/6203/3921/5690/9261/5692/6132/6155/6157/25804/5682/6188/28960/6193/6139/6133/9349/6210/6234/6224/5691/6181/6201/6208/6173/6218/6164/9939/6165/7431/6235/84305/6231/6144/6160/6207/6204/6228/55110/8635/1153/5696/6169/6209/27258"	81
+"14"	"Up"	"GO:0006605"	"protein targeting"	"80/549"	"364/17913"	1.10426751108592e-45	2.95312682964691e-43	2.61454014466884e-43	"6189/6125/4736/7879/3295/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/1891/56993/4924/6155/6157/6188/7332/6193/6139/6133/9349/30/6210/6234/23480/950/373156/6224/6181/6201/6208/6173/706/6218/6164/6165/131118/401505/6235/6747/6231/6144/6160/10965/6207/6726/26517/11261/26519/2053/6204/6228/26520/6169/6209"	80
+"15"	"Up"	"GO:0090150"	"establishment of protein localization to membrane"	"70/549"	"287/17913"	3.55324102399244e-43	8.86888959588513e-41	7.85203928740505e-41	"6189/6125/4736/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/9230/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/4218/56993/8266/6155/6157/6188/6193/6139/6133/9349/439/6210/6234/6224/6181/6201/6208/6173/6218/6164/6165/6235/6747/6231/6144/6160/9341/6207/6726/11261/26519/6204/6228/26520/6169/6209"	70
+"16"	"Up"	"GO:0072594"	"establishment of protein localization to organelle"	"83/549"	"452/17913"	4.72092352077339e-41	1.10469610386097e-38	9.78038695191803e-39	"6189/6125/4736/7879/11331/3295/6142/6136/6191/6192/6206/6154/6217/6202/6129/6222/6152/6138/6232/6156/6143/6229/6230/6227/6187/6205/6161/6135/6223/6168/6159/23521/6147/6203/3921/6132/1891/56993/5594/6155/6157/6188/7332/6193/6139/6133/9349/30/6210/6234/23480/950/373156/6224/6181/10204/6201/6208/6173/706/6218/6164/6165/131118/401505/6235/7251/6747/6231/6144/6160/10965/6207/6726/26517/11261/26519/2053/6204/6228/26520/6169/6209"	83
+"17"	"Up"	"GO:0006119"	"oxidative phosphorylation"	"32/549"	"131/17913"	3.09299229045743e-20	6.81186066792506e-18	6.03085617501575e-18	"387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/4700/513/521"	32
+"18"	"Up"	"GO:0043312"	"neutrophil degranulation"	"56/549"	"485/17913"	9.02573847185842e-18	1.87735360214655e-15	1.66210821332644e-15	"7879/3608/5478/1650/5689/10549/387/10493/57826/5686/9218/1508/5908/4282/51552/5594/30/1509/10159/5878/5906/8673/1992/5476/55004/9545/10092/29108/5049/23593/5547/2760/684/12/25801/4125/1727/51382/5265/55313/2992/8635/54472/567/5660/8649/2717/2896/2990/2548/4680/29952/427/1522/175/2512"	56
+"19"	"Up"	"GO:0042775"	"mitochondrial ATP synthesis coupled electron transport"	"25/549"	"89/17913"	1.13691215084136e-17	2.24031531197371e-15	1.98345504875315e-15	"29796/4723/1345/4728/11315/9377/4697/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/4700"	25
+"20"	"Up"	"GO:0002283"	"neutrophil activation involved in immune response"	"56/549"	"488/17913"	1.19704694613467e-17	2.2408718831641e-15	1.98394780704109e-15	"7879/3608/5478/1650/5689/10549/387/10493/57826/5686/9218/1508/5908/4282/51552/5594/30/1509/10159/5878/5906/8673/1992/5476/55004/9545/10092/29108/5049/23593/5547/2760/684/12/25801/4125/1727/51382/5265/55313/2992/8635/54472/567/5660/8649/2717/2896/2990/2548/4680/29952/427/1522/175/2512"	56
+"21"	"Up"	"GO:0042773"	"ATP synthesis coupled electron transport"	"25/549"	"90/17913"	1.52982454473e-17	2.72745861689006e-15	2.41474560970164e-15	"29796/4723/1345/4728/11315/9377/4697/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/4700"	25
+"22"	"Up"	"GO:0002446"	"neutrophil mediated immunity"	"56/549"	"499/17913"	3.3032901933791e-17	5.37718194957015e-15	4.76066856702553e-15	"7879/3608/5478/1650/5689/10549/387/10493/57826/5686/9218/1508/5908/4282/51552/5594/30/1509/10159/5878/5906/8673/1992/5476/55004/9545/10092/29108/5049/23593/5547/2760/684/12/25801/4125/1727/51382/5265/55313/2992/8635/54472/567/5660/8649/2717/2896/2990/2548/4680/29952/427/1522/175/2512"	56
+"23"	"Up"	"GO:0042119"	"neutrophil activation"	"56/549"	"499/17913"	3.3032901933791e-17	5.37718194957015e-15	4.76066856702553e-15	"7879/3608/5478/1650/5689/10549/387/10493/57826/5686/9218/1508/5908/4282/51552/5594/30/1509/10159/5878/5906/8673/1992/5476/55004/9545/10092/29108/5049/23593/5547/2760/684/12/25801/4125/1727/51382/5265/55313/2992/8635/54472/567/5660/8649/2717/2896/2990/2548/4680/29952/427/1522/175/2512"	56
+"24"	"Up"	"GO:0006414"	"translational elongation"	"27/549"	"124/17913"	6.50920470770029e-16	1.01543593440124e-13	8.99012527392465e-14	"9775/6156/64978/64969/90480/11222/51649/54534/65003/6181/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28998/6726/51650/54948/10573"	27
+"25"	"Up"	"GO:0070125"	"mitochondrial translational elongation"	"23/549"	"86/17913"	7.63921449202343e-16	1.14404876232543e-13	1.01287942885818e-13	"64978/64969/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28998/51650/54948/10573"	23
+"26"	"Up"	"GO:0022904"	"respiratory electron transport chain"	"25/549"	"106/17913"	1.06286230376542e-15	1.5305217174222e-13	1.35504186014466e-13	"29796/4723/1345/4728/11315/9377/4697/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/4700"	25
+"27"	"Up"	"GO:0070126"	"mitochondrial translational termination"	"23/549"	"88/17913"	1.32780109741345e-15	1.84121752174665e-13	1.63011526540154e-13	"64978/64969/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28998/51650/54948/10573"	23
+"28"	"Up"	"GO:0009141"	"nucleoside triphosphate metabolic process"	"42/549"	"337/17913"	9.66883073925286e-15	1.29286079599153e-12	1.14462962398148e-12	"7167/204/387/29796/4723/498/506/51727/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/3704/4729/1340/7381/4724/4702/4698/4704/1329/79077/4513/126328/4713/4695/2026/4700/513/521/4832"	42
+"29"	"Up"	"GO:0022900"	"electron transport chain"	"30/549"	"175/17913"	1.50350020251755e-14	1.94107060628473e-12	1.71851983220609e-12	"29796/4723/1345/4728/11315/9377/4697/10327/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/1347/4704/8574/5860/1329/4513/126328/4713/4695/4700/1528"	30
+"30"	"Up"	"GO:0000377"	"RNA splicing, via transesterification reactions with bulged adenosine as nucleophile"	"42/549"	"344/17913"	1.98893279661731e-14	2.39842530414397e-12	2.12343715776804e-12	"9775/4670/27316/9967/5725/708/220988/1994/10949/6426/3185/11338/8683/25804/28960/6625/6626/10189/10250/6431/6629/83443/6634/7536/29896/10284/6428/51645/9939/6628/2963/51691/6427/10772/135295/6430/55110/11051/6632/6636/6637/27258"	42
+"31"	"Up"	"GO:0000398"	"mRNA splicing, via spliceosome"	"42/549"	"344/17913"	1.98893279661731e-14	2.39842530414397e-12	2.12343715776804e-12	"9775/4670/27316/9967/5725/708/220988/1994/10949/6426/3185/11338/8683/25804/28960/6625/6626/10189/10250/6431/6629/83443/6634/7536/29896/10284/6428/51645/9939/6628/2963/51691/6427/10772/135295/6430/55110/11051/6632/6636/6637/27258"	42
+"32"	"Up"	"GO:0009205"	"purine ribonucleoside triphosphate metabolic process"	"40/549"	"314/17913"	2.04993615738801e-14	2.39842530414397e-12	2.12343715776804e-12	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/3704/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521/4832"	40
+"33"	"Up"	"GO:0006415"	"translational termination"	"23/549"	"100/17913"	2.693444125697e-14	2.97149793720018e-12	2.63080493821507e-12	"64978/64969/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28998/51650/54948/10573"	23
+"34"	"Up"	"GO:0046034"	"ATP metabolic process"	"38/549"	"287/17913"	2.6984756908335e-14	2.97149793720018e-12	2.63080493821507e-12	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521"	38
+"35"	"Up"	"GO:0000375"	"RNA splicing, via transesterification reactions"	"42/549"	"348/17913"	2.97669365945596e-14	3.18421173171518e-12	2.81913032590281e-12	"9775/4670/27316/9967/5725/708/220988/1994/10949/6426/3185/11338/8683/25804/28960/6625/6626/10189/10250/6431/6629/83443/6634/7536/29896/10284/6428/51645/9939/6628/2963/51691/6427/10772/135295/6430/55110/11051/6632/6636/6637/27258"	42
+"36"	"Up"	"GO:0009199"	"ribonucleoside triphosphate metabolic process"	"40/549"	"319/17913"	3.49043773315543e-14	3.63005524248165e-12	3.21385626365686e-12	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/3704/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521/4832"	40
+"37"	"Up"	"GO:0009144"	"purine nucleoside triphosphate metabolic process"	"40/549"	"321/17913"	4.30489150343961e-14	4.35608480780484e-12	3.85664391019384e-12	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/3704/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521/4832"	40
+"38"	"Up"	"GO:0032543"	"mitochondrial translation"	"25/549"	"125/17913"	6.29911919435496e-14	6.20629006938551e-12	5.49471643851074e-12	"708/64978/64969/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28958/28998/51650/54948/10573"	25
+"39"	"Up"	"GO:0045333"	"cellular respiration"	"29/549"	"176/17913"	1.19851495984731e-13	1.15057436145342e-11	1.01865684441543e-11	"29796/4723/1345/4728/6390/11315/9377/81889/4697/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/55847/4513/126328/4713/4695/4700/513"	29
+"40"	"Up"	"GO:0006120"	"mitochondrial electron transport, NADH to ubiquinone"	"17/549"	"55/17913"	3.37257771557936e-13	3.15230834582046e-11	2.79088477873049e-11	"4723/4728/11315/4697/55967/4726/4715/4725/4729/4724/4702/4698/4704/126328/4713/4695/4700"	17
+"41"	"Up"	"GO:0008380"	"RNA splicing"	"46/549"	"440/17913"	3.45204706673715e-13	3.15230834582046e-11	2.79088477873049e-11	"9775/4670/27316/9967/5725/708/51493/220988/1994/10949/6426/3185/11338/8683/25804/28960/6625/6626/10189/10250/51637/6431/6629/83443/6634/7536/29896/10284/6428/51645/9939/6628/2963/6231/6207/51691/6427/10772/135295/6430/55110/11051/6632/6636/6637/27258"	46
+"42"	"Up"	"GO:0140053"	"mitochondrial gene expression"	"26/549"	"148/17913"	4.85823242211427e-13	4.3307671877133e-11	3.83422904692678e-11	"708/64978/64969/3028/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/63931/51373/28958/28998/51650/54948/10573"	26
+"43"	"Up"	"GO:0009161"	"ribonucleoside monophosphate metabolic process"	"39/549"	"331/17913"	5.53282059044524e-13	4.81741402107604e-11	4.26508005858312e-11	"7167/204/387/29796/4723/498/506/51727/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521"	39
+"44"	"Up"	"GO:0009167"	"purine ribonucleoside monophosphate metabolic process"	"38/549"	"317/17913"	6.46564273830756e-13	5.49292757739715e-11	4.86314353948033e-11	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521"	38
+"45"	"Up"	"GO:0022613"	"ribonucleoprotein complex biogenesis"	"42/549"	"381/17913"	6.60207641514081e-13	5.49292757739715e-11	4.86314353948033e-11	"6125/8668/9775/708/6154/6217/6426/6129/6232/6229/6187/6135/6223/23521/6203/8683/6155/6431/6234/6634/7536/6201/26065/6208/6218/55651/6628/6165/10772/135295/54433/6430/6228/2752/1153/55505/11051/6632/6636/6169/6637/6209"	42
+"46"	"Up"	"GO:0009126"	"purine nucleoside monophosphate metabolic process"	"38/549"	"318/17913"	7.13681455714417e-13	5.80874645694517e-11	5.14275264083455e-11	"7167/204/387/29796/4723/498/506/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521"	38
+"47"	"Up"	"GO:0002181"	"cytoplasmic translation"	"18/549"	"69/17913"	1.74544590325192e-12	1.3904147791011e-10	1.23099868966188e-10	"8668/4736/6142/6152/6156/6143/6227/6161/6135/23521/6132/6234/6173/6235/6231/6160/6228/6169"	18
+"48"	"Up"	"GO:0009150"	"purine ribonucleotide metabolic process"	"48/549"	"500/17913"	2.40221916155885e-12	1.8737309460159e-10	1.65890090783965e-10	"7167/204/3295/387/29796/4723/498/506/10632/3094/1345/4728/11315/9377/4697/25874/27089/522/55967/4726/4715/5538/2987/706/4725/129401/84836/3704/4729/1340/7381/4724/4702/4698/4704/641371/10965/1329/4513/126328/4713/79717/4695/2026/4700/513/521/4832"	48
+"49"	"Up"	"GO:0009123"	"nucleoside monophosphate metabolic process"	"39/549"	"349/17913"	2.96090953946444e-12	2.26237659505201e-10	2.00298692583749e-10	"7167/204/387/29796/4723/498/506/51727/10632/1345/4728/11315/9377/4697/27089/522/55967/4726/4715/2987/706/4725/129401/4729/1340/7381/4724/4702/4698/4704/1329/4513/126328/4713/4695/2026/4700/513/521"	39
+"50"	"Up"	"GO:0032984"	"protein-containing complex disassembly"	"35/549"	"298/17913"	9.72617175568067e-12	7.28295741065369e-10	6.44793997023967e-10	"11034/11344/64978/29979/64969/9349/90480/11222/51649/8673/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/822/7251/84305/63931/51373/28998/51650/23557/27243/136319/54948/10573/3159"	35
+"51"	"Up"	"GO:0015980"	"energy derivation by oxidation of organic compounds"	"32/549"	"264/17913"	3.34434934782912e-11	2.45514587417102e-09	2.17365450904312e-09	"29796/4723/1345/4728/6390/11315/9377/81889/4697/27089/55967/4726/4715/4725/4729/1340/7381/4724/4702/4698/4704/1329/55847/4513/2992/126328/112464/4713/4695/4700/513/2548"	32
+"52"	"Up"	"GO:0033119"	"negative regulation of RNA splicing"	"11/549"	"24/17913"	3.52929497833582e-11	2.54109238440179e-09	2.24974694064363e-09	"27316/5725/708/11338/8683/6431/10284/6231/6207/10772/135295"	11
+"53"	"Up"	"GO:0043624"	"cellular protein complex disassembly"	"27/549"	"195/17913"	5.60328929654272e-11	3.95824813702943e-09	3.50442065438193e-09	"11034/11344/64978/64969/90480/11222/51649/54534/65003/29074/92259/51073/64928/740/65993/116540/51642/63875/84545/822/63931/51373/28998/51650/136319/54948/10573"	27
+"54"	"Up"	"GO:0006397"	"mRNA processing"	"44/549"	"499/17913"	3.26684528710972e-10	2.26501273239607e-08	2.00532082048899e-08	"9775/4670/27316/9967/5725/708/220988/1994/10949/6426/3185/11338/8683/25804/28960/6625/6626/10189/10250/6431/6629/83443/6634/7536/29896/10284/6428/51645/9939/26097/6628/2963/5566/51691/6427/10772/135295/6430/55110/11051/6632/6636/6637/27258"	44
+"55"	"Up"	"GO:0007005"	"mitochondrion organization"	"42/549"	"466/17913"	4.30245943061338e-10	2.92880147422118e-08	2.59300377933044e-08	"11331/5245/10493/4723/498/493856/506/3028/10632/56993/4728/6742/7332/11315/522/55967/4726/4715/706/4725/131118/29108/4729/401505/23593/4724/4702/4698/4704/28958/26517/26519/2876/10935/126328/4713/4695/26520/4700/513/521/1890"	42
+"56"	"Up"	"GO:0010257"	"NADH dehydrogenase complex assembly"	"15/549"	"64/17913"	6.52939938714452e-10	4.28878443955598e-08	3.79705977287499e-08	"4723/4728/55967/4726/4715/4725/4729/4724/4702/4698/4704/126328/4713/4695/4700"	15
+"57"	"Up"	"GO:0032981"	"mitochondrial respiratory chain complex I assembly"	"15/549"	"64/17913"	6.52939938714452e-10	4.28878443955598e-08	3.79705977287499e-08	"4723/4728/55967/4726/4715/4725/4729/4724/4702/4698/4704/126328/4713/4695/4700"	15
+"58"	"Up"	"GO:0048025"	"negative regulation of mRNA splicing, via spliceosome"	"9/549"	"19/17913"	1.57058442594358e-09	1.01383932598841e-07	8.97598975915853e-08	"27316/5725/708/11338/8683/6431/10284/10772/135295"	9
+"59"	"Up"	"GO:0006900"	"vesicle budding from membrane"	"17/549"	"91/17913"	2.04227197401249e-09	1.29597733401742e-07	1.14738883963699e-07	"7879/8775/5861/9218/56681/9217/9871/375/10016/27095/10342/8724/81876/5265/10959/54732/1522"	17
+"60"	"Up"	"GO:1902600"	"proton transmembrane transport"	"21/549"	"148/17913"	4.97814877916924e-09	3.1063648382016e-07	2.75020886063227e-07	"11331/9114/498/506/10632/537/1345/11315/9377/4697/522/1340/1347/9550/534/11261/4513/51382/513/521/1528"	21
+"61"	"Up"	"GO:0033108"	"mitochondrial respiratory chain complex assembly"	"16/549"	"87/17913"	7.7295800837394e-09	4.74418816942956e-07	4.20024981599575e-07	"4723/4728/55967/4726/4715/4725/4729/4724/4702/4698/4704/28958/126328/4713/4695/4700"	16
+"62"	"Up"	"GO:0006364"	"rRNA processing"	"21/549"	"154/17913"	1.02720717389609e-08	6.2030059017209e-07	5.4918088125616e-07	"6125/9775/6154/6217/6129/6232/6229/6187/6135/6223/6203/6155/6234/6201/6208/6218/55651/6165/54433/55505/6209"	21
+"63"	"Up"	"GO:0042254"	"ribosome biogenesis"	"24/549"	"202/17913"	1.47064841691768e-08	8.73985344911079e-07	7.73779760212829e-07	"6125/9775/708/6154/6217/6129/6232/6229/6187/6135/6223/6203/6155/6234/6201/6208/6218/55651/6165/54433/2752/55505/6169/6209"	24
+"64"	"Up"	"GO:1903312"	"negative regulation of mRNA metabolic process"	"14/549"	"69/17913"	1.79564001067656e-08	1.05044940624579e-06	9.30011577898105e-07	"27316/9967/5725/708/1994/10949/11338/8683/9261/6431/10284/10772/135295/1153"	14
+"65"	"Up"	"GO:0042274"	"ribosomal small subunit biogenesis"	"9/549"	"24/17913"	1.9379833863472e-08	1.11627843053599e-06	9.8829306617123e-07	"6217/6229/6223/6234/6201/6208/6218/6169/6209"	9
+"66"	"Up"	"GO:0051169"	"nuclear transport"	"30/549"	"305/17913"	2.02481310890717e-08	1.14862125450734e-06	1.01692766825338e-06	"9775/11331/6426/11338/8683/3267/5594/9349/11315/10189/10250/6431/6634/10204/6428/9939/129401/26097/6628/5566/11261/6427/6430/55110/8815/6632/3159/6636/6637/6209"	30
+"67"	"Up"	"GO:0050657"	"nucleic acid transport"	"22/549"	"176/17913"	2.3278989778501e-08	1.28171379015747e-06	1.13476066273219e-06	"9775/220988/6426/11338/7263/8683/3267/10189/10250/51637/6431/29074/10204/6428/9939/129401/26097/5813/6427/6430/55110/6209"	22
+"68"	"Up"	"GO:0050658"	"RNA transport"	"22/549"	"176/17913"	2.3278989778501e-08	1.28171379015747e-06	1.13476066273219e-06	"9775/220988/6426/11338/7263/8683/3267/10189/10250/51637/6431/29074/10204/6428/9939/129401/26097/5813/6427/6430/55110/6209"	22
+"69"	"Up"	"GO:0006403"	"RNA localization"	"24/549"	"208/17913"	2.6105691284491e-08	1.40144097946013e-06	1.24076069622131e-06	"9775/220988/6426/11338/7263/8683/3267/10189/10250/51637/6431/29074/10204/6428/9939/129401/55651/26097/5813/6427/6430/55110/55505/6209"	24
+"70"	"Up"	"GO:0031123"	"RNA 3'-end processing"	"17/549"	"107/17913"	2.62021550646926e-08	1.40144097946013e-06	1.24076069622131e-06	"9775/6426/11338/8683/3028/6626/10189/10250/6431/6428/26024/9939/26097/6427/6430/55110/11051"	17
+"71"	"Up"	"GO:0022618"	"ribonucleoprotein complex assembly"	"24/549"	"209/17913"	2.86621570600715e-08	1.49393478458136e-06	1.32264975164381e-06	"6125/8668/708/6426/6135/6223/23521/8683/6431/6634/7536/26065/6208/6628/10772/135295/6430/6228/1153/11051/6632/6636/6169/6637"	24
+"72"	"Up"	"GO:1903311"	"regulation of mRNA metabolic process"	"28/549"	"275/17913"	2.8729515088103e-08	1.49393478458136e-06	1.32264975164381e-06	"27316/9967/5689/5725/708/1994/10949/3315/11338/5686/8683/5690/9261/5692/5682/6625/6626/6431/5691/10284/6428/9939/7431/10772/135295/1153/11051/5696"	28
+"73"	"Up"	"GO:0051236"	"establishment of RNA localization"	"22/549"	"179/17913"	3.1746671547249e-08	1.62821285305343e-06	1.44153235331344e-06	"9775/220988/6426/11338/7263/8683/3267/10189/10250/51637/6431/29074/10204/6428/9939/129401/26097/5813/6427/6430/55110/6209"	22
+"74"	"Up"	"GO:0048194"	"Golgi vesicle budding"	"14/549"	"75/17913"	5.49991868777868e-08	2.78266156311397e-06	2.46361933823828e-06	"8775/5861/9218/56681/9217/9871/10016/27095/10342/81876/5265/10959/54732/1522"	14
+"75"	"Up"	"GO:0022411"	"cellular component disassembly"	"39/549"	"492/17913"	6.33070837672959e-08	3.15204693245381e-06	2.79065333735297e-06	"11034/11344/64978/29979/493856/64969/826/9349/11315/90480/11222/51649/8673/54534/65003/29074/92259/51073/64928/740/65993/116540/706/51642/63875/84545/822/7251/84305/63931/51373/28998/51650/23557/27243/136319/54948/10573/3159"	39
+"76"	"Up"	"GO:0050686"	"negative regulation of mRNA processing"	"9/549"	"27/17913"	6.3983858671605e-08	3.15204693245381e-06	2.79065333735297e-06	"27316/5725/708/11338/8683/6431/10284/10772/135295"	9
+"77"	"Up"	"GO:0048193"	"Golgi vesicle transport"	"29/549"	"304/17913"	6.82929452978033e-08	3.32063359993475e-06	2.93991093291569e-06	"8775/10652/5861/9218/11079/51552/4218/56681/830/381/9217/9871/8673/375/377/10016/22818/27095/6892/378/10342/81876/9341/403/5265/10959/54732/400/1522"	29
+"78"	"Up"	"GO:0031124"	"mRNA 3'-end processing"	"15/549"	"89/17913"	7.71019293868709e-08	3.7008926105698e-06	3.27657187097512e-06	"9775/6426/11338/8683/6626/10189/10250/6431/6428/9939/26097/6427/6430/55110/11051"	15
+"79"	"Up"	"GO:0043484"	"regulation of RNA splicing"	"17/549"	"115/17913"	7.85058040008697e-08	3.72057886302856e-06	3.29400102330098e-06	"27316/9967/5725/708/3185/11338/8683/6625/6431/10284/6428/9939/6231/6207/10772/135295/6430"	17
+"80"	"Up"	"GO:0071826"	"ribonucleoprotein complex subunit organization"	"24/549"	"221/17913"	8.39533156186242e-08	3.92901517095161e-06	3.47853935372431e-06	"6125/8668/708/6426/6135/6223/23521/8683/6431/6634/7536/26065/6208/6628/10772/135295/6430/6228/1153/11051/6632/6636/6169/6637"	24
+"81"	"Up"	"GO:0007033"	"vacuole organization"	"18/549"	"131/17913"	1.03113250758305e-07	4.76612359060608e-06	4.21967026170112e-06	"7879/5868/5861/29979/950/5899/375/55004/5538/29978/4669/81876/23557/11151/53/2896/2548/1200"	18
+"82"	"Up"	"GO:0007040"	"lysosome organization"	"12/549"	"57/17913"	1.22524234711674e-07	5.52687632241576e-06	4.89319993794625e-06	"7879/950/375/55004/5538/4669/23557/11151/53/2896/2548/1200"	12
+"83"	"Up"	"GO:0080171"	"lytic vacuole organization"	"12/549"	"57/17913"	1.22524234711674e-07	5.52687632241576e-06	4.89319993794625e-06	"7879/950/375/55004/5538/4669/23557/11151/53/2896/2548/1200"	12
+"84"	"Up"	"GO:0006611"	"protein export from nucleus"	"20/549"	"163/17913"	1.37886551563217e-07	6.14580058396055e-06	5.44116229163624e-06	"9775/6426/11338/8683/3267/11315/10189/10250/6431/10204/6428/9939/129401/26097/5566/11261/6427/6430/55110/6209"	20
+"85"	"Up"	"GO:0016050"	"vesicle organization"	"27/549"	"280/17913"	1.55859305968489e-07	6.86514401818849e-06	6.07803039622007e-06	"7879/8775/5861/9218/4218/56681/3267/9217/9871/950/375/10016/55004/27095/6892/10342/8724/7251/81876/9341/23557/27243/5265/11151/10959/54732/1522"	27
+"86"	"Up"	"GO:0090114"	"COPII-coated vesicle budding"	"13/549"	"70/17913"	1.75130380061156e-07	7.62428073196473e-06	6.75012933675127e-06	"8775/5861/9218/56681/9217/9871/10016/27095/10342/81876/5265/10959/1522"	13
+"87"	"Up"	"GO:0006913"	"nucleocytoplasmic transport"	"28/549"	"302/17913"	2.08447670611737e-07	8.97043768701545e-06	7.94194452215803e-06	"9775/11331/6426/11338/8683/3267/5594/9349/11315/10189/10250/6431/6634/10204/6428/9939/129401/26097/6628/5566/11261/6427/6430/55110/6632/6636/6637/6209"	28
+"88"	"Up"	"GO:0016054"	"organic acid catabolic process"	"25/549"	"250/17913"	2.25211973377463e-07	9.47408571151934e-06	8.38784747682591e-06	"1666/2806/3295/7263/3028/1891/2746/30/55347/10327/55577/4357/23564/3073/1632/587/23576/3712/5860/2184/11261/2752/51181/5092/2990"	25
+"89"	"Up"	"GO:0046395"	"carboxylic acid catabolic process"	"25/549"	"250/17913"	2.25211973377463e-07	9.47408571151934e-06	8.38784747682591e-06	"1666/2806/3295/7263/3028/1891/2746/30/55347/10327/55577/4357/23564/3073/1632/587/23576/3712/5860/2184/11261/2752/51181/5092/2990"	25
+"90"	"Up"	"GO:0048002"	"antigen processing and presentation of peptide antigen"	"21/549"	"188/17913"	3.36535952519222e-07	1.38565862040824e-05	1.22678784178631e-05	"7879/5689/1211/5686/5690/5692/5682/830/51752/1509/9871/8673/375/5691/6892/29108/9341/567/5696/3123/3122"	21
+"91"	"Up"	"GO:0031503"	"protein-containing complex localization"	"24/549"	"238/17913"	3.36792025793669e-07	1.38565862040824e-05	1.22678784178631e-05	"9775/6426/11338/8683/4218/3267/10189/10250/6431/5906/5899/6428/9939/129401/26097/83658/83657/5813/23557/403/6427/6430/55110/6209"	24
+"92"	"Up"	"GO:0048024"	"regulation of mRNA splicing, via spliceosome"	"13/549"	"75/17913"	4.06058726897433e-07	1.65248247119999e-05	1.46301937185356e-05	"27316/9967/5725/708/11338/8683/6625/6431/10284/6428/9939/10772/135295"	13
+"93"	"Up"	"GO:0016072"	"rRNA metabolic process"	"21/549"	"191/17913"	4.39083964308986e-07	1.76766705631489e-05	1.56499762717487e-05	"6125/9775/6154/6217/6129/6232/6229/6187/6135/6223/6203/6155/6234/6201/6208/6218/55651/6165/54433/55505/6209"	21
+"94"	"Up"	"GO:0051168"	"nuclear export"	"20/549"	"176/17913"	4.85279134748809e-07	1.93285646861653e-05	1.71124747516685e-05	"9775/6426/11338/8683/3267/11315/10189/10250/6431/10204/6428/9939/129401/26097/5566/11261/6427/6430/55110/6209"	20
+"95"	"Up"	"GO:0071426"	"ribonucleoprotein complex export from nucleus"	"16/549"	"116/17913"	4.99401922811749e-07	1.96816926211283e-05	1.74251152901296e-05	"9775/6426/11338/8683/3267/10189/10250/6431/6428/9939/129401/26097/6427/6430/55110/6209"	16
+"96"	"Up"	"GO:0071166"	"ribonucleoprotein complex localization"	"16/549"	"117/17913"	5.62404914036554e-07	2.19337916474256e-05	1.94190030076876e-05	"9775/6426/11338/8683/3267/10189/10250/6431/6428/9939/129401/26097/6427/6430/55110/6209"	16
+"97"	"Up"	"GO:0006406"	"mRNA export from nucleus"	"15/549"	"107/17913"	9.17252782245069e-07	3.50428001706688e-05	3.10250162329723e-05	"9775/6426/11338/8683/3267/10189/10250/6431/6428/9939/129401/26097/6427/6430/55110"	15
+"98"	"Up"	"GO:0071427"	"mRNA-containing ribonucleoprotein complex export from nucleus"	"15/549"	"107/17913"	9.17252782245069e-07	3.50428001706688e-05	3.10250162329723e-05	"9775/6426/11338/8683/3267/10189/10250/6431/6428/9939/129401/26097/6427/6430/55110"	15
+"99"	"Up"	"GO:0006405"	"RNA export from nucleus"	"16/549"	"122/17913"	9.98911105937536e-07	3.75548895142822e-05	3.32490854364807e-05	"9775/6426/11338/8683/3267/10189/10250/6431/6428/9939/129401/26097/6427/6430/55110/6209"	16
+"100"	"Up"	"GO:0044282"	"small molecule catabolic process"	"32/549"	"404/17913"	1.00306863018916e-06	3.75548895142822e-05	3.32490854364807e-05	"7167/1666/2806/3295/2582/7263/3028/1891/2746/30/55347/10327/55577/4357/23564/3073/1632/587/23576/3712/3029/5860/26007/2184/11261/2752/2026/51181/5092/30833/2990/1890"	32
+"101"	"Up"	"GO:0050684"	"regulation of mRNA processing"	"15/549"	"108/17913"	1.03561934893679e-06	3.83896915091024e-05	3.39881743595826e-05	"27316/9967/5725/708/11338/8683/6625/6626/6431/10284/6428/9939/10772/135295/11051"	15
+"102"	"Up"	"GO:0051438"	"regulation of ubiquitin-protein transferase activity"	"10/549"	"47/17913"	1.25646804036922e-06	4.61197680700232e-05	4.08319696503889e-05	"6125/5861/6187/6135/7332/9349/11315/6201/7334/5300"	10
+"103"	"Up"	"GO:0015931"	"nucleobase-containing compound transport"	"22/549"	"221/17913"	1.29025509673501e-06	4.6900146428892e-05	4.15228748044818e-05	"9775/220988/6426/11338/7263/8683/3267/10189/10250/51637/6431/29074/10204/6428/9939/129401/26097/5813/6427/6430/55110/6209"	22
+"104"	"Up"	"GO:0034470"	"ncRNA processing"	"26/549"	"293/17913"	1.30581435928588e-06	4.70093169342915e-05	4.16195285161055e-05	"6125/9775/51493/6154/6217/6129/6232/6229/6187/6135/6223/6203/3028/6155/51637/6234/6201/6208/26024/6218/55651/6165/55644/54433/55505/6209"	26
+"105"	"Up"	"GO:0006888"	"ER to Golgi vesicle-mediated transport"	"19/549"	"172/17913"	1.44158298806751e-06	5.14027305459501e-05	4.5509221347615e-05	"8775/10652/5861/9218/56681/830/9217/9871/375/10016/22818/27095/378/10342/81876/5265/10959/54732/1522"	19
+"106"	"Up"	"GO:0002478"	"antigen processing and presentation of exogenous peptide antigen"	"19/549"	"174/17913"	1.71766122480869e-06	6.06690908083372e-05	5.37131598502738e-05	"7879/5689/1211/5686/5690/5692/5682/830/1509/9871/8673/375/5691/6892/9341/567/5696/3123/3122"	19
+"107"	"Up"	"GO:0019884"	"antigen processing and presentation of exogenous antigen"	"19/549"	"176/17913"	2.04090103528622e-06	7.14124623935663e-05	6.32247649790093e-05	"7879/5689/1211/5686/5690/5692/5682/830/1509/9871/8673/375/5691/6892/9341/567/5696/3123/3122"	19
+"108"	"Up"	"GO:0051028"	"mRNA transport"	"17/549"	"146/17913"	2.48537673196095e-06	8.61597267079796e-05	7.62812020365013e-05	"9775/220988/6426/11338/8683/3267/10189/10250/6431/10204/6428/9939/129401/26097/6427/6430/55110"	17
+"109"	"Up"	"GO:0045727"	"positive regulation of translation"	"15/549"	"117/17913"	2.89866867604576e-06	9.95652800285809e-05	8.81497601242693e-05	"6125/9775/6191/387/708/6154/1994/6156/5594/7431/84305/28958/51065/1153/5935"	15
+"110"	"Up"	"GO:0006885"	"regulation of pH"	"12/549"	"76/17913"	3.16453953145972e-06	0.000107709418234411	9.53601433929825e-05	"7879/9114/506/537/5594/5538/9550/534/11261/23557/51382/2896"	12
+"111"	"Up"	"GO:0030641"	"regulation of cellular pH"	"11/549"	"65/17913"	4.05096760251682e-06	0.000136638042376784	0.000120971996020156	"7879/9114/506/5594/5538/9550/534/11261/23557/51382/2896"	11
+"112"	"Up"	"GO:0019882"	"antigen processing and presentation"	"21/549"	"220/17913"	4.37480412926923e-06	0.000146243452321286	0.000129476110931098	"7879/5689/1211/5686/5690/5692/5682/830/51752/1509/9871/8673/375/5691/6892/29108/9341/567/5696/3123/3122"	21
+"113"	"Up"	"GO:1990542"	"mitochondrial transmembrane transport"	"11/549"	"66/17913"	4.72846816070739e-06	0.00015666712206804	0.000138704669194854	"7263/498/506/10632/522/29074/81855/26519/26520/513/521"	11
+"114"	"Up"	"GO:0006901"	"vesicle coating"	"11/549"	"67/17913"	5.50288059964626e-06	0.000180726183904172	0.000160005272468015	"8775/5861/9871/10016/27095/10342/81876/5265/10959/54732/1522"	11
+"115"	"Up"	"GO:0002474"	"antigen processing and presentation of peptide antigen via MHC class I"	"13/549"	"95/17913"	6.39820047467655e-06	0.000208303152845122	0.000184420442057267	"5689/5686/5690/5692/5682/51752/9871/8673/5691/6892/9341/567/5696"	13
+"116"	"Up"	"GO:0048199"	"vesicle targeting, to, from or within Golgi"	"11/549"	"70/17913"	8.52813923143081e-06	0.000275253045538594	0.000243694287112301	"8775/5861/9871/10016/27095/10342/81876/5265/10959/54732/1522"	11
+"117"	"Up"	"GO:0006123"	"mitochondrial electron transport, cytochrome c to oxygen"	"6/549"	"18/17913"	1.09320677914168e-05	0.000346861540771735	0.000307092609055947	"1345/9377/4697/1340/1329/4513"	6
+"118"	"Up"	"GO:0019646"	"aerobic electron transport chain"	"6/549"	"18/17913"	1.09320677914168e-05	0.000346861540771735	0.000307092609055947	"1345/9377/4697/1340/1329/4513"	6
+"119"	"Up"	"GO:0007007"	"inner mitochondrial membrane organization"	"8/549"	"37/17913"	1.30303923895766e-05	0.000409964614340965	0.00036296068672956	"498/506/10632/522/26519/26520/513/521"	8
+"120"	"Up"	"GO:0051453"	"regulation of intracellular pH"	"10/549"	"61/17913"	1.48895278797333e-05	0.000464553269847678	0.000411290555204211	"7879/9114/506/5538/9550/534/11261/23557/51382/2896"	10
+"121"	"Up"	"GO:0002479"	"antigen processing and presentation of exogenous peptide antigen via MHC class I, TAP-dependent"	"11/549"	"75/17913"	1.68133797711367e-05	0.000517740876698616	0.000458380010324995	"5689/5686/5690/5692/5682/8673/5691/6892/9341/567/5696"	11
+"122"	"Up"	"GO:0006903"	"vesicle targeting"	"12/549"	"89/17913"	1.68708298496878e-05	0.000517740876698616	0.000458380010324995	"8775/10652/5861/9871/10016/27095/10342/81876/5265/10959/54732/1522"	12
+"123"	"Up"	"GO:0045851"	"pH reduction"	"9/549"	"50/17913"	1.82476610286479e-05	0.000555440999115917	0.000491757677186241	"7879/9114/537/5538/9550/534/23557/51382/2896"	9
+"124"	"Up"	"GO:1903320"	"regulation of protein modification by small protein conjugation or removal"	"20/549"	"223/17913"	1.85400154983666e-05	0.000559788855047458	0.000495607035690633	"6125/5861/6187/11338/6135/29979/6188/7332/7329/9349/11315/10016/6201/706/408/7334/11261/9636/54472/5300"	20
+"125"	"Up"	"GO:0006890"	"retrograde vesicle-mediated transport, Golgi to ER"	"11/549"	"76/17913"	1.91231835040052e-05	0.000568231738404725	0.000503081911897346	"8775/5861/11079/381/377/22818/6892/378/81876/10959/54732"	11
+"126"	"Up"	"GO:0031397"	"negative regulation of protein ubiquitination"	"11/549"	"76/17913"	1.91231835040052e-05	0.000568231738404725	0.000503081911897346	"6125/11338/6135/6188/9349/11315/6201/706/408/11261/9636"	11
+"127"	"Up"	"GO:0006914"	"autophagy"	"32/549"	"471/17913"	2.40627372949795e-05	0.000703835065878149	0.000623137826824756	"7879/5868/5861/3315/9114/29979/493856/4218/56993/6625/826/11315/8673/5899/5476/55004/706/29108/5049/29978/401505/7251/81876/5566/9550/534/23557/27243/51382/54472/5660/8649"	32
+"128"	"Up"	"GO:0061919"	"process utilizing autophagic mechanism"	"32/549"	"471/17913"	2.40627372949795e-05	0.000703835065878149	0.000623137826824756	"7879/5868/5861/3315/9114/29979/493856/4218/56993/6625/826/11315/8673/5899/5476/55004/706/29108/5049/29978/401505/7251/81876/5566/9550/534/23557/27243/51382/54472/5660/8649"	32
+"129"	"Up"	"GO:0042590"	"antigen processing and presentation of exogenous peptide antigen via MHC class I"	"11/549"	"78/17913"	2.45778685477072e-05	0.000713329766221828	0.000631543925391514	"5689/5686/5690/5692/5682/8673/5691/6892/9341/567/5696"	11
+"130"	"Up"	"GO:0034250"	"positive regulation of cellular amide metabolic process"	"15/549"	"140/17913"	2.6305034155649e-05	0.000751215460972616	0.000665085888046212	"6125/9775/6191/387/708/6154/1994/6156/5594/7431/84305/28958/51065/1153/5935"	15
+"131"	"Up"	"GO:0048207"	"vesicle targeting, rough ER to cis-Golgi"	"10/549"	"65/17913"	2.64851604830089e-05	0.000751215460972616	0.000665085888046212	"8775/5861/9871/10016/27095/10342/81876/5265/10959/1522"	10
+"132"	"Up"	"GO:0048208"	"COPII vesicle coating"	"10/549"	"65/17913"	2.64851604830089e-05	0.000751215460972616	0.000665085888046212	"8775/5861/9871/10016/27095/10342/81876/5265/10959/1522"	10
+"133"	"Up"	"GO:0042776"	"mitochondrial ATP synthesis coupled proton transport"	"6/549"	"21/17913"	2.95439202934483e-05	0.000831672462997523	0.000736318203435448	"498/506/10632/522/513/521"	6
+"134"	"Up"	"GO:0030004"	"cellular monovalent inorganic cation homeostasis"	"11/549"	"80/17913"	3.13278724770172e-05	0.000875310108611585	0.000774952634957794	"7879/9114/506/5594/5538/9550/534/11261/23557/51382/2896"	11
+"135"	"Up"	"GO:0000380"	"alternative mRNA splicing, via spliceosome"	"9/549"	"54/17913"	3.47370636343083e-05	0.000963374564791483	0.00085292018233479	"4670/27316/9967/5725/6426/6431/10284/9939/135295"	9
+"136"	"Up"	"GO:0031396"	"regulation of protein ubiquitination"	"18/549"	"196/17913"	3.51261722750091e-05	0.00096700286027672	0.000856132480603743	"6125/5861/6187/11338/6135/29979/6188/7332/9349/11315/10016/6201/706/408/7334/11261/9636/5300"	18
+"137"	"Up"	"GO:0016236"	"macroautophagy"	"22/549"	"272/17913"	3.5895222681902e-05	0.000980961414022197	0.000868490635615132	"7879/5868/5861/9114/29979/56993/826/8673/5899/55004/5049/29978/401505/7251/81876/5566/9550/534/23557/27243/51382/8649"	22
+"138"	"Up"	"GO:0009063"	"cellular amino acid catabolic process"	"13/549"	"115/17913"	5.12900894023702e-05	0.00139152242552517	0.00123197934041239	"2806/7263/3028/2746/4357/23564/587/23576/3712/5860/2184/2752/5092"	13
+"139"	"Up"	"GO:0015985"	"energy coupled proton transport, down electrochemical gradient"	"6/549"	"23/17913"	5.21633147150505e-05	0.00139499607352249	0.00123505472208793	"498/506/10632/522/513/521"	6
+"140"	"Up"	"GO:0015986"	"ATP synthesis coupled proton transport"	"6/549"	"23/17913"	5.21633147150505e-05	0.00139499607352249	0.00123505472208793	"498/506/10632/522/513/521"	6
+"141"	"Up"	"GO:1903321"	"negative regulation of protein modification by small protein conjugation or removal"	"11/549"	"86/17913"	6.19932970738211e-05	0.00164611988825806	0.00145738628208632	"6125/11338/6135/6188/9349/11315/6201/706/408/11261/9636"	11
+"142"	"Up"	"GO:0035722"	"interleukin-12-mediated signaling pathway"	"8/549"	"47/17913"	8.1077420952753e-05	0.00213770326793738	0.00189260784714766	"5478/9987/3185/5908/4282/6647/375/5898"	8
+"143"	"Up"	"GO:0009065"	"glutamine family amino acid catabolic process"	"6/549"	"25/17913"	8.68623333840219e-05	0.00227421381950894	0.00201346696964509	"2806/2746/23564/23576/2184/2752"	6
+"144"	"Up"	"GO:0051444"	"negative regulation of ubiquitin-protein transferase activity"	"5/549"	"16/17913"	8.76113491566878e-05	0.00227789507807388	0.00201672615858487	"6125/6135/9349/11315/6201"	5
+"145"	"Up"	"GO:0051452"	"intracellular pH reduction"	"8/549"	"48/17913"	9.47131828134386e-05	0.00244555969967941	0.00216516742417073	"7879/9114/5538/9550/534/23557/51382/2896"	8
+"146"	"Up"	"GO:0006417"	"regulation of translation"	"27/549"	"397/17913"	0.000101354418145478	0.0025991160379224	0.00230111797217095	"6125/9775/6191/387/708/6154/1994/6156/3315/23521/5594/6188/1974/26065/6208/9939/5813/7431/84305/28958/6726/136319/1975/51065/1153/5935/6169"	27
+"147"	"Up"	"GO:0042255"	"ribosome assembly"	"6/549"	"26/17913"	0.00011001582567521	0.00278759961265426	0.00246799122251695	"6125/708/6135/6223/6208/6169"	6
+"148"	"Up"	"GO:0071349"	"cellular response to interleukin-12"	"8/549"	"49/17913"	0.000110193574431846	0.00278759961265426	0.00246799122251695	"5478/9987/3185/5908/4282/6647/375/5898"	8
+"149"	"Up"	"GO:0070671"	"response to interleukin-12"	"8/549"	"50/17913"	0.000127707081746741	0.0032089618393275	0.00284104274405148	"5478/9987/3185/5908/4282/6647/375/5898"	8
+"150"	"Up"	"GO:0042273"	"ribosomal large subunit biogenesis"	"6/549"	"27/17913"	0.000137811826569068	0.00343978319116393	0.00304539959204206	"6125/6154/6129/6135/6165/6169"	6
+"151"	"Up"	"GO:0034248"	"regulation of cellular amide metabolic process"	"29/549"	"452/17913"	0.000156349093715087	0.00387662918456481	0.0034321596103786	"6125/9775/6191/387/708/6154/1994/6156/3315/23521/5594/6188/1974/6625/5476/26065/6208/9939/5813/7431/84305/28958/6726/136319/1975/51065/1153/5935/6169"	29
+"152"	"Up"	"GO:0030833"	"regulation of actin filament polymerization"	"13/549"	"129/17913"	0.000167465575319725	0.00412494153945427	0.00365200205458319	"10095/387/10109/11344/10093/2885/375/10092/10094/29108/822/136319/11151"	13
+"153"	"Up"	"GO:0008064"	"regulation of actin polymerization or depolymerization"	"14/549"	"147/17913"	0.000173878415415797	0.00425490710664539	0.00376706659886031	"11034/10095/387/10109/11344/10093/2885/375/10092/10094/29108/822/136319/11151"	14
+"154"	"Up"	"GO:0019058"	"viral life cycle"	"23/549"	"324/17913"	0.00017537530595724	0.00426366977599938	0.0037748245964412	"7879/5868/1487/5478/5861/9218/3921/1508/51495/9217/950/8673/129401/10410/8724/7251/81876/3956/684/64710/27243/9636/8815"	23
+"155"	"Up"	"GO:0030832"	"regulation of actin filament length"	"14/549"	"148/17913"	0.000186766177133915	0.00451130688509276	0.00399406921422546	"11034/10095/387/10109/11344/10093/2885/375/10092/10094/29108/822/136319/11151"	14
+"156"	"Up"	"GO:0006839"	"mitochondrial transport"	"18/549"	"224/17913"	0.000195607645436147	0.00469458349046752	0.00415633249310679	"7263/498/506/10632/56993/7332/522/29074/706/131118/401505/23593/26517/81855/26519/26520/513/521"	18
+"157"	"Up"	"GO:0009060"	"aerobic respiration"	"9/549"	"68/17913"	0.000220147852934787	0.00524989529546397	0.0046479757887472	"1345/6390/9377/81889/4697/1340/1329/4513/513"	9
+"158"	"Up"	"GO:0000381"	"regulation of alternative mRNA splicing, via spliceosome"	"7/549"	"41/17913"	0.000222241278687851	0.0052662743506792	0.00466247692596964	"27316/9967/5725/6431/10284/9939/135295"	7
+"159"	"Up"	"GO:0019042"	"viral latency"	"4/549"	"11/17913"	0.00024256058450578	0.00568388257075972	0.00503220485136144	"5478/64710/8815/3159"	4
+"160"	"Up"	"GO:0030838"	"positive regulation of actin filament polymerization"	"10/549"	"84/17913"	0.000242900964562381	0.00568388257075972	0.00503220485136144	"10095/387/10109/10093/2885/375/10092/10094/29108/11151"	10
+"161"	"Up"	"GO:0061025"	"membrane fusion"	"12/549"	"117/17913"	0.000250843748603082	0.00583328568180085	0.00516447835469829	"7879/5478/8775/10652/9218/4218/6892/9341/25801/11261/23557/11151"	12
+"162"	"Up"	"GO:0034314"	"Arp2/3 complex-mediated actin nucleation"	"6/549"	"30/17913"	0.00025568319254502	0.00587287038581936	0.00519952452905566	"10095/10109/10093/375/10092/10094"	6
+"163"	"Up"	"GO:0042407"	"cristae formation"	"6/549"	"30/17913"	0.00025568319254502	0.00587287038581936	0.00519952452905566	"498/506/10632/522/513/521"	6
+"164"	"Up"	"GO:0006376"	"mRNA splice site selection"	"7/549"	"42/17913"	0.000259726808432233	0.0059293729925017	0.00524954890727279	"6426/8683/6431/7536/10772/135295/6430"	7
+"165"	"Up"	"GO:0002429"	"immune response-activating cell surface receptor signaling pathway"	"26/549"	"399/17913"	0.00026603332355071	0.00603653795984157	0.00534442702303788	"5689/10095/10109/1967/10093/5686/10163/5690/5692/5594/5682/6188/2885/1399/5906/5691/10092/10094/29085/1398/5566/7334/4582/5696/3123/3122"	26
+"166"	"Up"	"GO:0006826"	"iron ion transport"	"8/549"	"56/17913"	0.000287673289870447	0.00648605843669643	0.00574240834940313	"9230/9114/537/9550/534/51382/567/2512"	8
+"167"	"Up"	"GO:0010506"	"regulation of autophagy"	"22/549"	"314/17913"	0.000289308696294953	0.00648605843669643	0.00574240834940313	"5868/3315/9114/493856/4218/6625/826/11315/5899/5476/55004/706/29108/5049/29978/81876/5566/9550/534/51382/5660/8649"	22
+"168"	"Up"	"GO:0045010"	"actin nucleation"	"7/549"	"43/17913"	0.000302133568122818	0.00673326237530851	0.00596126946127038	"10095/10109/10093/375/10092/10094/11151"	7
+"169"	"Up"	"GO:0000245"	"spliceosomal complex assembly"	"9/549"	"71/17913"	0.000306749392288887	0.00679567884455381	0.00601652965629216	"6426/8683/6431/7536/10772/135295/6430/6632/6637"	9
+"170"	"Up"	"GO:0051650"	"establishment of vesicle localization"	"19/549"	"253/17913"	0.000312580713234674	0.00688413053147422	0.00609484003700302	"5868/8775/10652/5861/9230/5908/79083/9871/5906/375/10016/27095/10342/81876/23557/5265/10959/54732/1522"	19
+"171"	"Up"	"GO:0006081"	"cellular aldehyde metabolic process"	"9/549"	"72/17913"	0.00034121559622028	0.00747082568566508	0.00661426846720629	"7167/2806/11315/10327/25796/3029/8574/55163/26007"	9
+"172"	"Up"	"GO:1901136"	"carbohydrate derivative catabolic process"	"15/549"	"176/17913"	0.00035014135064828	0.00762168149318117	0.0067478281101067	"3094/55347/55577/3073/3704/4669/2760/6448/79077/11261/5660/2717/30833/2990/1890"	15
+"173"	"Up"	"GO:0043488"	"regulation of mRNA stability"	"14/549"	"158/17913"	0.000368013318072001	0.00796299022338638	0.00705000455843559	"9967/5689/1994/10949/3315/5686/5690/9261/5692/5682/5691/7431/1153/5696"	14
+"174"	"Up"	"GO:0055067"	"monovalent inorganic cation homeostasis"	"12/549"	"122/17913"	0.000370074866150969	0.00796299022338638	0.00705000455843559	"7879/9114/506/537/5594/5538/9550/534/11261/23557/51382/2896"	12
+"175"	"Up"	"GO:0071453"	"cellular response to oxygen levels"	"18/549"	"237/17913"	0.000389590062044763	0.00833500109883196	0.00737936303987343	"11331/5689/2782/6921/26608/9114/29979/5686/5690/5692/537/5682/5691/23576/9550/6923/51142/5696"	18
+"176"	"Up"	"GO:1903902"	"positive regulation of viral life cycle"	"8/549"	"59/17913"	0.000414419149332083	0.00881582554033704	0.00780505921798283	"5478/9218/51495/9217/7251/3956/64710/27243"	8
+"177"	"Up"	"GO:1990748"	"cellular detoxification"	"11/549"	"107/17913"	0.000440795698871702	0.0093051794047728	0.00823830688979688	"10549/25824/4259/6647/11315/10327/373156/84817/2879/2876/10935"	11
+"178"	"Up"	"GO:0032271"	"regulation of protein polymerization"	"15/549"	"180/17913"	0.000444879036713229	0.0093051794047728	0.00823830688979688	"10095/387/10109/11344/10093/24139/6188/2885/375/10092/10094/29108/822/136319/11151"	15
+"179"	"Up"	"GO:0050852"	"T cell receptor signaling pathway"	"15/549"	"180/17913"	0.000444879036713229	0.0093051794047728	0.00823830688979688	"5689/1967/5686/5690/5692/5594/5682/6188/1399/5691/29085/7334/5696/3123/3122"	15
+"180"	"Up"	"GO:1904666"	"regulation of ubiquitin protein ligase activity"	"5/549"	"22/17913"	0.000453564976482124	0.00943415151082819	0.00835249187685503	"6125/5861/6135/9349/6201"	5
+"181"	"Up"	"GO:0006520"	"cellular amino acid metabolic process"	"23/549"	"347/17913"	0.000466866493174278	0.0096571721019033	0.00854994234955395	"2806/5689/10549/7263/5686/5690/3028/5692/2746/5682/11315/5691/4357/23564/587/23576/3712/5860/2184/670/2752/5696/5092"	23
+"182"	"Up"	"GO:0043487"	"regulation of RNA stability"	"14/549"	"163/17913"	0.000504695418364813	0.0103255718380211	0.00914170763549494	"9967/5689/1994/10949/3315/5686/5690/9261/5692/5682/5691/7431/1153/5696"	14
+"183"	"Up"	"GO:2001242"	"regulation of intrinsic apoptotic signaling pathway"	"14/549"	"163/17913"	0.000504695418364813	0.0103255718380211	0.00914170763549494	"6154/3315/6135/29979/4282/6647/6188/51060/11315/7178/6201/29108/2876/4582"	14
+"184"	"Up"	"GO:0006521"	"regulation of cellular amino acid metabolic process"	"8/549"	"61/17913"	0.00052169000938565	0.0106152575822819	0.00939817986015683	"5689/5686/5690/5692/5682/11315/5691/5696"	8
+"185"	"Up"	"GO:0030041"	"actin filament polymerization"	"13/549"	"145/17913"	0.000527522279887021	0.0106759103562	0.00945187857390742	"10095/387/10109/11344/10093/2885/375/10092/10094/29108/822/136319/11151"	13
+"186"	"Up"	"GO:0061418"	"regulation of transcription from RNA polymerase II promoter in response to hypoxia"	"9/549"	"77/17913"	0.000565005628347534	0.0113730165189955	0.0100690589907549	"5689/6921/5686/5690/5692/5682/5691/6923/5696"	9
+"187"	"Up"	"GO:1903900"	"regulation of viral life cycle"	"13/549"	"147/17913"	0.000601050009975673	0.0120338568842188	0.0106541316150487	"5478/9218/51495/9217/10410/8724/7251/3956/684/64710/27243/9636/8815"	13
+"188"	"Up"	"GO:0006749"	"glutathione metabolic process"	"7/549"	"48/17913"	0.000604966312449686	0.0120478397543172	0.010666511298455	"6647/11315/26873/55748/2879/3029/2876"	7
+"189"	"Up"	"GO:0051648"	"vesicle localization"	"19/549"	"270/17913"	0.000696580174612443	0.0137989215542274	0.0122168252289311	"5868/8775/10652/5861/9230/5908/79083/9871/5906/375/10016/27095/10342/81876/23557/5265/10959/54732/1522"	19
+"190"	"Up"	"GO:0098754"	"detoxification"	"11/549"	"113/17913"	0.000701686737404817	0.0138269218149665	0.012241615158381	"10549/25824/4259/6647/11315/10327/373156/84817/2879/2876/10935"	11
+"191"	"Up"	"GO:0015682"	"ferric iron transport"	"6/549"	"36/17913"	0.00071780202948794	0.0139246155357661	0.0123281079403192	"9230/9114/537/9550/534/51382"	6
+"192"	"Up"	"GO:0033572"	"transferrin transport"	"6/549"	"36/17913"	0.00071780202948794	0.0139246155357661	0.0123281079403192	"9230/9114/537/9550/534/51382"	6
+"193"	"Up"	"GO:0072512"	"trivalent inorganic cation transport"	"6/549"	"36/17913"	0.00071780202948794	0.0139246155357661	0.0123281079403192	"9230/9114/537/9550/534/51382"	6
+"194"	"Up"	"GO:0008154"	"actin polymerization or depolymerization"	"14/549"	"170/17913"	0.000766976771921465	0.0148018610003813	0.0131047740357064	"11034/10095/387/10109/11344/10093/2885/375/10092/10094/29108/822/136319/11151"	14
+"195"	"Up"	"GO:0043687"	"post-translational protein modification"	"23/549"	"360/17913"	0.000773660614865668	0.0148542838054208	0.013151186376313	"5868/5689/6921/5861/9230/5686/5690/5692/4218/4924/5682/25870/5862/10920/5691/4738/81876/6923/3956/5265/5696/2335/3371"	23
+"196"	"Up"	"GO:0000387"	"spliceosomal snRNP assembly"	"7/549"	"50/17913"	0.000778545865125719	0.0148718148930137	0.0131667074612293	"6634/6628/10772/135295/6632/6636/6637"	7
+"197"	"Up"	"GO:0051258"	"protein polymerization"	"17/549"	"232/17913"	0.000837841173874837	0.0159123833113466	0.01408797094226	"10095/387/10109/11344/10093/24139/6188/2885/375/10092/10094/29108/2879/822/27243/136319/11151"	17
+"198"	"Up"	"GO:1901606"	"alpha-amino acid catabolic process"	"10/549"	"98/17913"	0.000841520271273136	0.0159123833113466	0.01408797094226	"2806/2746/23564/587/23576/3712/5860/2184/2752/5092"	10
+"199"	"Up"	"GO:0000038"	"very long-chain fatty acid metabolic process"	"5/549"	"25/17913"	0.000848203638723657	0.0159581629315647	0.0141285017632415	"3295/51495/30/641371/10965"	5
+"200"	"Up"	"GO:0032273"	"positive regulation of protein polymerization"	"11/549"	"116/17913"	0.000873944669046536	0.0163602442045511	0.0144844829622502	"10095/387/10109/10093/6188/2885/375/10092/10094/29108/11151"	11
+"201"	"Up"	"GO:0032956"	"regulation of actin cytoskeleton organization"	"20/549"	"297/17913"	0.000882230104815222	0.0164331816538716	0.0145490578688826	"11034/10095/387/10109/11344/10093/10163/2885/375/396/10092/10094/29108/29085/822/1398/684/136319/11151/397"	20
+"202"	"Up"	"GO:0045921"	"positive regulation of exocytosis"	"9/549"	"82/17913"	0.000896864486983607	0.0166230724716169	0.0147171770167346	"7879/5868/537/8673/375/9545/7251/27243/5874"	9
+"203"	"Up"	"GO:0098869"	"cellular oxidant detoxification"	"10/549"	"99/17913"	0.000910976750280902	0.0168014628229148	0.0148751142682632	"10549/25824/4259/6647/11315/373156/84817/2879/2876/10935"	10
+"204"	"Up"	"GO:0002768"	"immune response-regulating cell surface receptor signaling pathway"	"26/549"	"434/17913"	0.000937534408096482	0.0172065138427119	0.0152337247218567	"5689/10095/10109/1967/10093/5686/10163/5690/5692/5594/5682/6188/2885/1399/5906/5691/10092/10094/29085/1398/5566/7334/4582/5696/3123/3122"	26
+"205"	"Up"	"GO:0044088"	"regulation of vacuole organization"	"6/549"	"38/17913"	0.000966037123837354	0.0176431365446198	0.0156202870498784	"5868/950/5899/29978/81876/2896"	6
+"206"	"Up"	"GO:0030149"	"sphingolipid catabolic process"	"5/549"	"26/17913"	0.00102396264183043	0.0185203677826722	0.0163969405498298	"5538/2760/5660/2717/427"	5
+"207"	"Up"	"GO:1902175"	"regulation of oxidative stress-induced intrinsic apoptotic signaling pathway"	"5/549"	"26/17913"	0.00102396264183043	0.0185203677826722	0.0163969405498298	"3315/29979/6647/11315/2876"	5
+"208"	"Up"	"GO:0019079"	"viral genome replication"	"11/549"	"120/17913"	0.00115674199770094	0.0208213559586169	0.0184341120989891	"5868/1487/5478/9218/51495/9217/10410/684/64710/9636/8815"	11
+"209"	"Up"	"GO:0035459"	"cargo loading into vesicle"	"4/549"	"16/17913"	0.00118400740798662	0.0212101614138847	0.0187783396008556	"5861/56681/9871/10959"	4
+"210"	"Up"	"GO:0061013"	"regulation of mRNA catabolic process"	"14/549"	"178/17913"	0.00119949293670121	0.0213852455000444	0.0189333496625168	"9967/5689/1994/10949/3315/5686/5690/9261/5692/5682/5691/7431/1153/5696"	14
+"211"	"Up"	"GO:0048524"	"positive regulation of viral process"	"10/549"	"103/17913"	0.00123747674036962	0.0219424036937419	0.0194266276517075	"7879/5478/9218/51495/9217/7251/2963/3956/64710/27243"	10
+"212"	"Up"	"GO:0099132"	"ATP hydrolysis coupled cation transmembrane transport"	"7/549"	"54/17913"	0.00124246516641914	0.0219424036937419	0.0194266276517075	"308/9114/498/506/10632/537/513"	7
+"213"	"Up"	"GO:0034446"	"substrate adhesion-dependent cell spreading"	"9/549"	"86/17913"	0.0012636221383235	0.0221467531360595	0.0196075476904666	"708/10109/5861/1399/55742/1398/9341/2335/10631"	9
+"214"	"Up"	"GO:0016482"	"cytosolic transport"	"12/549"	"140/17913"	0.00126586676578973	0.0221467531360595	0.0196075476904666	"7879/5868/51699/10652/51552/5594/29934/8724/9341/11151/10772/400"	12
+"215"	"Up"	"GO:0038093"	"Fc receptor signaling pathway"	"17/549"	"241/17913"	0.0012726102912222	0.022161176420167	0.0196203172928211	"5689/10095/10109/10093/5686/10163/5690/5692/5594/5682/2885/5906/5691/10092/10094/1398/5696"	17
+"216"	"Up"	"GO:0034660"	"ncRNA metabolic process"	"27/549"	"470/17913"	0.00139660724874951	0.0242078589783248	0.0214323402841725	"6125/9775/51493/6154/6217/6129/6232/6229/6187/6135/6223/6203/3028/6155/51637/6234/6201/6208/26024/6218/55651/6165/55644/2963/54433/55505/6209"	27
+"217"	"Up"	"GO:0051443"	"positive regulation of ubiquitin-protein transferase activity"	"5/549"	"28/17913"	0.00145459340152638	0.0248919439338786	0.0220379924223413	"5861/6187/7332/7334/5300"	5
+"218"	"Up"	"GO:0090383"	"phagosome acidification"	"5/549"	"28/17913"	0.00145459340152638	0.0248919439338786	0.0220379924223413	"7879/9114/9550/534/51382"	5
+"219"	"Up"	"GO:0098927"	"vesicle-mediated transport between endosomal compartments"	"6/549"	"41/17913"	0.00145601915638873	0.0248919439338786	0.0220379924223413	"7879/5868/5594/29934/8724/11151"	6
+"220"	"Up"	"GO:0042177"	"negative regulation of protein catabolic process"	"11/549"	"124/17913"	0.00151092568268702	0.0255995909974151	0.0226645051874888	"6125/5245/6135/6625/9349/11315/29934/5476/6201/8724/5300"	11
+"221"	"Up"	"GO:0046514"	"ceramide catabolic process"	"4/549"	"17/17913"	0.00151108696859742	0.0255995909974151	0.0226645051874888	"2760/5660/2717/427"	4
+"222"	"Up"	"GO:0050792"	"regulation of viral process"	"15/549"	"204/17913"	0.00160215428815683	0.0270201155624288	0.0239221614670738	"7879/5478/9218/51495/9217/10410/8724/7251/2963/3956/684/64710/27243/9636/8815"	15
+"223"	"Up"	"GO:0090382"	"phagosome maturation"	"6/549"	"42/17913"	0.00165540121438148	0.0277929244244138	0.0246063649945116	"7879/9114/9550/534/51382/11151"	6
+"224"	"Up"	"GO:0006879"	"cellular iron ion homeostasis"	"7/549"	"57/17913"	0.00171423994188654	0.0286522961715322	0.025367206658838	"9114/537/6647/4738/6717/9550/2512"	7
+"225"	"Up"	"GO:0016241"	"regulation of macroautophagy"	"13/549"	"166/17913"	0.00184132380859796	0.0306396281750701	0.0271266838515789	"5868/9114/826/5899/55004/5049/29978/81876/5566/9550/534/51382/8649"	13
+"226"	"Up"	"GO:1990090"	"cellular response to nerve growth factor stimulus"	"6/549"	"43/17913"	0.00187485002188289	0.0310015740449967	0.0274471313168282	"9775/6132/5906/10094/1398/11151"	6
+"227"	"Up"	"GO:0000041"	"transition metal ion transport"	"9/549"	"91/17913"	0.00188275046778388	0.0310015740449967	0.0274471313168282	"9230/9114/537/9550/534/51382/475/567/2512"	9
+"228"	"Up"	"GO:0055072"	"iron ion homeostasis"	"8/549"	"74/17913"	0.0018879163681248	0.0310015740449967	0.0274471313168282	"9114/537/6647/4738/6717/9550/567/2512"	8
+"229"	"Up"	"GO:0043618"	"regulation of transcription from RNA polymerase II promoter in response to stress"	"10/549"	"109/17913"	0.00190060154219496	0.0310735902793796	0.0275108906291516	"5689/6921/5686/5690/5692/5682/5691/6923/4582/5696"	10
+"230"	"Up"	"GO:0017157"	"regulation of exocytosis"	"14/549"	"187/17913"	0.00191364730314127	0.0311508500128736	0.027579292254425	"7879/5868/5908/537/5906/8673/5899/375/9545/7251/23557/5898/27243/5874"	14
+"231"	"Up"	"GO:0032970"	"regulation of actin filament-based process"	"21/549"	"341/17913"	0.00201891795151327	0.0327222026427086	0.0289704836150161	"11034/10095/387/10109/11344/10093/10163/2885/375/396/10092/10094/29108/29085/822/1398/6717/684/136319/11151/397"	21
+"232"	"Up"	"GO:0072332"	"intrinsic apoptotic signaling pathway by p53 class mediator"	"8/549"	"75/17913"	0.00205790146010657	0.0332102718389612	0.0294025939105063	"6154/6135/3094/4282/6201/29108/4582/51065"	8
+"233"	"Up"	"GO:0071456"	"cellular response to hypoxia"	"15/549"	"210/17913"	0.00212738599750445	0.0341842625521745	0.0302649130614028	"11331/5689/2782/6921/26608/29979/5686/5690/5692/5682/5691/23576/6923/51142/5696"	15
+"234"	"Up"	"GO:0051701"	"interaction with host"	"15/549"	"211/17913"	0.0022274806249521	0.0356396899992336	0.0315534704812153	"7879/5478/9218/3921/1508/2885/10189/9217/950/8673/10410/8724/7251/3956/27243"	15
+"235"	"Up"	"GO:0097193"	"intrinsic apoptotic signaling pathway"	"18/549"	"277/17913"	0.0023155909758405	0.0365285042505257	0.0323403789599937	"6154/3315/6135/29979/3094/4282/6647/6188/51060/11315/7178/6201/29108/56616/2876/4582/51065/1396"	18
+"236"	"Up"	"GO:0006369"	"termination of RNA polymerase II transcription"	"5/549"	"31/17913"	0.0023318142403514	0.0365285042505257	0.0323403789599937	"6634/6628/11051/6636/6637"	5
+"237"	"Up"	"GO:0033120"	"positive regulation of RNA splicing"	"5/549"	"31/17913"	0.0023318142403514	0.0365285042505257	0.0323403789599937	"27316/9967/11338/6625/6430"	5
+"238"	"Up"	"GO:0046466"	"membrane lipid catabolic process"	"5/549"	"31/17913"	0.0023318142403514	0.0365285042505257	0.0323403789599937	"5538/2760/5660/2717/427"	5
+"239"	"Up"	"GO:1902253"	"regulation of intrinsic apoptotic signaling pathway by p53 class mediator"	"5/549"	"31/17913"	0.0023318142403514	0.0365285042505257	0.0323403789599937	"6154/6135/4282/6201/4582"	5
+"240"	"Up"	"GO:0045069"	"regulation of viral genome replication"	"9/549"	"95/17913"	0.00253516019037862	0.0395484989699064	0.0350141203486941	"5478/9218/51495/9217/10410/684/64710/9636/8815"	9
+"241"	"Up"	"GO:1990089"	"response to nerve growth factor"	"6/549"	"46/17913"	0.00266633175821917	0.0414221829990564	0.0366729797188564	"9775/6132/5906/10094/1398/11151"	6
+"242"	"Up"	"GO:0043620"	"regulation of DNA-templated transcription in response to stress"	"10/549"	"115/17913"	0.00282491706192693	0.0437045019828695	0.0386936225663676	"5689/6921/5686/5690/5692/5682/5691/6923/4582/5696"	10
+"243"	"Up"	"GO:0006527"	"arginine catabolic process"	"3/549"	"10/17913"	0.00292482389951376	0.0450639534147305	0.0398972079686759	"23564/23576/2184"	3
+"244"	"Up"	"GO:0051656"	"establishment of organelle localization"	"25/549"	"448/17913"	0.00303420278437146	0.0465576033798637	0.0412196055564527	"5868/55968/8775/10652/5861/9230/5908/537/79083/9871/5906/8673/375/10016/6284/27095/10342/81876/23557/27243/5265/10959/54732/6209/1522"	25
+"245"	"Up"	"GO:0140029"	"exocytic process"	"7/549"	"63/17913"	0.00306527486687197	0.0468150062316486	0.0414474962391648	"8775/10652/4218/8673/5899/9341/23557"	7
+"246"	"Up"	"GO:0006457"	"protein folding"	"13/549"	"176/17913"	0.00307598598637434	0.0468150062316486	0.0414474962391648	"5478/10549/2782/2784/3315/3336/6625/5204/10471/51645/131118/567/2896"	13
+"247"	"Up"	"GO:0033238"	"regulation of cellular amine metabolic process"	"8/549"	"80/17913"	0.00309632379390914	0.0469337501392544	0.0415526257277643	"5689/5686/5690/5692/5682/11315/5691/5696"	8
+"248"	"Dn"	"GO:0022613"	"ribonucleoprotein complex biogenesis"	"47/388"	"381/17913"	2.44547086221445e-22	9.9017115211063e-19	7.55779205417012e-19	"55226/117246/9188/23481/27340/51096/3326/23246/4931/10607/84916/84135/9136/23560/25929/22984/10528/3320/4869/23517/51202/4839/51602/55646/51068/22894/55127/1983/24148/317781/23020/27339/1778/25926/10594/10514/1736/103/7514/51386/8662/8663/728689/1656/1660/3646/5036"	47
+"249"	"Dn"	"GO:0034660"	"ncRNA metabolic process"	"46/388"	"470/17913"	8.50850090523618e-18	1.72254600826506e-14	1.31478729777755e-14	"55226/117246/9188/23481/27340/51096/51520/23246/4931/4790/10607/84916/84135/9136/5430/23560/22984/10528/23517/51202/8565/51602/80222/3376/55646/22894/55699/55127/5917/6897/7965/284119/2058/317781/2617/25926/6597/4691/16/3735/84365/10056/1736/103/7407/5036"	46
+"250"	"Dn"	"GO:0042254"	"ribosome biogenesis"	"30/388"	"202/17913"	7.37550764793263e-17	9.95447682215973e-14	7.59806682608077e-14	"55226/117246/9188/23481/27340/51096/23246/4931/10607/84916/84135/9136/23560/22984/10528/4869/23517/51202/4839/51602/55646/51068/22894/55127/317781/25926/10514/1736/7514/5036"	30
+"251"	"Dn"	"GO:0016072"	"rRNA metabolic process"	"29/388"	"191/17913"	1.33848573434903e-16	1.35488218459481e-13	1.03415634632862e-13	"55226/117246/9188/23481/27340/51096/23246/4931/10607/84916/84135/9136/23560/22984/10528/23517/51202/51602/55646/22894/55127/284119/317781/25926/6597/4691/84365/1736/5036"	29
+"252"	"Dn"	"GO:0006403"	"RNA localization"	"29/388"	"208/17913"	1.37594727683273e-15	1.11424210477915e-12	8.50480253638086e-13	"10644/7175/11260/55308/11269/51602/10482/8607/10128/51068/9631/24148/9793/4928/10574/10576/3192/170506/10694/23165/4641/1736/7203/6950/7514/10575/5976/1660/908"	29
+"253"	"Dn"	"GO:0006364"	"rRNA processing"	"25/388"	"154/17913"	3.57055040370491e-15	2.40952643076686e-12	1.83914666408379e-12	"55226/117246/9188/23481/27340/51096/23246/4931/10607/84916/84135/9136/23560/22984/10528/23517/51202/51602/55646/22894/55127/317781/25926/1736/5036"	25
+"254"	"Dn"	"GO:0051054"	"positive regulation of DNA metabolic process"	"28/388"	"222/17913"	5.72639763762856e-14	3.31231200496543e-11	2.52822608482368e-11	"7037/26354/5984/4436/306/3326/4931/3320/1956/5591/142/983/10574/10576/10111/170506/8239/10694/1499/10155/1736/7203/7520/6950/10575/5111/1660/908"	28
+"255"	"Dn"	"GO:0006457"	"protein folding"	"25/388"	"176/17913"	8.5371359336571e-14	4.3208579244222e-11	3.2980304080549e-11	"1410/3329/10808/6905/80273/3320/22824/10845/7184/10574/10576/3312/10694/821/3309/3301/10131/5700/7203/10961/6950/10575/9601/908/2288"	25
+"256"	"Dn"	"GO:0006418"	"tRNA aminoacylation for protein translation"	"14/388"	"42/17913"	1.20836021786644e-13	5.00734817832744e-11	3.82201563779734e-11	"51520/8565/80222/3376/55699/5917/6897/7965/2058/2617/16/3735/10056/7407"	14
+"257"	"Dn"	"GO:0051052"	"regulation of DNA metabolic process"	"37/388"	"403/17913"	1.23668762122189e-13	5.00734817832744e-11	3.82201563779734e-11	"7037/55226/26354/5984/4436/306/3326/4931/2956/23560/3320/4869/1956/5591/142/3838/983/10574/10576/10111/3192/170506/8239/10694/7913/1499/3980/10155/1736/7203/7520/6950/10575/5111/5976/1660/908"	37
+"258"	"Dn"	"GO:0034329"	"cell junction assembly"	"27/388"	"214/17913"	1.62050168787829e-13	5.96491939474474e-11	4.55291191924466e-11	"3909/3852/857/3655/3691/100506658/3918/7205/3673/5339/23603/2316/1365/81/6093/6624/3728/87/1495/5586/10015/1739/1499/4641/8826/7094/7414"	27
+"259"	"Dn"	"GO:1904816"	"positive regulation of protein localization to chromosome, telomeric region"	"9/388"	"12/17913"	1.98891176555923e-13	6.20479272737643e-11	4.73600276808496e-11	"26354/10574/10576/10694/1736/7203/6950/10575/908"	9
+"260"	"Dn"	"GO:0006520"	"cellular amino acid metabolic process"	"34/388"	"347/17913"	1.99215375292402e-13	6.20479272737643e-11	4.73600276808496e-11	"8140/440/26227/445/1503/8833/51520/29968/2618/5713/493/2744/8565/790/80222/56922/3376/55699/5917/6897/7965/2058/5707/2617/16/3735/5708/6472/191/5701/10056/4942/5700/7407"	34
+"261"	"Dn"	"GO:0000723"	"telomere maintenance"	"23/388"	"154/17913"	2.90021175929588e-13	8.3878267238493e-11	6.40227197390429e-11	"55226/26354/5984/3326/3320/5591/142/10574/10576/10111/3192/170506/10694/1499/1736/7203/7520/6950/10575/5111/2547/5976/908"	23
+"262"	"Dn"	"GO:0043039"	"tRNA aminoacylation"	"14/388"	"45/17913"	3.59599403426069e-13	9.70678656314768e-11	7.40900946286974e-11	"51520/8565/80222/3376/55699/5917/6897/7965/2058/2617/16/3735/10056/7407"	14
+"263"	"Dn"	"GO:0034330"	"cell junction organization"	"30/388"	"277/17913"	4.14120854344535e-13	1.04798458702564e-10	7.99907123918128e-11	"3909/3852/857/3655/3691/100506658/1832/3918/7205/3673/5339/5962/23603/2316/1365/81/6093/6624/3728/87/1495/5586/10015/1739/1829/1499/4641/8826/7094/7414"	30
+"264"	"Dn"	"GO:0034504"	"protein localization to nucleus"	"27/388"	"223/17913"	4.43432595276929e-13	1.0561521048684e-10	8.06141238224808e-11	"1277/4931/79711/7175/3843/2316/5905/23650/51068/142/3728/3838/4000/5530/25942/983/10574/10576/3192/10694/10155/1736/7203/6950/7514/10575/908"	27
+"265"	"Dn"	"GO:0043038"	"amino acid activation"	"14/388"	"46/17913"	5.06855512560059e-13	1.14014331686427e-10	8.70250166594348e-11	"51520/8565/80222/3376/55699/5917/6897/7965/2058/2617/16/3735/10056/7407"	14
+"266"	"Dn"	"GO:1900180"	"regulation of protein localization to nucleus"	"20/388"	"117/17913"	7.89817667598184e-13	1.6244761171277e-10	1.2399323757359e-10	"4931/7175/3843/2316/23650/51068/142/3728/4000/25942/983/10574/10576/10694/10155/1736/7203/6950/10575/908"	20
+"267"	"Dn"	"GO:0010833"	"telomere maintenance via telomere lengthening"	"17/388"	"79/17913"	8.42528981469046e-13	1.6244761171277e-10	1.2399323757359e-10	"55226/3326/3320/142/10574/10576/10111/3192/170506/10694/1499/1736/7203/7520/6950/10575/908"	17
+"268"	"Dn"	"GO:0032204"	"regulation of telomere maintenance"	"17/388"	"79/17913"	8.42528981469046e-13	1.6244761171277e-10	1.2399323757359e-10	"55226/26354/142/10574/10576/10111/3192/170506/10694/1499/1736/7203/7520/6950/10575/5976/908"	17
+"269"	"Dn"	"GO:0032200"	"telomere organization"	"23/388"	"167/17913"	1.66563621652372e-12	2.93154829788725e-10	2.23759623626287e-10	"55226/26354/5984/3326/3320/5591/142/10574/10576/10111/3192/170506/10694/1499/1736/7203/7520/6950/10575/5111/2547/5976/908"	23
+"270"	"Dn"	"GO:1904814"	"regulation of protein localization to chromosome, telomeric region"	"9/388"	"14/17913"	1.74163789559959e-12	2.93154829788725e-10	2.23759623626287e-10	"26354/10574/10576/10694/1736/7203/6950/10575/908"	9
+"271"	"Dn"	"GO:0043312"	"neutrophil degranulation"	"39/388"	"485/17913"	1.76211344167147e-12	2.93154829788725e-10	2.23759623626287e-10	"1832/306/3326/4790/3934/161/6814/5713/3320/302/6709/47/3043/1729/6093/5317/23191/3728/5707/1778/1938/10576/3615/3312/3482/5708/10694/5701/10970/7520/8826/55832/2547/226/7414/5036/1915/5315/10383"	39
+"272"	"Dn"	"GO:1903405"	"protein localization to nuclear body"	"8/388"	"10/17913"	1.95484821049532e-12	2.93154829788725e-10	2.23759623626287e-10	"10574/10576/10694/1736/7203/6950/10575/908"	8
+"273"	"Dn"	"GO:1904851"	"positive regulation of establishment of protein localization to telomere"	"8/388"	"10/17913"	1.95484821049532e-12	2.93154829788725e-10	2.23759623626287e-10	"10574/10576/10694/1736/7203/6950/10575/908"	8
+"274"	"Dn"	"GO:1904867"	"protein localization to Cajal body"	"8/388"	"10/17913"	1.95484821049532e-12	2.93154829788725e-10	2.23759623626287e-10	"10574/10576/10694/1736/7203/6950/10575/908"	8
+"275"	"Dn"	"GO:0002283"	"neutrophil activation involved in immune response"	"39/388"	"488/17913"	2.13450545231724e-12	3.0866473487259e-10	2.35598045413662e-10	"1832/306/3326/4790/3934/161/6814/5713/3320/302/6709/47/3043/1729/6093/5317/23191/3728/5707/1778/1938/10576/3615/3312/3482/5708/10694/5701/10970/7520/8826/55832/2547/226/7414/5036/1915/5315/10383"	39
+"276"	"Dn"	"GO:1903829"	"positive regulation of cellular protein localization"	"31/388"	"318/17913"	2.75637246499718e-12	3.84846624509434e-10	2.93746263420389e-10	"26354/6711/3326/7175/5962/3675/57707/2181/3843/2316/3799/1956/51068/142/3728/3688/983/10574/10576/10694/1739/10155/4641/1736/7203/8826/8878/6950/10575/4926/908"	31
+"277"	"Dn"	"GO:1900182"	"positive regulation of protein localization to nucleus"	"16/388"	"74/17913"	3.69627759135333e-12	4.98874265579655e-10	3.8078143888468e-10	"7175/3843/2316/51068/142/3728/983/10574/10576/10694/10155/1736/7203/6950/10575/908"	16
+"278"	"Dn"	"GO:0002446"	"neutrophil mediated immunity"	"39/388"	"499/17913"	4.25304855721911e-12	5.2406367640603e-10	4.00008047192446e-10	"1832/306/3326/4790/3934/161/6814/5713/3320/302/6709/47/3043/1729/6093/5317/23191/3728/5707/1778/1938/10576/3615/3312/3482/5708/10694/5701/10970/7520/8826/55832/2547/226/7414/5036/1915/5315/10383"	39
+"279"	"Dn"	"GO:0042119"	"neutrophil activation"	"39/388"	"499/17913"	4.25304855721911e-12	5.2406367640603e-10	4.00008047192446e-10	"1832/306/3326/4790/3934/161/6814/5713/3320/302/6709/47/3043/1729/6093/5317/23191/3728/5707/1778/1938/10576/3615/3312/3482/5708/10694/5701/10970/7520/8826/55832/2547/226/7414/5036/1915/5315/10383"	39
+"280"	"Dn"	"GO:1904874"	"positive regulation of telomerase RNA localization to Cajal body"	"9/388"	"15/17913"	4.27120309246702e-12	5.2406367640603e-10	4.00008047192446e-10	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
+"281"	"Dn"	"GO:0070203"	"regulation of establishment of protein localization to telomere"	"8/388"	"11/17913"	7.03260822690415e-12	8.37500903256909e-10	6.39248846878965e-10	"10574/10576/10694/1736/7203/6950/10575/908"	8
+"282"	"Dn"	"GO:0043487"	"regulation of RNA stability"	"22/388"	"163/17913"	7.73430646675185e-12	8.94748768110807e-10	6.82945076282209e-10	"10644/5713/4869/6093/22894/8531/5707/3312/3192/170506/5708/1981/5701/1736/10605/5700/23367/7514/5976/10492/1660/26986"	22
+"283"	"Dn"	"GO:0007004"	"telomere maintenance via telomerase"	"15/388"	"67/17913"	1.02804559774823e-11	1.15626572924516e-09	8.82556103797898e-10	"55226/3326/3320/10574/10576/10111/3192/10694/1499/1736/7203/7520/6950/10575/908"	15
+"284"	"Dn"	"GO:0070202"	"regulation of establishment of protein localization to chromosome"	"8/388"	"12/17913"	2.07000423276007e-11	2.20564398380145e-09	1.68352698819489e-09	"10574/10576/10694/1736/7203/6950/10575/908"	8
+"285"	"Dn"	"GO:1990173"	"protein localization to nucleoplasm"	"8/388"	"12/17913"	2.07000423276007e-11	2.20564398380145e-09	1.68352698819489e-09	"10574/10576/10694/1736/7203/6950/10575/908"	8
+"286"	"Dn"	"GO:0043488"	"regulation of mRNA stability"	"21/388"	"158/17913"	3.14070210899822e-11	3.26069303572661e-09	2.48882628664474e-09	"10644/5713/4869/6093/22894/8531/5707/3312/3192/170506/5708/1981/5701/10605/5700/23367/7514/5976/10492/1660/26986"	21
+"287"	"Dn"	"GO:1904356"	"regulation of telomere maintenance via telomere lengthening"	"14/388"	"61/17913"	3.54184784843248e-11	3.58523548457578e-09	2.73654349552573e-09	"55226/142/10574/10576/3192/170506/10694/1499/1736/7203/7520/6950/10575/908"	14
+"288"	"Dn"	"GO:1904872"	"regulation of telomerase RNA localization to Cajal body"	"9/388"	"18/17913"	3.91674844514993e-11	3.86802791571026e-09	2.95239369318619e-09	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
+"289"	"Dn"	"GO:0006417"	"regulation of translation"	"33/388"	"397/17913"	4.10382040973098e-11	3.95627829500018e-09	3.01975356465418e-09	"55226/10644/7175/3673/25929/4869/6093/10128/23191/1983/2058/10985/8531/1938/4691/16/170506/9669/5936/6472/1981/10605/10131/23367/8662/8663/5976/10492/1660/3646/5036/2597/26986"	33
+"290"	"Dn"	"GO:0032206"	"positive regulation of telomere maintenance"	"13/388"	"51/17913"	4.27774656743704e-11	4.02804554687269e-09	3.07453217184704e-09	"26354/10574/10576/10111/170506/10694/1499/1736/7203/7520/6950/10575/908"	13
+"291"	"Dn"	"GO:0061013"	"regulation of mRNA catabolic process"	"22/388"	"178/17913"	4.54247494594551e-11	4.1801093309394e-09	3.19059962710431e-09	"10644/5713/4869/6093/22894/5317/8531/5707/3312/3192/170506/5708/1981/5701/10605/5700/23367/7514/5976/10492/1660/26986"	22
+"292"	"Dn"	"GO:0006278"	"RNA-dependent DNA biosynthetic process"	"15/388"	"74/17913"	4.72451305182108e-11	4.25101185484968e-09	3.24471820354309e-09	"55226/3326/3320/10574/10576/10111/3192/10694/1499/1736/7203/7520/6950/10575/908"	15
+"293"	"Dn"	"GO:0034470"	"ncRNA processing"	"28/388"	"293/17913"	5.209951433991e-11	4.58588986004991e-09	3.50032435015963e-09	"55226/117246/9188/23481/27340/51096/23246/4931/10607/84916/84135/9136/23560/22984/10528/23517/51202/51602/55646/22894/55127/317781/25926/16/3735/1736/103/5036"	28
+"294"	"Dn"	"GO:0090670"	"RNA localization to Cajal body"	"9/388"	"19/17913"	7.30023219177044e-11	5.9117280288957e-09	4.512311940008e-09	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
+"295"	"Dn"	"GO:0090671"	"telomerase RNA localization to Cajal body"	"9/388"	"19/17913"	7.30023219177044e-11	5.9117280288957e-09	4.512311940008e-09	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
+"296"	"Dn"	"GO:0090672"	"telomerase RNA localization"	"9/388"	"19/17913"	7.30023219177044e-11	5.9117280288957e-09	4.512311940008e-09	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
+"297"	"Dn"	"GO:0090685"	"RNA localization to nucleus"	"9/388"	"19/17913"	7.30023219177044e-11	5.9117280288957e-09	4.512311940008e-09	"8607/10574/10576/10694/1736/7203/6950/10575/908"	9
+"298"	"Dn"	"GO:0071103"	"DNA conformation change"	"27/388"	"279/17913"	8.73298006926895e-11	6.93330123538627e-09	5.29205974889033e-09	"23397/10592/10051/79711/7175/4171/4175/7150/4869/4176/64151/8607/7153/142/1108/26155/6832/983/10111/4173/170506/3009/4678/7520/8467/2547/1660"	27
+"299"	"Dn"	"GO:2000573"	"positive regulation of DNA biosynthetic process"	"14/388"	"66/17913"	1.10392789377821e-10	8.59577700366919e-09	6.56099655087618e-09	"5984/3326/4931/3320/10574/10576/10694/1499/1736/7203/7520/6950/10575/908"	14
+"300"	"Dn"	"GO:2001252"	"positive regulation of chromosome organization"	"21/388"	"169/17913"	1.14115225160125e-10	8.71797257874235e-09	6.65426615829446e-09	"26354/7175/8452/4000/25942/10574/10576/10111/3192/170506/10694/3009/1499/10155/1736/7203/7520/6950/10575/4926/908"	21
+"301"	"Dn"	"GO:0050821"	"protein stabilization"	"21/388"	"171/17913"	1.42665965950194e-10	1.06973054839321e-08	8.16505411364072e-09	"1410/3329/3326/23560/2319/3320/2316/80155/8774/56926/10574/10576/8239/10694/3009/7203/7917/6950/10575/908/2597"	21
+"302"	"Dn"	"GO:0070198"	"protein localization to chromosome, telomeric region"	"10/388"	"28/17913"	1.87766832892535e-10	1.38230528433068e-08	1.05508788779422e-08	"26354/10574/10576/10694/1736/7203/7520/6950/10575/908"	10
+"303"	"Dn"	"GO:0033044"	"regulation of chromosome organization"	"28/388"	"311/17913"	2.09838540615776e-10	1.517207590988e-08	1.15805630685699e-08	"55226/26354/7175/4171/8452/7153/142/4000/26155/25942/10574/4288/10576/10111/3192/170506/10694/3009/1499/10155/1736/7203/7520/6950/10575/4926/5976/908"	28
+"304"	"Dn"	"GO:1904358"	"positive regulation of telomere maintenance via telomere lengthening"	"11/388"	"37/17913"	2.20601567122392e-10	1.56704516715537e-08	1.19609640087044e-08	"10574/10576/170506/10694/1499/1736/7203/7520/6950/10575/908"	11
+"305"	"Dn"	"GO:0034248"	"regulation of cellular amide metabolic process"	"34/388"	"452/17913"	3.01274531867193e-10	2.10320789574183e-08	1.60533942933226e-08	"55226/10644/7175/3673/25929/4869/6093/10128/23191/1983/2058/10985/8531/1938/4691/16/170506/9669/5936/6472/1981/10605/10131/23367/8662/8663/5976/10492/1660/3646/5036/1915/2597/26986"	34
+"306"	"Dn"	"GO:1903311"	"regulation of mRNA metabolic process"	"26/388"	"275/17913"	3.27988670884035e-10	2.25089174306688e-08	1.71806376042021e-08	"10644/5713/4869/6093/22894/5317/8531/27339/5707/4928/6829/3312/3192/170506/5708/5936/1981/5701/10605/5700/23367/7514/5976/10492/1660/26986"	26
+"307"	"Dn"	"GO:0070200"	"establishment of protein localization to telomere"	"8/388"	"16/17913"	4.98763826786423e-10	3.36582455776371e-08	2.56907122007884e-08	"10574/10576/10694/1736/7203/6950/10575/908"	8
+"308"	"Dn"	"GO:0006401"	"RNA catabolic process"	"30/388"	"368/17913"	5.22799640758341e-10	3.47018974660741e-08	2.64873122565399e-08	"10644/5713/4869/6093/10128/22894/5317/9652/8531/5707/7812/6832/3312/23644/3192/170506/5708/1981/5701/1736/10605/5700/23367/7514/5976/10492/1656/1660/3646/26986"	30
+"309"	"Dn"	"GO:0032508"	"DNA duplex unwinding"	"14/388"	"76/17913"	8.05229507393188e-10	5.25866818618552e-08	4.01384352072394e-08	"4171/4175/4176/8607/7153/142/1108/6832/10111/4173/170506/7520/2547/1660"	14
+"310"	"Dn"	"GO:0070199"	"establishment of protein localization to chromosome"	"9/388"	"24/17913"	9.38679500238654e-10	6.03287824835922e-08	4.60478364695186e-08	"10574/10576/10694/3009/1736/7203/6950/10575/908"	9
+"311"	"Dn"	"GO:2000278"	"regulation of DNA biosynthetic process"	"16/388"	"106/17913"	1.07803363921405e-09	6.72054986323485e-08	5.12967058752844e-08	"55226/5984/3326/4931/3320/10574/10576/3192/10694/1499/1736/7203/7520/6950/10575/908"	16
+"312"	"Dn"	"GO:0032210"	"regulation of telomere maintenance via telomerase"	"12/388"	"53/17913"	1.07887315660722e-09	6.72054986323485e-08	5.12967058752844e-08	"55226/10574/10576/3192/10694/1499/1736/7203/7520/6950/10575/908"	12
+"313"	"Dn"	"GO:0031647"	"regulation of protein stability"	"25/388"	"272/17913"	1.30670873864235e-09	8.01646012539827e-08	6.11881476340339e-08	"1410/3329/3326/23560/8452/2319/3320/2316/80155/5591/8774/4000/56926/10574/10576/3312/8239/10694/3009/7203/7917/6950/10575/908/2597"	25
+"314"	"Dn"	"GO:0006402"	"mRNA catabolic process"	"28/388"	"338/17913"	1.40329352484763e-09	8.48050071956428e-08	6.47300830943072e-08	"10644/5713/4869/6093/22894/5317/9652/8531/5707/7812/6832/3312/23644/3192/170506/5708/1981/5701/10605/5700/23367/7514/5976/10492/1656/1660/3646/26986"	28
+"315"	"Dn"	"GO:0032212"	"positive regulation of telomere maintenance via telomerase"	"10/388"	"34/17913"	1.67069779919562e-09	9.94802263079865e-08	7.59314046197887e-08	"10574/10576/10694/1499/1736/7203/7520/6950/10575/908"	10
+"316"	"Dn"	"GO:0002181"	"cytoplasmic translation"	"13/388"	"69/17913"	2.43983708491153e-09	1.43172468939229e-07	1.09280879958814e-07	"1983/8531/1938/16/170506/5936/1981/51386/8662/8663/728689/1660/3646"	13
+"317"	"Dn"	"GO:0071826"	"ribonucleoprotein complex subunit organization"	"22/388"	"221/17913"	2.97429215230903e-09	1.72041556067132e-07	1.31316116679388e-07	"3326/23246/25929/3320/4869/3799/4839/1983/24148/23020/27339/1778/3831/10594/103/51386/8662/8663/728689/1656/1660/3646"	22
+"318"	"Dn"	"GO:0032392"	"DNA geometric change"	"14/388"	"86/17913"	4.36934085190412e-09	2.49175508582532e-07	1.90191026555827e-07	"4171/4175/4176/8607/7153/142/1108/6832/10111/4173/170506/7520/2547/1660"	14
+"319"	"Dn"	"GO:1902369"	"negative regulation of RNA catabolic process"	"11/388"	"49/17913"	5.95367955271699e-09	3.34811784846543e-07	2.55555601853466e-07	"10128/5317/8531/3192/170506/1736/10605/23367/10492/1660/26986"	11
+"320"	"Dn"	"GO:0071897"	"DNA biosynthetic process"	"20/388"	"192/17913"	7.21680605674208e-09	4.00285585256831e-07	3.05530534716579e-07	"55226/5984/3326/4931/3320/10574/10576/10111/3192/10694/1499/3980/7706/1736/7203/7520/6950/10575/5111/908"	20
+"321"	"Dn"	"GO:0019058"	"viral life cycle"	"26/388"	"324/17913"	1.06811858274294e-08	5.84434073179211e-07	4.46087647074434e-07	"857/7037/3326/7175/3673/140564/6510/1956/7153/9631/3838/3688/4928/5586/983/3312/10015/7913/23165/7706/10155/103/23367/7514/1656/26986"	26
+"322"	"Dn"	"GO:0045216"	"cell-cell junction organization"	"16/388"	"128/17913"	1.76884716126984e-08	9.54941620797546e-07	7.28889160068528e-07	"857/100506658/1832/1365/81/6093/6624/3728/1495/5586/10015/1739/1829/4641/7094/7414"	16
+"323"	"Dn"	"GO:0034502"	"protein localization to chromosome"	"13/388"	"82/17913"	2.18339889403352e-08	1.16323448972918e-06	8.87875228931084e-07	"26354/4436/983/10574/10576/10694/3009/1736/7203/7520/6950/10575/908"	13
+"324"	"Dn"	"GO:0009165"	"nucleotide biosynthetic process"	"27/388"	"360/17913"	2.31423073285874e-08	1.21692470614871e-06	9.2885597152061e-07	"1503/8833/7175/3099/2618/2181/5214/47/2180/790/9631/5208/142/6240/2617/4928/10111/3615/10135/471/3735/23165/2023/3939/226/2597/5315"	27
+"325"	"Dn"	"GO:0007043"	"cell-cell junction assembly"	"14/388"	"98/17913"	2.48210257971983e-08	1.28846581349815e-06	9.83461966809367e-07	"857/100506658/1365/81/6093/6624/3728/1495/5586/10015/1739/4641/7094/7414"	14
+"326"	"Dn"	"GO:0022618"	"ribonucleoprotein complex assembly"	"20/388"	"209/17913"	3.06640087126027e-08	1.5614257439409e-06	1.19180719975315e-06	"3326/23246/25929/3320/4869/4839/1983/24148/23020/27339/1778/10594/103/51386/8662/8663/728689/1656/1660/3646"	20
+"327"	"Dn"	"GO:1901293"	"nucleoside phosphate biosynthetic process"	"27/388"	"365/17913"	3.08505950889779e-08	1.5614257439409e-06	1.19180719975315e-06	"1503/8833/7175/3099/2618/2181/5214/47/2180/790/9631/5208/142/6240/2617/4928/10111/3615/10135/471/3735/23165/2023/3939/226/2597/5315"	27
+"328"	"Dn"	"GO:0031581"	"hemidesmosome assembly"	"6/388"	"11/17913"	4.18862288502721e-08	2.09379432857718e-06	1.59815422877711e-06	"3909/3852/3655/3691/3918/5339"	6
+"329"	"Dn"	"GO:0006913"	"nucleocytoplasmic transport"	"24/388"	"302/17913"	4.78530392270377e-08	2.36288970524726e-06	1.80354971977642e-06	"79711/7175/11260/11269/25929/4869/3843/2316/5905/10482/51068/9631/3728/3838/4000/5530/4928/3313/5936/23165/10155/7514/5976/1660"	24
+"330"	"Dn"	"GO:0051973"	"positive regulation of telomerase activity"	"9/388"	"36/17913"	5.36948379986094e-08	2.61940239826951e-06	1.99934108261151e-06	"3326/4931/3320/10576/1499/1736/7520/6950/10575"	9
+"331"	"Dn"	"GO:0051169"	"nuclear transport"	"24/388"	"305/17913"	5.7711202767248e-08	2.76560826247013e-06	2.11093729669764e-06	"79711/7175/11260/11269/25929/4869/3843/2316/5905/10482/51068/9631/3728/3838/4000/5530/4928/3313/5936/23165/10155/7514/5976/1660"	24
+"332"	"Dn"	"GO:0046394"	"carboxylic acid biosynthetic process"	"29/388"	"426/17913"	5.80579655001138e-08	2.76560826247013e-06	2.11093729669764e-06	"440/26227/445/25902/220/11160/4790/29968/7175/3099/2618/2181/5214/493/2744/8644/9631/5208/1213/4928/471/6472/23165/4942/2023/3939/226/2597/5315"	29
+"333"	"Dn"	"GO:0072594"	"establishment of protein localization to organelle"	"30/388"	"452/17913"	5.97331877038304e-08	2.81232182573034e-06	2.14659288982186e-06	"51520/79711/7175/3099/3320/3843/2316/10953/3308/8540/6731/3728/3838/4000/5530/10574/10576/10531/3312/8239/10694/3009/10155/3309/3301/1736/7203/6950/10575/908"	30
+"334"	"Dn"	"GO:0016053"	"organic acid biosynthetic process"	"29/388"	"427/17913"	6.10678416755052e-08	2.84211139016231e-06	2.1693307097312e-06	"440/26227/445/25902/220/11160/4790/29968/7175/3099/2618/2181/5214/493/2744/8644/9631/5208/1213/4928/471/6472/23165/4942/2023/3939/226/2597/5315"	29
+"335"	"Dn"	"GO:0046390"	"ribose phosphate biosynthetic process"	"23/388"	"284/17913"	6.48257671645674e-08	2.98272194601515e-06	2.27665612912883e-06	"2539/1503/8833/7175/3099/2618/2181/5214/47/2180/790/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	23
+"336"	"Dn"	"GO:0002183"	"cytoplasmic translational initiation"	"8/388"	"27/17913"	6.98125948457149e-08	3.17608085989101e-06	2.42424338813742e-06	"1983/5936/1981/51386/8662/8663/728689/3646"	8
+"337"	"Dn"	"GO:0009895"	"negative regulation of catabolic process"	"23/388"	"288/17913"	8.37018217078436e-08	3.76565195661176e-06	2.8742520296401e-06	"3326/51520/302/2801/493/2316/6093/1956/10128/5317/8531/10135/3192/170506/1981/1736/10605/23367/7917/23450/10492/1660/26986"	23
+"338"	"Dn"	"GO:0106074"	"aminoacyl-tRNA metabolism involved in translational fidelity"	"6/388"	"13/17913"	1.49950511055894e-07	6.48798833905647e-06	4.95216070594944e-06	"51520/80222/3376/55699/16/7407"	6
+"339"	"Dn"	"GO:0009156"	"ribonucleoside monophosphate biosynthetic process"	"18/388"	"188/17913"	1.49955596618236e-07	6.48798833905647e-06	4.95216070594944e-06	"8833/7175/3099/2618/5214/790/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	18
+"340"	"Dn"	"GO:0007044"	"cell-substrate junction assembly"	"13/388"	"96/17913"	1.50238933759725e-07	6.48798833905647e-06	4.95216070594944e-06	"3909/3852/3655/3691/3918/7205/3673/5339/23603/6093/87/8826/7094"	13
+"341"	"Dn"	"GO:0009991"	"response to extracellular stimulus"	"31/388"	"498/17913"	1.50622599128503e-07	6.48798833905647e-06	4.95216070594944e-06	"440/3655/445/2539/1277/23394/51520/3934/3673/57707/2181/3157/2180/790/1956/5019/8644/7184/10985/1938/10135/3312/191/1981/10514/7706/3309/23367/23376/5111/5315"	31
+"342"	"Dn"	"GO:0030048"	"actin filament-based movement"	"15/388"	"132/17913"	1.78273954014836e-07	7.59822357690602e-06	5.79958259265994e-06	"857/1832/476/2316/81/6093/9631/4627/4430/3728/79784/4628/1739/1829/4641"	15
+"343"	"Dn"	"GO:0043489"	"RNA stabilization"	"9/388"	"41/17913"	1.81575387594368e-07	7.65832025384995e-06	5.84545326729237e-06	"8531/3192/170506/1736/10605/23367/10492/1660/26986"	9
+"344"	"Dn"	"GO:0009123"	"nucleoside monophosphate metabolic process"	"25/388"	"349/17913"	1.87163511230093e-07	7.81262945330565e-06	5.96323460631095e-06	"8833/4436/7175/3099/2618/5214/790/9631/5208/142/10845/4928/983/10111/3615/471/3312/1739/6472/23165/2023/3939/226/2597/5315"	25
+"345"	"Dn"	"GO:0009260"	"ribonucleotide biosynthetic process"	"22/388"	"279/17913"	2.00318120621822e-07	8.27640888160977e-06	6.31722880929828e-06	"1503/8833/7175/3099/2618/2181/5214/47/2180/790/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	22
+"346"	"Dn"	"GO:0009127"	"purine nucleoside monophosphate biosynthetic process"	"17/388"	"174/17913"	2.49004356048702e-07	1.00821863764119e-05	7.69554515114725e-06	"8833/7175/3099/2618/5214/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	17
+"347"	"Dn"	"GO:0009168"	"purine ribonucleoside monophosphate biosynthetic process"	"17/388"	"174/17913"	2.49004356048702e-07	1.00821863764119e-05	7.69554515114725e-06	"8833/7175/3099/2618/5214/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	17
+"348"	"Dn"	"GO:0006260"	"DNA replication"	"21/388"	"260/17913"	2.55073683870595e-07	1.02256766929905e-05	7.80506863829148e-06	"5984/4171/23560/4175/4172/4176/1956/4174/6240/25942/4928/983/10111/4173/4678/6749/3980/11198/5111/5976/1660"	21
+"349"	"Dn"	"GO:0009161"	"ribonucleoside monophosphate metabolic process"	"24/388"	"331/17913"	2.64753806123495e-07	1.05096878528826e-05	8.0218490689224e-06	"8833/4436/7175/3099/2618/5214/790/9631/5208/142/10845/4928/983/3615/471/3312/1739/6472/23165/2023/3939/226/2597/5315"	24
+"350"	"Dn"	"GO:0035966"	"response to topologically incorrect protein"	"17/388"	"175/17913"	2.70413644748852e-07	1.06301441513408e-05	8.11379111888226e-06	"440/3329/3326/10808/8452/3320/22824/3308/4000/7184/3312/201595/3309/3301/7917/10525/7094"	17
+"351"	"Dn"	"GO:0009124"	"nucleoside monophosphate biosynthetic process"	"18/388"	"196/17913"	2.80888013278894e-07	1.09357265939062e-05	8.34703650796388e-06	"8833/7175/3099/2618/5214/790/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	18
+"352"	"Dn"	"GO:0050657"	"nucleic acid transport"	"17/388"	"176/17913"	2.93484479934698e-07	1.12105533892037e-05	8.55680668409408e-06	"10644/7175/11260/55308/11269/10482/10128/51068/9631/9793/4928/3192/23165/4641/7514/5976/1660"	17
+"353"	"Dn"	"GO:0050658"	"RNA transport"	"17/388"	"176/17913"	2.93484479934698e-07	1.12105533892037e-05	8.55680668409408e-06	"10644/7175/11260/55308/11269/10482/10128/51068/9631/9793/4928/3192/23165/4641/7514/5976/1660"	17
+"354"	"Dn"	"GO:0051236"	"establishment of RNA localization"	"17/388"	"179/17913"	3.73848258435056e-07	1.41468373682574e-05	1.07980175776225e-05	"10644/7175/11260/55308/11269/10482/10128/51068/9631/9793/4928/3192/23165/4641/7514/5976/1660"	17
+"355"	"Dn"	"GO:0031667"	"response to nutrient levels"	"29/388"	"466/17913"	3.86762560358988e-07	1.4488262293072e-05	1.10586208660902e-05	"440/445/2539/1277/51520/3934/3673/57707/2181/3157/2180/790/1956/5019/8644/7184/10985/1938/10135/3312/191/1981/10514/7706/3309/23367/23376/5111/5315"	29
+"356"	"Dn"	"GO:0031330"	"negative regulation of cellular catabolic process"	"20/388"	"244/17913"	3.90027312903149e-07	1.4488262293072e-05	1.10586208660902e-05	"3326/51520/302/2801/493/6093/10128/5317/8531/10135/3192/170506/1981/1736/10605/23367/7917/10492/1660/26986"	20
+"357"	"Dn"	"GO:0006732"	"coenzyme metabolic process"	"25/388"	"366/17913"	4.57704436551638e-07	1.68476842145235e-05	1.28595236910585e-05	"80221/2539/25902/7175/3099/2618/2181/5214/47/2180/56922/9631/5208/4928/10135/471/6472/7086/23165/2023/3939/226/2597/5226/5315"	25
+"358"	"Dn"	"GO:0009167"	"purine ribonucleoside monophosphate metabolic process"	"23/388"	"317/17913"	4.66107557394709e-07	1.70024279269475e-05	1.2977636685736e-05	"8833/4436/7175/3099/2618/5214/9631/5208/142/10845/4928/983/3615/471/3312/1739/6472/23165/2023/3939/226/2597/5315"	23
+"359"	"Dn"	"GO:0009126"	"purine nucleoside monophosphate metabolic process"	"23/388"	"318/17913"	4.92599971067224e-07	1.78083685968856e-05	1.35927961941106e-05	"8833/4436/7175/3099/2618/5214/9631/5208/142/10845/4928/983/3615/471/3312/1739/6472/23165/2023/3939/226/2597/5315"	23
+"360"	"Dn"	"GO:0072524"	"pyridine-containing compound metabolic process"	"17/388"	"184/17913"	5.5317293829197e-07	1.98212143995061e-05	1.51291639201232e-05	"2539/29968/7175/3099/5214/9631/5208/4928/10135/7086/23165/2023/3939/226/2597/5226/5315"	17
+"361"	"Dn"	"GO:0006450"	"regulation of translational fidelity"	"6/388"	"16/17913"	6.62182870582946e-07	2.35191091490381e-05	1.79516981351018e-05	"51520/80222/3376/55699/16/7407"	6
+"362"	"Dn"	"GO:0051972"	"regulation of telomerase activity"	"9/388"	"48/17913"	7.6027340590302e-07	2.67682349608811e-05	2.04316953751146e-05	"3326/4931/3320/10576/1499/1736/7520/6950/10575"	9
+"363"	"Dn"	"GO:0043903"	"regulation of symbiosis, encompassing mutualism through parasitism"	"19/388"	"232/17913"	7.72995283514953e-07	2.69815336461383e-05	2.05945022903802e-05	"857/3853/140564/5430/302/7153/3838/6597/6829/5586/3312/7706/10155/103/23367/8878/1660/2597/26986"	19
+"364"	"Dn"	"GO:0043297"	"apical junction assembly"	"10/388"	"63/17913"	9.30675229180867e-07	3.22077265209686e-05	2.45835580105715e-05	"100506658/1365/81/6093/1495/5586/10015/1739/4641/7414"	10
+"365"	"Dn"	"GO:0060249"	"anatomical structure homeostasis"	"26/388"	"413/17913"	1.26562614836834e-06	4.34281379215542e-05	3.31478891312171e-05	"7037/55226/26354/5984/3326/3320/1956/5591/142/10574/10576/10111/3192/170506/10694/1499/1736/7203/7520/6950/10575/5111/2547/5976/226/908"	26
+"366"	"Dn"	"GO:0009152"	"purine ribonucleotide biosynthetic process"	"20/388"	"266/17913"	1.51914575472068e-06	5.15895194839767e-05	3.93773197293563e-05	"8833/7175/3099/2618/2181/5214/47/2180/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	20
+"367"	"Dn"	"GO:0034605"	"cellular response to heat"	"13/388"	"117/17913"	1.52895587504994e-06	5.15895194839767e-05	3.93773197293563e-05	"1410/3326/10808/7175/3320/9631/4928/3312/170506/488/23165/26509/2288"	13
+"368"	"Dn"	"GO:0009108"	"coenzyme biosynthetic process"	"19/388"	"245/17913"	1.75597500630071e-06	5.87598578554675e-05	4.4850305511082e-05	"25902/7175/3099/2618/2181/5214/47/2180/9631/5208/4928/10135/471/23165/2023/3939/226/2597/5315"	19
+"369"	"Dn"	"GO:0019362"	"pyridine nucleotide metabolic process"	"16/388"	"179/17913"	1.84857975038222e-06	6.08528407259967e-05	4.64478403690389e-05	"2539/7175/3099/5214/9631/5208/4928/10135/7086/23165/2023/3939/226/2597/5226/5315"	16
+"370"	"Dn"	"GO:0046496"	"nicotinamide nucleotide metabolic process"	"16/388"	"179/17913"	1.84857975038222e-06	6.08528407259967e-05	4.64478403690389e-05	"2539/7175/3099/5214/9631/5208/4928/10135/7086/23165/2023/3939/226/2597/5226/5315"	16
+"371"	"Dn"	"GO:0006399"	"tRNA metabolic process"	"15/388"	"160/17913"	2.13993614174965e-06	6.98758180479381e-05	5.33349109692442e-05	"55226/51520/8565/80222/3376/55699/5917/6897/7965/2058/2617/16/3735/10056/7407"	15
+"372"	"Dn"	"GO:0006986"	"response to unfolded protein"	"15/388"	"161/17913"	2.31395881567717e-06	7.49537539574149e-05	5.72108049080267e-05	"440/3329/3326/10808/3320/22824/3308/4000/7184/3312/201595/3309/3301/10525/7094"	15
+"373"	"Dn"	"GO:0006413"	"translational initiation"	"16/388"	"183/17913"	2.47181584076924e-06	7.94316058672591e-05	6.0628665902243e-05	"7175/4869/1983/9669/5936/1981/10605/23367/51386/8662/8663/728689/3646/8894/26986/1973"	16
+"374"	"Dn"	"GO:0086004"	"regulation of cardiac muscle cell contraction"	"8/388"	"42/17913"	2.79347298377231e-06	8.9061197726725e-05	6.7978754085002e-05	"857/1832/476/2316/3728/1739/1829/488"	8
+"375"	"Dn"	"GO:0072525"	"pyridine-containing compound biosynthetic process"	"14/388"	"145/17913"	3.30138015088066e-06	0.00010443193930403	7.97109549587633e-05	"29968/7175/3099/5214/9631/5208/4928/10135/23165/2023/3939/226/2597/5315"	14
+"376"	"Dn"	"GO:0006164"	"purine nucleotide biosynthetic process"	"20/388"	"280/17913"	3.33662018854475e-06	0.000104728489483858	7.99373061898604e-05	"8833/7175/3099/2618/2181/5214/47/2180/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	20
+"377"	"Dn"	"GO:1902373"	"negative regulation of mRNA catabolic process"	"8/388"	"43/17913"	3.36768547327704e-06	0.000104890449856144	8.0060927526651e-05	"5317/8531/3192/10605/23367/10492/1660/26986"	8
+"378"	"Dn"	"GO:0006090"	"pyruvate metabolic process"	"14/388"	"147/17913"	3.88108184271983e-06	0.00011995801817689	9.15617218981553e-05	"3945/7175/3099/5214/9631/5208/4928/682/23165/2023/3939/226/2597/5315"	14
+"379"	"Dn"	"GO:0051291"	"protein heterooligomerization"	"13/388"	"128/17913"	4.2194222237973e-06	0.000129427580182994	9.87896622732765e-05	"1277/6814/302/1365/3043/56922/3728/6240/1495/3710/10056/8878/2547"	13
+"380"	"Dn"	"GO:0006733"	"oxidoreduction coenzyme metabolic process"	"16/388"	"192/17913"	4.61269929647673e-06	0.000140427213920559	0.000107185477914172	"2539/7175/3099/5214/9631/5208/4928/10135/7086/23165/2023/3939/226/2597/5226/5315"	16
+"381"	"Dn"	"GO:0006096"	"glycolytic process"	"12/388"	"110/17913"	4.68798367852334e-06	0.000141654073987619	0.000108121917361701	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
+"382"	"Dn"	"GO:0006757"	"ATP generation from ADP"	"12/388"	"111/17913"	5.15513986269248e-06	0.000154616009659569	0.000118015521535011	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
+"383"	"Dn"	"GO:0006541"	"glutamine metabolic process"	"6/388"	"22/17913"	5.52576078339346e-06	0.000164513275087942	0.000125569919969375	"440/26227/1503/8833/2744/790"	6
+"384"	"Dn"	"GO:0003012"	"muscle system process"	"26/388"	"448/17913"	5.59218372698074e-06	0.000165275561390839	0.000126151758912143	"857/2539/1832/476/1410/3673/493/2316/6093/9631/142/3728/4000/5530/1938/79784/10848/1739/1829/488/2023/26509/10539/7094/226/7414"	26
+"385"	"Dn"	"GO:0072522"	"purine-containing compound biosynthetic process"	"20/388"	"291/17913"	5.96120626965193e-06	0.000174905247723338	0.000133501919204409	"8833/7175/3099/2618/2181/5214/47/2180/9631/5208/142/4928/3615/471/23165/2023/3939/226/2597/5315"	20
+"386"	"Dn"	"GO:0034109"	"homotypic cell-cell adhesion"	"10/388"	"77/17913"	6.1025896519684e-06	0.000177382497304851	0.000135392757688589	"1832/5962/6814/2316/3043/4627/3728/1829/7094/7414"	10
+"387"	"Dn"	"GO:1904377"	"positive regulation of protein localization to cell periphery"	"9/388"	"61/17913"	6.13325503153351e-06	0.000177382497304851	0.000135392757688589	"6711/3675/2181/3799/1956/3688/1739/8878/4926"	9
+"388"	"Dn"	"GO:0009135"	"purine nucleoside diphosphate metabolic process"	"13/388"	"133/17913"	6.4551430494689e-06	0.000184062494417603	0.000140491475116684	"7175/3099/5214/9631/5208/4928/1739/23165/2023/3939/226/2597/5315"	13
+"389"	"Dn"	"GO:0009179"	"purine ribonucleoside diphosphate metabolic process"	"13/388"	"133/17913"	6.4551430494689e-06	0.000184062494417603	0.000140491475116684	"7175/3099/5214/9631/5208/4928/1739/23165/2023/3939/226/2597/5315"	13
+"390"	"Dn"	"GO:0045815"	"positive regulation of gene expression, epigenetic"	"8/388"	"47/17913"	6.77118801141935e-06	0.000188249381900482	0.000143687248380969	"9188/9533/9031/7913/10514/1499/4641/8467"	8
+"391"	"Dn"	"GO:0070849"	"response to epidermal growth factor"	"8/388"	"47/17913"	6.77118801141935e-06	0.000188249381900482	0.000143687248380969	"1277/7175/790/4176/1956/4691/8826/1915"	8
+"392"	"Dn"	"GO:1903115"	"regulation of actin filament-based movement"	"8/388"	"47/17913"	6.77118801141935e-06	0.000188249381900482	0.000143687248380969	"857/1832/476/2316/3728/1739/1829/488"	8
+"393"	"Dn"	"GO:0042866"	"pyruvate biosynthetic process"	"12/388"	"114/17913"	6.81122498788055e-06	0.000188249381900482	0.000143687248380969	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
+"394"	"Dn"	"GO:0015931"	"nucleobase-containing compound transport"	"17/388"	"221/17913"	6.85728208779562e-06	0.000188249381900482	0.000143687248380969	"10644/7175/11260/55308/11269/10482/10128/51068/9631/9793/4928/3192/23165/4641/7514/5976/1660"	17
+"395"	"Dn"	"GO:0098901"	"regulation of cardiac muscle cell action potential"	"7/388"	"34/17913"	6.88093566838018e-06	0.000188249381900482	0.000143687248380969	"857/1832/2316/3728/1739/1829/488"	7
+"396"	"Dn"	"GO:0009185"	"ribonucleoside diphosphate metabolic process"	"13/388"	"135/17913"	7.60808327893472e-06	0.000206745833532931	0.000157805245545407	"7175/3099/5214/9631/5208/4928/1739/23165/2023/3939/226/2597/5315"	13
+"397"	"Dn"	"GO:1900034"	"regulation of cellular response to heat"	"10/388"	"79/17913"	7.71244591402337e-06	0.000208184623372538	0.000158903447042615	"1410/3326/10808/7175/3320/9631/4928/3312/23165/2288"	10
+"398"	"Dn"	"GO:0001732"	"formation of cytoplasmic translation initiation complex"	"5/388"	"14/17913"	7.91828767567541e-06	0.000212325475488806	0.000162064082368651	"51386/8662/8663/728689/3646"	5
+"399"	"Dn"	"GO:0007339"	"binding of sperm to zona pellucida"	"7/388"	"35/17913"	8.44218141138908e-06	0.000223414330292251	0.000170527998788017	"10574/10576/10694/7203/6950/10575/226"	7
+"400"	"Dn"	"GO:1901998"	"toxin transport"	"7/388"	"35/17913"	8.44218141138908e-06	0.000223414330292251	0.000170527998788017	"10574/10576/10694/3309/7203/6950/10575"	7
+"401"	"Dn"	"GO:0045727"	"positive regulation of translation"	"12/388"	"117/17913"	8.91702611700349e-06	0.000233587261779696	0.000178292807992926	"55226/3673/4869/8531/1938/170506/10605/23367/8663/1660/3646/26986"	12
+"402"	"Dn"	"GO:0002244"	"hematopoietic progenitor cell differentiation"	"14/388"	"158/17913"	8.99965740618241e-06	0.000233587261779696	0.000178292807992926	"54443/5713/5591/7153/5707/1938/25942/3313/170506/5708/5701/103/5700/7520"	14
+"403"	"Dn"	"GO:0009408"	"response to heat"	"14/388"	"158/17913"	8.99965740618241e-06	0.000233587261779696	0.000178292807992926	"1410/3326/10808/7175/3320/9631/4928/3312/170506/488/23165/3301/26509/2288"	14
+"404"	"Dn"	"GO:0006007"	"glucose catabolic process"	"7/388"	"36/17913"	1.02862878006518e-05	0.000263602400663538	0.000201202804681636	"3099/5214/5208/2023/226/2597/5315"	7
+"405"	"Dn"	"GO:0048255"	"mRNA stabilization"	"7/388"	"36/17913"	1.02862878006518e-05	0.000263602400663538	0.000201202804681636	"8531/3192/10605/23367/10492/1660/26986"	7
+"406"	"Dn"	"GO:0043588"	"skin development"	"24/388"	"412/17913"	1.20910539629021e-05	0.000307903632048998	0.000235017109798614	"3852/3655/3691/6699/3853/1832/1277/3892/1830/3673/301/3675/6093/1956/1718/8644/5317/10999/3728/5493/2317/1829/1499/4926"	24
+"407"	"Dn"	"GO:1904951"	"positive regulation of establishment of protein localization"	"25/388"	"440/17913"	1.21874821055385e-05	0.000308419469033284	0.000235410838564875	"6711/7175/2181/3843/2316/3799/1956/5019/5208/3728/4628/10574/10576/3735/170506/10694/10155/4641/1736/7203/6950/10575/1660/908/2597"	25
+"408"	"Dn"	"GO:0046031"	"ADP metabolic process"	"12/388"	"121/17913"	1.26000508835779e-05	0.000316879540544144	0.000241868253639653	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
+"409"	"Dn"	"GO:1901607"	"alpha-amino acid biosynthetic process"	"8/388"	"51/17913"	1.27138006565112e-05	0.000317766536161815	0.000242545280880552	"440/26227/445/29968/493/2744/6472/4942"	8
+"410"	"Dn"	"GO:0019359"	"nicotinamide nucleotide biosynthetic process"	"13/388"	"142/17913"	1.32021105717262e-05	0.000325947229908044	0.000248789452109037	"7175/3099/5214/9631/5208/4928/10135/23165/2023/3939/226/2597/5315"	13
+"411"	"Dn"	"GO:0019363"	"pyridine nucleotide biosynthetic process"	"13/388"	"142/17913"	1.32021105717262e-05	0.000325947229908044	0.000248789452109037	"7175/3099/5214/9631/5208/4928/10135/23165/2023/3939/226/2597/5315"	13
+"412"	"Dn"	"GO:0009150"	"purine ribonucleotide metabolic process"	"27/388"	"500/17913"	1.36814908972862e-05	0.000335735494806739	0.000256260652468468	"80221/8833/4436/7175/3099/2618/2181/5214/47/2180/9631/5208/142/10845/4928/983/3615/471/3312/1739/6472/23165/2023/3939/226/2597/5315"	27
+"413"	"Dn"	"GO:0009201"	"ribonucleoside triphosphate biosynthetic process"	"14/388"	"164/17913"	1.37921823629808e-05	0.000336412930046442	0.000256777726174456	"1503/7175/3099/5214/9631/5208/142/4928/23165/2023/3939/226/2597/5315"	14
+"414"	"Dn"	"GO:0048524"	"positive regulation of viral process"	"11/388"	"103/17913"	1.43230816657112e-05	0.000347270405176434	0.000265065034796899	"5430/7153/3838/6597/6829/5586/3312/103/23367/1660/26986"	11
+"415"	"Dn"	"GO:0043331"	"response to dsRNA"	"7/388"	"38/17913"	1.49819040983757e-05	0.000361081724370971	0.000275606957599192	"857/9188/6520/4790/4869/170506/1660"	7
+"416"	"Dn"	"GO:0051188"	"cofactor biosynthetic process"	"20/388"	"310/17913"	1.5134897019354e-05	0.000361221917358426	0.000275713964296406	"25902/29968/7175/3099/2618/2181/5214/47/2180/9631/5208/4928/10135/471/23165/2023/3939/226/2597/5315"	20
+"417"	"Dn"	"GO:0009064"	"glutamine family amino acid metabolic process"	"9/388"	"68/17913"	1.5251832145365e-05	0.000361221917358426	0.000275713964296406	"440/26227/445/1503/8833/493/2744/790/4942"	9
+"418"	"Dn"	"GO:0034404"	"nucleobase-containing small molecule biosynthetic process"	"16/388"	"211/17913"	1.52553588215092e-05	0.000361221917358426	0.000275713964296406	"1503/8833/7175/3099/5214/790/9631/5208/4928/3615/23165/2023/3939/226/2597/5315"	16
+"419"	"Dn"	"GO:0051131"	"chaperone-mediated protein complex assembly"	"5/388"	"16/17913"	1.66686911914853e-05	0.000392392619967	0.000299505981261939	"3329/3326/3320/3308/10576"	5
+"420"	"Dn"	"GO:0006446"	"regulation of translational initiation"	"9/388"	"69/17913"	1.72086934750637e-05	0.000400448275175477	0.000305654712902523	"7175/4869/1983/9669/5936/1981/23367/8662/3646"	9
+"421"	"Dn"	"GO:1903312"	"negative regulation of mRNA metabolic process"	"9/388"	"69/17913"	1.72086934750637e-05	0.000400448275175477	0.000305654712902523	"5317/8531/6829/3192/10605/23367/10492/1660/26986"	9
+"422"	"Dn"	"GO:0051028"	"mRNA transport"	"13/388"	"146/17913"	1.78075955340498e-05	0.000412016881813529	0.000314484814965234	"10644/7175/55308/11269/10482/10128/9631/4928/23165/4641/7514/5976/1660"	13
+"423"	"Dn"	"GO:0007051"	"spindle organization"	"13/388"	"147/17913"	1.91586752205222e-05	0.000440594413761034	0.000336297513044779	"6905/7175/9493/2801/29127/2316/4627/1213/1778/9793/3192/1739/4926"	13
+"424"	"Dn"	"GO:0007584"	"response to nutrient"	"16/388"	"215/17913"	1.92603633577928e-05	0.000440594413761034	0.000336297513044779	"445/1277/3673/2181/3157/2180/1956/5019/8644/7184/1938/191/7706/23376/5111/5315"	16
+"425"	"Dn"	"GO:1903078"	"positive regulation of protein localization to plasma membrane"	"8/388"	"54/17913"	1.96309408387926e-05	0.000446548760990289	0.000340842355426938	"6711/3675/2181/3799/1956/3688/1739/8878"	8
+"426"	"Dn"	"GO:0006735"	"NADH regeneration"	"6/388"	"27/17913"	2.00017179535776e-05	0.000447441745823401	0.000341523954124477	"3099/5214/2023/226/2597/5315"	6
+"427"	"Dn"	"GO:0061621"	"canonical glycolysis"	"6/388"	"27/17913"	2.00017179535776e-05	0.000447441745823401	0.000341523954124477	"3099/5214/2023/226/2597/5315"	6
+"428"	"Dn"	"GO:0061718"	"glucose catabolic process to pyruvate"	"6/388"	"27/17913"	2.00017179535776e-05	0.000447441745823401	0.000341523954124477	"3099/5214/2023/226/2597/5315"	6
+"429"	"Dn"	"GO:0006936"	"muscle contraction"	"21/388"	"343/17913"	2.04115747433126e-05	0.000454101462283916	0.000346607191708304	"857/1832/476/1410/3673/493/2316/6093/9631/3728/1938/79784/10848/1739/1829/488/2023/26509/7094/226/7414"	21
+"430"	"Dn"	"GO:0006323"	"DNA packaging"	"15/388"	"194/17913"	2.23455450215036e-05	0.000494410446951192	0.000377374289232871	"23397/10592/10051/79711/7175/4171/4869/64151/8607/7153/26155/983/3009/4678/8467"	15
+"431"	"Dn"	"GO:0007163"	"establishment or maintenance of cell polarity"	"14/388"	"172/17913"	2.36172424444143e-05	0.000519707688355616	0.000396683202613274	"3326/9181/2319/3320/3993/6093/6624/4627/4000/9793/1495/10015/1739/4926"	14
+"432"	"Dn"	"GO:0006754"	"ATP biosynthetic process"	"13/388"	"150/17913"	2.3766171160142e-05	0.000520157983931972	0.000397026904843111	"7175/3099/5214/9631/5208/142/4928/23165/2023/3939/226/2597/5315"	13
+"433"	"Dn"	"GO:0006165"	"nucleoside diphosphate phosphorylation"	"12/388"	"129/17913"	2.41168978745954e-05	0.000523400489186941	0.000399501848735323	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
+"434"	"Dn"	"GO:0009266"	"response to temperature stimulus"	"16/388"	"219/17913"	2.41728553909503e-05	0.000523400489186941	0.000399501848735323	"1410/3329/3326/10808/7175/3320/9631/8531/4928/3312/170506/488/23165/3301/26509/2288"	16
+"435"	"Dn"	"GO:0061615"	"glycolytic process through fructose-6-phosphate"	"6/388"	"28/17913"	2.49947167019262e-05	0.000535468825005815	0.000408713384777807	"3099/5214/2023/226/2597/5315"	6
+"436"	"Dn"	"GO:0061620"	"glycolytic process through glucose-6-phosphate"	"6/388"	"28/17913"	2.49947167019262e-05	0.000535468825005815	0.000408713384777807	"3099/5214/2023/226/2597/5315"	6
+"437"	"Dn"	"GO:0086002"	"cardiac muscle cell action potential involved in contraction"	"8/388"	"56/17913"	2.58090958043034e-05	0.000550005415324339	0.000419808893525954	"857/1832/476/2316/9631/3728/1739/1829"	8
+"438"	"Dn"	"GO:0046939"	"nucleotide phosphorylation"	"12/388"	"131/17913"	2.81368708310145e-05	0.000596472198925539	0.000455276124330993	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
+"439"	"Dn"	"GO:0009142"	"nucleoside triphosphate biosynthetic process"	"14/388"	"175/17913"	2.86478707608665e-05	0.000604141816201814	0.000461130200405175	"1503/7175/3099/5214/9631/5208/142/4928/23165/2023/3939/226/2597/5315"	14
+"440"	"Dn"	"GO:0009132"	"nucleoside diphosphate metabolic process"	"13/388"	"153/17913"	2.93159687198937e-05	0.00061490854178263	0.000469348241586305	"7175/3099/5214/9631/5208/4928/1739/23165/2023/3939/226/2597/5315"	13
+"441"	"Dn"	"GO:0032507"	"maintenance of protein location in cell"	"8/388"	"57/17913"	2.9462152903391e-05	0.00061490854178263	0.000469348241586305	"857/3099/5905/3728/2317/3192/3309/7094"	8
+"442"	"Dn"	"GO:0032481"	"positive regulation of type I interferon production"	"9/388"	"74/17913"	3.05140448993297e-05	0.000630364121415234	0.000481145197768163	"3329/4790/5591/9533/170506/1499/7520/2547/1660"	9
+"443"	"Dn"	"GO:0086001"	"cardiac muscle cell action potential"	"9/388"	"74/17913"	3.05140448993297e-05	0.000630364121415234	0.000481145197768163	"857/1832/476/2316/9631/3728/1739/1829/488"	9
+"444"	"Dn"	"GO:0062012"	"regulation of small molecule metabolic process"	"24/388"	"439/17913"	3.39326734976836e-05	0.000697428400975233	0.000532334113754737	"857/11160/1717/4790/7175/2222/5713/493/3157/8644/9631/5208/142/1213/5707/6713/4928/983/5708/6472/5701/23165/2023/5700"	24
+"445"	"Dn"	"GO:0071364"	"cellular response to epidermal growth factor stimulus"	"7/388"	"43/17913"	3.48526655681898e-05	0.000710711382520325	0.00054247276626579	"1277/790/4176/1956/4691/8826/1915"	7
+"446"	"Dn"	"GO:1990778"	"protein localization to cell periphery"	"18/388"	"276/17913"	3.49299987951456e-05	0.000710711382520325	0.00054247276626579	"857/6711/5962/3675/2803/2319/2181/2316/3799/6093/1956/1213/3728/3688/1739/682/8878/4926"	18
+"447"	"Dn"	"GO:0034332"	"adherens junction organization"	"12/388"	"134/17913"	3.52565555967537e-05	0.000713768968056279	0.00054480656437931	"1832/7205/3673/5962/23603/6093/3728/87/1495/1499/8826/7414"	12
+"448"	"Dn"	"GO:0090257"	"regulation of muscle system process"	"17/388"	"251/17913"	3.57550227600574e-05	0.000720259140076977	0.000549760391848801	"857/2539/1832/476/3673/493/2316/6093/142/3728/4000/5530/1739/1829/488/2023/10539"	17
+"449"	"Dn"	"GO:0006270"	"DNA replication initiation"	"6/388"	"30/17913"	3.79776888784157e-05	0.000761245852815372	0.000581044786592123	"4171/4175/4172/4176/4174/4173"	6
+"450"	"Dn"	"GO:0007052"	"mitotic spindle organization"	"10/388"	"95/17913"	3.97976850630228e-05	0.000793797176454086	0.000605890605885585	"6905/7175/9493/2801/29127/2316/1213/1778/3192/4926"	10
+"451"	"Dn"	"GO:0044539"	"long-chain fatty acid import"	"4/388"	"10/17913"	4.10463469886189e-05	0.000810715409545942	0.000618803978221233	"2181/2180/10999/2058"	4
+"452"	"Dn"	"GO:2000767"	"positive regulation of cytoplasmic translation"	"4/388"	"10/17913"	4.10463469886189e-05	0.000810715409545942	0.000618803978221233	"8531/1938/170506/1660"	4
+"453"	"Dn"	"GO:0098911"	"regulation of ventricular cardiac muscle cell action potential"	"5/388"	"19/17913"	4.20562415322678e-05	0.000826629718272584	0.00063095107377996	"857/1832/3728/1739/1829"	5
+"454"	"Dn"	"GO:0009206"	"purine ribonucleoside triphosphate biosynthetic process"	"13/388"	"159/17913"	4.38975563096458e-05	0.000855163179196138	0.000652730133267437	"7175/3099/5214/9631/5208/142/4928/23165/2023/3939/226/2597/5315"	13
+"455"	"Dn"	"GO:1902850"	"microtubule cytoskeleton organization involved in mitosis"	"11/388"	"116/17913"	4.39303386694978e-05	0.000855163179196138	0.000652730133267437	"6905/7175/9493/9181/2801/29127/2316/1213/1778/3192/4926"	11
+"456"	"Dn"	"GO:0035690"	"cellular response to drug"	"21/388"	"362/17913"	4.49950529624349e-05	0.000871698418396646	0.000665351173496394	"7037/445/3326/4790/3934/9181/493/790/1956/3728/5530/7184/25942/1495/983/1499/3309/10131/23367/5111/9343"	21
+"457"	"Dn"	"GO:0030866"	"cortical actin cytoskeleton organization"	"6/388"	"31/17913"	4.62386144555929e-05	0.000891524523479503	0.000680484070384064	"9493/29127/6093/10015/1739/7094"	6
+"458"	"Dn"	"GO:0009145"	"purine nucleoside triphosphate biosynthetic process"	"13/388"	"160/17913"	4.68598872486257e-05	0.00089497963900795	0.000683121295739648	"7175/3099/5214/9631/5208/142/4928/23165/2023/3939/226/2597/5315"	13
+"459"	"Dn"	"GO:0046661"	"male sex differentiation"	"13/388"	"160/17913"	4.68598872486257e-05	0.00089497963900795	0.000683121295739648	"4436/3157/2316/1718/8644/6240/8531/7812/1495/4678/1499/8894/2288"	13
+"460"	"Dn"	"GO:0060968"	"regulation of gene silencing"	"12/388"	"139/17913"	5.06137916548024e-05	0.000962137288311244	0.000734381479112923	"7175/5430/1956/9631/5530/25942/4928/1981/23165/10155/103/1660"	12
+"461"	"Dn"	"GO:0017038"	"protein import"	"12/388"	"140/17913"	5.42975785995164e-05	0.00102256230581136	0.00078050276997885	"79711/7175/3320/3843/2316/3308/3728/3838/4000/5530/3312/10155"	12
+"462"	"Dn"	"GO:0034250"	"positive regulation of cellular amide metabolic process"	"12/388"	"140/17913"	5.42975785995164e-05	0.00102256230581136	0.00078050276997885	"55226/3673/4869/8531/1938/170506/10605/23367/8663/1660/3646/26986"	12
+"463"	"Dn"	"GO:0006360"	"transcription by RNA polymerase I"	"8/388"	"62/17913"	5.48653120943775e-05	0.00102847059569507	0.000785012457646649	"84135/2316/55127/9533/284119/25926/6597/4691"	8
+"464"	"Dn"	"GO:0006356"	"regulation of transcription by RNA polymerase I"	"6/388"	"32/17913"	5.58777705593212e-05	0.00103783987612244	0.000792163854959764	"84135/2316/55127/25926/6597/4691"	6
+"465"	"Dn"	"GO:0030261"	"chromosome condensation"	"6/388"	"32/17913"	5.58777705593212e-05	0.00103783987612244	0.000792163854959764	"23397/10592/10051/64151/7153/983"	6
+"466"	"Dn"	"GO:0046034"	"ATP metabolic process"	"18/388"	"287/17913"	5.81254825930323e-05	0.00106977308645085	0.000816537879871497	"4436/7175/3099/5214/9631/5208/142/10845/4928/983/3312/6472/23165/2023/3939/226/2597/5315"	18
+"467"	"Dn"	"GO:0048511"	"rhythmic process"	"18/388"	"287/17913"	5.81254825930323e-05	0.00106977308645085	0.000816537879871497	"445/23394/7150/1956/5591/7153/25942/983/3615/10135/3192/8239/5936/191/10514/3309/5111/1660"	18
+"468"	"Dn"	"GO:0044843"	"cell cycle G1/S phase transition"	"18/388"	"288/17913"	6.07931757557624e-05	0.00111380800287367	0.00085014891173574	"5962/4171/8452/4175/493/4172/4176/1956/5591/4174/3688/5530/983/4173/4678/1981/3276/5111"	18
+"469"	"Dn"	"GO:0072659"	"protein localization to plasma membrane"	"16/388"	"237/17913"	6.27897874807737e-05	0.00114520652932276	0.000874114822397115	"6711/5962/3675/2803/2319/2181/2316/3799/6093/1956/1213/3728/3688/1739/682/8878"	16
+"470"	"Dn"	"GO:0051260"	"protein homooligomerization"	"20/388"	"345/17913"	6.87730752763583e-05	0.00124870933539899	0.000953116587261686	"857/10938/220/1410/9043/3934/6510/2801/25814/2744/1365/9361/3710/3615/10015/6472/3276/81502/226/5315"	20
+"471"	"Dn"	"GO:0006405"	"RNA export from nucleus"	"11/388"	"122/17913"	6.9864952487206e-05	0.00126287139562811	0.000963926224165587	"7175/11260/11269/10482/51068/9631/4928/23165/7514/5976/1660"	11
+"472"	"Dn"	"GO:0009199"	"ribonucleoside triphosphate metabolic process"	"19/388"	"319/17913"	7.28407917629695e-05	0.00131081051488117	0.00100051726136177	"1503/4436/7175/3099/5214/9631/5208/142/10845/4928/983/3312/6472/23165/2023/3939/226/2597/5315"	19
+"473"	"Dn"	"GO:0035036"	"sperm-egg recognition"	"7/388"	"49/17913"	8.30993626427407e-05	0.00148880229796662	0.00113637507554302	"10574/10576/10694/7203/6950/10575/226"	7
+"474"	"Dn"	"GO:0000082"	"G1/S transition of mitotic cell cycle"	"17/388"	"269/17913"	8.46518133473877e-05	0.00150993476759283	0.00115250509616476	"5962/4171/8452/4175/4172/4176/1956/5591/4174/3688/5530/983/4173/4678/1981/3276/5111"	17
+"475"	"Dn"	"GO:0006941"	"striated muscle contraction"	"13/388"	"170/17913"	8.74637936163769e-05	0.00155324956295048	0.00118556647302716	"857/1832/476/2316/9631/3728/1938/79784/10848/1739/1829/488/226"	13
+"476"	"Dn"	"GO:0045943"	"positive regulation of transcription by RNA polymerase I"	"5/388"	"22/17913"	9.02784501990575e-05	0.00159623338365059	0.00121837522309553	"84135/55127/25926/6597/4691"	5
+"477"	"Dn"	"GO:0045185"	"maintenance of protein location"	"9/388"	"85/17913"	9.22272622712953e-05	0.00162360080407163	0.00123926426557677	"857/3099/2316/5905/3728/2317/3192/3309/7094"	9
+"478"	"Dn"	"GO:0007015"	"actin filament organization"	"19/388"	"325/17913"	9.31765312857845e-05	0.00163139667540159	0.00124521470901953	"6711/5962/9181/8452/6709/2316/81/1729/6093/6624/4430/23191/6712/7184/87/1495/1739/4641/226"	19
+"479"	"Dn"	"GO:0000460"	"maturation of 5.8S rRNA"	"4/388"	"12/17913"	9.34759270667251e-05	0.00163139667540159	0.00124521470901953	"23481/27340/23246/23517"	4
+"480"	"Dn"	"GO:0030865"	"cortical cytoskeleton organization"	"6/388"	"35/17913"	9.47482914303378e-05	0.00163946936752751	0.00125137644462201	"9493/29127/6093/10015/1739/7094"	6
+"481"	"Dn"	"GO:0045070"	"positive regulation of viral genome replication"	"6/388"	"35/17913"	9.47482914303378e-05	0.00163946936752751	0.00125137644462201	"7153/5586/3312/103/23367/26986"	6
+"482"	"Dn"	"GO:0006397"	"mRNA processing"	"25/388"	"499/17913"	9.57658400673656e-05	0.00165002504865006	0.00125943339949736	"5430/8449/25929/22984/23517/51202/9128/988/24148/23020/27339/284695/4928/6829/3312/3192/170506/10594/5936/103/23450/10492/1660/9343/26986"	25
+"483"	"Dn"	"GO:0001649"	"osteoblast differentiation"	"15/388"	"222/17913"	0.000104907629563451	0.00179987708517971	0.00137381266903788	"9188/1277/23560/3376/1213/23020/3192/26156/5701/10514/1499/103/23376/10492/1660"	15
+"484"	"Dn"	"GO:0086003"	"cardiac muscle cell contraction"	"8/388"	"68/17913"	0.000107147070115037	0.00183054213880077	0.0013972187335454	"857/1832/476/2316/9631/3728/1739/1829"	8
+"485"	"Dn"	"GO:0002478"	"antigen processing and presentation of exogenous peptide antigen"	"13/388"	"174/17913"	0.00011071950042644	0.00187637832019212	0.0014322046374242	"9493/161/5713/29127/1213/6712/5707/1778/3831/5708/5701/821/5700"	13
+"486"	"Dn"	"GO:0007059"	"chromosome segregation"	"17/388"	"275/17913"	0.000110756833422059	0.00187637832019212	0.0014322046374242	"23397/10592/10051/7175/9493/8452/29127/64151/7153/23047/1778/4288/3192/8239/1499/7917/4926"	17
+"487"	"Dn"	"GO:0006734"	"NADH metabolic process"	"6/388"	"36/17913"	0.000111640692156275	0.00188347151058649	0.00143761873759133	"3099/5214/2023/226/2597/5315"	6
+"488"	"Dn"	"GO:0009988"	"cell-cell recognition"	"8/388"	"69/17913"	0.000118942267051427	0.00199832879373953	0.00152528716341117	"10574/10576/10694/1739/7203/6950/10575/226"	8
+"489"	"Dn"	"GO:0048193"	"Golgi vesicle transport"	"18/388"	"304/17913"	0.000120939505990151	0.00202348785022364	0.00154449060281462	"6711/375056/9493/2803/8452/2181/2801/6709/29127/10067/4430/8774/9950/6712/1778/3831/10525/1314"	18
+"490"	"Dn"	"GO:1901605"	"alpha-amino acid metabolic process"	"14/388"	"200/17913"	0.000122181676561747	0.00203585847077578	0.00155393286716608	"440/26227/445/1503/8833/29968/2618/493/2744/790/56922/6472/191/4942"	14
+"491"	"Dn"	"GO:0019884"	"antigen processing and presentation of exogenous antigen"	"13/388"	"176/17913"	0.000124226863609073	0.00205303906429852	0.001567046494334	"9493/161/5713/29127/1213/6712/5707/1778/3831/5708/5701/821/5700"	13
+"492"	"Dn"	"GO:0051168"	"nuclear export"	"13/388"	"176/17913"	0.000124226863609073	0.00205303906429852	0.001567046494334	"7175/11260/11269/5905/10482/51068/9631/4928/3313/23165/7514/5976/1660"	13
+"493"	"Dn"	"GO:0007623"	"circadian rhythm"	"14/388"	"201/17913"	0.000128796656891827	0.00211990920225613	0.00161808722565	"445/7150/1956/5591/7153/25942/983/3615/10135/3192/8239/5936/191/10514"	14
+"494"	"Dn"	"GO:0034976"	"response to endoplasmic reticulum stress"	"16/388"	"254/17913"	0.000141271748237535	0.00231582716037967	0.00176762775548861	"440/857/11160/4000/7184/1938/488/201595/81502/7706/3309/7917/23376/10961/10525/7094"	16
+"495"	"Dn"	"GO:0000070"	"mitotic sister chromatid segregation"	"11/388"	"132/17913"	0.000142155312993326	0.00232091476737894	0.00177151103119018	"23397/10592/10051/7175/9493/8452/29127/64151/23047/3192/4926"	11
+"496"	"Dn"	"GO:0009141"	"nucleoside triphosphate metabolic process"	"19/388"	"337/17913"	0.000149412283843492	0.00242959974812169	0.00185446825349606	"1503/4436/7175/3099/5214/9631/5208/142/10845/4928/983/3312/6472/23165/2023/3939/226/2597/5315"	19
+"497"	"Dn"	"GO:0050792"	"regulation of viral process"	"14/388"	"204/17913"	0.000150537871950899	0.00243811137411676	0.0018609650191488	"140564/5430/7153/3838/6597/6829/5586/3312/7706/10155/103/23367/1660/26986"	14
+"498"	"Dn"	"GO:0070830"	"bicellular tight junction assembly"	"7/388"	"54/17913"	0.000156138882758658	0.00251311944049232	0.00191821727971441	"100506658/1365/81/6093/10015/1739/4641"	7
+"499"	"Dn"	"GO:0090068"	"positive regulation of cell cycle process"	"17/388"	"283/17913"	0.000156410496172898	0.00251311944049232	0.00191821727971441	"7175/9493/5962/8452/4869/29127/1956/1778/25942/5586/983/3192/1981/10514/3276/5111/4926"	17
+"500"	"Dn"	"GO:0006695"	"cholesterol biosynthetic process"	"8/388"	"72/17913"	0.000160929281170536	0.00254654036321676	0.00194372684779983	"2539/11160/1717/2222/3157/47/1718/6713"	8
+"501"	"Dn"	"GO:0051651"	"maintenance of location in cell"	"8/388"	"72/17913"	0.000160929281170536	0.00254654036321676	0.00194372684779983	"857/3099/5905/3728/2317/3192/3309/7094"	8
+"502"	"Dn"	"GO:1902653"	"secondary alcohol biosynthetic process"	"8/388"	"72/17913"	0.000160929281170536	0.00254654036321676	0.00194372684779983	"2539/11160/1717/2222/3157/47/1718/6713"	8
+"503"	"Dn"	"GO:0070268"	"cornification"	"10/388"	"112/17913"	0.000161006256602492	0.00254654036321676	0.00194372684779983	"3852/6699/3853/1832/3892/1830/5317/3728/5493/1829"	10
+"504"	"Dn"	"GO:0000819"	"sister chromatid segregation"	"12/388"	"157/17913"	0.000163182314660403	0.00257091514420222	0.00196233166431678	"23397/10592/10051/7175/9493/8452/29127/64151/23047/3192/1499/4926"	12
+"505"	"Dn"	"GO:0051099"	"positive regulation of binding"	"13/388"	"181/17913"	0.000164371034323597	0.00257465640296073	0.00196518729747246	"857/3326/4931/3673/302/51068/142/1981/1499/10155/8663/1660/3646"	13
+"506"	"Dn"	"GO:0051098"	"regulation of binding"	"20/388"	"368/17913"	0.00016469153083893	0.00257465640296073	0.00196518729747246	"857/3326/23394/4931/3673/23560/302/2801/6093/51068/142/5530/25942/1981/1499/10155/3309/8663/1660/3646"	20
+"507"	"Dn"	"GO:0097305"	"response to alcohol"	"15/388"	"232/17913"	0.00017072251960961	0.00265867493038197	0.00202931707519764	"2539/3157/1365/790/5019/8644/142/3728/1938/1495/983/1981/1499/23367/7284"	15
+"508"	"Dn"	"GO:1904375"	"regulation of protein localization to cell periphery"	"10/388"	"113/17913"	0.000173295693028947	0.0026698379437611	0.00203783759547714	"6711/3675/2181/3799/1956/1213/3688/1739/8878/4926"	10
+"509"	"Dn"	"GO:0090263"	"positive regulation of canonical Wnt signaling pathway"	"11/388"	"135/17913"	0.000173509476490713	0.0026698379437611	0.00203783759547714	"857/1277/4790/5713/1956/8607/3728/5707/5708/5701/5700"	11
+"510"	"Dn"	"GO:0009435"	"NAD biosynthetic process"	"7/388"	"55/17913"	0.000175621590662851	0.0026698379437611	0.00203783759547714	"3099/5214/10135/2023/226/2597/5315"	7
+"511"	"Dn"	"GO:0019320"	"hexose catabolic process"	"7/388"	"55/17913"	0.000175621590662851	0.0026698379437611	0.00203783759547714	"3099/5214/5208/2023/226/2597/5315"	7
+"512"	"Dn"	"GO:0098900"	"regulation of action potential"	"7/388"	"55/17913"	0.000175621590662851	0.0026698379437611	0.00203783759547714	"857/1832/2316/3728/1739/1829/488"	7
+"513"	"Dn"	"GO:0120192"	"tight junction assembly"	"7/388"	"55/17913"	0.000175621590662851	0.0026698379437611	0.00203783759547714	"100506658/1365/81/6093/10015/1739/4641"	7
+"514"	"Dn"	"GO:0008652"	"cellular amino acid biosynthetic process"	"8/388"	"73/17913"	0.0001773737729987	0.0026698379437611	0.00203783759547714	"440/26227/445/29968/493/2744/6472/4942"	8
+"515"	"Dn"	"GO:0044766"	"multi-organism transport"	"8/388"	"73/17913"	0.0001773737729987	0.0026698379437611	0.00203783759547714	"857/7175/9631/3838/4928/23165/6950/7514"	8
+"516"	"Dn"	"GO:1902579"	"multi-organism localization"	"8/388"	"73/17913"	0.0001773737729987	0.0026698379437611	0.00203783759547714	"857/7175/9631/3838/4928/23165/6950/7514"	8
+"517"	"Dn"	"GO:0009205"	"purine ribonucleoside triphosphate metabolic process"	"18/388"	"314/17913"	0.000180925760017743	0.00271321630485867	0.00207094749088535	"4436/7175/3099/5214/9631/5208/142/10845/4928/983/3312/6472/23165/2023/3939/226/2597/5315"	18
+"518"	"Dn"	"GO:1903076"	"regulation of protein localization to plasma membrane"	"9/388"	"93/17913"	0.00018511318951704	0.0027657686507546	0.00211105971808907	"6711/3675/2181/3799/1956/1213/3688/1739/8878"	9
+"519"	"Dn"	"GO:0000226"	"microtubule cytoskeleton organization"	"23/388"	"460/17913"	0.000186835504492095	0.00278123881503123	0.00212286780645817	"1410/6905/7175/9493/9181/2801/4869/29127/2316/4627/1213/4000/1778/9793/983/3192/10015/1739/1499/7514/4926/2288/2597"	23
+"520"	"Dn"	"GO:0000377"	"RNA splicing, via transesterification reactions with bulged adenosine as nucleophile"	"19/388"	"344/17913"	0.000194483454334971	0.00287395440365802	0.00219363588907981	"5430/8449/25929/23517/9128/988/24148/23020/27339/4928/3312/3192/10594/5936/23450/10492/1660/9343/26986"	19
+"521"	"Dn"	"GO:0000398"	"mRNA splicing, via spliceosome"	"19/388"	"344/17913"	0.000194483454334971	0.00287395440365802	0.00219363588907981	"5430/8449/25929/23517/9128/988/24148/23020/27339/4928/3312/3192/10594/5936/23450/10492/1660/9343/26986"	19
+"522"	"Dn"	"GO:0086065"	"cell communication involved in cardiac conduction"	"7/388"	"56/17913"	0.000197023375642644	0.00290090053809842	0.00221420337181552	"857/1832/476/2316/9631/3728/1829"	7
+"523"	"Dn"	"GO:0007229"	"integrin-mediated signaling pathway"	"9/388"	"94/17913"	0.000200870164562017	0.00292562336802736	0.00223307384761106	"3655/3673/3675/8452/2316/4627/3688/1495/7094"	9
+"524"	"Dn"	"GO:1990823"	"response to leukemia inhibitory factor"	"9/388"	"94/17913"	0.000200870164562017	0.00292562336802736	0.00223307384761106	"7037/3099/5214/4691/9774/3192/7706/7520/8467"	9
+"525"	"Dn"	"GO:1990830"	"cellular response to leukemia inhibitory factor"	"9/388"	"94/17913"	0.000200870164562017	0.00292562336802736	0.00223307384761106	"7037/3099/5214/4691/9774/3192/7706/7520/8467"	9
+"526"	"Dn"	"GO:2000765"	"regulation of cytoplasmic translation"	"5/388"	"26/17913"	0.000209993504384793	0.00304754014069544	0.00232613065034428	"8531/1938/16/170506/1660"	5
+"527"	"Dn"	"GO:1901987"	"regulation of cell cycle phase transition"	"23/388"	"464/17913"	0.000211718146920102	0.00305953353136486	0.00233528498214952	"54443/7277/7175/5962/8452/5713/3320/4869/493/1956/5591/5707/1778/25942/9793/983/5708/1981/5701/3276/5700/5111/10383"	23
+"528"	"Dn"	"GO:0051701"	"interaction with host"	"14/388"	"211/17913"	0.000213966171325141	0.00305953353136486	0.00233528498214952	"857/7037/3853/3673/6510/1956/3838/3688/983/1499/7706/10155/6950/2597"	14
+"529"	"Dn"	"GO:0016126"	"sterol biosynthetic process"	"8/388"	"75/17913"	0.000214417144339912	0.00305953353136486	0.00233528498214952	"2539/11160/1717/2222/3157/47/1718/6713"	8
+"530"	"Dn"	"GO:0031100"	"animal organ regeneration"	"8/388"	"75/17913"	0.000214417144339912	0.00305953353136486	0.00233528498214952	"306/790/1956/983/471/3482/5111/5315"	8
+"531"	"Dn"	"GO:0071426"	"ribonucleoprotein complex export from nucleus"	"10/388"	"116/17913"	0.000215000797850494	0.00305953353136486	0.00233528498214952	"7175/11260/11269/10482/51068/9631/4928/23165/7514/5976"	10
+"532"	"Dn"	"GO:0140014"	"mitotic nuclear division"	"15/388"	"237/17913"	0.000215353681511234	0.00305953353136486	0.00233528498214952	"23397/10592/54443/10051/7175/9493/8452/2801/29127/2316/64151/23047/4288/3192/4926"	15
+"533"	"Dn"	"GO:0000375"	"RNA splicing, via transesterification reactions"	"19/388"	"348/17913"	0.000225262648819096	0.00318912050723259	0.00243419630818133	"5430/8449/25929/23517/9128/988/24148/23020/27339/4928/3312/3192/10594/5936/23450/10492/1660/9343/26986"	19
+"534"	"Dn"	"GO:0071496"	"cellular response to external stimulus"	"18/388"	"320/17913"	0.000228255364753365	0.00322022986719992	0.00245794150345088	"440/3655/476/1277/23394/51520/4790/3934/3673/1956/8644/7184/10985/10135/3312/1981/10514/3309"	18
+"535"	"Dn"	"GO:0060147"	"regulation of posttranscriptional gene silencing"	"10/388"	"117/17913"	0.000230649115814793	0.00322033886184172	0.0024580246970317	"7175/5430/1956/9631/5530/4928/1981/23165/103/1660"	10
+"536"	"Dn"	"GO:0060966"	"regulation of gene silencing by RNA"	"10/388"	"117/17913"	0.000230649115814793	0.00322033886184172	0.0024580246970317	"7175/5430/1956/9631/5530/4928/1981/23165/103/1660"	10
+"537"	"Dn"	"GO:0071166"	"ribonucleoprotein complex localization"	"10/388"	"117/17913"	0.000230649115814793	0.00322033886184172	0.0024580246970317	"7175/11260/11269/10482/51068/9631/4928/23165/7514/5976"	10
+"538"	"Dn"	"GO:0006611"	"protein export from nucleus"	"12/388"	"163/17913"	0.000231673894193026	0.0032235312631875	0.00246046139754286	"7175/11260/11269/5905/10482/51068/9631/4928/3313/23165/7514/5976"	12
+"539"	"Dn"	"GO:0009144"	"purine nucleoside triphosphate metabolic process"	"18/388"	"321/17913"	0.000237114146232046	0.00328792869210122	0.00250961475608251	"4436/7175/3099/5214/9631/5208/142/10845/4928/983/3312/6472/23165/2023/3939/226/2597/5315"	18
+"540"	"Dn"	"GO:0048002"	"antigen processing and presentation of peptide antigen"	"13/388"	"188/17913"	0.000239011234117177	0.00329244273140124	0.00251306023823791	"9493/161/5713/29127/1213/6712/5707/1778/3831/5708/5701/821/5700"	13
+"541"	"Dn"	"GO:0071356"	"cellular response to tumor necrosis factor"	"16/388"	"266/17913"	0.000239065982472701	0.00329244273140124	0.00251306023823791	"445/100506658/1277/4790/3934/9181/5713/81/8531/5707/3735/10594/5708/5701/5700/1660"	16
+"542"	"Dn"	"GO:0007076"	"mitotic chromosome condensation"	"4/388"	"15/17913"	0.00024480832883169	0.00333747112269196	0.00254742957097233	"23397/10592/10051/64151"	4
+"543"	"Dn"	"GO:0046931"	"pore complex assembly"	"4/388"	"15/17913"	0.00024480832883169	0.00333747112269196	0.00254742957097233	"4928/10694/23165/7203"	4
+"544"	"Dn"	"GO:0071474"	"cellular hyperosmotic response"	"4/388"	"15/17913"	0.00024480832883169	0.00333747112269196	0.00254742957097233	"9181/8531/7520/2547"	4
+"545"	"Dn"	"GO:0030433"	"ubiquitin-dependent ERAD pathway"	"7/388"	"58/17913"	0.000246140918261676	0.00334437777866284	0.0025527012928869	"857/11160/7184/201595/7706/3309/7917"	7
+"546"	"Dn"	"GO:0043254"	"regulation of protein complex assembly"	"21/388"	"409/17913"	0.000247649844606895	0.00335362615656628	0.00255976040755446	"6711/1410/5962/9181/3320/6709/6624/23191/142/6712/56926/9774/3312/170506/1739/1981/1499/4641/55832/4926/2288"	21
+"547"	"Dn"	"GO:0002026"	"regulation of the force of heart contraction"	"5/388"	"27/17913"	0.000253173455846433	0.00340564559043923	0.00259946587293278	"857/476/493/488/10539"	5
+"548"	"Dn"	"GO:0042273"	"ribosomal large subunit biogenesis"	"5/388"	"27/17913"	0.000253173455846433	0.00340564559043923	0.00259946587293278	"23481/23246/4931/23560/4839"	5
+"549"	"Dn"	"GO:0008380"	"RNA splicing"	"22/388"	"440/17913"	0.000256823087808256	0.00344330027329679	0.00262820699130373	"79026/5430/8449/25929/23517/51202/9128/988/24148/23020/27339/284695/4928/3312/3192/10594/5936/23450/10492/1660/9343/26986"	22
+"550"	"Dn"	"GO:0010639"	"negative regulation of organelle organization"	"19/388"	"352/17913"	0.000260227096553206	0.00347742413842881	0.00265425310224149	"55226/6711/7175/5962/9181/4171/6709/4869/7153/142/6712/4000/26155/25942/10111/3192/3980/7520/2288"	19
+"551"	"Dn"	"GO:0120193"	"tight junction organization"	"7/388"	"59/17913"	0.000274149838708593	0.00362862451886302	0.00276966153758091	"100506658/1365/81/6093/10015/1739/4641"	7
+"552"	"Dn"	"GO:1903902"	"positive regulation of viral life cycle"	"7/388"	"59/17913"	0.000274149838708593	0.00362862451886302	0.00276966153758091	"7153/3838/5586/3312/103/23367/26986"	7
+"553"	"Dn"	"GO:0051262"	"protein tetramerization"	"12/388"	"166/17913"	0.000274230452648082	0.00362862451886302	0.00276966153758091	"220/302/2801/2744/6240/3615/6472/81502/10056/2547/226/5315"	12
+"554"	"Dn"	"GO:0016925"	"protein sumoylation"	"8/388"	"78/17913"	0.000281683752186176	0.00371510590424048	0.00283567116893061	"26354/7175/5905/9631/4928/1499/23165/10155"	8
+"555"	"Dn"	"GO:0046794"	"transport of virus"	"7/388"	"60/17913"	0.000304664212265991	0.00400514738787337	0.00305705443340037	"857/7175/9631/3838/4928/23165/7514"	7
+"556"	"Dn"	"GO:0036503"	"ERAD pathway"	"8/388"	"79/17913"	0.000307601095242931	0.00403066936776254	0.00307653488548201	"857/11160/7184/201595/81502/7706/3309/7917"	8
+"557"	"Dn"	"GO:0009166"	"nucleotide catabolic process"	"12/388"	"169/17913"	0.000323251474631049	0.00422208135735844	0.00322263609343552	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
+"558"	"Dn"	"GO:0098813"	"nuclear chromosome segregation"	"14/388"	"220/17913"	0.00032833068759345	0.00427463329281633	0.00326274800735951	"23397/10592/10051/7175/9493/8452/29127/64151/23047/1778/3192/1499/7917/4926"	14
+"559"	"Dn"	"GO:0070482"	"response to oxygen levels"	"20/388"	"389/17913"	0.00034015743628121	0.00441327287435913	0.00336856901876185	"857/1410/1277/3673/3099/5713/1365/81/9361/4000/7184/5707/10135/5708/191/5701/2023/5700/10525/5315"	20
+"560"	"Dn"	"GO:0030177"	"positive regulation of Wnt signaling pathway"	"12/388"	"170/17913"	0.000341159399771402	0.00441327287435913	0.00336856901876185	"857/1277/4790/5713/1956/8607/3728/5707/6597/5708/5701/5700"	12
+"561"	"Dn"	"GO:0001508"	"action potential"	"10/388"	"123/17913"	0.000345970402141168	0.00444709256593521	0.00339438295968745	"857/1832/476/2316/9631/3728/79784/1739/1829/488"	10
+"562"	"Dn"	"GO:0032479"	"regulation of type I interferon production"	"10/388"	"123/17913"	0.000345970402141168	0.00444709256593521	0.00339438295968745	"3329/4790/5591/9533/170506/1499/7706/7520/2547/1660"	10
+"563"	"Dn"	"GO:0055117"	"regulation of cardiac muscle contraction"	"8/388"	"81/17913"	0.000365282236498675	0.00468046764425042	0.00357251381199237	"857/1832/476/2316/3728/1739/1829/488"	8
+"564"	"Dn"	"GO:0008360"	"regulation of cell shape"	"10/388"	"124/17913"	0.000369212049939251	0.00471589776089598	0.00359955696039064	"301/5962/1729/23654/4627/23191/79784/4628/1739/226"	10
+"565"	"Dn"	"GO:0046365"	"monosaccharide catabolic process"	"7/388"	"62/17913"	0.000373861171354771	0.00476026378243858	0.0036334207186283	"3099/5214/5208/2023/226/2597/5315"	7
+"566"	"Dn"	"GO:0032606"	"type I interferon production"	"10/388"	"125/17913"	0.000393740095310103	0.00496481186377929	0.00378954846084309	"3329/4790/5591/9533/170506/1499/7706/7520/2547/1660"	10
+"567"	"Dn"	"GO:0051170"	"import into nucleus"	"10/388"	"125/17913"	0.000393740095310103	0.00496481186377929	0.00378954846084309	"79711/7175/25929/3843/2316/3728/3838/4000/5530/10155"	10
+"568"	"Dn"	"GO:2001251"	"negative regulation of chromosome organization"	"10/388"	"125/17913"	0.000393740095310103	0.00496481186377929	0.00378954846084309	"55226/7175/4171/7153/142/26155/25942/10111/3192/7520"	10
+"569"	"Dn"	"GO:0017148"	"negative regulation of translation"	"13/388"	"198/17913"	0.000394830679213863	0.00496481186377929	0.00378954846084309	"10644/7175/6093/2058/4691/170506/5936/1981/23367/5976/10492/3646/2597"	13
+"570"	"Dn"	"GO:0006606"	"protein import into nucleus"	"9/388"	"103/17913"	0.000399696343672547	0.00501043497068156	0.00382437172893139	"79711/7175/3843/2316/3728/3838/4000/5530/10155"	9
+"571"	"Dn"	"GO:0036293"	"response to decreased oxygen levels"	"19/388"	"365/17913"	0.000408724866172363	0.00510779933065401	0.00389868813217043	"857/1410/3673/3099/5713/1365/81/9361/4000/7184/5707/10135/5708/191/5701/2023/5700/10525/5315"	19
+"572"	"Dn"	"GO:0009303"	"rRNA transcription"	"5/388"	"30/17913"	0.00042369604944411	0.00527860093599755	0.00402905781754788	"284119/25926/6597/4691/84365"	5
+"573"	"Dn"	"GO:1901292"	"nucleoside phosphate catabolic process"	"12/388"	"175/17913"	0.00044382472226018	0.00551241196451371	0.00420752142252466	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
+"574"	"Dn"	"GO:1901990"	"regulation of mitotic cell cycle phase transition"	"21/388"	"428/17913"	0.000452494520117713	0.00557648438440143	0.00425642670772578	"54443/7277/7175/5962/8452/5713/3320/1956/5591/5707/1778/25942/9793/983/5708/1981/5701/3276/5700/5111/10383"	21
+"575"	"Dn"	"GO:0071214"	"cellular response to abiotic stimulus"	"17/388"	"310/17913"	0.000453115179666108	0.00557648438440143	0.00425642670772578	"476/1410/1277/4790/3673/9181/4869/1956/142/8531/26155/10135/170506/3309/7520/5111/2547"	17
+"576"	"Dn"	"GO:0104004"	"cellular response to environmental stimulus"	"17/388"	"310/17913"	0.000453115179666108	0.00557648438440143	0.00425642670772578	"476/1410/1277/4790/3673/9181/4869/1956/142/8531/26155/10135/170506/3309/7520/5111/2547"	17
+"577"	"Dn"	"GO:1902749"	"regulation of cell cycle G2/M phase transition"	"13/388"	"202/17913"	0.000477801863204622	0.00586248407307732	0.00447472494535493	"7277/5713/3320/4869/5707/1778/25942/9793/983/5708/5701/5700/10383"	13
+"578"	"Dn"	"GO:0034612"	"response to tumor necrosis factor"	"16/388"	"284/17913"	0.000493926158906728	0.00602653283467477	0.00459994031082531	"445/100506658/1277/4790/3934/9181/5713/81/8531/5707/3735/10594/5708/5701/5700/1660"	16
+"579"	"Dn"	"GO:0043200"	"response to amino acid"	"9/388"	"106/17913"	0.000494148901237842	0.00602653283467477	0.00459994031082531	"440/445/1277/51520/57707/3843/1956/23376/5111"	9
+"580"	"Dn"	"GO:0043330"	"response to exogenous dsRNA"	"5/388"	"31/17913"	0.000496284017711133	0.00603439635949663	0.00460594239291888	"857/9188/6520/170506/1660"	5
+"581"	"Dn"	"GO:0032388"	"positive regulation of intracellular transport"	"13/388"	"203/17913"	0.000500711909865261	0.00607000755402527	0.004633123754694	"10938/7175/5962/302/3843/2316/3799/3728/1778/10155/4641/4926/1660"	13
+"582"	"Dn"	"GO:0006333"	"chromatin assembly or disassembly"	"12/388"	"178/17913"	0.00051710679991377	0.0062500460682115	0.00477054380061847	"79711/7175/4171/4869/8607/9031/26155/6597/3009/4678/11198/8467"	12
+"583"	"Dn"	"GO:0045947"	"negative regulation of translational initiation"	"4/388"	"18/17913"	0.000521269532693891	0.00628160814844513	0.00479463454883855	"7175/5936/23367/3646"	4
+"584"	"Dn"	"GO:0045787"	"positive regulation of cell cycle"	"19/388"	"373/17913"	0.000532850165560517	0.00640210777553274	0.00488660967073459	"440/3326/7175/9493/5962/8452/4869/29127/1956/1778/25942/5586/983/3192/1981/10514/3276/5111/4926"	19
+"585"	"Dn"	"GO:0001889"	"liver development"	"10/388"	"130/17913"	0.000537655194645485	0.00642172826878929	0.00490158562794331	"440/445/3673/8452/3157/790/1956/3482/5111/5315"	10
+"586"	"Dn"	"GO:0006261"	"DNA-dependent DNA replication"	"10/388"	"130/17913"	0.000537655194645485	0.00642172826878929	0.00490158562794331	"5984/4171/4175/4172/4176/4174/4173/3980/5111/5976"	10
+"587"	"Dn"	"GO:0045931"	"positive regulation of mitotic cell cycle"	"11/388"	"154/17913"	0.000540740256451825	0.00643958028933364	0.00491521174285622	"440/7175/5962/8452/1956/25942/5586/983/3192/1981/4926"	11
+"588"	"Dn"	"GO:0043902"	"positive regulation of multi-organism process"	"12/388"	"180/17913"	0.000571414935173204	0.00678492396632346	0.00517880614190006	"5430/7153/3838/6597/6829/5586/3312/103/23367/1660/2597/26986"	12
+"589"	"Dn"	"GO:0006338"	"chromatin remodeling"	"11/388"	"156/17913"	0.000602662397293887	0.00713440287385224	0.00544555688542465	"7175/86/7150/4869/8607/1108/9031/6597/4678/1499/8467"	11
+"590"	"Dn"	"GO:0072330"	"monocarboxylic acid biosynthetic process"	"17/388"	"318/17913"	0.000604371495611588	0.00713440287385224	0.00544555688542465	"440/220/11160/7175/3099/2181/5214/8644/9631/5208/4928/23165/2023/3939/226/2597/5315"	17
+"591"	"Dn"	"GO:1901657"	"glycosyl compound metabolic process"	"10/388"	"132/17913"	0.000606271408601723	0.00713602596926854	0.00544679576393715	"1503/8833/9582/140564/790/8644/3615/471/1739/191"	10
+"592"	"Dn"	"GO:0043900"	"regulation of multi-organism process"	"20/388"	"408/17913"	0.000621993930822151	0.00729986500260548	0.005571851047731	"857/3853/140564/5430/302/7153/3838/25942/6597/6829/5586/3312/7706/10155/103/23367/8878/1660/2597/26986"	20
+"593"	"Dn"	"GO:0061008"	"hepaticobiliary system development"	"10/388"	"133/17913"	0.000643202271644411	0.00752695375112203	0.00574518366153937	"440/445/3673/8452/3157/790/1956/3482/5111/5315"	10
+"594"	"Dn"	"GO:1903578"	"regulation of ATP metabolic process"	"9/388"	"110/17913"	0.000647860746932355	0.00755184741988836	0.00576418453543883	"7175/9631/5208/142/4928/983/6472/23165/2023"	9
+"595"	"Dn"	"GO:0046653"	"tetrahydrofolate metabolic process"	"4/388"	"19/17913"	0.000649059743670326	0.00755184741988836	0.00576418453543883	"25902/2618/471/6472"	4
+"596"	"Dn"	"GO:0051493"	"regulation of cytoskeleton organization"	"22/388"	"472/17913"	0.000664213742712486	0.00769599814795274	0.00587421210237466	"6711/7175/5962/9181/6709/4869/2316/1729/6093/6624/23191/1213/6712/1778/3192/10015/1739/1499/4641/7514/4926/2288"	22
+"597"	"Dn"	"GO:0006409"	"tRNA export from nucleus"	"5/388"	"33/17913"	0.000669051950624688	0.00769599814795274	0.00587421210237466	"7175/11260/9631/4928/23165"	5
+"598"	"Dn"	"GO:0051031"	"tRNA transport"	"5/388"	"33/17913"	0.000669051950624688	0.00769599814795274	0.00587421210237466	"7175/11260/9631/4928/23165"	5
+"599"	"Dn"	"GO:0071431"	"tRNA-containing ribonucleoprotein complex export from nucleus"	"5/388"	"33/17913"	0.000669051950624688	0.00769599814795274	0.00587421210237466	"7175/11260/9631/4928/23165"	5
+"600"	"Dn"	"GO:0030260"	"entry into host cell"	"10/388"	"134/17913"	0.000681971469938506	0.00775646764545227	0.00592036734399602	"857/7037/3853/3673/6510/1956/3688/983/1499/7706"	10
+"601"	"Dn"	"GO:0044409"	"entry into host"	"10/388"	"134/17913"	0.000681971469938506	0.00775646764545227	0.00592036734399602	"857/7037/3853/3673/6510/1956/3688/983/1499/7706"	10
+"602"	"Dn"	"GO:0051806"	"entry into cell of other organism involved in symbiotic interaction"	"10/388"	"134/17913"	0.000681971469938506	0.00775646764545227	0.00592036734399602	"857/7037/3853/3673/6510/1956/3688/983/1499/7706"	10
+"603"	"Dn"	"GO:0051828"	"entry into other organism involved in symbiotic interaction"	"10/388"	"134/17913"	0.000681971469938506	0.00775646764545227	0.00592036734399602	"857/7037/3853/3673/6510/1956/3688/983/1499/7706"	10
+"604"	"Dn"	"GO:0009119"	"ribonucleoside metabolic process"	"8/388"	"89/17913"	0.000690534097157769	0.00780997921617823	0.00596121172965366	"1503/8833/9582/140564/790/3615/1739/191"	8
+"605"	"Dn"	"GO:0051289"	"protein homotetramerization"	"8/388"	"89/17913"	0.000690534097157769	0.00780997921617823	0.00596121172965366	"220/2801/2744/3615/6472/81502/226/5315"	8
+"606"	"Dn"	"GO:0031589"	"cell-substrate adhesion"	"17/388"	"322/17913"	0.000695031742083796	0.00783895131949106	0.00598332559671023	"3655/3691/7205/1277/3673/3675/23603/2316/81/6093/2049/3728/3688/87/1499/8826/7414"	17
+"607"	"Dn"	"GO:0010498"	"proteasomal protein catabolic process"	"19/388"	"382/17913"	0.000710315997653862	0.00798908187361247	0.0060979174535431	"857/11160/3326/8452/5713/7184/27339/5707/983/5708/5701/1499/201595/81502/7706/3309/5700/7917/23376"	19
+"608"	"Dn"	"GO:0031503"	"protein-containing complex localization"	"14/388"	"238/17913"	0.00071917441374188	0.00806630803667832	0.00615686274601592	"7175/11260/11269/10482/51068/9631/4928/3192/1739/1742/23165/7514/5976/2288"	14
+"609"	"Dn"	"GO:0010389"	"regulation of G2/M transition of mitotic cell cycle"	"12/388"	"185/17913"	0.000728509468167239	0.00812599128542466	0.00620241785860233	"7277/5713/3320/5707/1778/25942/9793/983/5708/5701/5700/10383"	12
+"610"	"Dn"	"GO:0016052"	"carbohydrate catabolic process"	"12/388"	"185/17913"	0.000728509468167239	0.00812599128542466	0.00620241785860233	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
+"611"	"Dn"	"GO:0034333"	"adherens junction assembly"	"8/388"	"90/17913"	0.000743866240212747	0.00825182029211345	0.00629846079672567	"7205/3673/23603/6093/87/1499/8826/7414"	8
+"612"	"Dn"	"GO:0051225"	"spindle assembly"	"8/388"	"90/17913"	0.000743866240212747	0.00825182029211345	0.00629846079672567	"7175/9493/2801/29127/2316/1778/3192/4926"	8
+"613"	"Dn"	"GO:0001666"	"response to hypoxia"	"18/388"	"354/17913"	0.000756560895960699	0.00834690754153916	0.00637103912387957	"857/1410/3673/3099/5713/1365/81/9361/4000/7184/5707/5708/191/5701/2023/5700/10525/5315"	18
+"614"	"Dn"	"GO:0042176"	"regulation of protein catabolic process"	"18/388"	"354/17913"	0.000756560895960699	0.00834690754153916	0.00637103912387957	"857/3326/4898/5962/3320/302/2316/6093/1956/5707/5708/5701/5700/7917/23376/7514/23450/1915"	18
+"615"	"Dn"	"GO:0032781"	"positive regulation of ATPase activity"	"6/388"	"51/17913"	0.000785611339313615	0.00863686148855277	0.0065923555732776	"23397/29128/10598/3192/3301/1660"	6
+"616"	"Dn"	"GO:0060964"	"regulation of gene silencing by miRNA"	"9/388"	"113/17913"	0.000787108394486533	0.00863686148855277	0.0065923555732776	"7175/5430/1956/9631/5530/4928/1981/23165/1660"	9
+"617"	"Dn"	"GO:0008584"	"male gonad development"	"10/388"	"137/17913"	0.000810011588730854	0.00886415384532765	0.00676584359747877	"4436/3157/2316/8644/6240/8531/7812/1495/4678/8894"	10
+"618"	"Dn"	"GO:0007160"	"cell-matrix adhesion"	"13/388"	"214/17913"	0.000820533507607921	0.00895509480405518	0.00683525713813834	"3655/3691/7205/3673/3675/23603/6093/3728/3688/87/1499/8826/7414"	13
+"619"	"Dn"	"GO:0000280"	"nuclear division"	"18/388"	"357/17913"	0.000833528858602547	0.00907246867871428	0.0069248464314009	"23397/10592/54443/10051/7175/9493/8452/2801/29127/2316/64151/7153/23047/4288/10111/3192/7917/4926"	18
+"620"	"Dn"	"GO:0009116"	"nucleoside metabolic process"	"9/388"	"114/17913"	0.000838600678942837	0.00910320147195589	0.00694830420029962	"1503/8833/9582/140564/790/3615/471/1739/191"	9
+"621"	"Dn"	"GO:0043161"	"proteasome-mediated ubiquitin-dependent protein catabolic process"	"17/388"	"328/17913"	0.000852776968804786	0.00920255976674058	0.00702414253685779	"857/11160/3326/8452/5713/7184/5707/983/5708/5701/1499/201595/7706/3309/5700/7917/23376"	17
+"622"	"Dn"	"GO:0019674"	"NAD metabolic process"	"7/388"	"71/17913"	0.000856106505430838	0.00920255976674058	0.00702414253685779	"3099/5214/10135/2023/226/2597/5315"	7
+"623"	"Dn"	"GO:1903313"	"positive regulation of mRNA metabolic process"	"7/388"	"71/17913"	0.000856106505430838	0.00920255976674058	0.00702414253685779	"6093/27339/4928/3312/170506/5976/26986"	7
+"624"	"Dn"	"GO:0046546"	"development of primary male sexual characteristics"	"10/388"	"138/17913"	0.000856844907893603	0.00920255976674058	0.00702414253685779	"4436/3157/2316/8644/6240/8531/7812/1495/4678/8894"	10
+"625"	"Dn"	"GO:2001242"	"regulation of intrinsic apoptotic signaling pathway"	"11/388"	"163/17913"	0.000867856060924374	0.00929616188011321	0.00709558728731262	"857/9181/142/8531/26155/9774/2023/3301/10131/10961/10525"	11
+"626"	"Dn"	"GO:0090307"	"mitotic spindle assembly"	"6/388"	"52/17913"	0.000872115973523584	0.00931714400210289	0.00711160255038257	"7175/9493/2801/29127/2316/3192"	6
+"627"	"Dn"	"GO:0061077"	"chaperone-mediated protein folding"	"5/388"	"35/17913"	0.000883266150903722	0.00941143327633992	0.00718357179793165	"10808/10576/10131/9601/2288"	5
+"628"	"Dn"	"GO:0043620"	"regulation of DNA-templated transcription in response to stress"	"9/388"	"115/17913"	0.00089279998092614	0.0094632123632721	0.00722309381096486	"5713/10985/5707/25942/9774/5708/5701/3309/5700"	9
+"629"	"Dn"	"GO:0070252"	"actin-mediated cell contraction"	"9/388"	"115/17913"	0.00089279998092614	0.0094632123632721	0.00722309381096486	"857/1832/476/2316/6093/9631/3728/1739/1829"	9
+"630"	"Dn"	"GO:0008544"	"epidermis development"	"21/388"	"452/17913"	0.00091135382859773	0.00963465183287783	0.0073539503662579	"3909/3852/6699/3853/1832/3918/3892/1830/301/2319/6093/1956/8644/5317/3728/5493/2317/1829/1499/488/4926"	21
+"631"	"Dn"	"GO:0006310"	"DNA recombination"	"14/388"	"244/17913"	0.00091606614487166	0.00965924953277435	0.00737272533262937	"7037/3329/4436/2956/86/5591/8607/142/3838/6832/10111/3980/7520/2547"	14
+"632"	"Dn"	"GO:0051983"	"regulation of chromosome segregation"	"8/388"	"93/17913"	0.000924032387678846	0.00971794061743285	0.00741752314483962	"7175/8452/29127/1778/4288/3192/1499/4926"	8
+"633"	"Dn"	"GO:0034249"	"negative regulation of cellular amide metabolic process"	"13/388"	"217/17913"	0.000932832405099269	0.00978507359649466	0.00746876449787688	"10644/7175/6093/2058/4691/170506/5936/1981/23367/5976/10492/3646/2597"	13
+"634"	"Dn"	"GO:1901654"	"response to ketone"	"12/388"	"191/17913"	0.000963226476644387	0.0100777881238582	0.00769218804685957	"857/445/790/1956/8644/142/988/25942/4678/1829/23367/5111"	12
+"635"	"Dn"	"GO:0051156"	"glucose 6-phosphate metabolic process"	"4/388"	"21/17913"	0.000968504116800292	0.0100809078892658	0.00769456930571142	"2539/3099/7086/5226"	4
+"636"	"Dn"	"GO:2000144"	"positive regulation of DNA-templated transcription, initiation"	"4/388"	"21/17913"	0.000968504116800292	0.0100809078892658	0.00769456930571142	"9774/170506/1499/55832"	4
+"637"	"Dn"	"GO:0032205"	"negative regulation of telomere maintenance"	"5/388"	"36/17913"	0.00100772187005654	0.0104150871545177	0.00794964211713457	"55226/142/10111/3192/7520"	5
+"638"	"Dn"	"GO:0097064"	"ncRNA export from nucleus"	"5/388"	"36/17913"	0.00100772187005654	0.0104150871545177	0.00794964211713457	"7175/11260/9631/4928/23165"	5
+"639"	"Dn"	"GO:0051053"	"negative regulation of DNA metabolic process"	"10/388"	"141/17913"	0.00101086943154714	0.0104150871545177	0.00794964211713457	"55226/4436/2956/23560/142/10111/3192/3980/10155/7520"	10
+"640"	"Dn"	"GO:0006283"	"transcription-coupled nucleotide-excision repair"	"7/388"	"73/17913"	0.00101089880259952	0.0104150871545177	0.00794964211713457	"5984/5430/27339/6917/3980/5111/2873"	7
+"641"	"Dn"	"GO:0035637"	"multicellular organismal signaling"	"12/388"	"193/17913"	0.00105423709012427	0.0107814700038329	0.00822929532470745	"857/1832/476/3673/493/2316/9631/3728/79784/3710/1829/488"	12
+"642"	"Dn"	"GO:0048285"	"organelle fission"	"19/388"	"395/17913"	0.00105542050210055	0.0107814700038329	0.00822929532470745	"23397/10592/54443/10051/7175/9493/8452/2801/29127/2316/64151/7153/23047/64423/4288/10111/3192/7917/4926"	19
+"643"	"Dn"	"GO:0048608"	"reproductive structure development"	"20/388"	"426/17913"	0.00105672429126994	0.0107814700038329	0.00822929532470745	"5268/4436/3326/3157/2316/1956/1718/8644/6240/8531/7812/1495/4678/1739/682/1499/10155/3309/8894/2288"	20
+"644"	"Dn"	"GO:0019882"	"antigen processing and presentation"	"13/388"	"220/17913"	0.00105773761189487	0.0107814700038329	0.00822929532470745	"9493/161/5713/29127/1213/6712/5707/1778/3831/5708/5701/821/5700"	13
+"645"	"Dn"	"GO:0045069"	"regulation of viral genome replication"	"8/388"	"95/17913"	0.00106243678229917	0.0107814700038329	0.00822929532470745	"140564/7153/5586/3312/10155/103/23367/26986"	8
+"646"	"Dn"	"GO:0050810"	"regulation of steroid biosynthetic process"	"8/388"	"95/17913"	0.00106243678229917	0.0107814700038329	0.00822929532470745	"476/11160/1717/4790/2222/3157/8644/6713"	8
+"647"	"Dn"	"GO:0001778"	"plasma membrane repair"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"4627/4628/26509"	3
+"648"	"Dn"	"GO:0006563"	"L-serine metabolic process"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"26227/29968/6472"	3
+"649"	"Dn"	"GO:0007016"	"cytoskeletal anchoring at plasma membrane"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"3728/2317/7094"	3
+"650"	"Dn"	"GO:0051231"	"spindle elongation"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"9493/29127/4926"	3
+"651"	"Dn"	"GO:0061635"	"regulation of protein complex stability"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"56926/3312/8878"	3
+"652"	"Dn"	"GO:1901838"	"positive regulation of transcription of nucleolar large rRNA by RNA polymerase I"	"3/388"	"10/17913"	0.00108049944230827	0.0108023265232251	0.0082452147176532	"25926/6597/4691"	3
+"653"	"Dn"	"GO:0097193"	"intrinsic apoptotic signaling pathway"	"15/388"	"277/17913"	0.00109576362726118	0.0109279480955185	0.00834109932496456	"857/2956/9181/8452/142/8531/26155/9774/10514/2023/3301/10131/7917/10961/10525"	15
+"654"	"Dn"	"GO:2000377"	"regulation of reactive oxygen species metabolic process"	"12/388"	"194/17913"	0.00110235550713108	0.0109666767773311	0.00837066020674214	"857/445/2539/1410/3326/3099/3320/493/3043/1956/8644/10131"	12
+"655"	"Dn"	"GO:0006942"	"regulation of striated muscle contraction"	"8/388"	"96/17913"	0.00113759089809882	0.0112618717515945	0.00859597703466259	"857/1832/476/2316/3728/1739/1829/488"	8
+"656"	"Dn"	"GO:0097327"	"response to antineoplastic agent"	"8/388"	"96/17913"	0.00113759089809882	0.0112618717515945	0.00859597703466259	"440/445/1956/3728/1495/1499/23367/5111"	8
+"657"	"Dn"	"GO:0042307"	"positive regulation of protein import into nucleus"	"5/388"	"37/17913"	0.00114473489767396	0.0112774491500776	0.008607866972905	"7175/3843/2316/3728/10155"	5
+"658"	"Dn"	"GO:0060236"	"regulation of mitotic spindle organization"	"5/388"	"37/17913"	0.00114473489767396	0.0112774491500776	0.008607866972905	"7175/1213/1778/3192/4926"	5
+"659"	"Dn"	"GO:0061458"	"reproductive system development"	"20/388"	"429/17913"	0.00115006143248235	0.0113024241265073	0.00862692990743018	"5268/4436/3326/3157/2316/1956/1718/8644/6240/8531/7812/1495/4678/1739/682/1499/10155/3309/8894/2288"	20
+"660"	"Dn"	"GO:0071359"	"cellular response to dsRNA"	"4/388"	"22/17913"	0.00116366537604501	0.0114084288319764	0.00870784132552095	"857/4790/4869/1660"	4
+"661"	"Dn"	"GO:0010332"	"response to gamma radiation"	"6/388"	"55/17913"	0.00117612702566059	0.0115027495818834	0.00877983459786291	"1410/5591/142/3309/7520/2547"	6
+"662"	"Dn"	"GO:0010212"	"response to ionizing radiation"	"10/388"	"144/17913"	0.00118686524816557	0.0115519648793808	0.00881739971815316	"1410/4436/5591/142/6240/10135/3735/3309/7520/2547"	10
+"663"	"Dn"	"GO:0061337"	"cardiac conduction"	"10/388"	"144/17913"	0.00118686524816557	0.0115519648793808	0.00881739971815316	"857/1832/476/493/2316/9631/3728/3710/1829/488"	10
+"664"	"Dn"	"GO:0031668"	"cellular response to extracellular stimulus"	"14/388"	"251/17913"	0.00120137991875939	0.0116651973406637	0.00890382794769041	"440/3655/1277/23394/51520/3934/8644/7184/10985/10135/3312/1981/10514/3309"	14
+"665"	"Dn"	"GO:0019079"	"viral genome replication"	"9/388"	"120/17913"	0.00120815277241707	0.0116749655740256	0.00891128385835077	"140564/7153/5586/3312/7913/10155/103/23367/26986"	9
+"666"	"Dn"	"GO:1905477"	"positive regulation of protein localization to membrane"	"9/388"	"120/17913"	0.00120815277241707	0.0116749655740256	0.00891128385835077	"6711/3675/2181/3799/1956/3688/1739/4641/8878"	9
+"667"	"Dn"	"GO:0019886"	"antigen processing and presentation of exogenous peptide antigen via MHC class II"	"8/388"	"97/17913"	0.00121692705946666	0.0117317563423345	0.00895463119447144	"9493/161/29127/1213/6712/1778/3831/821"	8
+"668"	"Dn"	"GO:0070507"	"regulation of microtubule cytoskeleton organization"	"11/388"	"170/17913"	0.00122318364121965	0.0117640630957205	0.00897929033784444	"7175/9181/4869/1213/1778/3192/10015/1499/7514/4926/2288"	11
+"669"	"Dn"	"GO:0010611"	"regulation of cardiac muscle hypertrophy"	"7/388"	"76/17913"	0.00128343682061151	0.0123143025750142	0.00939927788804039	"2539/493/6093/142/4000/5530/10539"	7
+"670"	"Dn"	"GO:0086005"	"ventricular cardiac muscle cell action potential"	"5/388"	"38/17913"	0.00129506418462741	0.0123964890864217	0.00946200932205067	"857/1832/3728/1739/1829"	5
+"671"	"Dn"	"GO:0032970"	"regulation of actin filament-based process"	"17/388"	"341/17913"	0.00130195440825074	0.0124330504693567	0.00948991594494584	"857/6711/1832/476/5962/6709/2316/6093/6624/4627/23191/3728/6712/1739/1829/488/4641"	17
+"672"	"Dn"	"GO:0009314"	"response to radiation"	"20/388"	"435/17913"	0.00135807959599384	0.0129385041980684	0.00987571936554285	"440/1410/4436/2956/4869/3157/1956/5591/142/3688/6240/26155/10135/3735/170506/5936/3309/7520/5111/2547"	20
+"673"	"Dn"	"GO:0032886"	"regulation of microtubule-based process"	"12/388"	"199/17913"	0.00137115130908234	0.0130323747663719	0.00994736902264829	"7175/9181/4869/1729/1213/1778/3192/10015/1499/7514/4926/2288"	12
+"674"	"Dn"	"GO:0031579"	"membrane raft organization"	"4/388"	"23/17913"	0.00138479137483635	0.0130918632163738	0.00999277544897989	"857/2319/302/1739"	4
+"675"	"Dn"	"GO:0043044"	"ATP-dependent chromatin remodeling"	"7/388"	"77/17913"	0.00138602262938595	0.0130918632163738	0.00999277544897989	"86/4869/8607/1108/6597/4678/8467"	7
+"676"	"Dn"	"GO:1903900"	"regulation of viral life cycle"	"10/388"	"147/17913"	0.00138711022964297	0.0130918632163738	0.00999277544897989	"140564/7153/3838/5586/3312/7706/10155/103/23367/26986"	10
+"677"	"Dn"	"GO:0075733"	"intracellular transport of virus"	"6/388"	"57/17913"	0.00141987093623176	0.0133699009786102	0.0102049964963928	"7175/9631/3838/4928/23165/7514"	6
+"678"	"Dn"	"GO:1904591"	"positive regulation of protein import"	"5/388"	"39/17913"	0.00145947928248147	0.0135763332266125	0.010362562387941	"7175/3843/2316/3728/10155"	5
+"679"	"Dn"	"GO:1990138"	"neuron projection extension"	"10/388"	"148/17913"	0.00145966026413997	0.0135763332266125	0.010362562387941	"3326/23394/2803/3320/23191/3688/8239/1499/8826/7414"	10
+"680"	"Dn"	"GO:0019321"	"pentose metabolic process"	"3/388"	"11/17913"	0.00146191190091456	0.0135763332266125	0.010362562387941	"2539/7086/5226"	3
+"681"	"Dn"	"GO:0032351"	"negative regulation of hormone metabolic process"	"3/388"	"11/17913"	0.00146191190091456	0.0135763332266125	0.010362562387941	"476/4790/8644"	3
+"682"	"Dn"	"GO:0055015"	"ventricular cardiac muscle cell development"	"3/388"	"11/17913"	0.00146191190091456	0.0135763332266125	0.010362562387941	"4000/4628/983"	3
+"683"	"Dn"	"GO:1905214"	"regulation of RNA binding"	"3/388"	"11/17913"	0.00146191190091456	0.0135763332266125	0.010362562387941	"1981/8663/3646"	3
+"684"	"Dn"	"GO:0002495"	"antigen processing and presentation of peptide antigen via MHC class II"	"8/388"	"100/17913"	0.00148169183382656	0.0136971923177254	0.010454811882035	"9493/161/29127/1213/6712/1778/3831/821"	8
+"685"	"Dn"	"GO:0046822"	"regulation of nucleocytoplasmic transport"	"8/388"	"100/17913"	0.00148169183382656	0.0136971923177254	0.010454811882035	"7175/3843/2316/5905/3728/5936/10155/1660"	8
+"686"	"Dn"	"GO:0070527"	"platelet aggregation"	"6/388"	"58/17913"	0.00155530132292061	0.0143123069466035	0.0109243174260644	"6814/2316/3043/4627/7094/7414"	6
+"687"	"Dn"	"GO:1904589"	"regulation of protein import"	"6/388"	"58/17913"	0.00155530132292061	0.0143123069466035	0.0109243174260644	"7175/3843/2316/3728/3312/10155"	6
+"688"	"Dn"	"GO:0070997"	"neuron death"	"17/388"	"347/17913"	0.00156889253182579	0.0144046391414119	0.0109947928713224	"2539/4436/3326/23394/57707/6093/1718/142/7965/10135/16/1981/1499/3309/5700/10525/2597"	17
+"689"	"Dn"	"GO:0002504"	"antigen processing and presentation of peptide or polysaccharide antigen via MHC class II"	"8/388"	"101/17913"	0.00157943647299844	0.0144359780568187	0.0110187132819851	"9493/161/29127/1213/6712/1778/3831/821"	8
+"690"	"Dn"	"GO:0048675"	"axon extension"	"8/388"	"101/17913"	0.00157943647299844	0.0144359780568187	0.0110187132819851	"3326/23394/2803/3320/23191/3688/8239/7414"	8
+"691"	"Dn"	"GO:0014743"	"regulation of muscle hypertrophy"	"7/388"	"79/17913"	0.00161033305613879	0.014685221946635	0.0112089565026635	"2539/493/6093/142/4000/5530/10539"	7
+"692"	"Dn"	"GO:0007568"	"aging"	"16/388"	"318/17913"	0.00162859087261985	0.0148183470634557	0.0113105684258117	"445/1410/4436/2956/4869/5591/9361/4000/5530/1938/25942/1495/983/10135/26156/821"	16
+"693"	"Dn"	"GO:0021680"	"cerebellar Purkinje cell layer development"	"4/388"	"24/17913"	0.0016336279592448	0.0148308511367314	0.0113201125521424	"6712/4628/16/3309"	4
+"694"	"Dn"	"GO:0006289"	"nucleotide-excision repair"	"8/388"	"102/17913"	0.0016822194041532	0.0152378218510432	0.011630745721403	"5984/5430/142/27339/6917/3980/5111/2873"	8
+"695"	"Dn"	"GO:0051258"	"protein polymerization"	"13/388"	"232/17913"	0.00170594598019284	0.0154182483790197	0.0117684619310296	"6711/5962/3320/2801/6709/1729/23191/6712/9793/1739/4641/4926/2288"	13
+"696"	"Dn"	"GO:0090224"	"regulation of spindle organization"	"5/388"	"41/17913"	0.00183369002881934	0.0165358817966358	0.0126215307106167	"7175/1213/1778/3192/4926"	5
+"697"	"Dn"	"GO:0046824"	"positive regulation of nucleocytoplasmic transport"	"6/388"	"60/17913"	0.00185541213197179	0.0166945860496751	0.0127426667122086	"7175/3843/2316/3728/10155/1660"	6
+"698"	"Dn"	"GO:0031145"	"anaphase-promoting complex-dependent catabolic process"	"7/388"	"81/17913"	0.00186192315682532	0.0167160240842255	0.012759029964848	"8452/5713/5707/983/5708/5701/5700"	7
+"699"	"Dn"	"GO:0071346"	"cellular response to interferon-gamma"	"10/388"	"153/17913"	0.00187012650396843	0.0167525270233809	0.0127868919786943	"445/3326/6814/3799/2058/2317/7706/4641/10492/2597"	10
+"700"	"Dn"	"GO:0032355"	"response to estradiol"	"9/388"	"128/17913"	0.00189460033185366	0.0168969972327654	0.0128971633997736	"445/1410/1277/3673/1956/8886/1938/1499/5111"	9
+"701"	"Dn"	"GO:1900542"	"regulation of purine nucleotide metabolic process"	"9/388"	"128/17913"	0.00189460033185366	0.0168969972327654	0.0128971633997736	"7175/9631/5208/142/4928/983/6472/23165/2023"	9
+"702"	"Dn"	"GO:0001765"	"membrane raft assembly"	"3/388"	"12/17913"	0.00191805722553051	0.0169471748529038	0.0129354630430192	"857/2319/302"	3
+"703"	"Dn"	"GO:0002566"	"somatic diversification of immune receptors via somatic mutation"	"3/388"	"12/17913"	0.00191805722553051	0.0169471748529038	0.0129354630430192	"4436/2956/103"	3
+"704"	"Dn"	"GO:0006999"	"nuclear pore organization"	"3/388"	"12/17913"	0.00191805722553051	0.0169471748529038	0.0129354630430192	"7175/4928/23165"	3
+"705"	"Dn"	"GO:0051095"	"regulation of helicase activity"	"3/388"	"12/17913"	0.00191805722553051	0.0169471748529038	0.0129354630430192	"4436/2956/4171"	3
+"706"	"Dn"	"GO:0051656"	"establishment of organelle localization"	"20/388"	"448/17913"	0.00192115417571816	0.0169471748529038	0.0129354630430192	"55717/9493/9181/8452/2801/3799/81/10128/51068/4627/1778/89941/4628/3192/1739/1499/488/4641/7514/4926"	20
+"707"	"Dn"	"GO:0072331"	"signal transduction by p53 class mediator"	"14/388"	"264/17913"	0.00192957182262783	0.0169844267604785	0.0129638967305156	"5984/23246/4839/1108/26155/983/10111/6749/10848/10514/3276/11198/7917/5111"	14
+"708"	"Dn"	"GO:0006970"	"response to osmotic stress"	"7/388"	"82/17913"	0.00199862508960858	0.0175172484558477	0.013370589610526	"3326/3673/9181/1956/8531/7520/2547"	7
+"709"	"Dn"	"GO:0008037"	"cell recognition"	"9/388"	"129/17913"	0.00199875741827652	0.0175172484558477	0.013370589610526	"2049/10574/10576/10694/1739/7203/6950/10575/226"	9
+"710"	"Dn"	"GO:0006521"	"regulation of cellular amino acid metabolic process"	"6/388"	"61/17913"	0.00202096485438777	0.0176736213723889	0.0134899461463737	"5713/493/5707/5708/5701/5700"	6
+"711"	"Dn"	"GO:0060218"	"hematopoietic stem cell differentiation"	"7/388"	"83/17913"	0.00214296773032269	0.0186583597351117	0.0142415786047986	"5713/5707/3313/5708/5701/5700/7520"	7
+"712"	"Dn"	"GO:0006354"	"DNA-templated transcription, elongation"	"8/388"	"106/17913"	0.00214739334071673	0.0186583597351117	0.0142415786047986	"5430/9533/6917/284695/6829/3192/6749/11198"	8
+"713"	"Dn"	"GO:0043502"	"regulation of muscle adaptation"	"8/388"	"106/17913"	0.00214739334071673	0.0186583597351117	0.0142415786047986	"2539/493/6093/142/4000/5530/488/10539"	8
+"714"	"Dn"	"GO:0045739"	"positive regulation of DNA repair"	"6/388"	"62/17913"	0.00219744024899845	0.0190523245571621	0.0145422846186396	"1956/5591/142/10155/5111/1660"	6
+"715"	"Dn"	"GO:1900027"	"regulation of ruffle assembly"	"4/388"	"26/17913"	0.00222134712884925	0.0192184498391253	0.0146690849534445	"857/5962/23603/23191"	4
+"716"	"Dn"	"GO:0046677"	"response to antibiotic"	"16/388"	"328/17913"	0.00222642105863364	0.0192212769006559	0.0146712427968766	"2539/1410/1277/3934/3320/1365/3043/5019/1938/983/1981/3309/10131/23367/5111/7284"	16
+"717"	"Dn"	"GO:0030216"	"keratinocyte differentiation"	"15/388"	"298/17913"	0.00224228926346156	0.0193170834633103	0.0147443701624258	"3852/6699/3853/1832/3892/1830/301/6093/8644/5317/3728/5493/2317/1829/4926"	15
+"718"	"Dn"	"GO:0007548"	"sex differentiation"	"14/388"	"269/17913"	0.00229315247045574	0.0197133213436843	0.0150468111593654	"4436/3157/2316/1718/8644/6240/8531/7812/1495/4678/1499/3309/8894/2288"	14
+"719"	"Dn"	"GO:0006140"	"regulation of nucleotide metabolic process"	"9/388"	"132/17913"	0.00233890379847515	0.0200216098943464	0.0152821220703751	"7175/9631/5208/142/4928/983/6472/23165/2023"	9
+"720"	"Dn"	"GO:0060048"	"cardiac muscle contraction"	"9/388"	"132/17913"	0.00233890379847515	0.0200216098943464	0.0152821220703751	"857/1832/476/2316/9631/3728/10848/1739/1829"	9
+"721"	"Dn"	"GO:0001101"	"response to acid chemical"	"16/388"	"330/17913"	0.00236564653530984	0.0202078118596404	0.015424246563779	"440/445/1277/51520/3673/57707/3843/493/2180/1956/8644/1938/3482/7520/23376/5111"	16
+"722"	"Dn"	"GO:0003300"	"cardiac muscle hypertrophy"	"8/388"	"108/17913"	0.00241504909434247	0.0204591727966475	0.015616105687163	"2539/493/6093/142/4000/5530/488/10539"	8
+"723"	"Dn"	"GO:0050684"	"regulation of mRNA processing"	"8/388"	"108/17913"	0.00241504909434247	0.0204591727966475	0.015616105687163	"27339/4928/6829/3312/3192/170506/5936/1660"	8
+"724"	"Dn"	"GO:0009084"	"glutamine family amino acid biosynthetic process"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"445/2744/4942"	3
+"725"	"Dn"	"GO:0030490"	"maturation of SSU-rRNA"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"27340/84916/25926"	3
+"726"	"Dn"	"GO:0032802"	"low-density lipoprotein particle receptor catabolic process"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"161/302/1213"	3
+"727"	"Dn"	"GO:0042559"	"pteridine-containing compound biosynthetic process"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"25902/2618/471"	3
+"728"	"Dn"	"GO:0042790"	"nucleolar large rRNA transcription by RNA polymerase I"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"25926/6597/4691"	3
+"729"	"Dn"	"GO:0062033"	"positive regulation of mitotic sister chromatid segregation"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"8452/3192/4926"	3
+"730"	"Dn"	"GO:0098903"	"regulation of membrane repolarization during action potential"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"857/2316/1739"	3
+"731"	"Dn"	"GO:1901836"	"regulation of transcription of nucleolar large rRNA by RNA polymerase I"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"25926/6597/4691"	3
+"732"	"Dn"	"GO:1902414"	"protein localization to cell junction"	"3/388"	"13/17913"	0.0024536591364387	0.0204591727966475	0.015616105687163	"1832/2316/81"	3
+"733"	"Dn"	"GO:1901532"	"regulation of hematopoietic progenitor cell differentiation"	"7/388"	"85/17913"	0.0024557070830256	0.0204591727966475	0.015616105687163	"5713/5707/3313/170506/5708/5701/5700"	7
+"734"	"Dn"	"GO:0006898"	"receptor-mediated endocytosis"	"15/388"	"301/17913"	0.00246749473259946	0.0205151666782242	0.0156588447744775	"857/7037/7036/10808/161/3320/302/3043/1213/3688/7184/3482/1742/821/10525"	15
+"735"	"Dn"	"GO:0043618"	"regulation of transcription from RNA polymerase II promoter in response to stress"	"8/388"	"109/17913"	0.00255832463117473	0.0211408779665543	0.0161364385513781	"5713/10985/5707/25942/5708/5701/3309/5700"	8
+"736"	"Dn"	"GO:0022411"	"cellular component disassembly"	"21/388"	"492/17913"	0.00256139342929797	0.0211408779665543	0.0161364385513781	"857/6711/3099/5962/9181/2801/6709/3799/6624/7153/6712/3831/9793/6597/983/3312/682/1499/11198/8878/5976"	21
+"737"	"Dn"	"GO:0006760"	"folic acid-containing compound metabolic process"	"4/388"	"27/17913"	0.00256363820241496	0.0211408779665543	0.0161364385513781	"25902/2618/471/6472"	4
+"738"	"Dn"	"GO:0090169"	"regulation of spindle assembly"	"4/388"	"27/17913"	0.00256363820241496	0.0211408779665543	0.0161364385513781	"7175/1778/3192/4926"	4
+"739"	"Dn"	"GO:2000378"	"negative regulation of reactive oxygen species metabolic process"	"6/388"	"64/17913"	0.00258496335740686	0.0212734077929683	0.0162375961004419	"857/2539/1410/3099/493/10131"	6
+"740"	"Dn"	"GO:0010256"	"endomembrane system organization"	"17/388"	"365/17913"	0.00266173537722537	0.0218607840616339	0.0166859294705534	"857/6711/375056/653145/2801/23603/9631/4627/9950/4000/4628/983/10015/488/26509/7917/8878"	17
+"741"	"Dn"	"GO:0010038"	"response to metal ion"	"16/388"	"335/17913"	0.00274573016419698	0.0225049826616064	0.0171776342682342	"857/7036/445/2539/1956/8644/9361/142/5530/983/3710/1742/682/3309/8826/5111"	16
+"742"	"Dn"	"GO:0022604"	"regulation of cell morphogenesis"	"19/388"	"430/17913"	0.0027667178041008	0.0226311927046548	0.0172739680443167	"23394/301/5962/2803/23603/2316/81/1729/23654/4627/2049/23191/5530/79784/4628/170506/1739/1742/226"	19
+"743"	"Dn"	"GO:0045428"	"regulation of nitric oxide biosynthetic process"	"6/388"	"65/17913"	0.00279692457327429	0.0228321524136847	0.0174273568487549	"857/445/3326/3320/493/3043"	6
+"744"	"Dn"	"GO:0051017"	"actin filament bundle assembly"	"9/388"	"136/17913"	0.00286230368325411	0.0232920993667408	0.0177784257947384	"5962/8452/2316/81/6093/6624/4430/7184/87"	9
+"745"	"Dn"	"GO:0014897"	"striated muscle hypertrophy"	"8/388"	"111/17913"	0.0028647729030963	0.0232920993667408	0.0177784257947384	"2539/493/6093/142/4000/5530/488/10539"	8
+"746"	"Dn"	"GO:0006972"	"hyperosmotic response"	"4/388"	"28/17913"	0.00294044831455521	0.0237237237621408	0.0181078766597718	"9181/8531/7520/2547"	4
+"747"	"Dn"	"GO:0050685"	"positive regulation of mRNA processing"	"4/388"	"28/17913"	0.00294044831455521	0.0237237237621408	0.0181078766597718	"27339/4928/3312/170506"	4
+"748"	"Dn"	"GO:1990776"	"response to angiotensin"	"4/388"	"28/17913"	0.00294044831455521	0.0237237237621408	0.0181078766597718	"857/4790/6093/8826"	4
+"749"	"Dn"	"GO:0006694"	"steroid biosynthetic process"	"11/388"	"190/17913"	0.00294129645062847	0.0237237237621408	0.0181078766597718	"2539/476/11160/1717/4790/2222/3157/47/1718/8644/6713"	11
+"750"	"Dn"	"GO:0061572"	"actin filament bundle organization"	"9/388"	"137/17913"	0.00300660547115027	0.0242022774407305	0.0184731477729354	"5962/8452/2316/81/6093/6624/4430/7184/87"	9
+"751"	"Dn"	"GO:0006984"	"ER-nucleus signaling pathway"	"5/388"	"46/17913"	0.00307103673139945	0.0244934909699602	0.0186954256379881	"440/11160/7184/488/3309"	5
+"752"	"Dn"	"GO:0014075"	"response to amine"	"5/388"	"46/17913"	0.00307103673139945	0.0244934909699602	0.0186954256379881	"445/3673/790/5530/983"	5
+"753"	"Dn"	"GO:0019081"	"viral translation"	"3/388"	"14/17913"	0.00307302875098537	0.0244934909699602	0.0186954256379881	"51386/8662/1660"	3
+"754"	"Dn"	"GO:0046037"	"GMP metabolic process"	"3/388"	"14/17913"	0.00307302875098537	0.0244934909699602	0.0186954256379881	"8833/3615/1739"	3
+"755"	"Dn"	"GO:0086069"	"bundle of His cell to Purkinje myocyte communication"	"3/388"	"14/17913"	0.00307302875098537	0.0244934909699602	0.0186954256379881	"1832/3728/1829"	3
+"756"	"Dn"	"GO:0006937"	"regulation of muscle contraction"	"10/388"	"164/17913"	0.00310361298553385	0.0246886620401307	0.0188443960821577	"857/1832/476/3673/2316/3728/1739/1829/488/2023"	10
+"757"	"Dn"	"GO:0031669"	"cellular response to nutrient levels"	"12/388"	"220/17913"	0.00315744989830642	0.0250676757612602	0.0191336901990251	"440/1277/51520/3934/8644/7184/10985/10135/3312/1981/10514/3309"	12
+"758"	"Dn"	"GO:0014896"	"muscle hypertrophy"	"8/388"	"113/17913"	0.00319911540322922	0.0253487637332194	0.0193482394147307	"2539/493/6093/142/4000/5530/488/10539"	8
+"759"	"Dn"	"GO:0002200"	"somatic diversification of immune receptors"	"6/388"	"67/17913"	0.00325955946508489	0.0257772583479076	0.019675301376417	"7037/3329/4436/2956/5591/103"	6
+"760"	"Dn"	"GO:0031331"	"positive regulation of cellular catabolic process"	"16/388"	"341/17913"	0.00326738156227081	0.0257887484320361	0.01968407154371	"857/4898/3099/5962/3320/6093/5208/6832/6829/170506/5701/5700/23367/7917/5976/26986"	16
+"761"	"Dn"	"GO:0071480"	"cellular response to gamma radiation"	"4/388"	"29/17913"	0.0033534144999214	0.0264162943777855	0.0201630656804612	"1410/3309/7520/2547"	4
+"762"	"Dn"	"GO:0001701"	"in utero embryonic development"	"16/388"	"342/17913"	0.00336180212551809	0.0264309452548015	0.0201742484221178	"4436/8452/86/1956/4627/84295/3688/8531/27339/25942/4628/4678/1499/3276/10155/8894"	16
+"763"	"Dn"	"GO:2001169"	"regulation of ATP biosynthetic process"	"7/388"	"90/17913"	0.00339144968952873	0.0266123639397322	0.0203127219266756	"7175/9631/5208/142/4928/23165/2023"	7
+"764"	"Dn"	"GO:1903320"	"regulation of protein modification by small protein conjugation or removal"	"12/388"	"223/17913"	0.00352213839270095	0.0275844068704955	0.021054664198249	"857/26354/3326/23560/8452/3320/2801/7965/1499/3309/3301/23376"	12
+"765"	"Dn"	"GO:0043484"	"regulation of RNA splicing"	"8/388"	"115/17913"	0.00356302203560945	0.0278051761471947	0.0212231732768751	"79026/5430/27339/284695/4928/3312/3192/5936"	8
+"766"	"Dn"	"GO:1902903"	"regulation of supramolecular fiber organization"	"15/388"	"313/17913"	0.00356406184746705	0.0278051761471947	0.0212231732768751	"6711/1410/5962/9181/79709/6709/2316/6093/23191/6712/3312/1739/4641/4926/2288"	15
+"767"	"Dn"	"GO:0046434"	"organophosphate catabolic process"	"12/388"	"224/17913"	0.00365098968220813	0.0284285715831937	0.0216989994068079	"7175/3099/5214/9631/5208/4928/23165/2023/3939/226/2597/5315"	12
+"768"	"Dn"	"GO:2000736"	"regulation of stem cell differentiation"	"8/388"	"116/17913"	0.00375659321401265	0.0289878021497441	0.0221258496865109	"5713/5707/3313/3192/170506/5708/5701/5700"	8
+"769"	"Dn"	"GO:0009913"	"epidermal cell differentiation"	"16/388"	"346/17913"	0.00376228967918882	0.0289878021497441	0.0221258496865109	"3852/6699/3853/1832/3892/1830/301/6093/8644/5317/3728/5493/2317/1829/1499/4926"	16
+"770"	"Dn"	"GO:0000281"	"mitotic cytokinesis"	"6/388"	"69/17913"	0.00377693246647603	0.0289878021497441	0.0221258496865109	"6711/54443/9493/29127/4628/10015"	6
+"771"	"Dn"	"GO:0006098"	"pentose-phosphate shunt"	"3/388"	"15/17913"	0.0037800838565238	0.0289878021497441	0.0221258496865109	"2539/7086/5226"	3
+"772"	"Dn"	"GO:0009070"	"serine family amino acid biosynthetic process"	"3/388"	"15/17913"	0.0037800838565238	0.0289878021497441	0.0221258496865109	"26227/29968/6472"	3
+"773"	"Dn"	"GO:0035635"	"entry of bacterium into host cell"	"3/388"	"15/17913"	0.0037800838565238	0.0289878021497441	0.0221258496865109	"857/3853/1499"	3
+"774"	"Dn"	"GO:0045091"	"regulation of single stranded viral RNA replication via double stranded DNA intermediate"	"3/388"	"15/17913"	0.0037800838565238	0.0289878021497441	0.0221258496865109	"140564/7153/10155"	3
+"775"	"Dn"	"GO:0090136"	"epithelial cell-cell adhesion"	"3/388"	"15/17913"	0.0037800838565238	0.0289878021497441	0.0221258496865109	"3728/1495/7414"	3
+"776"	"Dn"	"GO:2000142"	"regulation of DNA-templated transcription, initiation"	"4/388"	"30/17913"	0.00380414041537944	0.0291171352398324	0.0222245672262542	"9774/170506/1499/55832"	4
+"777"	"Dn"	"GO:2001022"	"positive regulation of response to DNA damage stimulus"	"7/388"	"92/17913"	0.00383358016877374	0.0292871058554054	0.0223543026326111	"1956/5591/142/9774/10155/5111/1660"	7
+"778"	"Dn"	"GO:0051235"	"maintenance of location"	"14/388"	"286/17913"	0.00397647193583231	0.0303215345916856	0.0231438628280378	"857/10938/4790/3934/3099/2316/5905/1729/3728/7184/2317/3192/3309/7094"	14
+"779"	"Dn"	"GO:0051261"	"protein depolymerization"	"7/388"	"93/17913"	0.00407040382537448	0.0309794456559047	0.0236460340943797	"6711/5962/9181/6709/6712/9793/3312"	7
+"780"	"Dn"	"GO:0044839"	"cell cycle G2/M phase transition"	"13/388"	"257/17913"	0.00412616057101955	0.0313448858387582	0.0239249677821929	"7277/5713/3320/4869/5707/1778/25942/9793/983/5708/5701/5700/10383"	13
+"781"	"Dn"	"GO:0006997"	"nucleus organization"	"8/388"	"118/17913"	0.00416805135341836	0.031603820093616	0.0241226074780925	"23481/7175/9631/4000/4928/983/23165/4926"	8
+"782"	"Dn"	"GO:0033120"	"positive regulation of RNA splicing"	"4/388"	"31/17913"	0.004294193215034	0.0324387841934192	0.0247599200301254	"5430/27339/4928/3312"	4
+"783"	"Dn"	"GO:0086011"	"membrane repolarization during action potential"	"4/388"	"31/17913"	0.004294193215034	0.0324387841934192	0.0247599200301254	"857/476/2316/1739"	4
+"784"	"Dn"	"GO:2001243"	"negative regulation of intrinsic apoptotic signaling pathway"	"7/388"	"94/17913"	0.00431814754643813	0.0325589933250056	0.0248516734222138	"9181/8531/26155/2023/3301/10131/10525"	7
+"785"	"Dn"	"GO:0000288"	"nuclear-transcribed mRNA catabolic process, deadenylation-dependent decay"	"6/388"	"71/17913"	0.00435282274573556	0.032759441073389	0.0250046714566222	"22894/9652/23644/170506/1656/26986"	6
+"786"	"Dn"	"GO:0035567"	"non-canonical Wnt signaling pathway"	"9/388"	"145/17913"	0.00437865305161911	0.032771102044373	0.0250135720586705	"161/5713/1213/5530/5707/5708/5701/1499/5700"	9
+"787"	"Dn"	"GO:0042133"	"neurotransmitter metabolic process"	"9/388"	"145/17913"	0.00437865305161911	0.032771102044373	0.0250135720586705	"857/26227/445/3326/2618/3320/493/3043/6472"	9
+"788"	"Dn"	"GO:0046165"	"alcohol biosynthetic process"	"9/388"	"145/17913"	0.00437865305161911	0.032771102044373	0.0250135720586705	"2539/11160/1717/4790/2222/3157/47/1718/6713"	9
+"789"	"Dn"	"GO:0002931"	"response to ischemia"	"5/388"	"50/17913"	0.00442441263496153	0.0329309683069104	0.025135595000478	"857/3099/1938/8878/10525"	5
+"790"	"Dn"	"GO:0045540"	"regulation of cholesterol biosynthetic process"	"5/388"	"50/17913"	0.00442441263496153	0.0329309683069104	0.025135595000478	"11160/1717/2222/3157/6713"	5
+"791"	"Dn"	"GO:0106118"	"regulation of sterol biosynthetic process"	"5/388"	"50/17913"	0.00442441263496153	0.0329309683069104	0.025135595000478	"11160/1717/2222/3157/6713"	5
+"792"	"Dn"	"GO:0034341"	"response to interferon-gamma"	"10/388"	"173/17913"	0.00453402952295067	0.0336232335868631	0.0256639882000832	"445/3326/6814/3799/2058/2317/7706/4641/10492/2597"	10
+"793"	"Dn"	"GO:0071478"	"cellular response to radiation"	"10/388"	"173/17913"	0.00453402952295067	0.0336232335868631	0.0256639882000832	"1410/4869/142/26155/10135/170506/3309/7520/5111/2547"	10
+"794"	"Dn"	"GO:0039692"	"single stranded viral RNA replication via double stranded DNA intermediate"	"3/388"	"16/17913"	0.00457836746771118	0.0337665025077643	0.0257733427000288	"140564/7153/10155"	3
+"795"	"Dn"	"GO:0055012"	"ventricular cardiac muscle cell differentiation"	"3/388"	"16/17913"	0.00457836746771118	0.0337665025077643	0.0257733427000288	"4000/4628/983"	3
+"796"	"Dn"	"GO:0061684"	"chaperone-mediated autophagy"	"3/388"	"16/17913"	0.00457836746771118	0.0337665025077643	0.0257733427000288	"3320/3312/1915"	3
+"797"	"Dn"	"GO:0006352"	"DNA-templated transcription, initiation"	"12/388"	"231/17913"	0.00466310046908456	0.0342103832303079	0.0261121485913829	"5430/9533/284119/6597/983/9774/170506/1499/10155/8467/55832/2969"	12
+"798"	"Dn"	"GO:0043462"	"regulation of ATPase activity"	"6/388"	"72/17913"	0.00466390010944183	0.0342103832303079	0.0261121485913829	"23397/29128/10598/3192/3301/1660"	6
+"799"	"Dn"	"GO:1902036"	"regulation of hematopoietic stem cell differentiation"	"6/388"	"72/17913"	0.00466390010944183	0.0342103832303079	0.0261121485913829	"5713/5707/3313/5708/5701/5700"	6
+"800"	"Dn"	"GO:0042594"	"response to starvation"	"10/388"	"174/17913"	0.00472055891779214	0.0345633690020621	0.0263815760590801	"440/51520/790/5019/8644/10985/3312/10514/3309/23367"	10
+"801"	"Dn"	"GO:0000910"	"cytokinesis"	"9/388"	"147/17913"	0.004787964881025	0.0349496114247425	0.0266763877092574	"6711/54443/9493/8452/29127/4627/4628/5586/10015"	9
+"802"	"Dn"	"GO:0003299"	"muscle hypertrophy in response to stress"	"4/388"	"32/17913"	0.00482510071287505	0.0349496114247425	0.0266763877092574	"493/4000/5530/488"	4
+"803"	"Dn"	"GO:0014887"	"cardiac muscle adaptation"	"4/388"	"32/17913"	0.00482510071287505	0.0349496114247425	0.0266763877092574	"493/4000/5530/488"	4
+"804"	"Dn"	"GO:0014898"	"cardiac muscle hypertrophy in response to stress"	"4/388"	"32/17913"	0.00482510071287505	0.0349496114247425	0.0266763877092574	"493/4000/5530/488"	4
+"805"	"Dn"	"GO:0051693"	"actin filament capping"	"4/388"	"32/17913"	0.00482510071287505	0.0349496114247425	0.0266763877092574	"6711/5962/6709/6712"	4
+"806"	"Dn"	"GO:0071709"	"membrane assembly"	"4/388"	"32/17913"	0.00482510071287505	0.0349496114247425	0.0266763877092574	"857/6711/2319/302"	4
+"807"	"Dn"	"GO:0043500"	"muscle adaptation"	"8/388"	"121/17913"	0.00484932198823541	0.0349998301789041	0.026714718749337	"2539/493/6093/142/4000/5530/488/10539"	8
+"808"	"Dn"	"GO:0046718"	"viral entry into host cell"	"8/388"	"121/17913"	0.00484932198823541	0.0349998301789041	0.026714718749337	"857/7037/3673/6510/1956/3688/983/7706"	8
+"809"	"Dn"	"GO:0001503"	"ossification"	"17/388"	"388/17913"	0.00491744768671625	0.0354283731023383	0.0270418175841898	"9188/1277/23560/1956/3376/1213/23020/3192/26156/170506/5701/10514/1499/103/23376/10492/1660"	17
+"810"	"Dn"	"GO:0072401"	"signal transduction involved in DNA integrity checkpoint"	"6/388"	"73/17913"	0.00499103455483069	0.035767608694707	0.0273007497959626	"5591/988/27339/983/3276/5111"	6
+"811"	"Dn"	"GO:0072422"	"signal transduction involved in DNA damage checkpoint"	"6/388"	"73/17913"	0.00499103455483069	0.035767608694707	0.0273007497959626	"5591/988/27339/983/3276/5111"	6
+"812"	"Dn"	"GO:1903779"	"regulation of cardiac conduction"	"6/388"	"73/17913"	0.00499103455483069	0.035767608694707	0.0273007497959626	"857/476/493/2316/3710/488"	6
+"813"	"Dn"	"GO:0048732"	"gland development"	"18/388"	"422/17913"	0.00508667777595131	0.0363795206001112	0.0277678107607926	"5268/440/857/445/220/3673/3099/8452/3157/790/1956/5591/2049/3482/1499/5111/2288/5315"	18
+"814"	"Dn"	"GO:1902904"	"negative regulation of supramolecular fiber organization"	"8/388"	"122/17913"	0.00509439075827688	0.0363795206001112	0.0277678107607926	"6711/1410/5962/9181/6709/6712/3312/2288"	8
+"815"	"Dn"	"GO:1901989"	"positive regulation of cell cycle phase transition"	"7/388"	"97/17913"	0.0051300391922203	0.0365695927628521	0.0279128893038525	"5962/8452/4869/1956/25942/983/1981"	7
+"816"	"Dn"	"GO:0060828"	"regulation of canonical Wnt signaling pathway"	"13/388"	"264/17913"	0.00515842333129993	0.0367073041624489	0.0280180018512563	"857/1277/4790/8452/5713/1956/8607/3728/5707/5708/5701/1499/5700"	13
+"817"	"Dn"	"GO:0043010"	"camera-type eye development"	"14/388"	"295/17913"	0.00521062387983968	0.0370137124376682	0.0282518775830273	"220/1410/86/493/1956/23047/23770/6240/6597/4628/3615/10848/1739/1499"	14
+"818"	"Dn"	"GO:0072395"	"signal transduction involved in cell cycle checkpoint"	"6/388"	"74/17913"	0.00533470316121317	0.0378287444829284	0.0288739763689222	"5591/988/27339/983/3276/5111"	6
+"819"	"Dn"	"GO:0042455"	"ribonucleoside biosynthetic process"	"4/388"	"33/17913"	0.00539834881801304	0.0380137641115388	0.0290151984067483	"1503/8833/790/3615"	4
+"820"	"Dn"	"GO:0042558"	"pteridine-containing compound metabolic process"	"4/388"	"33/17913"	0.00539834881801304	0.0380137641115388	0.0290151984067483	"25902/2618/471/6472"	4
+"821"	"Dn"	"GO:0043928"	"exonucleolytic nuclear-transcribed mRNA catabolic process involved in deadenylation-dependent decay"	"4/388"	"33/17913"	0.00539834881801304	0.0380137641115388	0.0290151984067483	"22894/9652/23644/1656"	4
+"822"	"Dn"	"GO:0071353"	"cellular response to interleukin-4"	"4/388"	"33/17913"	0.00539834881801304	0.0380137641115388	0.0290151984067483	"3326/4171/3615/3309"	4
+"823"	"Dn"	"GO:0060537"	"muscle tissue development"	"17/388"	"392/17913"	0.00543606387351233	0.0381936982506278	0.0291525387851044	"857/2539/1832/4000/3688/5530/8531/1938/2317/79784/4628/983/3192/10848/1739/1829/1499"	17
+"824"	"Dn"	"GO:0022406"	"membrane docking"	"9/388"	"150/17913"	0.00545700162857321	0.0381936982506278	0.0291525387851044	"7277/6814/3320/6093/1778/9793/983/23344/10383"	9
+"825"	"Dn"	"GO:0030902"	"hindbrain development"	"9/388"	"150/17913"	0.00545700162857321	0.0381936982506278	0.0291525387851044	"2618/2316/6712/3688/4628/471/16/1499/3309"	9
+"826"	"Dn"	"GO:0006266"	"DNA ligation"	"3/388"	"17/17913"	0.00547106569161871	0.0381936982506278	0.0291525387851044	"7153/3980/2547"	3
+"827"	"Dn"	"GO:0006544"	"glycine metabolic process"	"3/388"	"17/17913"	0.00547106569161871	0.0381936982506278	0.0291525387851044	"26227/2618/6472"	3
+"828"	"Dn"	"GO:0019218"	"regulation of steroid metabolic process"	"8/388"	"124/17913"	0.00561284759970279	0.0391160411896671	0.0298565459783085	"476/11160/1717/4790/2222/3157/8644/6713"	8
+"829"	"Dn"	"GO:0032984"	"protein-containing complex disassembly"	"14/388"	"298/17913"	0.00568468192501153	0.0394163079082209	0.0300857339742201	"857/6711/5962/9181/6709/3799/6712/3831/9793/6597/3312/1499/11198/5976"	14
+"830"	"Dn"	"GO:0006336"	"DNA replication-independent nucleosome assembly"	"5/388"	"53/17913"	0.00568513801392961	0.0394163079082209	0.0300857339742201	"79711/4869/8607/4678/8467"	5
+"831"	"Dn"	"GO:0034724"	"DNA replication-independent nucleosome organization"	"5/388"	"53/17913"	0.00568513801392961	0.0394163079082209	0.0300857339742201	"79711/4869/8607/4678/8467"	5
+"832"	"Dn"	"GO:1903046"	"meiotic cell cycle process"	"9/388"	"151/17913"	0.00569537422021613	0.0394197781498378	0.0300883827450374	"23397/10592/2956/10051/2801/7153/4627/10111/7917"	9
+"833"	"Dn"	"GO:0000086"	"G2/M transition of mitotic cell cycle"	"12/388"	"238/17913"	0.00588817204761187	0.0406846563494547	0.0310538407253251	"7277/5713/3320/5707/1778/25942/9793/983/5708/5701/5700/10383"	12
+"834"	"Dn"	"GO:0032271"	"regulation of protein polymerization"	"10/388"	"180/17913"	0.00596994794341208	0.0411794194597539	0.0314314841959255	"6711/5962/3320/6709/23191/6712/1739/4641/4926/2288"	10
+"835"	"Dn"	"GO:0000291"	"nuclear-transcribed mRNA catabolic process, exonucleolytic"	"4/388"	"34/17913"	0.00601537922809378	0.0413519023676599	0.0315631371882465	"22894/9652/23644/1656"	4
+"836"	"Dn"	"GO:0072595"	"maintenance of protein localization in organelle"	"4/388"	"34/17913"	0.00601537922809378	0.0413519023676599	0.0315631371882465	"3099/5905/3192/3309"	4
+"837"	"Dn"	"GO:0006809"	"nitric oxide biosynthetic process"	"6/388"	"76/17913"	0.00607354957220722	0.0416702507830138	0.0318061266066809	"857/445/3326/3320/493/3043"	6
+"838"	"Dn"	"GO:0031334"	"positive regulation of protein complex assembly"	"12/388"	"239/17913"	0.00608227172456437	0.0416702507830138	0.0318061266066809	"3320/6624/23191/142/9774/170506/1739/1981/1499/4641/55832/4926"	12
+"839"	"Dn"	"GO:0030010"	"establishment of cell polarity"	"8/388"	"126/17913"	0.00617058111344896	0.0422038562978967	0.032213417761533	"3326/9181/2319/3320/6093/6624/4627/4926"	8
+"840"	"Dn"	"GO:0031497"	"chromatin assembly"	"9/388"	"153/17913"	0.00619618553282634	0.0422698849242393	0.0322638161827005	"79711/7175/4171/4869/8607/26155/3009/4678/8467"	9
+"841"	"Dn"	"GO:1905475"	"regulation of protein localization to membrane"	"10/388"	"181/17913"	0.00620111426154561	0.0422698849242393	0.0322638161827005	"6711/3675/2181/3799/1956/1213/3688/1739/4641/8878"	10
+"842"	"Dn"	"GO:0070498"	"interleukin-1-mediated signaling pathway"	"7/388"	"101/17913"	0.00638460594735134	0.0433746132228617	0.033107034725227	"4790/5713/5707/5708/5701/5700/8878"	7
+"843"	"Dn"	"GO:1903426"	"regulation of reactive oxygen species biosynthetic process"	"7/388"	"101/17913"	0.00638460594735134	0.0433746132228617	0.033107034725227	"857/445/3326/3320/493/3043/10131"	7
+"844"	"Dn"	"GO:0038083"	"peptidyl-tyrosine autophosphorylation"	"3/388"	"18/17913"	0.00646102492340366	0.0436011498581024	0.0332799459212511	"857/1956/8826"	3
+"845"	"Dn"	"GO:0042026"	"protein refolding"	"3/388"	"18/17913"	0.00646102492340366	0.0436011498581024	0.0332799459212511	"3329/3320/3312"	3
+"846"	"Dn"	"GO:0048026"	"positive regulation of mRNA splicing, via spliceosome"	"3/388"	"18/17913"	0.00646102492340366	0.0436011498581024	0.0332799459212511	"27339/4928/3312"	3
+"847"	"Dn"	"GO:0060546"	"negative regulation of necroptotic process"	"3/388"	"18/17913"	0.00646102492340366	0.0436011498581024	0.0332799459212511	"857/9181/8531"	3
+"848"	"Dn"	"GO:0032386"	"regulation of intracellular transport"	"17/388"	"400/17913"	0.0066073298474443	0.0445142737975075	0.0339769164236737	"10938/1410/7175/5962/302/3843/2316/5905/3799/3728/1778/5936/488/10155/4641/4926/1660"	17
+"849"	"Dn"	"GO:0042306"	"regulation of protein import into nucleus"	"5/388"	"55/17913"	0.00665440367799074	0.0446164212035171	0.0340548836369022	"7175/3843/2316/3728/10155"	5
+"850"	"Dn"	"GO:0030835"	"negative regulation of actin filament depolymerization"	"4/388"	"35/17913"	0.00667758736708604	0.0446164212035171	0.0340548836369022	"6711/5962/6709/6712"	4
+"851"	"Dn"	"GO:0045740"	"positive regulation of DNA replication"	"4/388"	"35/17913"	0.00667758736708604	0.0446164212035171	0.0340548836369022	"1956/983/5111/1660"	4
+"852"	"Dn"	"GO:0046131"	"pyrimidine ribonucleoside metabolic process"	"4/388"	"35/17913"	0.00667758736708604	0.0446164212035171	0.0340548836369022	"1503/9582/140564/790"	4
+"853"	"Dn"	"GO:0048333"	"mesodermal cell differentiation"	"4/388"	"35/17913"	0.00667758736708604	0.0446164212035171	0.0340548836369022	"3691/3673/3675/3688"	4
+"854"	"Dn"	"GO:0031960"	"response to corticosteroid"	"9/388"	"155/17913"	0.0067302369979465	0.0448260100843544	0.0342148589275232	"445/1277/301/790/1956/8644/142/3192/5111"	9
+"855"	"Dn"	"GO:0006275"	"regulation of DNA replication"	"7/388"	"102/17913"	0.00673109758737651	0.0448260100843544	0.0342148589275232	"5984/23560/1956/983/3980/5111/1660"	7
+"856"	"Dn"	"GO:1903008"	"organelle disassembly"	"6/388"	"78/17913"	0.00688424340124475	0.0457706100683744	0.0349358545087799	"3099/2801/3799/3831/983/8878"	6
+"857"	"Dn"	"GO:0071347"	"cellular response to interleukin-1"	"9/388"	"156/17913"	0.00701016282583304	0.0465313922652426	0.0355165453954198	"4790/3934/5713/5707/5708/5701/5700/8878/5976"	9
+"858"	"Dn"	"GO:0051222"	"positive regulation of protein transport"	"17/388"	"403/17913"	0.00709607243490644	0.0470245454810739	0.0358929600635461	"6711/7175/2181/3843/2316/3799/1956/5019/5208/3728/4628/3735/170506/10155/4641/1660/2597"	17
+"859"	"Dn"	"GO:0060560"	"developmental growth involved in morphogenesis"	"11/388"	"214/17913"	0.00713490529815798	0.0472046267193491	0.0360304127199722	"3326/23394/2803/3320/23191/3688/8239/1499/10155/8826/7414"	11
+"860"	"Dn"	"GO:0033619"	"membrane protein proteolysis"	"5/388"	"56/17913"	0.00717997075782683	0.0473344982192462	0.0361295412178984	"4790/4898/6093/4627/81502"	5
+"861"	"Dn"	"GO:1901880"	"negative regulation of protein depolymerization"	"5/388"	"56/17913"	0.00717997075782683	0.0473344982192462	0.0361295412178984	"6711/5962/9181/6709/6712"	5
+"862"	"Dn"	"GO:0060047"	"heart contraction"	"13/388"	"275/17913"	0.00718960642253308	0.0473344982192462	0.0361295412178984	"857/1832/476/493/2316/9631/3728/3710/10848/1739/1829/488/10539"	13
+"863"	"Dn"	"GO:0043434"	"response to peptide hormone"	"17/388"	"404/17913"	0.00726533169876073	0.0477554026757828	0.036450809753181	"857/445/1277/4790/6814/57707/5905/790/6093/5591/23191/142/988/2058/682/4641/8826"	17
+"864"	"Dn"	"GO:0006368"	"transcription elongation from RNA polymerase II promoter"	"6/388"	"79/17913"	0.00731771548440415	0.04802176660673	0.036654120382514	"5430/6917/6829/3192/6749/11198"	6
+"865"	"Dn"	"GO:0051293"	"establishment of spindle localization"	"4/388"	"36/17913"	0.00738632055421473	0.0482374385871217	0.0368187387897699	"9181/4627/1778/4926"	4
+"866"	"Dn"	"GO:0070670"	"response to interleukin-4"	"4/388"	"36/17913"	0.00738632055421473	0.0482374385871217	0.0368187387897699	"3326/4171/3615/3309"	4
+"867"	"Dn"	"GO:0086091"	"regulation of heart rate by cardiac conduction"	"4/388"	"36/17913"	0.00738632055421473	0.0482374385871217	0.0368187387897699	"857/1832/3728/1829"	4
+"868"	"Dn"	"GO:0010612"	"regulation of cardiac muscle adaptation"	"3/388"	"19/17913"	0.00755076839460367	0.0489952904322921	0.0373971929935162	"493/4000/5530"	3
+"869"	"Dn"	"GO:0032042"	"mitochondrial DNA metabolic process"	"3/388"	"19/17913"	0.00755076839460367	0.0489952904322921	0.0373971929935162	"9361/142/3980"	3
+"870"	"Dn"	"GO:0032069"	"regulation of nuclease activity"	"3/388"	"19/17913"	0.00755076839460367	0.0489952904322921	0.0373971929935162	"4869/6917/5111"	3
+"871"	"Dn"	"GO:1903242"	"regulation of cardiac muscle hypertrophy in response to stress"	"3/388"	"19/17913"	0.00755076839460367	0.0489952904322921	0.0373971929935162	"493/4000/5530"	3
+"872"	"Dn"	"GO:0021537"	"telencephalon development"	"12/388"	"246/17913"	0.00758701664783955	0.0491357851508118	0.0375044299964341	"220/306/2618/493/2316/3799/1956/55236/2049/4628/471/1499"	12
+"873"	"Dn"	"GO:0099173"	"postsynapse organization"	"9/388"	"158/17913"	0.00759669091242485	0.0491357851508118	0.0375044299964341	"3675/2049/6712/87/4628/3312/170506/1739/1742"	9
+"874"	"Dn"	"GO:0048588"	"developmental cell growth"	"11/388"	"216/17913"	0.00762846499804647	0.0492626072999843	0.0376012309817249	"2539/3326/23394/2803/3320/23191/3688/8239/1499/8826/7414"	11
+"875"	"Dn"	"GO:0030111"	"regulation of Wnt signaling pathway"	"15/388"	"341/17913"	0.00771552670270342	0.0497454898395639	0.0379698062338874	"857/1277/4790/3675/8452/5713/1956/8607/3728/5707/6597/5708/5701/1499/5700"	15
--- a/test-data/Gene_ID_BreastDn.txt	Thu Jan 23 03:16:11 2020 -0500
+++ b/test-data/Gene_ID_BreastDn.txt	Tue Feb 04 05:16:19 2020 -0500
@@ -1,697 +1,697 @@
-Gene names	Protein names	Protein IDs	Welch test p-value	Welch test Difference	Cluster	GeneID	Ensembl_Gene
-LAMA3	Laminin subunit alpha-3	Q16787	3,1687E-06	-1,400093984	Downregualted in Tumor	3909	ENSG00000053747
-SLC7A5;lat1	Large neutral amino acids transporter small subunit 1	Q01650	9,35698E-08	-1,150743779	Downregualted in Tumor	8140	ENSG00000103257
-SERPINB5	Serpin B5	P36952	4,18289E-07	-1,074692515	Downregualted in Tumor	5268	ENSG00000206075
-SERPINB5	Serpin B5	A0A024R2B6	4,18289E-07	-1,074692515	Downregualted in Tumor	5268	NA
-ASNS	Asparagine synthetase [glutamine-hydrolyzing]	P08243	1,66709E-06	-1,06512767	Downregualted in Tumor	440	ENSG00000070669
-KRT5	Keratin, type II cytoskeletal 5	P13647	0,00018084	-1,061978052	Downregualted in Tumor	3852	ENSG00000186081
-CAV1	Caveolin-1;Caveolin	Q03135	1,31585E-08	-1,030079667	Downregualted in Tumor	857	ENSG00000105974
-CAV1	Caveolin-1;Caveolin	Q2TNI1	1,31585E-08	-1,030079667	Downregualted in Tumor	857	NA
-CAV1	Caveolin-1;Caveolin	Q59E85	1,31585E-08	-1,030079667	Downregualted in Tumor	857	NA
-CAV1	Caveolin-1;Caveolin	A9XTE5	1,31585E-08	-1,030079667	Downregualted in Tumor	857	NA
-ACSF2	Acyl-CoA synthetase family member 2, mitochondrial	Q96CM8	7,3569E-05	-0,99480022	Downregualted in Tumor	80221	ENSG00000167107
-ACSF2	Acyl-CoA synthetase family member 2, mitochondrial	E9PF16	7,3569E-05	-0,99480022	Downregualted in Tumor	80221	ENSG00000167107
-ACSF2	Acyl-CoA synthetase family member 2, mitochondrial	B4DTB9	7,3569E-05	-0,99480022	Downregualted in Tumor	80221	NA
-ITGA6	Integrin alpha-6;Integrin alpha-6 heavy chain;Integrin alpha-6 light chain	P23229	2,01299E-06	-0,980933035	Downregualted in Tumor	3655	ENSG00000091409
-ITGB4	Integrin beta	A0A024R8K7	6,61087E-10	-0,979720083	Downregualted in Tumor	3691	NA
-ITGB4	Integrin beta	B7ZLD8	6,61087E-10	-0,979720083	Downregualted in Tumor	3691	NA
-TFRC	Transferrin receptor protein 1;Transferrin receptor protein 1, serum form	P02786	7,9451E-08	-0,961853047	Downregualted in Tumor	7037	ENSG00000072274
-TFRC	Transferrin receptor protein 1;Transferrin receptor protein 1, serum form	G3V0E5	7,9451E-08	-0,961853047	Downregualted in Tumor	7037	ENSG00000072274
-TFRC	Transferrin receptor protein 1;Transferrin receptor protein 1, serum form	B7Z2I6	7,9451E-08	-0,961853047	Downregualted in Tumor	7037	NA
-TFRC	Transferrin receptor protein 1;Transferrin receptor protein 1, serum form	Q9UP52	7,9451E-08	-0,961853047	Downregualted in Tumor	7036	ENSG00000106327
-NAT10	N-acetyltransferase 10	Q9H0A0	3,04492E-05	-0,952848508	Downregualted in Tumor	55226	ENSG00000135372
-SPRR1B	Cornifin-B	P22528	0,00277333	-0,948371322	Downregualted in Tumor	6699	ENSG00000169469
-PHGDH;PGDH3	D-3-phosphoglycerate dehydrogenase	O43175	1,55392E-08	-0,936814458	Downregualted in Tumor	26227	ENSG00000092621
-FTSJ3	pre-rRNA processing protein FTSJ3	Q8IY81	4,88486E-08	-0,932961961	Downregualted in Tumor	117246	ENSG00000108592
-GNL3	Guanine nucleotide-binding protein-like 3	Q9BVP2	7,3644E-06	-0,928687143	Downregualted in Tumor	26354	ENSG00000163938
-ASS1;ASS	Argininosuccinate synthase	P00966	1,80149E-06	-0,924816978	Downregualted in Tumor	445	ENSG00000130707
-ASS1;ASS	Argininosuccinate synthase	Q5T6L4	1,80149E-06	-0,924816978	Downregualted in Tumor	445	NA
-WDR11;DKFZp434L1715	WD repeat-containing protein 11	Q9BZH6	0,005051577	-0,924780542	Downregualted in Tumor	55717	ENSG00000120008
-SPTBN1	Spectrin beta chain, non-erythrocytic 1	Q01082	1,34021E-07	-0,923438056	Downregualted in Tumor	6711	ENSG00000115306
-SPTBN1	Spectrin beta chain, non-erythrocytic 1	B2ZZ89	1,34021E-07	-0,923438056	Downregualted in Tumor	6711	NA
-KRT6A	Keratin, type II cytoskeletal 6A	P02538	0,003529226	-0,920052752	Downregualted in Tumor	3853	ENSG00000205420
-NCAPH	Condensin complex subunit 2	Q15003	0,007723664	-0,918386324	Downregualted in Tumor	23397	ENSG00000121152
-NCAPH	Condensin complex subunit 2	B4DRG7	0,007723664	-0,918386324	Downregualted in Tumor	23397	NA
-DDX21	Nucleolar RNA helicase 2	Q9NR30	3,42513E-08	-0,915125615	Downregualted in Tumor	9188	ENSG00000165732
-G6PD	Glucose-6-phosphate 1-dehydrogenase	P11413	8,00091E-09	-0,893817022	Downregualted in Tumor	2539	ENSG00000160211
-SLC3A2	4F2 cell-surface antigen heavy chain	P08195	1,45782E-06	-0,881083346	Downregualted in Tumor	6520	ENSG00000168003
-SLC3A2	4F2 cell-surface antigen heavy chain	J3KPF3	1,45782E-06	-0,881083346	Downregualted in Tumor	6520	ENSG00000168003
-SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	O95347	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	ENSG00000136824
-SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	A0A024R158	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
-SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	A8K984	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
-SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	B7ZLZ7	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
-SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	B3KMB1	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
-SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	Q05BV1	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
-SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	Q6IPS5	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
-SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	Q05D74	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
-SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	Q7Z2X1	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
-OCLN	Occludin	Q16625	3,20963E-05	-0,878711509	Downregualted in Tumor	100506658	ENSG00000197822
-OCLN	Occludin	A8K3T2	3,20963E-05	-0,878711509	Downregualted in Tumor	100506658	NA
-CTPS1	CTP synthase 1	P17812	1,29357E-06	-0,876439652	Downregualted in Tumor	1503	ENSG00000171793
-CTPS1	CTP synthase 1	B4E1E0	1,29357E-06	-0,876439652	Downregualted in Tumor	1503	NA
-GMPS	GMP synthase [glutamine-hydrolyzing]	P49915	1,42995E-06	-0,858913572	Downregualted in Tumor	8833	ENSG00000163655
-CA8	Carbonic anhydrase-related protein	P35219	0,002127208	-0,853246743	Downregualted in Tumor	767	ENSG00000178538
-DSP;DSP variant protein	Desmoplakin	P15924	6,15905E-07	-0,849624601	Downregualted in Tumor	1832	ENSG00000096696
-DSP;DSP variant protein	Desmoplakin	Q4LE79	6,15905E-07	-0,849624601	Downregualted in Tumor	1832	NA
-DSP;DSP variant protein	Desmoplakin	B4DKX6	6,15905E-07	-0,849624601	Downregualted in Tumor	1832	NA
-MTHFD1L	Monofunctional C1-tetrahydrofolate synthase, mitochondrial	Q6UB35	6,59381E-05	-0,833670187	Downregualted in Tumor	25902	ENSG00000120254
-MTHFD1L	Monofunctional C1-tetrahydrofolate synthase, mitochondrial	A0A087WVM4	6,59381E-05	-0,833670187	Downregualted in Tumor	25902	ENSG00000120254
-MTHFD1L	Monofunctional C1-tetrahydrofolate synthase, mitochondrial	B7ZM99	6,59381E-05	-0,833670187	Downregualted in Tumor	25902	ENSG00000120254
-MTHFD1L	Monofunctional C1-tetrahydrofolate synthase, mitochondrial	B2RD24	6,59381E-05	-0,833670187	Downregualted in Tumor	25902	NA
-EHD1	EH domain-containing protein 1	Q9H4M9	1,90023E-07	-0,830043132	Downregualted in Tumor	10938	ENSG00000110047
-EHD1	EH domain-containing protein 1	B2R5U3	1,90023E-07	-0,830043132	Downregualted in Tumor	10938	NA
-EHD1	EH domain-containing protein 1	A0A024R571	1,90023E-07	-0,830043132	Downregualted in Tumor	10938	ENSG00000110047
-PES1	Pescadillo homolog	O00541	0,000676951	-0,826673569	Downregualted in Tumor	23481	ENSG00000100029
-PES1	Pescadillo homolog	B2RDF2	0,000676951	-0,826673569	Downregualted in Tumor	23481	NA
-PES1	Pescadillo homolog	B3KXD6	0,000676951	-0,826673569	Downregualted in Tumor	23481	ENSG00000100029
-LAMC2	Laminin subunit gamma-2	Q13753	5,61515E-06	-0,814967484	Downregualted in Tumor	3918	ENSG00000058085
-ALDH1A3;DKFZp686G1675	Aldehyde dehydrogenase family 1 member A3	P47895	2,88978E-05	-0,810954269	Downregualted in Tumor	220	ENSG00000184254
-ALDH1A3;DKFZp686G1675	Aldehyde dehydrogenase family 1 member A3	A0A024RC95	2,88978E-05	-0,810954269	Downregualted in Tumor	220	NA
-ALDH1A3;DKFZp686G1675	Aldehyde dehydrogenase family 1 member A3	H0Y2X5	2,88978E-05	-0,810954269	Downregualted in Tumor	220	ENSG00000184254
-ALDH1A3;DKFZp686G1675	Aldehyde dehydrogenase family 1 member A3	Q7Z3A2	2,88978E-05	-0,810954269	Downregualted in Tumor	220	NA
-ATP1A1	Sodium/potassium-transporting ATPase subunit alpha-1	P05023	2,75542E-10	-0,81037753	Downregualted in Tumor	476	ENSG00000163399
-UTP20	Small subunit processome component 20 homolog	O75691	2,03064E-05	-0,804653456	Downregualted in Tumor	27340	ENSG00000120800
-IGF2BP2	Insulin-like growth factor 2 mRNA-binding protein 2	Q9Y6M1	0,006321334	-0,795419088	Downregualted in Tumor	10644	ENSG00000073792
-IGF2BP2	Insulin-like growth factor 2 mRNA-binding protein 2	F8W930	0,006321334	-0,795419088	Downregualted in Tumor	10644	ENSG00000073792
-IGF2BP2	Insulin-like growth factor 2 mRNA-binding protein 2	B4DKT5	0,006321334	-0,795419088	Downregualted in Tumor	10644	NA
-CRYAB	Alpha-crystallin B chain	P02511	0,001634189	-0,786896352	Downregualted in Tumor	1410	ENSG00000109846
-CRYAB	Alpha-crystallin B chain	V9HW27	0,001634189	-0,786896352	Downregualted in Tumor	1410	NA
-CRYAB	Alpha-crystallin B chain	A0A024R3B9	0,001634189	-0,786896352	Downregualted in Tumor	1410	ENSG00000109846
-HSPD1	60 kDa heat shock protein, mitochondrial	P10809	1,28921E-10	-0,784529094	Downregualted in Tumor	3329	ENSG00000144381
-HSPD1	60 kDa heat shock protein, mitochondrial	A0A024R3X4	1,28921E-10	-0,784529094	Downregualted in Tumor	3329	NA
-TRIP6;TRIP6i1	Thyroid receptor-interacting protein 6	Q15654	0,001314986	-0,78277387	Downregualted in Tumor	7205	ENSG00000087077
-ANLN	Actin-binding protein anillin	Q9NQW6	0,005289009	-0,782161534	Downregualted in Tumor	54443	ENSG00000011426
-ANLN	Actin-binding protein anillin	A0A024RA49	0,005289009	-0,782161534	Downregualted in Tumor	54443	NA
-ANLN	Actin-binding protein anillin	A8K5D9	0,005289009	-0,782161534	Downregualted in Tumor	54443	NA
-MIA3	Melanoma inhibitory activity protein 3	Q5JRA6	1,10791E-05	-0,781499875	Downregualted in Tumor	375056	ENSG00000154305
-LDHB	L-lactate dehydrogenase B chain;L-lactate dehydrogenase	P07195	2,65903E-10	-0,779144822	Downregualted in Tumor	3945	ENSG00000111716
-LDHB	L-lactate dehydrogenase B chain;L-lactate dehydrogenase	Q5U077	2,65903E-10	-0,779144822	Downregualted in Tumor	3945	NA
-TUBA4A	Tubulin alpha-4A chain	P68366	5,12664E-06	-0,777504329	Downregualted in Tumor	7277	ENSG00000127824
-UHRF1	E3 ubiquitin-protein ligase UHRF1	Q96T88	0,000735849	-0,77577958	Downregualted in Tumor	29128	ENSG00000276043
-UHRF1	E3 ubiquitin-protein ligase UHRF1	A0A087WVR3	0,000735849	-0,77577958	Downregualted in Tumor	29128	ENSG00000276043
-RFC4	Replication factor C subunit 4	P35249	0,000990499	-0,770350482	Downregualted in Tumor	5984	ENSG00000163918
-ERLIN2	Erlin-2	O94905	0,000111752	-0,767481127	Downregualted in Tumor	11160	ENSG00000147475
-MSH2	DNA mismatch repair protein Msh2	P43246	6,11475E-06	-0,76673187	Downregualted in Tumor	4436	ENSG00000095002
-SPAG9	C-Jun-amino-terminal kinase-interacting protein 4	O60271	3,66432E-07	-0,766705518	Downregualted in Tumor	9043	ENSG00000008294
-ANXA8;ANXA8L1	Annexin A8;Annexin;Annexin A8-like protein 1	P13928	1,40812E-05	-0,765130309	Downregualted in Tumor	728113;653145	ENSG00000265190
-ANXA8;ANXA8L1	Annexin A8;Annexin;Annexin A8-like protein 1	B4DTB3	1,40812E-05	-0,765130309	Downregualted in Tumor	653145	NA
-ANXA8;ANXA8L1	Annexin A8;Annexin;Annexin A8-like protein 1	A0A087WTN9	1,40812E-05	-0,765130309	Downregualted in Tumor	653145	ENSG00000265190
-COL1A1	Collagen alpha-1(I) chain	P02452	0,000183691	-0,764177238	Downregualted in Tumor	1277	ENSG00000108821
-KRT86	Keratin, type II cuticular Hb6	O43790	6,46876E-05	-0,753458903	Downregualted in Tumor	3892	ENSG00000170442
-KRT86	Keratin, type II cuticular Hb6	A8K872	6,46876E-05	-0,753458903	Downregualted in Tumor	3892	NA
-DHCR7	7-dehydrocholesterol reductase	Q9UBM7	1,73874E-06	-0,752399769	Downregualted in Tumor	1717	ENSG00000172893
-DHCR7	7-dehydrocholesterol reductase	A0A024R5F7	1,73874E-06	-0,752399769	Downregualted in Tumor	1717	NA
-ANXA3	Annexin A3;Annexin	P12429	3,96339E-05	-0,748518784	Downregualted in Tumor	306	ENSG00000138772
-UTP18	U3 small nucleolar RNA-associated protein 18 homolog	Q9Y5J1	0,002631407	-0,747487302	Downregualted in Tumor	51096	ENSG00000011260
-NOMO2;NOMO3	Nodal modulator 2;Nodal modulator 3	Q5JPE7	3,14308E-05	-0,744997421	Downregualted in Tumor	283820	ENSG00000185164
-NOMO2;NOMO3	Nodal modulator 2;Nodal modulator 3	P69849	3,14308E-05	-0,744997421	Downregualted in Tumor	408050	ENSG00000278087;ENSG00000103226
-NOMO2;NOMO3	Nodal modulator 2;Nodal modulator 3	J3KN36	3,14308E-05	-0,744997421	Downregualted in Tumor	408050	ENSG00000278087;ENSG00000103226
-NOMO2;NOMO3	Nodal modulator 2;Nodal modulator 3	Q1LZN2	3,14308E-05	-0,744997421	Downregualted in Tumor	408050	NA
-HSP90AB1	Heat shock protein HSP 90-beta	P08238	1,69927E-09	-0,741839087	Downregualted in Tumor	3326	ENSG00000096384
-HSP90AB1	Heat shock protein HSP 90-beta	A0A024RD80	1,69927E-09	-0,741839087	Downregualted in Tumor	3326	NA
-HSP90AB1	Heat shock protein HSP 90-beta	B4DGL0	1,69927E-09	-0,741839087	Downregualted in Tumor	3326	NA
-HSP90AB1	Heat shock protein HSP 90-beta	Q6PK50	1,69927E-09	-0,741839087	Downregualted in Tumor	3326	NA
-ADNP	Activity-dependent neuroprotector homeobox protein	Q9H2P0	0,001960616	-0,738990315	Downregualted in Tumor	23394	ENSG00000101126
-ADNP	Activity-dependent neuroprotector homeobox protein	Q6DHZ8	0,001960616	-0,738990315	Downregualted in Tumor	23394	NA
-LARS	Leucine--tRNA ligase, cytoplasmic	Q9P2J5	2,02969E-08	-0,738194248	Downregualted in Tumor	51520	ENSG00000133706
-LARS	Leucine--tRNA ligase, cytoplasmic	B4DER1	2,02969E-08	-0,738194248	Downregualted in Tumor	51520	NA
-LARS	Leucine--tRNA ligase, cytoplasmic	B4E266	2,02969E-08	-0,738194248	Downregualted in Tumor	51520	NA
-BOP1	Ribosome biogenesis protein BOP1	Q14137	8,60666E-06	-0,732046295	Downregualted in Tumor	23246	ENSG00000261236;ENSG00000285301
-HSPH1	Heat shock protein 105 kDa	Q92598	1,30416E-08	-0,729742324	Downregualted in Tumor	10808	ENSG00000120694
-HSPH1	Heat shock protein 105 kDa	A0A024RDS1	1,30416E-08	-0,729742324	Downregualted in Tumor	10808	NA
-HSPH1	Heat shock protein 105 kDa	A0A024RDQ0	1,30416E-08	-0,729742324	Downregualted in Tumor	10808	NA
-HSPH1	Heat shock protein 105 kDa	B4DY72	1,30416E-08	-0,729742324	Downregualted in Tumor	10808	NA
-NVL	Nuclear valosin-containing protein-like	O15381	0,000281968	-0,729292199	Downregualted in Tumor	4931	ENSG00000143748
-NVL	Nuclear valosin-containing protein-like	B4DF43	0,000281968	-0,729292199	Downregualted in Tumor	4931	NA
-TBCE	Tubulin-specific chaperone E	Q15813	0,005486615	-0,728700574	Downregualted in Tumor	6905	ENSG00000285053;ENSG00000284770;ENSG00000282984
-MSH6;GTBP	DNA mismatch repair protein Msh6	P52701	2,59178E-06	-0,723915352	Downregualted in Tumor	2956	ENSG00000116062
-MSH6;GTBP	DNA mismatch repair protein Msh6	Q3SWU9	2,59178E-06	-0,723915352	Downregualted in Tumor	2956	NA
-SMC4	Structural maintenance of chromosomes protein 4;Structural maintenance of chromosomes protein	Q9NTJ3	0,001139478	-0,723597445	Downregualted in Tumor	10051	ENSG00000113810
-SMC4	Structural maintenance of chromosomes protein 4;Structural maintenance of chromosomes protein	E9PD53	0,001139478	-0,723597445	Downregualted in Tumor	10051	ENSG00000113810
-SMC4	Structural maintenance of chromosomes protein 4;Structural maintenance of chromosomes protein	B3KXX5	0,001139478	-0,723597445	Downregualted in Tumor	10051	NA
-SMC4	Structural maintenance of chromosomes protein 4;Structural maintenance of chromosomes protein	Q58F29	0,001139478	-0,723597445	Downregualted in Tumor	10051	NA
-NFKB1	Nuclear factor NF-kappa-B p105 subunit;Nuclear factor NF-kappa-B p50 subunit	P19838	0,00696192	-0,718194274	Downregualted in Tumor	4790	ENSG00000109320
-NFKB1	Nuclear factor NF-kappa-B p105 subunit;Nuclear factor NF-kappa-B p50 subunit	A0A024RDJ4	0,00696192	-0,718194274	Downregualted in Tumor	4790	NA
-AHNAK	Neuroblast differentiation-associated protein AHNAK	Q09666	5,17822E-08	-0,717602003	Downregualted in Tumor	79026	ENSG00000124942
-AHNAK	Neuroblast differentiation-associated protein AHNAK	B4DTV0	5,17822E-08	-0,717602003	Downregualted in Tumor	79026	NA
-AHNAK	Neuroblast differentiation-associated protein AHNAK	Q9BVU3	5,17822E-08	-0,717602003	Downregualted in Tumor	79026	NA
-IPO4	Importin-4	Q8TEX9	0,000679847	-0,717398863	Downregualted in Tumor	79711	ENSG00000285248;ENSG00000196497
-IPO4	Importin-4	B3KT38	0,000679847	-0,717398863	Downregualted in Tumor	79711	NA
-PSAT1	Phosphoserine aminotransferase	Q9Y617	0,000699166	-0,716590086	Downregualted in Tumor	29968	ENSG00000135069
-PSAT1	Phosphoserine aminotransferase	A0A024R222	0,000699166	-0,716590086	Downregualted in Tumor	29968	NA
-PSAT1	Phosphoserine aminotransferase	A0A024R280	0,000699166	-0,716590086	Downregualted in Tumor	29968	NA
-TPR	Nucleoprotein TPR	P12270	0,000435138	-0,710929382	Downregualted in Tumor	7175	ENSG00000047410
-DSG3	Desmoglein-3	P32926	0,000641018	-0,709144403	Downregualted in Tumor	1830	ENSG00000134757
-DNTTIP2	Deoxynucleotidyltransferase terminal-interacting protein 2	Q5QJE6	0,001988168	-0,703198723	Downregualted in Tumor	30836	ENSG00000067334
-TBL3	Transducin beta-like protein 3	Q12788	0,001330934	-0,701020666	Downregualted in Tumor	10607	ENSG00000183751
-CIRH1A	Cirhin	Q969X6	0,001497746	-0,696756095	Downregualted in Tumor	84916	ENSG00000262788;ENSG00000141076
-UTP15	U3 small nucleolar RNA-associated protein 15 homolog	Q8TED0	0,000580015	-0,695363344	Downregualted in Tumor	84135	ENSG00000164338
-LCN2;NGAL	Neutrophil gelatinase-associated lipocalin	P80188	8,48128E-05	-0,69322885	Downregualted in Tumor	3934	ENSG00000148346
-ITGA2	Integrin alpha-2	P17301	3,14858E-06	-0,692416132	Downregualted in Tumor	3673	ENSG00000164171
-APOBEC3B	DNA dC->dU-editing enzyme APOBEC-3B	Q9UH17	0,002091541	-0,692250959	Downregualted in Tumor	9582	ENSG00000179750
-APOBEC3B	DNA dC->dU-editing enzyme APOBEC-3B	Q6ICH2	0,002091541	-0,692250959	Downregualted in Tumor	140564	ENSG00000243811
-APOBEC3B	DNA dC->dU-editing enzyme APOBEC-3B	B2CML4	0,002091541	-0,692250959	Downregualted in Tumor	140564	NA
-RRP9	U3 small nucleolar RNA-interacting protein 2	O43818	0,00955613	-0,689404364	Downregualted in Tumor	9136	ENSG00000114767
-ANXA1	Annexin A1;Annexin	P04083	1,4089E-06	-0,689085617	Downregualted in Tumor	301	ENSG00000135046
-ANXA1	Annexin A1;Annexin	Q5TZZ9	1,4089E-06	-0,689085617	Downregualted in Tumor	301	NA
-STIP1	Stress-induced-phosphoprotein 1	P31948	1,15799E-08	-0,685815079	Downregualted in Tumor	10963	ENSG00000168439
-STIP1	Stress-induced-phosphoprotein 1	V9HW72	1,15799E-08	-0,685815079	Downregualted in Tumor	10963	NA
-POLR2A	DNA-directed RNA polymerase II subunit RPB1	P24928	0,000920197	-0,683297656	Downregualted in Tumor	5430	ENSG00000181222
-PLEC	Plectin	Q15149	2,45786E-08	-0,681744248	Downregualted in Tumor	5339	ENSG00000178209
-FDFT1	Squalene synthase	P37268	0,000144706	-0,681491473	Downregualted in Tumor	2222	ENSG00000079459
-FDFT1	Squalene synthase	Q6IAX1	0,000144706	-0,681491473	Downregualted in Tumor	2222	NA
-FDFT1	Squalene synthase	B4DND3	0,000144706	-0,681491473	Downregualted in Tumor	2222	NA
-FDFT1	Squalene synthase	B7Z9R8	0,000144706	-0,681491473	Downregualted in Tumor	2222	NA
-NRD1	Nardilysin	O43847	0,002312247	-0,680530134	Downregualted in Tumor	4898	ENSG00000078618
-NRD1	Nardilysin	B1AKJ5	0,002312247	-0,680530134	Downregualted in Tumor	4898	ENSG00000078618
-NRD1	Nardilysin	Q6UUU9	0,002312247	-0,680530134	Downregualted in Tumor	4898	NA
-NRD1	Nardilysin	G3V1R5	0,002312247	-0,680530134	Downregualted in Tumor	4898	ENSG00000078618
-HK2	Hexokinase-2	P52789	0,000109561	-0,677769184	Downregualted in Tumor	3099	ENSG00000159399
-DHX16	Putative pre-mRNA-splicing factor ATP-dependent RNA helicase DHX16	O60231	0,007588644	-0,675095839	Downregualted in Tumor	8449	ENSG00000204560;ENSG00000233418;ENSG00000233049;ENSG00000233561;ENSG00000226171;ENSG00000231377;ENSG00000206486
-DHX16	Putative pre-mRNA-splicing factor ATP-dependent RNA helicase DHX16	Q5SQH4	0,007588644	-0,675095839	Downregualted in Tumor	8449	NA
-DHX16	Putative pre-mRNA-splicing factor ATP-dependent RNA helicase DHX16	Q5SQH5	0,007588644	-0,675095839	Downregualted in Tumor	8449	ENSG00000204560;ENSG00000233418;ENSG00000233049;ENSG00000233561;ENSG00000226171;ENSG00000231377
-XPOT	Exportin-T	O43592	0,000142579	-0,672464874	Downregualted in Tumor	11260	ENSG00000184575
-DDX19A;DKFZp762C1313;hCG_1998531	ATP-dependent RNA helicase DDX19A	Q9NUU7	4,53341E-05	-0,672330671	Downregualted in Tumor	55308	ENSG00000168872
-DDX19A;DKFZp762C1313;hCG_1998531	ATP-dependent RNA helicase DDX19A	I3L0H8	4,53341E-05	-0,672330671	Downregualted in Tumor	55308	ENSG00000168872
-DDX19A;DKFZp762C1313;hCG_1998531	ATP-dependent RNA helicase DDX19A	B4DS24	4,53341E-05	-0,672330671	Downregualted in Tumor	55308	NA
-DDX19A;DKFZp762C1313;hCG_1998531	ATP-dependent RNA helicase DDX19A	B4DL69	4,53341E-05	-0,672330671	Downregualted in Tumor	11269	NA
-KIF23	Kinesin-like protein KIF23	Q02241	0,006707505	-0,670735416	Downregualted in Tumor	9493	ENSG00000137807
-RDX	Radixin	P35241	2,37466E-05	-0,665698467	Downregualted in Tumor	5962	ENSG00000137710
-RDX	Radixin	B0YJ88	2,37466E-05	-0,665698467	Downregualted in Tumor	5962	NA
-RDX	Radixin	Q6PKD3	2,37466E-05	-0,665698467	Downregualted in Tumor	5962	NA
-AP2A2	AP-2 complex subunit alpha-2	O94973	0,010588934	-0,662948059	Downregualted in Tumor	161	ENSG00000183020
-ITGA3	Integrin alpha-3;Integrin alpha-3 heavy chain;Integrin alpha-3 light chain	P26006	0,001060817	-0,662132858	Downregualted in Tumor	3675	ENSG00000005884
-ARHGEF2	Rho guanine nucleotide exchange factor 2	Q92974	5,30564E-05	-0,662033953	Downregualted in Tumor	9181	ENSG00000116584
-MCM2	DNA replication licensing factor MCM2	P49736	1,59896E-05	-0,661017833	Downregualted in Tumor	4171	ENSG00000073111
-GTPBP4	Nucleolar GTP-binding protein 1	Q9BZE4	0,001124113	-0,660227115	Downregualted in Tumor	23560	ENSG00000107937
-GTPBP4	Nucleolar GTP-binding protein 1	D2CFK9	0,001124113	-0,660227115	Downregualted in Tumor	23560	NA
-GEMIN5	Gem-associated protein 5	Q8TEQ6	0,004642141	-0,658230106	Downregualted in Tumor	25929	ENSG00000082516
-GEMIN5	Gem-associated protein 5	B7ZLC9	0,004642141	-0,658230106	Downregualted in Tumor	25929	NA
-GEMIN5	Gem-associated protein 5	Q58EZ8	0,004642141	-0,658230106	Downregualted in Tumor	25929	NA
-GOLGA4	Golgin subfamily A member 4	Q13439	0,001031108	-0,656149822	Downregualted in Tumor	2803	ENSG00000144674
-GOLGA4	Golgin subfamily A member 4	Q49A56	0,001031108	-0,656149822	Downregualted in Tumor	2803	NA
-STXBP3	Syntaxin-binding protein 3	O00186	0,000816102	-0,647855413	Downregualted in Tumor	6814	ENSG00000116266
-RRP12	RRP12-like protein	Q5JTH9	3,34076E-05	-0,645909078	Downregualted in Tumor	23223	ENSG00000052749
-RRP12	RRP12-like protein	B3KMR5	3,34076E-05	-0,645909078	Downregualted in Tumor	23223	NA
-GART	Trifunctional purine biosynthetic protein adenosine-3;Phosphoribosylamine--glycine ligase;Phosphoribosylformylglycinamidine cyclo-ligase;Phosphoribosylglycinamide formyltransferase	P22102	1,07892E-07	-0,645182659	Downregualted in Tumor	2618	ENSG00000159131;ENSG00000262473
-GART	Trifunctional purine biosynthetic protein adenosine-3;Phosphoribosylamine--glycine ligase;Phosphoribosylformylglycinamidine cyclo-ligase;Phosphoribosylglycinamide formyltransferase	Q59HH3	1,07892E-07	-0,645182659	Downregualted in Tumor	2618	NA
-PDCD11	Protein RRP5 homolog	Q14690	0,000398164	-0,643626638	Downregualted in Tumor	22984	ENSG00000148843
-GRPEL1	GrpE protein homolog 1, mitochondrial	Q9HAV7	0,002340415	-0,641239454	Downregualted in Tumor	80273	ENSG00000109519
-COLGALT1	Procollagen galactosyltransferase 1	Q8NBJ5	2,4617E-05	-0,640699749	Downregualted in Tumor	79709	ENSG00000130309
-CUL3	Cullin-3	Q13618	0,000323586	-0,640653965	Downregualted in Tumor	8452	ENSG00000036257
-CUL3	Cullin-3	A0A024R475	0,000323586	-0,640653965	Downregualted in Tumor	8452	NA
-CUL3	Cullin-3	B7Z600	0,000323586	-0,640653965	Downregualted in Tumor	8452	NA
-SLC1A5	Neutral amino acid transporter B(0)	Q15758	5,12288E-05	-0,636526534	Downregualted in Tumor	6510	ENSG00000105281
-FLOT2	Flotillin-2	Q14254	0,000303665	-0,636310852	Downregualted in Tumor	2319	ENSG00000132589
-FLOT2	Flotillin-2	A0A024QZ62	0,000303665	-0,636310852	Downregualted in Tumor	2319	NA
-FLOT2	Flotillin-2	Q6FG43	0,000303665	-0,636310852	Downregualted in Tumor	2319	NA
-FLOT2	Flotillin-2	J3QLD9	0,000303665	-0,636310852	Downregualted in Tumor	2319	ENSG00000132589
-NOP56	Nucleolar protein 56	O00567	5,66589E-07	-0,635833052	Downregualted in Tumor	10528	ENSG00000101361
-RMDN1	Regulator of microtubule dynamics protein 1	Q96DB5	0,000920322	-0,635827456	Downregualted in Tumor	51115	ENSG00000176623
-RMDN1	Regulator of microtubule dynamics protein 1	E5RH53	0,000920322	-0,635827456	Downregualted in Tumor	51115	ENSG00000176623
-TLDC1;KIAA1609	TLD domain-containing protein 1	Q6P9B6	0,002720092	-0,635407828	Downregualted in Tumor	57707	ENSG00000140950
-ACSL3	Long-chain-fatty-acid--CoA ligase 3	O95573	0,000182493	-0,63457249	Downregualted in Tumor	2181	ENSG00000123983
-ACSL3	Long-chain-fatty-acid--CoA ligase 3	A0A024R497	0,000182493	-0,63457249	Downregualted in Tumor	2181	NA
-PSMD7	26S proteasome non-ATPase regulatory subunit 7	P51665	0,001203831	-0,63438699	Downregualted in Tumor	5713	ENSG00000103035
-ACTL6A	Actin-like protein 6A	O96019	3,2497E-05	-0,63404137	Downregualted in Tumor	86	ENSG00000136518
-PFKP	6-phosphofructokinase type C	Q01813	7,90425E-07	-0,633722924	Downregualted in Tumor	5214	ENSG00000067057
-HSP90AA1;EL52	Heat shock protein HSP 90-alpha	P07900	2,11258E-07	-0,633537145	Downregualted in Tumor	3320	ENSG00000080824
-HSP90AA1;EL52	Heat shock protein HSP 90-alpha	K9JA46	2,11258E-07	-0,633537145	Downregualted in Tumor	3320	NA
-HSP90AA1;EL52	Heat shock protein HSP 90-alpha	Q86SX1	2,11258E-07	-0,633537145	Downregualted in Tumor	3320	NA
-MCM6	DNA replication licensing factor MCM6	Q14566	4,45165E-06	-0,632859052	Downregualted in Tumor	4175	ENSG00000076003
-TOP1	DNA topoisomerase 1	P11387	2,49926E-05	-0,631151	Downregualted in Tumor	7150	ENSG00000198900
-TOP1	DNA topoisomerase 1	Q9BVT2	2,49926E-05	-0,631151	Downregualted in Tumor	7150	NA
-TRIM33	E3 ubiquitin-protein ligase TRIM33	Q9UPN9	9,23797E-05	-0,630775432	Downregualted in Tumor	51592	ENSG00000197323
-TRIM33	E3 ubiquitin-protein ligase TRIM33	B3KN30	9,23797E-05	-0,630775432	Downregualted in Tumor	51592	NA
-ANXA2;ANXA2P2	Annexin A2;Annexin;Putative annexin A2-like protein	P07355	3,6622E-07	-0,630683913	Downregualted in Tumor	302	ENSG00000182718
-ANXA2;ANXA2P2	Annexin A2;Annexin;Putative annexin A2-like protein	A0A024R5Z7	3,6622E-07	-0,630683913	Downregualted in Tumor	302	NA
-GOLGA2	Golgin subfamily A member 2	Q08379	0,000599422	-0,626728678	Downregualted in Tumor	2801	ENSG00000167110
-SPTAN1	Spectrin alpha chain, non-erythrocytic 1	Q13813	3,42217E-06	-0,626585795	Downregualted in Tumor	6709	ENSG00000197694
-NPM1	Nucleophosmin	P06748	1,04604E-06	-0,623349789	Downregualted in Tumor	4869	ENSG00000181163
-TMEM205	Transmembrane protein 205	Q6UW68	0,000587132	-0,622823266	Downregualted in Tumor	374882	ENSG00000105518
-TMEM205	Transmembrane protein 205	A0A024R7D3	0,000587132	-0,622823266	Downregualted in Tumor	374882	NA
-IPO5	Importin-5	O00410	7,20713E-07	-0,621437326	Downregualted in Tumor	3843	ENSG00000065150
-IPO5	Importin-5	B3KWG6	7,20713E-07	-0,621437326	Downregualted in Tumor	3843	NA
-IPO5	Importin-5	Q9BVS9	7,20713E-07	-0,621437326	Downregualted in Tumor	3843	NA
-ATP2B4;DKFZp686M088	Plasma membrane calcium-transporting ATPase 4	P23634	0,000284107	-0,620920211	Downregualted in Tumor	493	ENSG00000058668
-ATP2B4;DKFZp686M088	Plasma membrane calcium-transporting ATPase 4	A0A024R968	0,000284107	-0,620920211	Downregualted in Tumor	493	NA
-HMGCS1	Hydroxymethylglutaryl-CoA synthase, cytoplasmic	Q01581	0,001203427	-0,619669474	Downregualted in Tumor	3157	ENSG00000112972
-HMGCS1	Hydroxymethylglutaryl-CoA synthase, cytoplasmic	A0A024R059	0,001203427	-0,619669474	Downregualted in Tumor	3157	NA
-RACGAP1	Rac GTPase-activating protein 1	Q9H0H5	0,010061792	-0,615725158	Downregualted in Tumor	29127	ENSG00000161800
-RACGAP1	Rac GTPase-activating protein 1	B2RE34	0,010061792	-0,615725158	Downregualted in Tumor	29127	NA
-RACGAP1	Rac GTPase-activating protein 1	A0A024R136	0,010061792	-0,615725158	Downregualted in Tumor	29127	NA
-ACLY;ACLY variant protein	ATP-citrate synthase	P53396	8,0658E-07	-0,613710314	Downregualted in Tumor	47	ENSG00000131473
-ACLY;ACLY variant protein	ATP-citrate synthase	A0A024R1T9	8,0658E-07	-0,613710314	Downregualted in Tumor	47	NA
-ACLY;ACLY variant protein	ATP-citrate synthase	Q4LE36	8,0658E-07	-0,613710314	Downregualted in Tumor	47	NA
-ACLY;ACLY variant protein	ATP-citrate synthase	A0A024R1Y2	8,0658E-07	-0,613710314	Downregualted in Tumor	47	NA
-ATXN10	Ataxin-10	Q9UBB4	2,39863E-05	-0,612369505	Downregualted in Tumor	25814	ENSG00000130638
-CORO1C	Coronin-1C;Coronin	Q9ULV4	0,000183002	-0,611936563	Downregualted in Tumor	23603	ENSG00000110880
-CORO1C	Coronin-1C;Coronin	A0A024RBI5	0,000183002	-0,611936563	Downregualted in Tumor	23603	NA
-CORO1C	Coronin-1C;Coronin	Q6QEF8	0,000183002	-0,611936563	Downregualted in Tumor	84940	ENSG00000167549
-CORO1C	Coronin-1C;Coronin	B3KRY9	0,000183002	-0,611936563	Downregualted in Tumor	84940	NA
-CORO1C	Coronin-1C;Coronin	B3KSZ9	0,000183002	-0,611936563	Downregualted in Tumor	84940	NA
-SKIV2L2	Superkiller viralicidic activity 2-like 2	P42285	0,000907648	-0,611404236	Downregualted in Tumor	23517	ENSG00000039123
-SKIV2L2	Superkiller viralicidic activity 2-like 2	Q3MHC9	0,000907648	-0,611404236	Downregualted in Tumor	23517	NA
-GLS	Glutaminase kidney isoform, mitochondrial	O94925	0,000702736	-0,610848119	Downregualted in Tumor	2744	ENSG00000115419
-FLNA	Filamin-A	P21333	1,90867E-06	-0,610782252	Downregualted in Tumor	2316	ENSG00000196924
-RANGAP1	Ran GTPase-activating protein 1	P46060	1,87872E-05	-0,609379838	Downregualted in Tumor	5905	ENSG00000100401
-RANGAP1	Ran GTPase-activating protein 1	A0A024R1U0	1,87872E-05	-0,609379838	Downregualted in Tumor	5905	NA
-RANGAP1	Ran GTPase-activating protein 1	Q9BSK3	1,87872E-05	-0,609379838	Downregualted in Tumor	5905	NA
-HEATR6	HEAT repeat-containing protein 6	Q6AI08	0,006087464	-0,607617521	Downregualted in Tumor	63897	ENSG00000068097
-SCAMP3	Secretory carrier-associated membrane protein 3	O14828	0,007988602	-0,607141838	Downregualted in Tumor	10067	ENSG00000116521;ENSG00000263290
-CLDN3	Claudin-3	O15551	0,006983346	-0,606985017	Downregualted in Tumor	1365	ENSG00000165215
-CLDN3	Claudin-3	Q75L79	0,006983346	-0,606985017	Downregualted in Tumor	1365	NA
-HBB	Hemoglobin subunit beta;LVV-hemorphin-7	P68871	0,006274827	-0,602485721	Downregualted in Tumor	3043	ENSG00000244734
-HBB	Hemoglobin subunit beta;LVV-hemorphin-7	D9YZU5	0,006274827	-0,602485721	Downregualted in Tumor	3043	NA
-KIF5B	Kinesin-1 heavy chain	P33176	8,84917E-06	-0,601674988	Downregualted in Tumor	3799	ENSG00000170759
-KIF5B	Kinesin-1 heavy chain	V9HW29	8,84917E-06	-0,601674988	Downregualted in Tumor	3799	NA
-DDX47;E4-DBP	Probable ATP-dependent RNA helicase DDX47	Q9H0S4	0,000181449	-0,600968445	Downregualted in Tumor	51202	ENSG00000213782
-DDX47;E4-DBP	Probable ATP-dependent RNA helicase DDX47	A0A024RAS3	0,000181449	-0,600968445	Downregualted in Tumor	51202	NA
-MCM3;HCC5	DNA replication licensing factor MCM3	P25205	1,82876E-06	-0,600052694	Downregualted in Tumor	4172	ENSG00000112118
-ACTN4	Alpha-actinin-4	O43707	3,84608E-07	-0,599992562	Downregualted in Tumor	81	ENSG00000130402;ENSG00000282844
-DIAPH1	Protein diaphanous homolog 1	O60610	8,54451E-07	-0,599989558	Downregualted in Tumor	1729	ENSG00000131504
-DIAPH1	Protein diaphanous homolog 1	Q6URC4	8,54451E-07	-0,599989558	Downregualted in Tumor	1729	NA
-YARS	Tyrosine--tRNA ligase, cytoplasmic;Tyrosine--tRNA ligase, cytoplasmic, N-terminally processed	P54577	1,62207E-06	-0,597541458	Downregualted in Tumor	8565	ENSG00000134684
-NOP2	Putative ribosomal RNA methyltransferase NOP2	P46087	6,18707E-05	-0,594384037	Downregualted in Tumor	4839	ENSG00000111641
-NOP58	Nucleolar protein 58	Q9Y2X3	9,53354E-06	-0,594313956	Downregualted in Tumor	51602	ENSG00000055044
-ACSL1	Long-chain-fatty-acid--CoA ligase 1	P33121	6,28035E-05	-0,592887823	Downregualted in Tumor	2180	ENSG00000151726
-ACSL1	Long-chain-fatty-acid--CoA ligase 1	A8K9T3	6,28035E-05	-0,592887823	Downregualted in Tumor	2180	NA
-ACSL1	Long-chain-fatty-acid--CoA ligase 1	E7EPM6	6,28035E-05	-0,592887823	Downregualted in Tumor	2180	ENSG00000151726
-ACSL1	Long-chain-fatty-acid--CoA ligase 1	B4E0R0	6,28035E-05	-0,592887823	Downregualted in Tumor	2180	NA
-ACSL1	Long-chain-fatty-acid--CoA ligase 1	B7Z3Z9	6,28035E-05	-0,592887823	Downregualted in Tumor	2180	ENSG00000151726
-PRPF4	U4/U6 small nuclear ribonucleoprotein Prp4	O43172	0,000243083	-0,591774161	Downregualted in Tumor	9128	ENSG00000136875
-PRPF4	U4/U6 small nuclear ribonucleoprotein Prp4	Q5T1M7	0,000243083	-0,591774161	Downregualted in Tumor	9128	NA
-NAA15;NARG1	N-alpha-acetyltransferase 15, NatA auxiliary subunit	Q9BXJ9	3,34463E-05	-0,590409453	Downregualted in Tumor	80155	ENSG00000164134
-NAA15;NARG1	N-alpha-acetyltransferase 15, NatA auxiliary subunit	B2RBE5	3,34463E-05	-0,590409453	Downregualted in Tumor	80155	NA
-NXF1	Nuclear RNA export factor 1	Q9UBU9	0,005779697	-0,590326693	Downregualted in Tumor	10482	ENSG00000162231
-NXF1	Nuclear RNA export factor 1	Q59E96	0,005779697	-0,590326693	Downregualted in Tumor	10482	NA
-LLGL2	Lethal(2) giant larvae protein homolog 2	Q6P1M3	1,33221E-05	-0,5865682	Downregualted in Tumor	3993	ENSG00000073350
-LLGL2	Lethal(2) giant larvae protein homolog 2	J3QRV5	1,33221E-05	-0,5865682	Downregualted in Tumor	3993	ENSG00000073350
-LLGL2	Lethal(2) giant larvae protein homolog 2	A0PJJ0	1,33221E-05	-0,5865682	Downregualted in Tumor	3993	NA
-CAD	CAD protein;Glutamine-dependent carbamoyl-phosphate synthase;Aspartate carbamoyltransferase;Dihydroorotase	P27708	5,24377E-06	-0,584945719	Downregualted in Tumor	790	ENSG00000084774
-CAD	CAD protein;Glutamine-dependent carbamoyl-phosphate synthase;Aspartate carbamoyltransferase;Dihydroorotase	F8VPD4	5,24377E-06	-0,584945719	Downregualted in Tumor	790	ENSG00000084774
-ROCK1	Rho-associated protein kinase 1	Q13464	0,010350019	-0,584751188	Downregualted in Tumor	6093	ENSG00000067900
-HSPA4L	Heat shock 70 kDa protein 4L	O95757	0,001289555	-0,582958646	Downregualted in Tumor	22824	ENSG00000164070
-HSPA4L	Heat shock 70 kDa protein 4L	E9PDE8	0,001289555	-0,582958646	Downregualted in Tumor	22824	ENSG00000164070
-HSPA4L	Heat shock 70 kDa protein 4L	B4DXT2	0,001289555	-0,582958646	Downregualted in Tumor	22824	NA
-CBS	Cystathionine beta-synthase;Cysteine synthase	P35520	0,002327998	-0,581398872	Downregualted in Tumor	875;102724560	ENSG00000160200
-MCM7	DNA replication licensing factor MCM7	P33993	0,000315085	-0,57985627	Downregualted in Tumor	4176	ENSG00000166508
-MCM7	DNA replication licensing factor MCM7	C6EMX8	0,000315085	-0,57985627	Downregualted in Tumor	4176	NA
-NCAPG	Condensin complex subunit 3	Q9BPX3	0,00679295	-0,579298242	Downregualted in Tumor	64151	ENSG00000109805
-TOMM34	Mitochondrial import receptor subunit TOM34	Q15785	0,001019016	-0,577933067	Downregualted in Tumor	10953	ENSG00000025772
-TARS2	Threonine--tRNA ligase, mitochondrial	Q9BW92	0,008621537	-0,577233877	Downregualted in Tumor	80222	ENSG00000143374
-TARS2	Threonine--tRNA ligase, mitochondrial	U3KQG0	0,008621537	-0,577233877	Downregualted in Tumor	80222	ENSG00000143374
-EGFR	Epidermal growth factor receptor	P00533	0,001272814	-0,575452048	Downregualted in Tumor	1956	ENSG00000146648
-EGFR	Epidermal growth factor receptor	B7Z2I3	0,001272814	-0,575452048	Downregualted in Tumor	1956	NA
-EGFR	Epidermal growth factor receptor	E9PFD7	0,001272814	-0,575452048	Downregualted in Tumor	1956	ENSG00000146648
-EGFR	Epidermal growth factor receptor	F2YGG7	0,001272814	-0,575452048	Downregualted in Tumor	1956	NA
-EGFR	Epidermal growth factor receptor	E7BSV0	0,001272814	-0,575452048	Downregualted in Tumor	1956	NA
-EGFR	Epidermal growth factor receptor	Q504U8	0,001272814	-0,575452048	Downregualted in Tumor	1956	ENSG00000146648
-MCCC1;DKFZp686B20267	Methylcrotonoyl-CoA carboxylase subunit alpha, mitochondrial	Q96RQ3	0,00198377	-0,575070915	Downregualted in Tumor	56922	ENSG00000078070
-MCCC1;DKFZp686B20267	Methylcrotonoyl-CoA carboxylase subunit alpha, mitochondrial	E9PHF7	0,00198377	-0,575070915	Downregualted in Tumor	56922	ENSG00000078070
-MCCC1;DKFZp686B20267	Methylcrotonoyl-CoA carboxylase subunit alpha, mitochondrial	Q68D27	0,00198377	-0,575070915	Downregualted in Tumor	56922	NA
-PLXNB2;Nbla00445	Plexin-B2	O15031	0,005546527	-0,573015357	Downregualted in Tumor	23654	ENSG00000196576
-PRKDC	DNA-dependent protein kinase catalytic subunit	P78527	2,95126E-06	-0,571548963	Downregualted in Tumor	5591	ENSG00000253729
-IARS;DKFZp686L0869;DKFZp686L17145	Isoleucine--tRNA ligase, cytoplasmic	P41252	8,40146E-08	-0,570388958	Downregualted in Tumor	3376	ENSG00000196305
-IARS;DKFZp686L0869;DKFZp686L17145	Isoleucine--tRNA ligase, cytoplasmic	Q6P0M4	8,40146E-08	-0,570388958	Downregualted in Tumor	3376	NA
-IARS;DKFZp686L0869;DKFZp686L17145	Isoleucine--tRNA ligase, cytoplasmic	Q7L4K8	8,40146E-08	-0,570388958	Downregualted in Tumor	3376	NA
-TM9SF3;SMBP	Transmembrane 9 superfamily member 3	Q9HD45	0,000676762	-0,569419073	Downregualted in Tumor	56889	ENSG00000077147
-TM9SF3;SMBP	Transmembrane 9 superfamily member 3	A0A024QYS2	0,000676762	-0,569419073	Downregualted in Tumor	56889	NA
-DHCR24;Nbla03646	Delta(24)-sterol reductase	Q15392	0,00049265	-0,568746738	Downregualted in Tumor	1718	ENSG00000116133
-HSPA4	Heat shock 70 kDa protein 4	P34932	1,85991E-06	-0,567590496	Downregualted in Tumor	3308	ENSG00000170606
-FSCN1	Fascin	Q16658	0,002791639	-0,565195692	Downregualted in Tumor	6624	ENSG00000075618
-FSCN1	Fascin	B3KTA3	0,002791639	-0,565195692	Downregualted in Tumor	6624	NA
-RUVBL1	RuvB-like 1	Q9Y265	3,58272E-05	-0,565186571	Downregualted in Tumor	8607	ENSG00000175792;ENSG00000284901
-RUVBL1	RuvB-like 1	E7ETR0	3,58272E-05	-0,565186571	Downregualted in Tumor	8607	ENSG00000175792;ENSG00000284901
-RUVBL1	RuvB-like 1	B3KRS7	3,58272E-05	-0,565186571	Downregualted in Tumor	8607	NA
-TRIM29	Tripartite motif-containing protein 29	Q14134	0,000487804	-0,564850655	Downregualted in Tumor	23650	ENSG00000137699
-TRIM29	Tripartite motif-containing protein 29	A0A024R3J1	0,000487804	-0,564850655	Downregualted in Tumor	23650	NA
-TRIM29	Tripartite motif-containing protein 29	B7Z8U9	0,000487804	-0,564850655	Downregualted in Tumor	23650	NA
-TRIM29	Tripartite motif-containing protein 29	E9PRL4	0,000487804	-0,564850655	Downregualted in Tumor	23650	ENSG00000137699
-TRIM29	Tripartite motif-containing protein 29	B7Z5V5	0,000487804	-0,564850655	Downregualted in Tumor	23650	NA
-LYAR	Cell growth-regulating nucleolar protein	Q9NX58	0,005576737	-0,56440413	Downregualted in Tumor	55646	ENSG00000145220
-OXCT1;OXCT	Succinyl-CoA:3-ketoacid coenzyme A transferase 1, mitochondrial;Succinyl-CoA:3-ketoacid-coenzyme A transferase	P55809	0,000185312	-0,56414058	Downregualted in Tumor	5019	ENSG00000083720
-OXCT1;OXCT	Succinyl-CoA:3-ketoacid coenzyme A transferase 1, mitochondrial;Succinyl-CoA:3-ketoacid-coenzyme A transferase	A0A024R040	0,000185312	-0,56414058	Downregualted in Tumor	5019	NA
-TOP2A	DNA topoisomerase 2-alpha	P11388	1,91688E-05	-0,563375923	Downregualted in Tumor	7153	ENSG00000131747
-DDX18	ATP-dependent RNA helicase DDX18	Q9NVP1	0,000229773	-0,562808317	Downregualted in Tumor	8886	ENSG00000088205
-DDX18	ATP-dependent RNA helicase DDX18	A0A024RAH8	0,000229773	-0,562808317	Downregualted in Tumor	8886	NA
-DDX18	ATP-dependent RNA helicase DDX18	Q8N254	0,000229773	-0,562808317	Downregualted in Tumor	8886	NA
-UBA6	Ubiquitin-like modifier-activating enzyme 6	A0AVT1	6,72792E-05	-0,561977412	Downregualted in Tumor	55236	ENSG00000033178
-UBA6	Ubiquitin-like modifier-activating enzyme 6	A0A024RDB0	6,72792E-05	-0,561977412	Downregualted in Tumor	55236	NA
-LRPPRC	Leucine-rich PPR motif-containing protein, mitochondrial	P42704	0,000261184	-0,561010008	Downregualted in Tumor	10128	ENSG00000138095
-LRPPRC	Leucine-rich PPR motif-containing protein, mitochondrial	E5KNY5	0,000261184	-0,561010008	Downregualted in Tumor	10128	NA
-PDS5B	Sister chromatid cohesion protein PDS5 homolog B	Q9NTI5	0,001867767	-0,560687782	Downregualted in Tumor	23047	ENSG00000083642
-NMD3	60S ribosomal export protein NMD3	Q96D46	0,001109735	-0,559488163	Downregualted in Tumor	51068	ENSG00000169251
-NMD3	60S ribosomal export protein NMD3	C9JA08	0,001109735	-0,559488163	Downregualted in Tumor	51068	ENSG00000169251
-AKR1C3	Aldo-keto reductase family 1 member C3	P42330	0,001004736	-0,557855972	Downregualted in Tumor	8644	ENSG00000196139
-AKR1C3	Aldo-keto reductase family 1 member C3	B4DKT3	0,001004736	-0,557855972	Downregualted in Tumor	8644	NA
-DIS3	Exosome complex exonuclease RRP44	Q9Y2L1	0,010748832	-0,556322481	Downregualted in Tumor	22894	ENSG00000083520
-DIS3	Exosome complex exonuclease RRP44	G3V1J5	0,010748832	-0,556322481	Downregualted in Tumor	22894	ENSG00000083520
-NUP155	Nuclear pore complex protein Nup155	O75694	0,000260615	-0,553991552	Downregualted in Tumor	9631	ENSG00000113569
-NUP155	Nuclear pore complex protein Nup155	A0A024R071	0,000260615	-0,553991552	Downregualted in Tumor	9631	NA
-NUP155	Nuclear pore complex protein Nup155	B4DLT2	0,000260615	-0,553991552	Downregualted in Tumor	9631	NA
-NUP155	Nuclear pore complex protein Nup155	E9PF10	0,000260615	-0,553991552	Downregualted in Tumor	9631	ENSG00000113569
-IARS2	Isoleucine--tRNA ligase, mitochondrial	Q9NSE4	3,09245E-06	-0,553940186	Downregualted in Tumor	55699	ENSG00000067704
-AGPS	Alkyldihydroxyacetonephosphate synthase, peroxisomal	O00116	0,005194493	-0,552664781	Downregualted in Tumor	8540	ENSG00000018510
-AGPS	Alkyldihydroxyacetonephosphate synthase, peroxisomal	B7Z3Q4	0,005194493	-0,552664781	Downregualted in Tumor	8540	NA
-PFKFB2;DKFZp781D2217	6-phosphofructo-2-kinase/fructose-2,6-bisphosphatase 2;6-phosphofructo-2-kinase;Fructose-2,6-bisphosphatase	O60825	0,006756207	-0,55180494	Downregualted in Tumor	5208	ENSG00000123836
-MYH9	Myosin-9	P35579	2,21188E-06	-0,551475797	Downregualted in Tumor	4627	ENSG00000100345
-MYH9	Myosin-9	A0A024R1N1	2,21188E-06	-0,551475797	Downregualted in Tumor	4627	NA
-SRP72	Signal recognition particle subunit SRP72	O76094	0,000182004	-0,549295493	Downregualted in Tumor	6731	ENSG00000174780
-SRP72	Signal recognition particle subunit SRP72	V9HWK0	0,000182004	-0,549295493	Downregualted in Tumor	6731	NA
-PKP1	Plakophilin-1	A0A024R952	0,002970762	-0,547445807	Downregualted in Tumor	5317	NA
-PKP1	Plakophilin-1	Q13835	0,002970762	-0,547445807	Downregualted in Tumor	5317	ENSG00000081277
-HEATR1	NA	B2RWN5	0,000421016	-0,547069432	Downregualted in Tumor	55127	NA
-NA	NA	B2R8G6	0,006194242	-0,545898744	Downregualted in Tumor	23770	NA
-PHF6	PHD finger protein 6	Q8IWS0	0,000528454	-0,545087698	Downregualted in Tumor	84295	ENSG00000156531
-LONP1	Lon protease homolog, mitochondrial;Lon protease homolog	P36776	3,99029E-06	-0,544415417	Downregualted in Tumor	9361	ENSG00000196365
-RHPN2	Rhophilin-2	Q8IUC4	0,008934742	-0,544341495	Downregualted in Tumor	85415	ENSG00000131941
-MYO1B	Unconventional myosin-Ib	O43795	0,000658573	-0,543957369	Downregualted in Tumor	4430	ENSG00000128641
-MYO1B	Unconventional myosin-Ib	E9PDF6	0,000658573	-0,543957369	Downregualted in Tumor	4430	ENSG00000128641
-MYO1B	Unconventional myosin-Ib	B0I1S9	0,000658573	-0,543957369	Downregualted in Tumor	4430	NA
-RARS	Arginine--tRNA ligase, cytoplasmic	P54136	3,52236E-06	-0,537167128	Downregualted in Tumor	5917	ENSG00000113643
-EPHB3	Ephrin type-B receptor 3	P54753	0,003607089	-0,536997263	Downregualted in Tumor	2049	ENSG00000182580
-CYFIP1	Cytoplasmic FMR1-interacting protein 1	Q7L576	0,000120559	-0,534550298	Downregualted in Tumor	23191	ENSG00000273749
-NAPG	Gamma-soluble NSF attachment protein	Q99747	0,003279737	-0,532012848	Downregualted in Tumor	8774	ENSG00000134265
-NAPG	Gamma-soluble NSF attachment protein	Q6FHY4	0,003279737	-0,532012848	Downregualted in Tumor	8774	NA
-PARP1	Poly [ADP-ribose] polymerase 1	P09874	0,000119867	-0,530258063	Downregualted in Tumor	142	ENSG00000143799
-PARP1	Poly [ADP-ribose] polymerase 1	A0A024R3T8	0,000119867	-0,530258063	Downregualted in Tumor	142	NA
-SLC27A4	Long-chain fatty acid transport protein 4	Q6P1M0	0,0060816	-0,529901889	Downregualted in Tumor	10999	ENSG00000167114
-SLC27A4	Long-chain fatty acid transport protein 4	A0A024R8D2	0,0060816	-0,529901889	Downregualted in Tumor	10999	NA
-TTC37	Tetratricopeptide repeat protein 37	Q6PGP7	0,005695547	-0,529900533	Downregualted in Tumor	9652	ENSG00000198677
-CLTC	Clathrin heavy chain 1	Q00610	5,10397E-07	-0,529731461	Downregualted in Tumor	1213	ENSG00000141367
-CLTC	Clathrin heavy chain 1	A0A087WVQ6	5,10397E-07	-0,529731461	Downregualted in Tumor	1213	ENSG00000141367
-POLR1C	DNA-directed RNA polymerases I and III subunit RPAC1	O15160	0,008635353	-0,529139668	Downregualted in Tumor	9533	ENSG00000171453
-EMC1	ER membrane protein complex subunit 1	Q8N766	0,001383193	-0,528986159	Downregualted in Tumor	23065	ENSG00000127463
-EIF5	Eukaryotic translation initiation factor 5	P55010	0,000376016	-0,52879778	Downregualted in Tumor	1983	ENSG00000100664
-EIF5	Eukaryotic translation initiation factor 5	A0A024R6Q1	0,000376016	-0,52879778	Downregualted in Tumor	1983	NA
-GOLGA5	Golgin subfamily A member 5	Q8TBA6	0,007116923	-0,528732943	Downregualted in Tumor	9950	ENSG00000066455
-MCM5	DNA replication licensing factor MCM5	P33992	3,6312E-07	-0,526483599	Downregualted in Tumor	4174	ENSG00000100297
-MCM5	DNA replication licensing factor MCM5	B1AHB0	3,6312E-07	-0,526483599	Downregualted in Tumor	4174	NA
-JUP	Junction plakoglobin	P14923	3,94608E-05	-0,525766097	Downregualted in Tumor	3728	ENSG00000173801
-TARS	Threonine--tRNA ligase, cytoplasmic	P26639	1,86779E-05	-0,524124627	Downregualted in Tumor	6897	ENSG00000113407
-SPTBN2	Spectrin beta chain, non-erythrocytic 2	O15020	0,004505332	-0,521659629	Downregualted in Tumor	6712	ENSG00000173898
-CDC5L	Cell division cycle 5-like protein	Q99459	0,00936171	-0,520813242	Downregualted in Tumor	988	ENSG00000096401
-ABCF2	ATP-binding cassette sub-family F member 2	Q9UG63	0,000459438	-0,519250631	Downregualted in Tumor	10061	ENSG00000285292;ENSG00000033050
-KPNA2	Importin subunit alpha-1;Importin subunit alpha	P52292	0,003303035	-0,51923262	Downregualted in Tumor	3838	ENSG00000182481
-PRPF6	Pre-mRNA-processing factor 6	O94906	5,92966E-06	-0,516174011	Downregualted in Tumor	24148	ENSG00000101161
-CHD4	Chromodomain-helicase-DNA-binding protein 4	F5GWX5	8,9986E-06	-0,515809394	Downregualted in Tumor	1108	ENSG00000111642
-CHD4	Chromodomain-helicase-DNA-binding protein 4	Q14839	8,9986E-06	-0,515809394	Downregualted in Tumor	1108	ENSG00000111642
-CLPX;DKFZp586J151	ATP-dependent Clp protease ATP-binding subunit clpX-like, mitochondrial	O76031	0,008881492	-0,513959057	Downregualted in Tumor	10845	ENSG00000166855
-CLPX;DKFZp586J151	ATP-dependent Clp protease ATP-binding subunit clpX-like, mitochondrial	A0A024R5X7	0,008881492	-0,513959057	Downregualted in Tumor	10845	NA
-AIMP2	Aminoacyl tRNA synthase complex-interacting multifunctional protein 2	Q13155	0,000963028	-0,513813162	Downregualted in Tumor	7965	ENSG00000106305
-AIMP2	Aminoacyl tRNA synthase complex-interacting multifunctional protein 2	A0A024QZY1	0,000963028	-0,513813162	Downregualted in Tumor	7965	NA
-AIMP2	Aminoacyl tRNA synthase complex-interacting multifunctional protein 2	A8MU58	0,000963028	-0,513813162	Downregualted in Tumor	7965	ENSG00000106305
-CSE1L	Exportin-2	P55060	0,007896757	-0,512911365	Downregualted in Tumor	1434	ENSG00000124207
-PPL	Periplakin	O60437	9,25578E-05	-0,512628729	Downregualted in Tumor	5493	ENSG00000118898
-PTRF	Polymerase I and transcript release factor	Q6NZI2	0,000283408	-0,511973701	Downregualted in Tumor	284119	ENSG00000177469
-LMNA	Prelamin-A/C;Lamin-A/C	P02545	1,64716E-05	-0,511024739	Downregualted in Tumor	4000	ENSG00000160789
-IMMT	Mitochondrial inner membrane protein	Q16891	1,67179E-05	-0,507033688	Downregualted in Tumor	10989	ENSG00000132305
-EPRS	Bifunctional glutamate/proline--tRNA ligase;Glutamate--tRNA ligase;Proline--tRNA ligase	P07814	2,09795E-09	-0,506881715	Downregualted in Tumor	2058	ENSG00000136628
-ITGB1	Integrin beta-1	P05556	0,000911523	-0,505460162	Downregualted in Tumor	3688	ENSG00000150093
-DDX51	ATP-dependent RNA helicase DDX51	Q8N8A6	0,008800964	-0,503766626	Downregualted in Tumor	317781	ENSG00000185163
-USP32	Ubiquitin carboxyl-terminal hydrolase 32;Ubiquitin carboxyl-terminal hydrolase	Q8NFA0	0,009886583	-0,502087377	Downregualted in Tumor	84669	ENSG00000170832
-PPP3CA	Serine/threonine-protein phosphatase 2B catalytic subunit alpha isoform;Serine/threonine-protein phosphatase	Q08209	0,001933936	-0,501141094	Downregualted in Tumor	5530	ENSG00000138814
-BAZ1B	Tyrosine-protein kinase BAZ1B	Q9UIG0	0,000259687	-0,500333423	Downregualted in Tumor	9031	ENSG00000009954
-HSP90B1;TRA1	Endoplasmin	P14625	3,5097E-10	-0,498304996	Downregualted in Tumor	7184	ENSG00000166598
-HSP90B1;TRA1	Endoplasmin	V9HWP2	3,5097E-10	-0,498304996	Downregualted in Tumor	7184	NA
-PRIC295;GCN1L1	Translational activator GCN1	Q92616	0,0007628	-0,498196064	Downregualted in Tumor	10985	ENSG00000089154
-RRM1	Ribonucleoside-diphosphate reductase large subunit;Ribonucleoside-diphosphate reductase	P23921	0,000178405	-0,496686915	Downregualted in Tumor	6240	ENSG00000167325
-RRM1	Ribonucleoside-diphosphate reductase large subunit;Ribonucleoside-diphosphate reductase	B4E0I8	0,000178405	-0,496686915	Downregualted in Tumor	6240	NA
-RRM1	Ribonucleoside-diphosphate reductase large subunit;Ribonucleoside-diphosphate reductase	E9PL69	0,000178405	-0,496686915	Downregualted in Tumor	6240	ENSG00000167325
-RRM1	Ribonucleoside-diphosphate reductase large subunit;Ribonucleoside-diphosphate reductase	B4DXD1	0,000178405	-0,496686915	Downregualted in Tumor	6240	NA
-SNRNP200	U5 small nuclear ribonucleoprotein 200 kDa helicase	O75643	1,18748E-05	-0,496556151	Downregualted in Tumor	23020	ENSG00000144028
-YBX3	Y-box-binding protein 3	P16989	0,010061398	-0,493377389	Downregualted in Tumor	8531	ENSG00000060138
-YBX3	Y-box-binding protein 3	A0A024RAQ1	0,010061398	-0,493377389	Downregualted in Tumor	8531	NA
-FAM83H	Protein FAM83H	Q6ZRV2	0,00022942	-0,49308038	Downregualted in Tumor	286077	ENSG00000273889;ENSG00000180921
-TCERG1	Transcription elongation regulator 1	O14776	0,000312799	-0,492262532	Downregualted in Tumor	10915	ENSG00000113649
-PRPF19	Pre-mRNA-processing factor 19	Q9UMS4	0,001296904	-0,492103618	Downregualted in Tumor	27339	ENSG00000110107
-PSMD1	26S proteasome non-ATPase regulatory subunit 1	Q99460	2,19993E-07	-0,491036903	Downregualted in Tumor	5707	ENSG00000173692
-TCEA1	Transcription elongation factor A protein 1	P23193	0,000945425	-0,489836267	Downregualted in Tumor	6917	ENSG00000187735
-TCEA1	Transcription elongation factor A protein 1	B7Z4W0	0,000945425	-0,489836267	Downregualted in Tumor	6917	NA
-SQLE;ERG1;DKFZp686B0215	Squalene monooxygenase	Q14534	0,000101226	-0,487777001	Downregualted in Tumor	6713	ENSG00000104549
-SQLE;ERG1;DKFZp686B0215	Squalene monooxygenase	Q9UNR6	0,000101226	-0,487777001	Downregualted in Tumor	6713	NA
-SQLE;ERG1;DKFZp686B0215	Squalene monooxygenase	Q5HYI4	0,000101226	-0,487777001	Downregualted in Tumor	6713	NA
-NOC2L	Nucleolar complex protein 2 homolog	Q9Y3T9	0,009851729	-0,487245231	Downregualted in Tumor	26155	ENSG00000188976
-DYNC1H1	Cytoplasmic dynein 1 heavy chain 1	Q14204	1,88122E-05	-0,486460659	Downregualted in Tumor	1778	ENSG00000197102
-CSDE1;UNR	Cold shock domain-containing protein E1	O75534	0,000670281	-0,485482175	Downregualted in Tumor	7812	ENSG00000009307
-CSDE1;UNR	Cold shock domain-containing protein E1	A0A024R0E2	0,000670281	-0,485482175	Downregualted in Tumor	7812	NA
-CSDE1;UNR	Cold shock domain-containing protein E1	A0A024R0K2	0,000670281	-0,485482175	Downregualted in Tumor	7812	NA
-KLC1;KNS2	NA	Q7RTQ2	0,000567978	-0,484833135	Downregualted in Tumor	3831	NA
-NCLN	Nicalin	Q969V3	0,001944947	-0,48477065	Downregualted in Tumor	56926	ENSG00000125912
-SUPV3L1	ATP-dependent RNA helicase SUPV3L1, mitochondrial	Q8IYB8	0,003953606	-0,483860139	Downregualted in Tumor	6832	ENSG00000156502
-EEF2	Elongation factor 2	P13639	4,73806E-07	-0,483736047	Downregualted in Tumor	1938	ENSG00000167658
-GARS	Glycine--tRNA ligase	P41250	0,001109051	-0,482619593	Downregualted in Tumor	2617	ENSG00000106105
-ACTN1	Alpha-actinin-1	P12814	0,000625674	-0,482060076	Downregualted in Tumor	87	ENSG00000072110
-ACTN1	Alpha-actinin-1	A0A024R694	0,000625674	-0,482060076	Downregualted in Tumor	87	NA
-LMNB1	Lamin-B1	P20700	9,48334E-05	-0,477795864	Downregualted in Tumor	4001	ENSG00000113368
-FLNB;DKFZp686A1668	Filamin-B	O75369	2,3025E-05	-0,476968715	Downregualted in Tumor	2317	ENSG00000136068
-SIN3A	Paired amphipathic helix protein Sin3a	Q96ST3	0,003449057	-0,474507779	Downregualted in Tumor	25942	ENSG00000169375
-RHOT2	Mitochondrial Rho GTPase 2	Q8IXI1	0,010909363	-0,474083368	Downregualted in Tumor	89941	ENSG00000140983
-NOL11	Nucleolar protein 11	Q9H8H0	0,009811013	-0,473878989	Downregualted in Tumor	25926	ENSG00000130935
-INF2	Inverted formin-2	Q27J81	0,001565536	-0,472744349	Downregualted in Tumor	64423	ENSG00000203485
-ZNF326	DBIRD complex subunit ZNF326	Q5BKZ1	0,006373981	-0,472226478	Downregualted in Tumor	284695	ENSG00000162664
-CKAP5	Cytoskeleton-associated protein 5	Q14008	6,49349E-05	-0,471991329	Downregualted in Tumor	9793	ENSG00000175216
-FKBP15	FK506-binding protein 15;Peptidyl-prolyl cis-trans isomerase	Q5T1M5	0,008809445	-0,467665739	Downregualted in Tumor	23307	ENSG00000119321
-CTNNA1	Catenin alpha-1	P35221	0,000135553	-0,46694246	Downregualted in Tumor	1495	ENSG00000044115
-CTNNA1	Catenin alpha-1	G3XAM7	0,000135553	-0,46694246	Downregualted in Tumor	1495	ENSG00000044115
-CTNNA1	Catenin alpha-1	B4DU00	0,000135553	-0,46694246	Downregualted in Tumor	1495	NA
-CTNNA1	Catenin alpha-1	B4DKT9	0,000135553	-0,46694246	Downregualted in Tumor	1495	NA
-SMARCA4	Transcription activator BRG1	P51532	0,001084271	-0,464949632	Downregualted in Tumor	6597	ENSG00000127616
-SMARCA4	Transcription activator BRG1	A7E2E1	0,001084271	-0,464949632	Downregualted in Tumor	6597	NA
-SMARCA4	Transcription activator BRG1	Q9HBD4	0,001084271	-0,464949632	Downregualted in Tumor	6597	ENSG00000127616
-SMARCA4	Transcription activator BRG1	B3KNW7	0,001084271	-0,464949632	Downregualted in Tumor	6597	NA
-MYH14	Myosin-14	Q7Z406	1,12882E-06	-0,462183229	Downregualted in Tumor	79784	ENSG00000105357
-MYH14	Myosin-14	A1L2Z2	1,12882E-06	-0,462183229	Downregualted in Tumor	79784	ENSG00000105357
-MYH10	Myosin-10	P35580	0,002726238	-0,461755415	Downregualted in Tumor	4628	ENSG00000133026
-MYH10	Myosin-10	G1UI33	0,002726238	-0,461755415	Downregualted in Tumor	4628	NA
-NUP98	Nuclear pore complex protein Nup98-Nup96;Nuclear pore complex protein Nup98;Nuclear pore complex protein Nup96	P52948	0,003596916	-0,4602676	Downregualted in Tumor	4928	ENSG00000110713
-NCL	Nucleolin	P19338	6,20646E-06	-0,458067496	Downregualted in Tumor	4691	ENSG00000115053
-NCL	Nucleolin	A0A024R4A0	6,20646E-06	-0,458067496	Downregualted in Tumor	4691	NA
-NCL	Nucleolin	B3KM80	6,20646E-06	-0,458067496	Downregualted in Tumor	4691	NA
-SUPT5H	Transcription elongation factor SPT5	O00267	0,003882513	-0,456760684	Downregualted in Tumor	6829	ENSG00000196235
-PKN2	Serine/threonine-protein kinase N2	Q16513	0,005776501	-0,453722283	Downregualted in Tumor	5586	ENSG00000065243
-CDK1;DKFZp686L20222;CDC2	Cyclin-dependent kinase 1	P06493	0,003734342	-0,45361171	Downregualted in Tumor	983	ENSG00000170312
-CDK1;DKFZp686L20222;CDC2	Cyclin-dependent kinase 1	A0A024QZJ8	0,003734342	-0,45361171	Downregualted in Tumor	983	NA
-CDK1;DKFZp686L20222;CDC2	Cyclin-dependent kinase 1	I6L9I5	0,003734342	-0,45361171	Downregualted in Tumor	983	NA
-CDK1;DKFZp686L20222;CDC2	Cyclin-dependent kinase 1	B7Z3D6	0,003734342	-0,45361171	Downregualted in Tumor	983	NA
-CCT7	T-complex protein 1 subunit eta	Q99832	3,07804E-05	-0,446322589	Downregualted in Tumor	10574	ENSG00000135624
-MKI67	Antigen KI-67	P46013	0,002074377	-0,445360451	Downregualted in Tumor	4288	ENSG00000148773
-BCLAF1	Bcl-2-associated transcription factor 1	Q9NYF8	0,006965528	-0,441907628	Downregualted in Tumor	9774	ENSG00000029363
-CCT2	T-complex protein 1 subunit beta	P78371	0,0002999	-0,440783134	Downregualted in Tumor	10576	ENSG00000166226
-CCT2	T-complex protein 1 subunit beta	V9HW96	0,0002999	-0,440783134	Downregualted in Tumor	10576	NA
-RAD50	DNA repair protein RAD50	Q92878	0,007026855	-0,439682287	Downregualted in Tumor	10111	ENSG00000113522
-RAD50	DNA repair protein RAD50	A5D6Y3	0,007026855	-0,439682287	Downregualted in Tumor	10111	NA
-ITPR3	Inositol 1,4,5-trisphosphate receptor type 3	Q14573	0,000215742	-0,438649726	Downregualted in Tumor	3710	ENSG00000096433
-ITPR3	Inositol 1,4,5-trisphosphate receptor type 3	Q59ES2	0,000215742	-0,438649726	Downregualted in Tumor	3710	NA
-ITPR3	Inositol 1,4,5-trisphosphate receptor type 3	A6H8K3	0,000215742	-0,438649726	Downregualted in Tumor	3710	NA
-IMPDH2	Inosine-5-monophosphate dehydrogenase 2	P12268	0,000267803	-0,437409529	Downregualted in Tumor	3615	ENSG00000178035
-NAMPT;NAMPTL	Nicotinamide phosphoribosyltransferase	P43490	1,45602E-05	-0,437295946	Downregualted in Tumor	10135	ENSG00000105835
-NAMPT;NAMPTL	Nicotinamide phosphoribosyltransferase	A0A024R718	1,45602E-05	-0,437295946	Downregualted in Tumor	10135	NA
-MCM4	DNA replication licensing factor MCM4	P33991	0,000874068	-0,436909777	Downregualted in Tumor	4173	ENSG00000104738
-MCM4	DNA replication licensing factor MCM4	B4DLA6	0,000874068	-0,436909777	Downregualted in Tumor	4173	NA
-MCM4	DNA replication licensing factor MCM4	B3KMX0	0,000874068	-0,436909777	Downregualted in Tumor	4173	NA
-PITRM1	Presequence protease, mitochondrial	Q5JRX3	0,002922723	-0,433943025	Downregualted in Tumor	10531	ENSG00000107959
-ATIC	Bifunctional purine biosynthesis protein PURH;Phosphoribosylaminoimidazolecarboxamide formyltransferase;IMP cyclohydrolase	P31939	2,67666E-05	-0,433742793	Downregualted in Tumor	471	ENSG00000138363
-ATIC	Bifunctional purine biosynthesis protein PURH;Phosphoribosylaminoimidazolecarboxamide formyltransferase;IMP cyclohydrolase	V9HWH7	2,67666E-05	-0,433742793	Downregualted in Tumor	471	NA
-AARS	Alanine--tRNA ligase, cytoplasmic	P49588	0,000606196	-0,432779548	Downregualted in Tumor	16	ENSG00000090861
-HSPA8	Heat shock cognate 71 kDa protein	P11142	1,37914E-07	-0,432444442	Downregualted in Tumor	3312	ENSG00000109971
-HSPA8	Heat shock cognate 71 kDa protein	V9HW22	1,37914E-07	-0,432444442	Downregualted in Tumor	3312	NA
-IGF2R	Cation-independent mannose-6-phosphate receptor	P11717	0,000954827	-0,430970634	Downregualted in Tumor	3482	ENSG00000197081
-HSPA9	Stress-70 protein, mitochondrial	P38646	2,81011E-07	-0,430379913	Downregualted in Tumor	3313	ENSG00000113013
-AHSA1	Activator of 90 kDa heat shock protein ATPase homolog 1	O95433	0,001428097	-0,429906151	Downregualted in Tumor	10598	ENSG00000100591
-AHSA1	Activator of 90 kDa heat shock protein ATPase homolog 1	G3V438	0,001428097	-0,429906151	Downregualted in Tumor	10598	ENSG00000100591
-EDC4	Enhancer of mRNA-decapping protein 4	Q6P2E9	0,000930706	-0,425870287	Downregualted in Tumor	23644	ENSG00000038358
-NUDCD1	NudC domain-containing protein 1	Q96RS6	0,003013368	-0,423029	Downregualted in Tumor	84955	ENSG00000120526
-HNRNPU;HNRPU	Heterogeneous nuclear ribonucleoprotein U	Q00839	6,68218E-07	-0,421255039	Downregualted in Tumor	3192	ENSG00000153187
-HNRNPU;HNRPU	Heterogeneous nuclear ribonucleoprotein U	Q96BA7	6,68218E-07	-0,421255039	Downregualted in Tumor	3192	NA
-RSL1D1	Ribosomal L1 domain-containing protein 1	O76021	0,002307631	-0,419571328	Downregualted in Tumor	26156	ENSG00000171490
-KARS	Lysine--tRNA ligase	Q15046	0,000221441	-0,419313109	Downregualted in Tumor	3735	ENSG00000065427
-FLII	Protein flightless-1 homolog	Q13045	0,002808046	-0,418400283	Downregualted in Tumor	2314	ENSG00000284571;ENSG00000177731
-DHX36	Probable ATP-dependent RNA helicase DHX36	Q9H2U1	0,000874107	-0,415790009	Downregualted in Tumor	170506	ENSG00000174953
-USP9X	Probable ubiquitin carboxyl-terminal hydrolase FAF-X;Ubiquitin carboxyl-terminal hydrolase	Q93008	0,000786896	-0,415753135	Downregualted in Tumor	8239	ENSG00000124486
-USP9X	Probable ubiquitin carboxyl-terminal hydrolase FAF-X;Ubiquitin carboxyl-terminal hydrolase	Q6P468	0,000786896	-0,415753135	Downregualted in Tumor	8239	NA
-USP9X	Probable ubiquitin carboxyl-terminal hydrolase FAF-X;Ubiquitin carboxyl-terminal hydrolase	Q86X58	0,000786896	-0,415753135	Downregualted in Tumor	8239	NA
-PRPF8	Pre-mRNA-processing-splicing factor 8	Q6P2Q9	0,000122093	-0,415383969	Downregualted in Tumor	10594	ENSG00000174231;ENSG00000274442
-PSMD2;DKFZp564A2282	26S proteasome non-ATPase regulatory subunit 2	Q13200	4,35515E-06	-0,412793442	Downregualted in Tumor	5708	ENSG00000175166
-CCT8	T-complex protein 1 subunit theta	P50990	1,99422E-05	-0,412602596	Downregualted in Tumor	10694	ENSG00000156261
-CCT8	T-complex protein 1 subunit theta	Q7Z759	1,99422E-05	-0,412602596	Downregualted in Tumor	10694	NA
-MKI67IP	MKI67 FHA domain-interacting nucleolar phosphoprotein	Q9BYG3	0,009739209	-0,411261323	Downregualted in Tumor	84365	ENSG00000155438
-HIST1H1B	Histone H1.5	P16401	0,000408742	-0,411014162	Downregualted in Tumor	3009	ENSG00000184357
-NASP	Nuclear autoantigenic sperm protein	P49321	0,009244848	-0,410161335	Downregualted in Tumor	4678	ENSG00000132780
-NASP	Nuclear autoantigenic sperm protein	Q5T626	0,009244848	-0,410161335	Downregualted in Tumor	4678	NA
-SSRP1	FACT complex subunit SSRP1	Q08945	5,7846E-05	-0,409610182	Downregualted in Tumor	6749	ENSG00000149136
-SSRP1	FACT complex subunit SSRP1	A0A024R4Z6	5,7846E-05	-0,409610182	Downregualted in Tumor	6749	NA
-PPP1R13L	RelA-associated inhibitor	Q8WUF5	0,009117854	-0,405884329	Downregualted in Tumor	10848	ENSG00000104881
-PPP1R13L	RelA-associated inhibitor	A0A024R0Q5	0,009117854	-0,405884329	Downregualted in Tumor	10848	NA
-EIF5B	Eukaryotic translation initiation factor 5B	Q8N5A0	0,003219964	-0,405864341	Downregualted in Tumor	9669	NA
-EIF5B	Eukaryotic translation initiation factor 5B	O60841	0,003219964	-0,405864341	Downregualted in Tumor	9669	ENSG00000158417
-PDCD6IP	Programmed cell death 6-interacting protein	Q8WUM4	7,9496E-06	-0,403039636	Downregualted in Tumor	10015	ENSG00000170248
-ACAD9	Acyl-CoA dehydrogenase family member 9, mitochondrial	Q9H845	0,003226907	-0,401568902	Downregualted in Tumor	28976	ENSG00000177646
-DLG1	Disks large homolog 1	Q12959	0,003629588	-0,400035969	Downregualted in Tumor	1739	ENSG00000075711
-DLG1	Disks large homolog 1	B4DF78	0,003629588	-0,400035969	Downregualted in Tumor	1739	NA
-DLG1	Disks large homolog 1	B7Z4H2	0,003629588	-0,400035969	Downregualted in Tumor	1742	NA
-RBM4	RNA-binding protein 4	Q9BWF3	0,001798157	-0,398306466	Downregualted in Tumor	5936	ENSG00000173933
-SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	P34897	0,000574642	-0,398250968	Downregualted in Tumor	6472	ENSG00000182199
-SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	A0A024RB99	0,000574642	-0,398250968	Downregualted in Tumor	6472	NA
-SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	V9HW06	0,000574642	-0,398250968	Downregualted in Tumor	6472	NA
-SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	Q5HYG8	0,000574642	-0,398250968	Downregualted in Tumor	6472	NA
-SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	Q5BJF5	0,000574642	-0,398250968	Downregualted in Tumor	6472	NA
-SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	B4DLV4	0,000574642	-0,398250968	Downregualted in Tumor	6472	NA
-DSG2	Desmoglein-2	Q14126	0,009131078	-0,397512148	Downregualted in Tumor	1829	ENSG00000046604
-IPO7	Importin-7	O95373	0,006066039	-0,39695969	Downregualted in Tumor	10527	ENSG00000205339
-IPO7	Importin-7	B3KNG9	0,006066039	-0,39695969	Downregualted in Tumor	10527	NA
-DEK	Protein DEK	P35659	0,010221165	-0,396788057	Downregualted in Tumor	7913	ENSG00000124795
-AHCY	Adenosylhomocysteinase	P23526	3,53811E-05	-0,396443945	Downregualted in Tumor	191	ENSG00000101444
-EIF4G1;EIF4G1 variant protein	Eukaryotic translation initiation factor 4 gamma 1	Q04637	1,97275E-06	-0,394801245	Downregualted in Tumor	1981	ENSG00000114867
-EIF4G1;EIF4G1 variant protein	Eukaryotic translation initiation factor 4 gamma 1	B2RU10	1,97275E-06	-0,394801245	Downregualted in Tumor	1981	NA
-EIF4G1;EIF4G1 variant protein	Eukaryotic translation initiation factor 4 gamma 1	B2RU06	1,97275E-06	-0,394801245	Downregualted in Tumor	1981	NA
-BSG;hEMMPRIN	Basigin	P35613	0,007286546	-0,394007937	Downregualted in Tumor	682	ENSG00000172270
-BSG;hEMMPRIN	Basigin	Q54A51	0,007286546	-0,394007937	Downregualted in Tumor	682	NA
-PSMC2	26S protease regulatory subunit 7	P35998	6,30262E-06	-0,392453931	Downregualted in Tumor	5701	ENSG00000161057
-PSMC2	26S protease regulatory subunit 7	B7Z571	6,30262E-06	-0,392453931	Downregualted in Tumor	5701	NA
-MYBBP1A	Myb-binding protein 1A	Q9BQG0	0,001222085	-0,390508399	Downregualted in Tumor	10514	ENSG00000132382
-S100A14	Protein S100-A14	Q9HCY8	0,008356518	-0,389305203	Downregualted in Tumor	57402	ENSG00000189334
-CANX	Calnexin	P27824	0,000512952	-0,385605131	Downregualted in Tumor	821	ENSG00000283777;ENSG00000127022
-TKT	Transketolase	P29401	2,93242E-07	-0,384250212	Downregualted in Tumor	7086	ENSG00000163931
-TKT	Transketolase	V9HWD9	2,93242E-07	-0,384250212	Downregualted in Tumor	7086	NA
-CTNNB1	Catenin beta-1	P35222	0,00651839	-0,378622448	Downregualted in Tumor	1499	ENSG00000168036
-CTNNB1	Catenin beta-1	A0A024R2Q3	0,00651839	-0,378622448	Downregualted in Tumor	1499	NA
-CTNNB1	Catenin beta-1	B4DGU4	0,00651839	-0,378622448	Downregualted in Tumor	1499	ENSG00000168036
-ATP2A2	Sarcoplasmic/endoplasmic reticulum calcium ATPase 2	P16615	5,29743E-06	-0,376276299	Downregualted in Tumor	488	ENSG00000174437
-LIG3	DNA ligase 3;DNA ligase	P49916	0,007116296	-0,376100262	Downregualted in Tumor	3980	ENSG00000005156
-PRMT1	Protein arginine N-methyltransferase 1	Q99873	0,001223579	-0,374309195	Downregualted in Tumor	3276	ENSG00000126457
-NUP205	Nuclear pore complex protein Nup205	Q92621	0,006123003	-0,373915838	Downregualted in Tumor	23165	ENSG00000155561
-STT3B	Dolichyl-diphosphooligosaccharide--protein glycosyltransferase subunit STT3B	Q8TCJ2	0,008488702	-0,368859068	Downregualted in Tumor	201595	ENSG00000163527
-HM13	Minor histocompatibility antigen H13	Q8TCT9	7,59595E-05	-0,367178533	Downregualted in Tumor	81502	ENSG00000101294
-TRIM25	E3 ubiquitin/ISG15 ligase TRIM25	Q14258	0,00037507	-0,365648753	Downregualted in Tumor	7706	ENSG00000121060
-FARSB	Phenylalanine--tRNA ligase beta subunit	Q9NSD9	0,000557104	-0,365603644	Downregualted in Tumor	10056	ENSG00000116120
-OAT	Ornithine aminotransferase, mitochondrial;Ornithine aminotransferase, hepatic form;Ornithine aminotransferase, renal form	P04181	0,00196794	-0,36230155	Downregualted in Tumor	4942	ENSG00000065154
-EEF1G	Elongation factor 1-gamma	P26641	0,004290837	-0,361278896	Downregualted in Tumor	1937	ENSG00000254772
-EEF1G	Elongation factor 1-gamma	Q53YD7	0,004290837	-0,361278896	Downregualted in Tumor	1937	NA
-ENO1	Alpha-enolase;Enolase	P06733	1,45209E-06	-0,361085218	Downregualted in Tumor	2023	ENSG00000074800
-ENO1	Alpha-enolase;Enolase	A0A024R4F1	1,45209E-06	-0,361085218	Downregualted in Tumor	2023	NA
-TRIM28	Transcription intermediary factor 1-beta	Q13263	0,001407233	-0,358659798	Downregualted in Tumor	10155	ENSG00000130726
-HSPA5	78 kDa glucose-regulated protein	P11021	7,26849E-05	-0,357808253	Downregualted in Tumor	3309	ENSG00000044574
-HSPA5	78 kDa glucose-regulated protein	V9HWB4	7,26849E-05	-0,357808253	Downregualted in Tumor	3309	NA
-SUPT16H	FACT complex subunit SPT16	Q9Y5B9	0,006986901	-0,357005741	Downregualted in Tumor	11198	ENSG00000092201
-MYO1C	Unconventional myosin-Ic	O00159	0,003670451	-0,35394897	Downregualted in Tumor	4641	ENSG00000197879
-DNAJA1	DnaJ homolog subfamily A member 1	P31689	0,002669664	-0,352050628	Downregualted in Tumor	3301	ENSG00000086061
-DNAJA1	DnaJ homolog subfamily A member 1	B7Z5C0	0,002669664	-0,352050628	Downregualted in Tumor	3301	NA
-DKC1	H/ACA ribonucleoprotein complex subunit 4	O60832	0,002781872	-0,348276227	Downregualted in Tumor	1736	ENSG00000130826
-ADAR	Double-stranded RNA-specific adenosine deaminase	P55265	0,008295857	-0,347810357	Downregualted in Tumor	103	ENSG00000160710
-PAIP1	Polyadenylate-binding protein-interacting protein 1	Q9H074	0,009995906	-0,346405576	Downregualted in Tumor	10605	ENSG00000172239
-TRAP1	Heat shock protein 75 kDa, mitochondrial	Q12931	0,000808508	-0,34425415	Downregualted in Tumor	10131	ENSG00000126602
-TRAP1	Heat shock protein 75 kDa, mitochondrial	Q53FS6	0,000808508	-0,34425415	Downregualted in Tumor	10131	NA
-CKAP4	Cytoskeleton-associated protein 4	Q07065	0,001823837	-0,343797892	Downregualted in Tumor	10970	ENSG00000136026
-CKAP4	Cytoskeleton-associated protein 4	A0A024RBH2	0,001823837	-0,343797892	Downregualted in Tumor	10970	NA
-STT3A	Dolichyl-diphosphooligosaccharide--protein glycosyltransferase subunit STT3A	P46977	0,010825163	-0,339539879	Downregualted in Tumor	3703	ENSG00000134910
-PSMC1	26S protease regulatory subunit 4	P62191	0,000251494	-0,336763876	Downregualted in Tumor	5700	ENSG00000100764
-PSMC1	26S protease regulatory subunit 4	Q53XL8	0,000251494	-0,336763876	Downregualted in Tumor	5700	NA
-CCT3	T-complex protein 1 subunit gamma	P49368	2,58158E-05	-0,336023048	Downregualted in Tumor	7203	ENSG00000163468
-CCT3	T-complex protein 1 subunit gamma	B3KX11	2,58158E-05	-0,336023048	Downregualted in Tumor	7203	NA
-CCT3	T-complex protein 1 subunit gamma	Q59H77	2,58158E-05	-0,336023048	Downregualted in Tumor	7203	NA
-LARP1	La-related protein 1	Q6PKG0	0,005441841	-0,335928322	Downregualted in Tumor	23367	ENSG00000155506
-TMPO	Lamina-associated polypeptide 2, isoform alpha;Thymopoietin;Thymopentin	P42166	0,005005762	-0,333896162	Downregualted in Tumor	7112	ENSG00000120802
-MYOF	Myoferlin	Q9NZM1	0,009534455	-0,333101377	Downregualted in Tumor	26509	ENSG00000138119
-XRCC5	X-ray repair cross-complementing protein 5	P13010	0,00512194	-0,331755075	Downregualted in Tumor	7520	ENSG00000079246
-BAG6	Large proline-rich protein BAG6	P46379	0,004779505	-0,329656457	Downregualted in Tumor	7917	ENSG00000096155;ENSG00000204463;ENSG00000233348;ENSG00000234651;ENSG00000227761;ENSG00000229524;ENSG00000228760
-GLRX3	Glutaredoxin-3	O76003	0,00062779	-0,328765497	Downregualted in Tumor	10539	ENSG00000108010
-UFL1	E3 UFM1-protein ligase 1	O94874	0,007507858	-0,328443468	Downregualted in Tumor	23376	ENSG00000014123
-IQGAP1	Ras GTPase-activating-like protein IQGAP1	P46940	0,002621655	-0,326568465	Downregualted in Tumor	8826	ENSG00000140575
-IQGAP1	Ras GTPase-activating-like protein IQGAP1	A0A024RC65	0,002621655	-0,326568465	Downregualted in Tumor	8826	NA
-SQSTM1	Sequestosome-1	Q13501	0,009650725	-0,325786867	Downregualted in Tumor	8878	ENSG00000161011
-ERP29	Endoplasmic reticulum resident protein 29	P30040	0,003254034	-0,323632334	Downregualted in Tumor	10961	ENSG00000089248
-ERP29	Endoplasmic reticulum resident protein 29	V9HW71	0,003254034	-0,323632334	Downregualted in Tumor	10961	NA
-ERP29	Endoplasmic reticulum resident protein 29	F8VY02	0,003254034	-0,323632334	Downregualted in Tumor	10961	ENSG00000089248
-ERMP1;KIAA1815	Endoplasmic reticulum metallopeptidase 1	Q7Z2K6	0,005818326	-0,321618136	Downregualted in Tumor	79956	ENSG00000099219
-ERMP1;KIAA1815	Endoplasmic reticulum metallopeptidase 1	Q6ZMD3	0,005818326	-0,321618136	Downregualted in Tumor	79956	NA
-TCP1	T-complex protein 1 subunit alpha	P17987	1,62142E-05	-0,319703198	Downregualted in Tumor	6950	ENSG00000120438
-TCP1	T-complex protein 1 subunit alpha	E7EQR6	1,62142E-05	-0,319703198	Downregualted in Tumor	6950	ENSG00000120438
-XPO1	Exportin-1	O14980	0,009049188	-0,315575442	Downregualted in Tumor	7514	ENSG00000082898
-EIF3L	Eukaryotic translation initiation factor 3 subunit L	Q9Y262	0,004121242	-0,314002098	Downregualted in Tumor	51386	ENSG00000100129
-EIF3L	Eukaryotic translation initiation factor 3 subunit L	B0QY90	0,004121242	-0,314002098	Downregualted in Tumor	51386	ENSG00000100129
-NUDC	Nuclear migration protein nudC	Q9Y266	0,000555651	-0,313571988	Downregualted in Tumor	10726	ENSG00000090273
-SMARCA5	SWI/SNF-related matrix-associated actin-dependent regulator of chromatin subfamily A member 5	O60264	0,008338524	-0,31209843	Downregualted in Tumor	8467	ENSG00000153147
-ESYT1	Extended synaptotagmin-1	Q9BSJ8	0,002173185	-0,307160503	Downregualted in Tumor	23344	ENSG00000139641
-ESYT1	Extended synaptotagmin-1	A0A024RB17	0,002173185	-0,307160503	Downregualted in Tumor	23344	NA
-HYOU1	Hypoxia up-regulated protein 1	Q9Y4L1	0,010717677	-0,302413673	Downregualted in Tumor	10525	ENSG00000149428;ENSG00000280682
-HYOU1	Hypoxia up-regulated protein 1	B7Z766	0,010717677	-0,302413673	Downregualted in Tumor	10525	NA
-HYOU1	Hypoxia up-regulated protein 1	Q6IN67	0,010717677	-0,302413673	Downregualted in Tumor	10525	NA
-CCT4	T-complex protein 1 subunit delta	P50991	2,57866E-05	-0,29873711	Downregualted in Tumor	10575	ENSG00000115484
-CAND1	Cullin-associated NEDD8-dissociated protein 1	Q86VP6	0,000143185	-0,298093337	Downregualted in Tumor	55832	ENSG00000111530
-TLN1	Talin-1	Q9Y490	0,002399143	-0,296222901	Downregualted in Tumor	7094	ENSG00000137076
-PCNA	Proliferating cell nuclear antigen	P12004	0,00456057	-0,293625769	Downregualted in Tumor	5111	ENSG00000132646
-EIF3B;EIF3S9	Eukaryotic translation initiation factor 3 subunit B	P55884	0,000296426	-0,29314364	Downregualted in Tumor	8662	ENSG00000106263
-EIF3B;EIF3S9	Eukaryotic translation initiation factor 3 subunit B	A0A024R821	0,000296426	-0,29314364	Downregualted in Tumor	8662	NA
-EIF3B;EIF3S9	Eukaryotic translation initiation factor 3 subunit B	A4D210	0,000296426	-0,29314364	Downregualted in Tumor	8662	NA
-VARS	Valine--tRNA ligase	P26640	0,006569315	-0,288754089	Downregualted in Tumor	7407	ENSG00000096171;ENSG00000204394;ENSG00000231116;ENSG00000226589;ENSG00000224264
-VARS	Valine--tRNA ligase	A0A024RCN6	0,006569315	-0,288754089	Downregualted in Tumor	7407	NA
-XRCC6	X-ray repair cross-complementing protein 6	P12956	0,004051299	-0,288534835	Downregualted in Tumor	2547	ENSG00000196419
-XRCC6	X-ray repair cross-complementing protein 6	A0A024R1N4	0,004051299	-0,288534835	Downregualted in Tumor	2547	NA
-XRCC6	X-ray repair cross-complementing protein 6	B1AHC9	0,004051299	-0,288534835	Downregualted in Tumor	2547	ENSG00000196419
-XRCC6	X-ray repair cross-complementing protein 6	B4DE32	0,004051299	-0,288534835	Downregualted in Tumor	2547	NA
-GPS1	COP9 signalosome complex subunit 1	Q13098	0,00073682	-0,286200666	Downregualted in Tumor	2873	ENSG00000169727
-GPS1	COP9 signalosome complex subunit 1	C9JFE4	0,00073682	-0,286200666	Downregualted in Tumor	2873	ENSG00000169727
-EIF3C;EIF3CL	Eukaryotic translation initiation factor 3 subunit C;Eukaryotic translation initiation factor 3 subunit C-like protein	Q99613	0,000752413	-0,284419439	Downregualted in Tumor	8663	ENSG00000184110
-EIF3C;EIF3CL	Eukaryotic translation initiation factor 3 subunit C;Eukaryotic translation initiation factor 3 subunit C-like protein	A0A024QYU9	0,000752413	-0,284419439	Downregualted in Tumor	8663	NA
-EIF3C;EIF3CL	Eukaryotic translation initiation factor 3 subunit C;Eukaryotic translation initiation factor 3 subunit C-like protein	B5ME19	0,000752413	-0,284419439	Downregualted in Tumor	728689	ENSG00000205609
-EIF3C;EIF3CL	Eukaryotic translation initiation factor 3 subunit C;Eukaryotic translation initiation factor 3 subunit C-like protein	A0A024QYX7	0,000752413	-0,284419439	Downregualted in Tumor	728689	NA
-COPA	Coatomer subunit alpha;Xenin;Proxenin	P53621	0,000892813	-0,284170565	Downregualted in Tumor	1314	ENSG00000122218
-GTF2I	General transcription factor II-I	P78347	0,005609981	-0,2824855	Downregualted in Tumor	2969	ENSG00000263001
-GTF2I	General transcription factor II-I	X5D2J9	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
-GTF2I	General transcription factor II-I	X5D939	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
-GTF2I	General transcription factor II-I	X5DNP5	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
-GTF2I	General transcription factor II-I	A8K9W7	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
-GTF2I	General transcription factor II-I	X5DR09	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
-GTF2I	General transcription factor II-I	Q499G6	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
-GTF2I	General transcription factor II-I	Q6EKJ0	0,005609981	-0,2824855	Downregualted in Tumor	389524	ENSG00000174428
-GTF2I	General transcription factor II-I	Q86UP8	0,005609981	-0,2824855	Downregualted in Tumor	84163	ENSG00000196275
-SF3B3	Splicing factor 3B subunit 3	Q15393	0,004900947	-0,282377853	Downregualted in Tumor	23450	ENSG00000189091
-SF3B3	Splicing factor 3B subunit 3	A8K6V3	0,004900947	-0,282377853	Downregualted in Tumor	23450	NA
-NUMA1;NUMA1 variant protein	Nuclear mitotic apparatus protein 1	Q14980	0,008633235	-0,276297332	Downregualted in Tumor	4926	ENSG00000137497
-NUMA1;NUMA1 variant protein	Nuclear mitotic apparatus protein 1	Q4LE64	0,008633235	-0,276297332	Downregualted in Tumor	4926	NA
-NUMA1;NUMA1 variant protein	Nuclear mitotic apparatus protein 1	Q3SYK8	0,008633235	-0,276297332	Downregualted in Tumor	4926	NA
-LDHA	L-lactate dehydrogenase A chain;L-lactate dehydrogenase	P00338	0,002872948	-0,273672026	Downregualted in Tumor	3939	ENSG00000134333
-LDHA	L-lactate dehydrogenase A chain;L-lactate dehydrogenase	V9HWB9	0,002872948	-0,273672026	Downregualted in Tumor	3939	NA
-UPF1	Regulator of nonsense transcripts 1	Q92900	0,00270076	-0,272423291	Downregualted in Tumor	5976	ENSG00000005007
-UPF1	Regulator of nonsense transcripts 1	A0A024R7L8	0,00270076	-0,272423291	Downregualted in Tumor	5976	NA
-UPF1	Regulator of nonsense transcripts 1	A0A024R7L5	0,00270076	-0,272423291	Downregualted in Tumor	5976	NA
-UPF1	Regulator of nonsense transcripts 1	B3KY55	0,00270076	-0,272423291	Downregualted in Tumor	5976	NA
-ALDOA	Fructose-bisphosphate aldolase A;Fructose-bisphosphate aldolase	P04075	0,006948006	-0,268631618	Downregualted in Tumor	226	ENSG00000149925
-ALDOA	Fructose-bisphosphate aldolase A;Fructose-bisphosphate aldolase	V9HWN7	0,006948006	-0,268631618	Downregualted in Tumor	226	NA
-SYNCRIP	Heterogeneous nuclear ribonucleoprotein Q	O60506	0,00119751	-0,263706716	Downregualted in Tumor	10492	ENSG00000135316
-DDX6	Probable ATP-dependent RNA helicase DDX6	P26196	0,00329751	-0,263066444	Downregualted in Tumor	1656	ENSG00000110367
-DDX6	Probable ATP-dependent RNA helicase DDX6	B2R858	0,00329751	-0,263066444	Downregualted in Tumor	1656	NA
-DHX9	ATP-dependent RNA helicase A	Q08211	0,000674696	-0,262120523	Downregualted in Tumor	1660	ENSG00000135829
-DHX9	ATP-dependent RNA helicase A	B3KU66	0,000674696	-0,262120523	Downregualted in Tumor	1660	NA
-EIF3E;EIF3S6	Eukaryotic translation initiation factor 3 subunit E	P60228	0,001045379	-0,255006001	Downregualted in Tumor	3646	ENSG00000104408
-TUFM	Elongation factor Tu, mitochondrial	P49411	0,001512697	-0,253849147	Downregualted in Tumor	7284	ENSG00000178952
-PDIA4	Protein disulfide-isomerase A4	P13667	0,005066989	-0,251982478	Downregualted in Tumor	9601	ENSG00000155660
-EIF2S2	Eukaryotic translation initiation factor 2 subunit 2	P20042	0,01063129	-0,251806876	Downregualted in Tumor	8894	ENSG00000125977
-EIF2S2	Eukaryotic translation initiation factor 2 subunit 2	Q6IBR8	0,01063129	-0,251806876	Downregualted in Tumor	8894	NA
-CCT6A	T-complex protein 1 subunit zeta	P40227	0,001231951	-0,251625811	Downregualted in Tumor	908	ENSG00000146731
-CCT6A	T-complex protein 1 subunit zeta	A0A024RDL1	0,001231951	-0,251625811	Downregualted in Tumor	908	NA
-EFTUD2;U5-116KD;SNRP116	116 kDa U5 small nuclear ribonucleoprotein component	Q15029	0,007097144	-0,249333675	Downregualted in Tumor	9343	ENSG00000108883
-EFTUD2;U5-116KD;SNRP116	116 kDa U5 small nuclear ribonucleoprotein component	B3KX19	0,007097144	-0,249333675	Downregualted in Tumor	9343	NA
-VCL	Vinculin	P18206	0,007925677	-0,244972859	Downregualted in Tumor	7414	ENSG00000035403
-VCL	Vinculin	A0A024QZN4	0,007925677	-0,244972859	Downregualted in Tumor	7414	NA
-VCL	Vinculin	V9HWK2	0,007925677	-0,244972859	Downregualted in Tumor	7414	NA
-VCL	Vinculin	B3KXA2	0,007925677	-0,244972859	Downregualted in Tumor	7414	NA
-FKBP4	Peptidyl-prolyl cis-trans isomerase FKBP4;Peptidyl-prolyl cis-trans isomerase FKBP4, N-terminally processed	Q02790	0,007711285	-0,240925199	Downregualted in Tumor	2288	ENSG00000004478
-PA2G4	Proliferation-associated protein 2G4	Q9UQ80	0,000801647	-0,231617817	Downregualted in Tumor	5036	ENSG00000170515
-PA2G4	Proliferation-associated protein 2G4	A0A024RB85	0,000801647	-0,231617817	Downregualted in Tumor	5036	NA
-EEF1A1;EEF1A1P5;EEF1A1L14	Elongation factor 1-alpha 1;Elongation factor 1-alpha;Putative elongation factor 1-alpha-like 3	P68104	0,004680844	-0,223417727	Downregualted in Tumor	1915	ENSG00000156508
-EEF1A1;EEF1A1P5;EEF1A1L14	Elongation factor 1-alpha 1;Elongation factor 1-alpha;Putative elongation factor 1-alpha-like 3	Q6IPS9	0,004680844	-0,223417727	Downregualted in Tumor	1915	NA
-GAPDH	Glyceraldehyde-3-phosphate dehydrogenase	P04406	0,008278382	-0,213199066	Downregualted in Tumor	2597	ENSG00000111640
-GAPDH	Glyceraldehyde-3-phosphate dehydrogenase	V9HVZ4	0,008278382	-0,213199066	Downregualted in Tumor	2597	NA
-PGD	6-phosphogluconate dehydrogenase, decarboxylating	P52209	0,009211071	-0,212168757	Downregualted in Tumor	5226	ENSG00000142657
-PGD	6-phosphogluconate dehydrogenase, decarboxylating	B4E2U0	0,009211071	-0,212168757	Downregualted in Tumor	5226	NA
-RPN1	Dolichyl-diphosphooligosaccharide--protein glycosyltransferase subunit 1	P04843	0,005384557	-0,200910738	Downregualted in Tumor	6184	ENSG00000163902
-PABPC1	Polyadenylate-binding protein 1	P11940	0,006255424	-0,198162628	Downregualted in Tumor	26986	ENSG00000070756
-PABPC1	Polyadenylate-binding protein 1	A0A024R9C1	0,006255424	-0,198162628	Downregualted in Tumor	26986	NA
-EIF4A1	Eukaryotic initiation factor 4A-I	P60842	0,006387652	-0,184959736	Downregualted in Tumor	1973	ENSG00000161960
-PKM;PKM2	Pyruvate kinase PKM;Pyruvate kinase	P14618	0,008545371	-0,171923721	Downregualted in Tumor	5315	ENSG00000067225
-PKM;PKM2	Pyruvate kinase PKM;Pyruvate kinase	V9HWB8	0,008545371	-0,171923721	Downregualted in Tumor	5315	NA
-PKM;PKM2	Pyruvate kinase PKM;Pyruvate kinase	B4DNK4	0,008545371	-0,171923721	Downregualted in Tumor	5315	ENSG00000067225
-TUBB4B;TUBB2C	Tubulin beta-4B chain	P68371	0,007146456	-0,167302237	Downregualted in Tumor	10383	ENSG00000188229
+Gene names	Protein names	Protein IDs	Welch test p-value	Welch test Difference	Cluster	GeneID	Ensembl_Gene
+LAMA3	Laminin subunit alpha-3	Q16787	3,1687E-06	-1,400093984	Downregualted in Tumor	3909	ENSG00000053747
+SLC7A5;lat1	Large neutral amino acids transporter small subunit 1	Q01650	9,35698E-08	-1,150743779	Downregualted in Tumor	8140	ENSG00000103257
+SERPINB5	Serpin B5	P36952	4,18289E-07	-1,074692515	Downregualted in Tumor	5268	ENSG00000206075
+SERPINB5	Serpin B5	A0A024R2B6	4,18289E-07	-1,074692515	Downregualted in Tumor	5268	NA
+ASNS	Asparagine synthetase [glutamine-hydrolyzing]	P08243	1,66709E-06	-1,06512767	Downregualted in Tumor	440	ENSG00000070669
+KRT5	Keratin, type II cytoskeletal 5	P13647	0,00018084	-1,061978052	Downregualted in Tumor	3852	ENSG00000186081
+CAV1	Caveolin-1;Caveolin	Q03135	1,31585E-08	-1,030079667	Downregualted in Tumor	857	ENSG00000105974
+CAV1	Caveolin-1;Caveolin	Q2TNI1	1,31585E-08	-1,030079667	Downregualted in Tumor	857	NA
+CAV1	Caveolin-1;Caveolin	Q59E85	1,31585E-08	-1,030079667	Downregualted in Tumor	857	NA
+CAV1	Caveolin-1;Caveolin	A9XTE5	1,31585E-08	-1,030079667	Downregualted in Tumor	857	NA
+ACSF2	Acyl-CoA synthetase family member 2, mitochondrial	Q96CM8	7,3569E-05	-0,99480022	Downregualted in Tumor	80221	ENSG00000167107
+ACSF2	Acyl-CoA synthetase family member 2, mitochondrial	E9PF16	7,3569E-05	-0,99480022	Downregualted in Tumor	80221	ENSG00000167107
+ACSF2	Acyl-CoA synthetase family member 2, mitochondrial	B4DTB9	7,3569E-05	-0,99480022	Downregualted in Tumor	80221	NA
+ITGA6	Integrin alpha-6;Integrin alpha-6 heavy chain;Integrin alpha-6 light chain	P23229	2,01299E-06	-0,980933035	Downregualted in Tumor	3655	ENSG00000091409
+ITGB4	Integrin beta	A0A024R8K7	6,61087E-10	-0,979720083	Downregualted in Tumor	3691	NA
+ITGB4	Integrin beta	B7ZLD8	6,61087E-10	-0,979720083	Downregualted in Tumor	3691	NA
+TFRC	Transferrin receptor protein 1;Transferrin receptor protein 1, serum form	P02786	7,9451E-08	-0,961853047	Downregualted in Tumor	7037	ENSG00000072274
+TFRC	Transferrin receptor protein 1;Transferrin receptor protein 1, serum form	G3V0E5	7,9451E-08	-0,961853047	Downregualted in Tumor	7037	ENSG00000072274
+TFRC	Transferrin receptor protein 1;Transferrin receptor protein 1, serum form	B7Z2I6	7,9451E-08	-0,961853047	Downregualted in Tumor	7037	NA
+TFRC	Transferrin receptor protein 1;Transferrin receptor protein 1, serum form	Q9UP52	7,9451E-08	-0,961853047	Downregualted in Tumor	7036	ENSG00000106327
+NAT10	N-acetyltransferase 10	Q9H0A0	3,04492E-05	-0,952848508	Downregualted in Tumor	55226	ENSG00000135372
+SPRR1B	Cornifin-B	P22528	0,00277333	-0,948371322	Downregualted in Tumor	6699	ENSG00000169469
+PHGDH;PGDH3	D-3-phosphoglycerate dehydrogenase	O43175	1,55392E-08	-0,936814458	Downregualted in Tumor	26227	ENSG00000092621
+FTSJ3	pre-rRNA processing protein FTSJ3	Q8IY81	4,88486E-08	-0,932961961	Downregualted in Tumor	117246	ENSG00000108592
+GNL3	Guanine nucleotide-binding protein-like 3	Q9BVP2	7,3644E-06	-0,928687143	Downregualted in Tumor	26354	ENSG00000163938
+ASS1;ASS	Argininosuccinate synthase	P00966	1,80149E-06	-0,924816978	Downregualted in Tumor	445	ENSG00000130707
+ASS1;ASS	Argininosuccinate synthase	Q5T6L4	1,80149E-06	-0,924816978	Downregualted in Tumor	445	NA
+WDR11;DKFZp434L1715	WD repeat-containing protein 11	Q9BZH6	0,005051577	-0,924780542	Downregualted in Tumor	55717	ENSG00000120008
+SPTBN1	Spectrin beta chain, non-erythrocytic 1	Q01082	1,34021E-07	-0,923438056	Downregualted in Tumor	6711	ENSG00000115306
+SPTBN1	Spectrin beta chain, non-erythrocytic 1	B2ZZ89	1,34021E-07	-0,923438056	Downregualted in Tumor	6711	NA
+KRT6A	Keratin, type II cytoskeletal 6A	P02538	0,003529226	-0,920052752	Downregualted in Tumor	3853	ENSG00000205420
+NCAPH	Condensin complex subunit 2	Q15003	0,007723664	-0,918386324	Downregualted in Tumor	23397	ENSG00000121152
+NCAPH	Condensin complex subunit 2	B4DRG7	0,007723664	-0,918386324	Downregualted in Tumor	23397	NA
+DDX21	Nucleolar RNA helicase 2	Q9NR30	3,42513E-08	-0,915125615	Downregualted in Tumor	9188	ENSG00000165732
+G6PD	Glucose-6-phosphate 1-dehydrogenase	P11413	8,00091E-09	-0,893817022	Downregualted in Tumor	2539	ENSG00000160211
+SLC3A2	4F2 cell-surface antigen heavy chain	P08195	1,45782E-06	-0,881083346	Downregualted in Tumor	6520	ENSG00000168003
+SLC3A2	4F2 cell-surface antigen heavy chain	J3KPF3	1,45782E-06	-0,881083346	Downregualted in Tumor	6520	ENSG00000168003
+SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	O95347	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	ENSG00000136824
+SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	A0A024R158	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
+SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	A8K984	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
+SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	B7ZLZ7	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
+SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	B3KMB1	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
+SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	Q05BV1	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
+SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	Q6IPS5	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
+SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	Q05D74	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
+SMC2	Structural maintenance of chromosomes protein 2;Structural maintenance of chromosomes protein	Q7Z2X1	8,33656E-07	-0,879355699	Downregualted in Tumor	10592	NA
+OCLN	Occludin	Q16625	3,20963E-05	-0,878711509	Downregualted in Tumor	100506658	ENSG00000197822
+OCLN	Occludin	A8K3T2	3,20963E-05	-0,878711509	Downregualted in Tumor	100506658	NA
+CTPS1	CTP synthase 1	P17812	1,29357E-06	-0,876439652	Downregualted in Tumor	1503	ENSG00000171793
+CTPS1	CTP synthase 1	B4E1E0	1,29357E-06	-0,876439652	Downregualted in Tumor	1503	NA
+GMPS	GMP synthase [glutamine-hydrolyzing]	P49915	1,42995E-06	-0,858913572	Downregualted in Tumor	8833	ENSG00000163655
+CA8	Carbonic anhydrase-related protein	P35219	0,002127208	-0,853246743	Downregualted in Tumor	767	ENSG00000178538
+DSP;DSP variant protein	Desmoplakin	P15924	6,15905E-07	-0,849624601	Downregualted in Tumor	1832	ENSG00000096696
+DSP;DSP variant protein	Desmoplakin	Q4LE79	6,15905E-07	-0,849624601	Downregualted in Tumor	1832	NA
+DSP;DSP variant protein	Desmoplakin	B4DKX6	6,15905E-07	-0,849624601	Downregualted in Tumor	1832	NA
+MTHFD1L	Monofunctional C1-tetrahydrofolate synthase, mitochondrial	Q6UB35	6,59381E-05	-0,833670187	Downregualted in Tumor	25902	ENSG00000120254
+MTHFD1L	Monofunctional C1-tetrahydrofolate synthase, mitochondrial	A0A087WVM4	6,59381E-05	-0,833670187	Downregualted in Tumor	25902	ENSG00000120254
+MTHFD1L	Monofunctional C1-tetrahydrofolate synthase, mitochondrial	B7ZM99	6,59381E-05	-0,833670187	Downregualted in Tumor	25902	ENSG00000120254
+MTHFD1L	Monofunctional C1-tetrahydrofolate synthase, mitochondrial	B2RD24	6,59381E-05	-0,833670187	Downregualted in Tumor	25902	NA
+EHD1	EH domain-containing protein 1	Q9H4M9	1,90023E-07	-0,830043132	Downregualted in Tumor	10938	ENSG00000110047
+EHD1	EH domain-containing protein 1	B2R5U3	1,90023E-07	-0,830043132	Downregualted in Tumor	10938	NA
+EHD1	EH domain-containing protein 1	A0A024R571	1,90023E-07	-0,830043132	Downregualted in Tumor	10938	ENSG00000110047
+PES1	Pescadillo homolog	O00541	0,000676951	-0,826673569	Downregualted in Tumor	23481	ENSG00000100029
+PES1	Pescadillo homolog	B2RDF2	0,000676951	-0,826673569	Downregualted in Tumor	23481	NA
+PES1	Pescadillo homolog	B3KXD6	0,000676951	-0,826673569	Downregualted in Tumor	23481	ENSG00000100029
+LAMC2	Laminin subunit gamma-2	Q13753	5,61515E-06	-0,814967484	Downregualted in Tumor	3918	ENSG00000058085
+ALDH1A3;DKFZp686G1675	Aldehyde dehydrogenase family 1 member A3	P47895	2,88978E-05	-0,810954269	Downregualted in Tumor	220	ENSG00000184254
+ALDH1A3;DKFZp686G1675	Aldehyde dehydrogenase family 1 member A3	A0A024RC95	2,88978E-05	-0,810954269	Downregualted in Tumor	220	NA
+ALDH1A3;DKFZp686G1675	Aldehyde dehydrogenase family 1 member A3	H0Y2X5	2,88978E-05	-0,810954269	Downregualted in Tumor	220	ENSG00000184254
+ALDH1A3;DKFZp686G1675	Aldehyde dehydrogenase family 1 member A3	Q7Z3A2	2,88978E-05	-0,810954269	Downregualted in Tumor	220	NA
+ATP1A1	Sodium/potassium-transporting ATPase subunit alpha-1	P05023	2,75542E-10	-0,81037753	Downregualted in Tumor	476	ENSG00000163399
+UTP20	Small subunit processome component 20 homolog	O75691	2,03064E-05	-0,804653456	Downregualted in Tumor	27340	ENSG00000120800
+IGF2BP2	Insulin-like growth factor 2 mRNA-binding protein 2	Q9Y6M1	0,006321334	-0,795419088	Downregualted in Tumor	10644	ENSG00000073792
+IGF2BP2	Insulin-like growth factor 2 mRNA-binding protein 2	F8W930	0,006321334	-0,795419088	Downregualted in Tumor	10644	ENSG00000073792
+IGF2BP2	Insulin-like growth factor 2 mRNA-binding protein 2	B4DKT5	0,006321334	-0,795419088	Downregualted in Tumor	10644	NA
+CRYAB	Alpha-crystallin B chain	P02511	0,001634189	-0,786896352	Downregualted in Tumor	1410	ENSG00000109846
+CRYAB	Alpha-crystallin B chain	V9HW27	0,001634189	-0,786896352	Downregualted in Tumor	1410	NA
+CRYAB	Alpha-crystallin B chain	A0A024R3B9	0,001634189	-0,786896352	Downregualted in Tumor	1410	ENSG00000109846
+HSPD1	60 kDa heat shock protein, mitochondrial	P10809	1,28921E-10	-0,784529094	Downregualted in Tumor	3329	ENSG00000144381
+HSPD1	60 kDa heat shock protein, mitochondrial	A0A024R3X4	1,28921E-10	-0,784529094	Downregualted in Tumor	3329	NA
+TRIP6;TRIP6i1	Thyroid receptor-interacting protein 6	Q15654	0,001314986	-0,78277387	Downregualted in Tumor	7205	ENSG00000087077
+ANLN	Actin-binding protein anillin	Q9NQW6	0,005289009	-0,782161534	Downregualted in Tumor	54443	ENSG00000011426
+ANLN	Actin-binding protein anillin	A0A024RA49	0,005289009	-0,782161534	Downregualted in Tumor	54443	NA
+ANLN	Actin-binding protein anillin	A8K5D9	0,005289009	-0,782161534	Downregualted in Tumor	54443	NA
+MIA3	Melanoma inhibitory activity protein 3	Q5JRA6	1,10791E-05	-0,781499875	Downregualted in Tumor	375056	ENSG00000154305
+LDHB	L-lactate dehydrogenase B chain;L-lactate dehydrogenase	P07195	2,65903E-10	-0,779144822	Downregualted in Tumor	3945	ENSG00000111716
+LDHB	L-lactate dehydrogenase B chain;L-lactate dehydrogenase	Q5U077	2,65903E-10	-0,779144822	Downregualted in Tumor	3945	NA
+TUBA4A	Tubulin alpha-4A chain	P68366	5,12664E-06	-0,777504329	Downregualted in Tumor	7277	ENSG00000127824
+UHRF1	E3 ubiquitin-protein ligase UHRF1	Q96T88	0,000735849	-0,77577958	Downregualted in Tumor	29128	ENSG00000276043
+UHRF1	E3 ubiquitin-protein ligase UHRF1	A0A087WVR3	0,000735849	-0,77577958	Downregualted in Tumor	29128	ENSG00000276043
+RFC4	Replication factor C subunit 4	P35249	0,000990499	-0,770350482	Downregualted in Tumor	5984	ENSG00000163918
+ERLIN2	Erlin-2	O94905	0,000111752	-0,767481127	Downregualted in Tumor	11160	ENSG00000147475
+MSH2	DNA mismatch repair protein Msh2	P43246	6,11475E-06	-0,76673187	Downregualted in Tumor	4436	ENSG00000095002
+SPAG9	C-Jun-amino-terminal kinase-interacting protein 4	O60271	3,66432E-07	-0,766705518	Downregualted in Tumor	9043	ENSG00000008294
+ANXA8;ANXA8L1	Annexin A8;Annexin;Annexin A8-like protein 1	P13928	1,40812E-05	-0,765130309	Downregualted in Tumor	728113;653145	ENSG00000265190
+ANXA8;ANXA8L1	Annexin A8;Annexin;Annexin A8-like protein 1	B4DTB3	1,40812E-05	-0,765130309	Downregualted in Tumor	653145	NA
+ANXA8;ANXA8L1	Annexin A8;Annexin;Annexin A8-like protein 1	A0A087WTN9	1,40812E-05	-0,765130309	Downregualted in Tumor	653145	ENSG00000265190
+COL1A1	Collagen alpha-1(I) chain	P02452	0,000183691	-0,764177238	Downregualted in Tumor	1277	ENSG00000108821
+KRT86	Keratin, type II cuticular Hb6	O43790	6,46876E-05	-0,753458903	Downregualted in Tumor	3892	ENSG00000170442
+KRT86	Keratin, type II cuticular Hb6	A8K872	6,46876E-05	-0,753458903	Downregualted in Tumor	3892	NA
+DHCR7	7-dehydrocholesterol reductase	Q9UBM7	1,73874E-06	-0,752399769	Downregualted in Tumor	1717	ENSG00000172893
+DHCR7	7-dehydrocholesterol reductase	A0A024R5F7	1,73874E-06	-0,752399769	Downregualted in Tumor	1717	NA
+ANXA3	Annexin A3;Annexin	P12429	3,96339E-05	-0,748518784	Downregualted in Tumor	306	ENSG00000138772
+UTP18	U3 small nucleolar RNA-associated protein 18 homolog	Q9Y5J1	0,002631407	-0,747487302	Downregualted in Tumor	51096	ENSG00000011260
+NOMO2;NOMO3	Nodal modulator 2;Nodal modulator 3	Q5JPE7	3,14308E-05	-0,744997421	Downregualted in Tumor	283820	ENSG00000185164
+NOMO2;NOMO3	Nodal modulator 2;Nodal modulator 3	P69849	3,14308E-05	-0,744997421	Downregualted in Tumor	408050	ENSG00000278087;ENSG00000103226
+NOMO2;NOMO3	Nodal modulator 2;Nodal modulator 3	J3KN36	3,14308E-05	-0,744997421	Downregualted in Tumor	408050	ENSG00000278087;ENSG00000103226
+NOMO2;NOMO3	Nodal modulator 2;Nodal modulator 3	Q1LZN2	3,14308E-05	-0,744997421	Downregualted in Tumor	408050	NA
+HSP90AB1	Heat shock protein HSP 90-beta	P08238	1,69927E-09	-0,741839087	Downregualted in Tumor	3326	ENSG00000096384
+HSP90AB1	Heat shock protein HSP 90-beta	A0A024RD80	1,69927E-09	-0,741839087	Downregualted in Tumor	3326	NA
+HSP90AB1	Heat shock protein HSP 90-beta	B4DGL0	1,69927E-09	-0,741839087	Downregualted in Tumor	3326	NA
+HSP90AB1	Heat shock protein HSP 90-beta	Q6PK50	1,69927E-09	-0,741839087	Downregualted in Tumor	3326	NA
+ADNP	Activity-dependent neuroprotector homeobox protein	Q9H2P0	0,001960616	-0,738990315	Downregualted in Tumor	23394	ENSG00000101126
+ADNP	Activity-dependent neuroprotector homeobox protein	Q6DHZ8	0,001960616	-0,738990315	Downregualted in Tumor	23394	NA
+LARS	Leucine--tRNA ligase, cytoplasmic	Q9P2J5	2,02969E-08	-0,738194248	Downregualted in Tumor	51520	ENSG00000133706
+LARS	Leucine--tRNA ligase, cytoplasmic	B4DER1	2,02969E-08	-0,738194248	Downregualted in Tumor	51520	NA
+LARS	Leucine--tRNA ligase, cytoplasmic	B4E266	2,02969E-08	-0,738194248	Downregualted in Tumor	51520	NA
+BOP1	Ribosome biogenesis protein BOP1	Q14137	8,60666E-06	-0,732046295	Downregualted in Tumor	23246	ENSG00000261236;ENSG00000285301
+HSPH1	Heat shock protein 105 kDa	Q92598	1,30416E-08	-0,729742324	Downregualted in Tumor	10808	ENSG00000120694
+HSPH1	Heat shock protein 105 kDa	A0A024RDS1	1,30416E-08	-0,729742324	Downregualted in Tumor	10808	NA
+HSPH1	Heat shock protein 105 kDa	A0A024RDQ0	1,30416E-08	-0,729742324	Downregualted in Tumor	10808	NA
+HSPH1	Heat shock protein 105 kDa	B4DY72	1,30416E-08	-0,729742324	Downregualted in Tumor	10808	NA
+NVL	Nuclear valosin-containing protein-like	O15381	0,000281968	-0,729292199	Downregualted in Tumor	4931	ENSG00000143748
+NVL	Nuclear valosin-containing protein-like	B4DF43	0,000281968	-0,729292199	Downregualted in Tumor	4931	NA
+TBCE	Tubulin-specific chaperone E	Q15813	0,005486615	-0,728700574	Downregualted in Tumor	6905	ENSG00000285053;ENSG00000284770;ENSG00000282984
+MSH6;GTBP	DNA mismatch repair protein Msh6	P52701	2,59178E-06	-0,723915352	Downregualted in Tumor	2956	ENSG00000116062
+MSH6;GTBP	DNA mismatch repair protein Msh6	Q3SWU9	2,59178E-06	-0,723915352	Downregualted in Tumor	2956	NA
+SMC4	Structural maintenance of chromosomes protein 4;Structural maintenance of chromosomes protein	Q9NTJ3	0,001139478	-0,723597445	Downregualted in Tumor	10051	ENSG00000113810
+SMC4	Structural maintenance of chromosomes protein 4;Structural maintenance of chromosomes protein	E9PD53	0,001139478	-0,723597445	Downregualted in Tumor	10051	ENSG00000113810
+SMC4	Structural maintenance of chromosomes protein 4;Structural maintenance of chromosomes protein	B3KXX5	0,001139478	-0,723597445	Downregualted in Tumor	10051	NA
+SMC4	Structural maintenance of chromosomes protein 4;Structural maintenance of chromosomes protein	Q58F29	0,001139478	-0,723597445	Downregualted in Tumor	10051	NA
+NFKB1	Nuclear factor NF-kappa-B p105 subunit;Nuclear factor NF-kappa-B p50 subunit	P19838	0,00696192	-0,718194274	Downregualted in Tumor	4790	ENSG00000109320
+NFKB1	Nuclear factor NF-kappa-B p105 subunit;Nuclear factor NF-kappa-B p50 subunit	A0A024RDJ4	0,00696192	-0,718194274	Downregualted in Tumor	4790	NA
+AHNAK	Neuroblast differentiation-associated protein AHNAK	Q09666	5,17822E-08	-0,717602003	Downregualted in Tumor	79026	ENSG00000124942
+AHNAK	Neuroblast differentiation-associated protein AHNAK	B4DTV0	5,17822E-08	-0,717602003	Downregualted in Tumor	79026	NA
+AHNAK	Neuroblast differentiation-associated protein AHNAK	Q9BVU3	5,17822E-08	-0,717602003	Downregualted in Tumor	79026	NA
+IPO4	Importin-4	Q8TEX9	0,000679847	-0,717398863	Downregualted in Tumor	79711	ENSG00000285248;ENSG00000196497
+IPO4	Importin-4	B3KT38	0,000679847	-0,717398863	Downregualted in Tumor	79711	NA
+PSAT1	Phosphoserine aminotransferase	Q9Y617	0,000699166	-0,716590086	Downregualted in Tumor	29968	ENSG00000135069
+PSAT1	Phosphoserine aminotransferase	A0A024R222	0,000699166	-0,716590086	Downregualted in Tumor	29968	NA
+PSAT1	Phosphoserine aminotransferase	A0A024R280	0,000699166	-0,716590086	Downregualted in Tumor	29968	NA
+TPR	Nucleoprotein TPR	P12270	0,000435138	-0,710929382	Downregualted in Tumor	7175	ENSG00000047410
+DSG3	Desmoglein-3	P32926	0,000641018	-0,709144403	Downregualted in Tumor	1830	ENSG00000134757
+DNTTIP2	Deoxynucleotidyltransferase terminal-interacting protein 2	Q5QJE6	0,001988168	-0,703198723	Downregualted in Tumor	30836	ENSG00000067334
+TBL3	Transducin beta-like protein 3	Q12788	0,001330934	-0,701020666	Downregualted in Tumor	10607	ENSG00000183751
+CIRH1A	Cirhin	Q969X6	0,001497746	-0,696756095	Downregualted in Tumor	84916	ENSG00000262788;ENSG00000141076
+UTP15	U3 small nucleolar RNA-associated protein 15 homolog	Q8TED0	0,000580015	-0,695363344	Downregualted in Tumor	84135	ENSG00000164338
+LCN2;NGAL	Neutrophil gelatinase-associated lipocalin	P80188	8,48128E-05	-0,69322885	Downregualted in Tumor	3934	ENSG00000148346
+ITGA2	Integrin alpha-2	P17301	3,14858E-06	-0,692416132	Downregualted in Tumor	3673	ENSG00000164171
+APOBEC3B	DNA dC->dU-editing enzyme APOBEC-3B	Q9UH17	0,002091541	-0,692250959	Downregualted in Tumor	9582	ENSG00000179750
+APOBEC3B	DNA dC->dU-editing enzyme APOBEC-3B	Q6ICH2	0,002091541	-0,692250959	Downregualted in Tumor	140564	ENSG00000243811
+APOBEC3B	DNA dC->dU-editing enzyme APOBEC-3B	B2CML4	0,002091541	-0,692250959	Downregualted in Tumor	140564	NA
+RRP9	U3 small nucleolar RNA-interacting protein 2	O43818	0,00955613	-0,689404364	Downregualted in Tumor	9136	ENSG00000114767
+ANXA1	Annexin A1;Annexin	P04083	1,4089E-06	-0,689085617	Downregualted in Tumor	301	ENSG00000135046
+ANXA1	Annexin A1;Annexin	Q5TZZ9	1,4089E-06	-0,689085617	Downregualted in Tumor	301	NA
+STIP1	Stress-induced-phosphoprotein 1	P31948	1,15799E-08	-0,685815079	Downregualted in Tumor	10963	ENSG00000168439
+STIP1	Stress-induced-phosphoprotein 1	V9HW72	1,15799E-08	-0,685815079	Downregualted in Tumor	10963	NA
+POLR2A	DNA-directed RNA polymerase II subunit RPB1	P24928	0,000920197	-0,683297656	Downregualted in Tumor	5430	ENSG00000181222
+PLEC	Plectin	Q15149	2,45786E-08	-0,681744248	Downregualted in Tumor	5339	ENSG00000178209
+FDFT1	Squalene synthase	P37268	0,000144706	-0,681491473	Downregualted in Tumor	2222	ENSG00000079459
+FDFT1	Squalene synthase	Q6IAX1	0,000144706	-0,681491473	Downregualted in Tumor	2222	NA
+FDFT1	Squalene synthase	B4DND3	0,000144706	-0,681491473	Downregualted in Tumor	2222	NA
+FDFT1	Squalene synthase	B7Z9R8	0,000144706	-0,681491473	Downregualted in Tumor	2222	NA
+NRD1	Nardilysin	O43847	0,002312247	-0,680530134	Downregualted in Tumor	4898	ENSG00000078618
+NRD1	Nardilysin	B1AKJ5	0,002312247	-0,680530134	Downregualted in Tumor	4898	ENSG00000078618
+NRD1	Nardilysin	Q6UUU9	0,002312247	-0,680530134	Downregualted in Tumor	4898	NA
+NRD1	Nardilysin	G3V1R5	0,002312247	-0,680530134	Downregualted in Tumor	4898	ENSG00000078618
+HK2	Hexokinase-2	P52789	0,000109561	-0,677769184	Downregualted in Tumor	3099	ENSG00000159399
+DHX16	Putative pre-mRNA-splicing factor ATP-dependent RNA helicase DHX16	O60231	0,007588644	-0,675095839	Downregualted in Tumor	8449	ENSG00000204560;ENSG00000233418;ENSG00000233049;ENSG00000233561;ENSG00000226171;ENSG00000231377;ENSG00000206486
+DHX16	Putative pre-mRNA-splicing factor ATP-dependent RNA helicase DHX16	Q5SQH4	0,007588644	-0,675095839	Downregualted in Tumor	8449	NA
+DHX16	Putative pre-mRNA-splicing factor ATP-dependent RNA helicase DHX16	Q5SQH5	0,007588644	-0,675095839	Downregualted in Tumor	8449	ENSG00000204560;ENSG00000233418;ENSG00000233049;ENSG00000233561;ENSG00000226171;ENSG00000231377
+XPOT	Exportin-T	O43592	0,000142579	-0,672464874	Downregualted in Tumor	11260	ENSG00000184575
+DDX19A;DKFZp762C1313;hCG_1998531	ATP-dependent RNA helicase DDX19A	Q9NUU7	4,53341E-05	-0,672330671	Downregualted in Tumor	55308	ENSG00000168872
+DDX19A;DKFZp762C1313;hCG_1998531	ATP-dependent RNA helicase DDX19A	I3L0H8	4,53341E-05	-0,672330671	Downregualted in Tumor	55308	ENSG00000168872
+DDX19A;DKFZp762C1313;hCG_1998531	ATP-dependent RNA helicase DDX19A	B4DS24	4,53341E-05	-0,672330671	Downregualted in Tumor	55308	NA
+DDX19A;DKFZp762C1313;hCG_1998531	ATP-dependent RNA helicase DDX19A	B4DL69	4,53341E-05	-0,672330671	Downregualted in Tumor	11269	NA
+KIF23	Kinesin-like protein KIF23	Q02241	0,006707505	-0,670735416	Downregualted in Tumor	9493	ENSG00000137807
+RDX	Radixin	P35241	2,37466E-05	-0,665698467	Downregualted in Tumor	5962	ENSG00000137710
+RDX	Radixin	B0YJ88	2,37466E-05	-0,665698467	Downregualted in Tumor	5962	NA
+RDX	Radixin	Q6PKD3	2,37466E-05	-0,665698467	Downregualted in Tumor	5962	NA
+AP2A2	AP-2 complex subunit alpha-2	O94973	0,010588934	-0,662948059	Downregualted in Tumor	161	ENSG00000183020
+ITGA3	Integrin alpha-3;Integrin alpha-3 heavy chain;Integrin alpha-3 light chain	P26006	0,001060817	-0,662132858	Downregualted in Tumor	3675	ENSG00000005884
+ARHGEF2	Rho guanine nucleotide exchange factor 2	Q92974	5,30564E-05	-0,662033953	Downregualted in Tumor	9181	ENSG00000116584
+MCM2	DNA replication licensing factor MCM2	P49736	1,59896E-05	-0,661017833	Downregualted in Tumor	4171	ENSG00000073111
+GTPBP4	Nucleolar GTP-binding protein 1	Q9BZE4	0,001124113	-0,660227115	Downregualted in Tumor	23560	ENSG00000107937
+GTPBP4	Nucleolar GTP-binding protein 1	D2CFK9	0,001124113	-0,660227115	Downregualted in Tumor	23560	NA
+GEMIN5	Gem-associated protein 5	Q8TEQ6	0,004642141	-0,658230106	Downregualted in Tumor	25929	ENSG00000082516
+GEMIN5	Gem-associated protein 5	B7ZLC9	0,004642141	-0,658230106	Downregualted in Tumor	25929	NA
+GEMIN5	Gem-associated protein 5	Q58EZ8	0,004642141	-0,658230106	Downregualted in Tumor	25929	NA
+GOLGA4	Golgin subfamily A member 4	Q13439	0,001031108	-0,656149822	Downregualted in Tumor	2803	ENSG00000144674
+GOLGA4	Golgin subfamily A member 4	Q49A56	0,001031108	-0,656149822	Downregualted in Tumor	2803	NA
+STXBP3	Syntaxin-binding protein 3	O00186	0,000816102	-0,647855413	Downregualted in Tumor	6814	ENSG00000116266
+RRP12	RRP12-like protein	Q5JTH9	3,34076E-05	-0,645909078	Downregualted in Tumor	23223	ENSG00000052749
+RRP12	RRP12-like protein	B3KMR5	3,34076E-05	-0,645909078	Downregualted in Tumor	23223	NA
+GART	Trifunctional purine biosynthetic protein adenosine-3;Phosphoribosylamine--glycine ligase;Phosphoribosylformylglycinamidine cyclo-ligase;Phosphoribosylglycinamide formyltransferase	P22102	1,07892E-07	-0,645182659	Downregualted in Tumor	2618	ENSG00000159131;ENSG00000262473
+GART	Trifunctional purine biosynthetic protein adenosine-3;Phosphoribosylamine--glycine ligase;Phosphoribosylformylglycinamidine cyclo-ligase;Phosphoribosylglycinamide formyltransferase	Q59HH3	1,07892E-07	-0,645182659	Downregualted in Tumor	2618	NA
+PDCD11	Protein RRP5 homolog	Q14690	0,000398164	-0,643626638	Downregualted in Tumor	22984	ENSG00000148843
+GRPEL1	GrpE protein homolog 1, mitochondrial	Q9HAV7	0,002340415	-0,641239454	Downregualted in Tumor	80273	ENSG00000109519
+COLGALT1	Procollagen galactosyltransferase 1	Q8NBJ5	2,4617E-05	-0,640699749	Downregualted in Tumor	79709	ENSG00000130309
+CUL3	Cullin-3	Q13618	0,000323586	-0,640653965	Downregualted in Tumor	8452	ENSG00000036257
+CUL3	Cullin-3	A0A024R475	0,000323586	-0,640653965	Downregualted in Tumor	8452	NA
+CUL3	Cullin-3	B7Z600	0,000323586	-0,640653965	Downregualted in Tumor	8452	NA
+SLC1A5	Neutral amino acid transporter B(0)	Q15758	5,12288E-05	-0,636526534	Downregualted in Tumor	6510	ENSG00000105281
+FLOT2	Flotillin-2	Q14254	0,000303665	-0,636310852	Downregualted in Tumor	2319	ENSG00000132589
+FLOT2	Flotillin-2	A0A024QZ62	0,000303665	-0,636310852	Downregualted in Tumor	2319	NA
+FLOT2	Flotillin-2	Q6FG43	0,000303665	-0,636310852	Downregualted in Tumor	2319	NA
+FLOT2	Flotillin-2	J3QLD9	0,000303665	-0,636310852	Downregualted in Tumor	2319	ENSG00000132589
+NOP56	Nucleolar protein 56	O00567	5,66589E-07	-0,635833052	Downregualted in Tumor	10528	ENSG00000101361
+RMDN1	Regulator of microtubule dynamics protein 1	Q96DB5	0,000920322	-0,635827456	Downregualted in Tumor	51115	ENSG00000176623
+RMDN1	Regulator of microtubule dynamics protein 1	E5RH53	0,000920322	-0,635827456	Downregualted in Tumor	51115	ENSG00000176623
+TLDC1;KIAA1609	TLD domain-containing protein 1	Q6P9B6	0,002720092	-0,635407828	Downregualted in Tumor	57707	ENSG00000140950
+ACSL3	Long-chain-fatty-acid--CoA ligase 3	O95573	0,000182493	-0,63457249	Downregualted in Tumor	2181	ENSG00000123983
+ACSL3	Long-chain-fatty-acid--CoA ligase 3	A0A024R497	0,000182493	-0,63457249	Downregualted in Tumor	2181	NA
+PSMD7	26S proteasome non-ATPase regulatory subunit 7	P51665	0,001203831	-0,63438699	Downregualted in Tumor	5713	ENSG00000103035
+ACTL6A	Actin-like protein 6A	O96019	3,2497E-05	-0,63404137	Downregualted in Tumor	86	ENSG00000136518
+PFKP	6-phosphofructokinase type C	Q01813	7,90425E-07	-0,633722924	Downregualted in Tumor	5214	ENSG00000067057
+HSP90AA1;EL52	Heat shock protein HSP 90-alpha	P07900	2,11258E-07	-0,633537145	Downregualted in Tumor	3320	ENSG00000080824
+HSP90AA1;EL52	Heat shock protein HSP 90-alpha	K9JA46	2,11258E-07	-0,633537145	Downregualted in Tumor	3320	NA
+HSP90AA1;EL52	Heat shock protein HSP 90-alpha	Q86SX1	2,11258E-07	-0,633537145	Downregualted in Tumor	3320	NA
+MCM6	DNA replication licensing factor MCM6	Q14566	4,45165E-06	-0,632859052	Downregualted in Tumor	4175	ENSG00000076003
+TOP1	DNA topoisomerase 1	P11387	2,49926E-05	-0,631151	Downregualted in Tumor	7150	ENSG00000198900
+TOP1	DNA topoisomerase 1	Q9BVT2	2,49926E-05	-0,631151	Downregualted in Tumor	7150	NA
+TRIM33	E3 ubiquitin-protein ligase TRIM33	Q9UPN9	9,23797E-05	-0,630775432	Downregualted in Tumor	51592	ENSG00000197323
+TRIM33	E3 ubiquitin-protein ligase TRIM33	B3KN30	9,23797E-05	-0,630775432	Downregualted in Tumor	51592	NA
+ANXA2;ANXA2P2	Annexin A2;Annexin;Putative annexin A2-like protein	P07355	3,6622E-07	-0,630683913	Downregualted in Tumor	302	ENSG00000182718
+ANXA2;ANXA2P2	Annexin A2;Annexin;Putative annexin A2-like protein	A0A024R5Z7	3,6622E-07	-0,630683913	Downregualted in Tumor	302	NA
+GOLGA2	Golgin subfamily A member 2	Q08379	0,000599422	-0,626728678	Downregualted in Tumor	2801	ENSG00000167110
+SPTAN1	Spectrin alpha chain, non-erythrocytic 1	Q13813	3,42217E-06	-0,626585795	Downregualted in Tumor	6709	ENSG00000197694
+NPM1	Nucleophosmin	P06748	1,04604E-06	-0,623349789	Downregualted in Tumor	4869	ENSG00000181163
+TMEM205	Transmembrane protein 205	Q6UW68	0,000587132	-0,622823266	Downregualted in Tumor	374882	ENSG00000105518
+TMEM205	Transmembrane protein 205	A0A024R7D3	0,000587132	-0,622823266	Downregualted in Tumor	374882	NA
+IPO5	Importin-5	O00410	7,20713E-07	-0,621437326	Downregualted in Tumor	3843	ENSG00000065150
+IPO5	Importin-5	B3KWG6	7,20713E-07	-0,621437326	Downregualted in Tumor	3843	NA
+IPO5	Importin-5	Q9BVS9	7,20713E-07	-0,621437326	Downregualted in Tumor	3843	NA
+ATP2B4;DKFZp686M088	Plasma membrane calcium-transporting ATPase 4	P23634	0,000284107	-0,620920211	Downregualted in Tumor	493	ENSG00000058668
+ATP2B4;DKFZp686M088	Plasma membrane calcium-transporting ATPase 4	A0A024R968	0,000284107	-0,620920211	Downregualted in Tumor	493	NA
+HMGCS1	Hydroxymethylglutaryl-CoA synthase, cytoplasmic	Q01581	0,001203427	-0,619669474	Downregualted in Tumor	3157	ENSG00000112972
+HMGCS1	Hydroxymethylglutaryl-CoA synthase, cytoplasmic	A0A024R059	0,001203427	-0,619669474	Downregualted in Tumor	3157	NA
+RACGAP1	Rac GTPase-activating protein 1	Q9H0H5	0,010061792	-0,615725158	Downregualted in Tumor	29127	ENSG00000161800
+RACGAP1	Rac GTPase-activating protein 1	B2RE34	0,010061792	-0,615725158	Downregualted in Tumor	29127	NA
+RACGAP1	Rac GTPase-activating protein 1	A0A024R136	0,010061792	-0,615725158	Downregualted in Tumor	29127	NA
+ACLY;ACLY variant protein	ATP-citrate synthase	P53396	8,0658E-07	-0,613710314	Downregualted in Tumor	47	ENSG00000131473
+ACLY;ACLY variant protein	ATP-citrate synthase	A0A024R1T9	8,0658E-07	-0,613710314	Downregualted in Tumor	47	NA
+ACLY;ACLY variant protein	ATP-citrate synthase	Q4LE36	8,0658E-07	-0,613710314	Downregualted in Tumor	47	NA
+ACLY;ACLY variant protein	ATP-citrate synthase	A0A024R1Y2	8,0658E-07	-0,613710314	Downregualted in Tumor	47	NA
+ATXN10	Ataxin-10	Q9UBB4	2,39863E-05	-0,612369505	Downregualted in Tumor	25814	ENSG00000130638
+CORO1C	Coronin-1C;Coronin	Q9ULV4	0,000183002	-0,611936563	Downregualted in Tumor	23603	ENSG00000110880
+CORO1C	Coronin-1C;Coronin	A0A024RBI5	0,000183002	-0,611936563	Downregualted in Tumor	23603	NA
+CORO1C	Coronin-1C;Coronin	Q6QEF8	0,000183002	-0,611936563	Downregualted in Tumor	84940	ENSG00000167549
+CORO1C	Coronin-1C;Coronin	B3KRY9	0,000183002	-0,611936563	Downregualted in Tumor	84940	NA
+CORO1C	Coronin-1C;Coronin	B3KSZ9	0,000183002	-0,611936563	Downregualted in Tumor	84940	NA
+SKIV2L2	Superkiller viralicidic activity 2-like 2	P42285	0,000907648	-0,611404236	Downregualted in Tumor	23517	ENSG00000039123
+SKIV2L2	Superkiller viralicidic activity 2-like 2	Q3MHC9	0,000907648	-0,611404236	Downregualted in Tumor	23517	NA
+GLS	Glutaminase kidney isoform, mitochondrial	O94925	0,000702736	-0,610848119	Downregualted in Tumor	2744	ENSG00000115419
+FLNA	Filamin-A	P21333	1,90867E-06	-0,610782252	Downregualted in Tumor	2316	ENSG00000196924
+RANGAP1	Ran GTPase-activating protein 1	P46060	1,87872E-05	-0,609379838	Downregualted in Tumor	5905	ENSG00000100401
+RANGAP1	Ran GTPase-activating protein 1	A0A024R1U0	1,87872E-05	-0,609379838	Downregualted in Tumor	5905	NA
+RANGAP1	Ran GTPase-activating protein 1	Q9BSK3	1,87872E-05	-0,609379838	Downregualted in Tumor	5905	NA
+HEATR6	HEAT repeat-containing protein 6	Q6AI08	0,006087464	-0,607617521	Downregualted in Tumor	63897	ENSG00000068097
+SCAMP3	Secretory carrier-associated membrane protein 3	O14828	0,007988602	-0,607141838	Downregualted in Tumor	10067	ENSG00000116521;ENSG00000263290
+CLDN3	Claudin-3	O15551	0,006983346	-0,606985017	Downregualted in Tumor	1365	ENSG00000165215
+CLDN3	Claudin-3	Q75L79	0,006983346	-0,606985017	Downregualted in Tumor	1365	NA
+HBB	Hemoglobin subunit beta;LVV-hemorphin-7	P68871	0,006274827	-0,602485721	Downregualted in Tumor	3043	ENSG00000244734
+HBB	Hemoglobin subunit beta;LVV-hemorphin-7	D9YZU5	0,006274827	-0,602485721	Downregualted in Tumor	3043	NA
+KIF5B	Kinesin-1 heavy chain	P33176	8,84917E-06	-0,601674988	Downregualted in Tumor	3799	ENSG00000170759
+KIF5B	Kinesin-1 heavy chain	V9HW29	8,84917E-06	-0,601674988	Downregualted in Tumor	3799	NA
+DDX47;E4-DBP	Probable ATP-dependent RNA helicase DDX47	Q9H0S4	0,000181449	-0,600968445	Downregualted in Tumor	51202	ENSG00000213782
+DDX47;E4-DBP	Probable ATP-dependent RNA helicase DDX47	A0A024RAS3	0,000181449	-0,600968445	Downregualted in Tumor	51202	NA
+MCM3;HCC5	DNA replication licensing factor MCM3	P25205	1,82876E-06	-0,600052694	Downregualted in Tumor	4172	ENSG00000112118
+ACTN4	Alpha-actinin-4	O43707	3,84608E-07	-0,599992562	Downregualted in Tumor	81	ENSG00000130402;ENSG00000282844
+DIAPH1	Protein diaphanous homolog 1	O60610	8,54451E-07	-0,599989558	Downregualted in Tumor	1729	ENSG00000131504
+DIAPH1	Protein diaphanous homolog 1	Q6URC4	8,54451E-07	-0,599989558	Downregualted in Tumor	1729	NA
+YARS	Tyrosine--tRNA ligase, cytoplasmic;Tyrosine--tRNA ligase, cytoplasmic, N-terminally processed	P54577	1,62207E-06	-0,597541458	Downregualted in Tumor	8565	ENSG00000134684
+NOP2	Putative ribosomal RNA methyltransferase NOP2	P46087	6,18707E-05	-0,594384037	Downregualted in Tumor	4839	ENSG00000111641
+NOP58	Nucleolar protein 58	Q9Y2X3	9,53354E-06	-0,594313956	Downregualted in Tumor	51602	ENSG00000055044
+ACSL1	Long-chain-fatty-acid--CoA ligase 1	P33121	6,28035E-05	-0,592887823	Downregualted in Tumor	2180	ENSG00000151726
+ACSL1	Long-chain-fatty-acid--CoA ligase 1	A8K9T3	6,28035E-05	-0,592887823	Downregualted in Tumor	2180	NA
+ACSL1	Long-chain-fatty-acid--CoA ligase 1	E7EPM6	6,28035E-05	-0,592887823	Downregualted in Tumor	2180	ENSG00000151726
+ACSL1	Long-chain-fatty-acid--CoA ligase 1	B4E0R0	6,28035E-05	-0,592887823	Downregualted in Tumor	2180	NA
+ACSL1	Long-chain-fatty-acid--CoA ligase 1	B7Z3Z9	6,28035E-05	-0,592887823	Downregualted in Tumor	2180	ENSG00000151726
+PRPF4	U4/U6 small nuclear ribonucleoprotein Prp4	O43172	0,000243083	-0,591774161	Downregualted in Tumor	9128	ENSG00000136875
+PRPF4	U4/U6 small nuclear ribonucleoprotein Prp4	Q5T1M7	0,000243083	-0,591774161	Downregualted in Tumor	9128	NA
+NAA15;NARG1	N-alpha-acetyltransferase 15, NatA auxiliary subunit	Q9BXJ9	3,34463E-05	-0,590409453	Downregualted in Tumor	80155	ENSG00000164134
+NAA15;NARG1	N-alpha-acetyltransferase 15, NatA auxiliary subunit	B2RBE5	3,34463E-05	-0,590409453	Downregualted in Tumor	80155	NA
+NXF1	Nuclear RNA export factor 1	Q9UBU9	0,005779697	-0,590326693	Downregualted in Tumor	10482	ENSG00000162231
+NXF1	Nuclear RNA export factor 1	Q59E96	0,005779697	-0,590326693	Downregualted in Tumor	10482	NA
+LLGL2	Lethal(2) giant larvae protein homolog 2	Q6P1M3	1,33221E-05	-0,5865682	Downregualted in Tumor	3993	ENSG00000073350
+LLGL2	Lethal(2) giant larvae protein homolog 2	J3QRV5	1,33221E-05	-0,5865682	Downregualted in Tumor	3993	ENSG00000073350
+LLGL2	Lethal(2) giant larvae protein homolog 2	A0PJJ0	1,33221E-05	-0,5865682	Downregualted in Tumor	3993	NA
+CAD	CAD protein;Glutamine-dependent carbamoyl-phosphate synthase;Aspartate carbamoyltransferase;Dihydroorotase	P27708	5,24377E-06	-0,584945719	Downregualted in Tumor	790	ENSG00000084774
+CAD	CAD protein;Glutamine-dependent carbamoyl-phosphate synthase;Aspartate carbamoyltransferase;Dihydroorotase	F8VPD4	5,24377E-06	-0,584945719	Downregualted in Tumor	790	ENSG00000084774
+ROCK1	Rho-associated protein kinase 1	Q13464	0,010350019	-0,584751188	Downregualted in Tumor	6093	ENSG00000067900
+HSPA4L	Heat shock 70 kDa protein 4L	O95757	0,001289555	-0,582958646	Downregualted in Tumor	22824	ENSG00000164070
+HSPA4L	Heat shock 70 kDa protein 4L	E9PDE8	0,001289555	-0,582958646	Downregualted in Tumor	22824	ENSG00000164070
+HSPA4L	Heat shock 70 kDa protein 4L	B4DXT2	0,001289555	-0,582958646	Downregualted in Tumor	22824	NA
+CBS	Cystathionine beta-synthase;Cysteine synthase	P35520	0,002327998	-0,581398872	Downregualted in Tumor	875;102724560	ENSG00000160200
+MCM7	DNA replication licensing factor MCM7	P33993	0,000315085	-0,57985627	Downregualted in Tumor	4176	ENSG00000166508
+MCM7	DNA replication licensing factor MCM7	C6EMX8	0,000315085	-0,57985627	Downregualted in Tumor	4176	NA
+NCAPG	Condensin complex subunit 3	Q9BPX3	0,00679295	-0,579298242	Downregualted in Tumor	64151	ENSG00000109805
+TOMM34	Mitochondrial import receptor subunit TOM34	Q15785	0,001019016	-0,577933067	Downregualted in Tumor	10953	ENSG00000025772
+TARS2	Threonine--tRNA ligase, mitochondrial	Q9BW92	0,008621537	-0,577233877	Downregualted in Tumor	80222	ENSG00000143374
+TARS2	Threonine--tRNA ligase, mitochondrial	U3KQG0	0,008621537	-0,577233877	Downregualted in Tumor	80222	ENSG00000143374
+EGFR	Epidermal growth factor receptor	P00533	0,001272814	-0,575452048	Downregualted in Tumor	1956	ENSG00000146648
+EGFR	Epidermal growth factor receptor	B7Z2I3	0,001272814	-0,575452048	Downregualted in Tumor	1956	NA
+EGFR	Epidermal growth factor receptor	E9PFD7	0,001272814	-0,575452048	Downregualted in Tumor	1956	ENSG00000146648
+EGFR	Epidermal growth factor receptor	F2YGG7	0,001272814	-0,575452048	Downregualted in Tumor	1956	NA
+EGFR	Epidermal growth factor receptor	E7BSV0	0,001272814	-0,575452048	Downregualted in Tumor	1956	NA
+EGFR	Epidermal growth factor receptor	Q504U8	0,001272814	-0,575452048	Downregualted in Tumor	1956	ENSG00000146648
+MCCC1;DKFZp686B20267	Methylcrotonoyl-CoA carboxylase subunit alpha, mitochondrial	Q96RQ3	0,00198377	-0,575070915	Downregualted in Tumor	56922	ENSG00000078070
+MCCC1;DKFZp686B20267	Methylcrotonoyl-CoA carboxylase subunit alpha, mitochondrial	E9PHF7	0,00198377	-0,575070915	Downregualted in Tumor	56922	ENSG00000078070
+MCCC1;DKFZp686B20267	Methylcrotonoyl-CoA carboxylase subunit alpha, mitochondrial	Q68D27	0,00198377	-0,575070915	Downregualted in Tumor	56922	NA
+PLXNB2;Nbla00445	Plexin-B2	O15031	0,005546527	-0,573015357	Downregualted in Tumor	23654	ENSG00000196576
+PRKDC	DNA-dependent protein kinase catalytic subunit	P78527	2,95126E-06	-0,571548963	Downregualted in Tumor	5591	ENSG00000253729
+IARS;DKFZp686L0869;DKFZp686L17145	Isoleucine--tRNA ligase, cytoplasmic	P41252	8,40146E-08	-0,570388958	Downregualted in Tumor	3376	ENSG00000196305
+IARS;DKFZp686L0869;DKFZp686L17145	Isoleucine--tRNA ligase, cytoplasmic	Q6P0M4	8,40146E-08	-0,570388958	Downregualted in Tumor	3376	NA
+IARS;DKFZp686L0869;DKFZp686L17145	Isoleucine--tRNA ligase, cytoplasmic	Q7L4K8	8,40146E-08	-0,570388958	Downregualted in Tumor	3376	NA
+TM9SF3;SMBP	Transmembrane 9 superfamily member 3	Q9HD45	0,000676762	-0,569419073	Downregualted in Tumor	56889	ENSG00000077147
+TM9SF3;SMBP	Transmembrane 9 superfamily member 3	A0A024QYS2	0,000676762	-0,569419073	Downregualted in Tumor	56889	NA
+DHCR24;Nbla03646	Delta(24)-sterol reductase	Q15392	0,00049265	-0,568746738	Downregualted in Tumor	1718	ENSG00000116133
+HSPA4	Heat shock 70 kDa protein 4	P34932	1,85991E-06	-0,567590496	Downregualted in Tumor	3308	ENSG00000170606
+FSCN1	Fascin	Q16658	0,002791639	-0,565195692	Downregualted in Tumor	6624	ENSG00000075618
+FSCN1	Fascin	B3KTA3	0,002791639	-0,565195692	Downregualted in Tumor	6624	NA
+RUVBL1	RuvB-like 1	Q9Y265	3,58272E-05	-0,565186571	Downregualted in Tumor	8607	ENSG00000175792;ENSG00000284901
+RUVBL1	RuvB-like 1	E7ETR0	3,58272E-05	-0,565186571	Downregualted in Tumor	8607	ENSG00000175792;ENSG00000284901
+RUVBL1	RuvB-like 1	B3KRS7	3,58272E-05	-0,565186571	Downregualted in Tumor	8607	NA
+TRIM29	Tripartite motif-containing protein 29	Q14134	0,000487804	-0,564850655	Downregualted in Tumor	23650	ENSG00000137699
+TRIM29	Tripartite motif-containing protein 29	A0A024R3J1	0,000487804	-0,564850655	Downregualted in Tumor	23650	NA
+TRIM29	Tripartite motif-containing protein 29	B7Z8U9	0,000487804	-0,564850655	Downregualted in Tumor	23650	NA
+TRIM29	Tripartite motif-containing protein 29	E9PRL4	0,000487804	-0,564850655	Downregualted in Tumor	23650	ENSG00000137699
+TRIM29	Tripartite motif-containing protein 29	B7Z5V5	0,000487804	-0,564850655	Downregualted in Tumor	23650	NA
+LYAR	Cell growth-regulating nucleolar protein	Q9NX58	0,005576737	-0,56440413	Downregualted in Tumor	55646	ENSG00000145220
+OXCT1;OXCT	Succinyl-CoA:3-ketoacid coenzyme A transferase 1, mitochondrial;Succinyl-CoA:3-ketoacid-coenzyme A transferase	P55809	0,000185312	-0,56414058	Downregualted in Tumor	5019	ENSG00000083720
+OXCT1;OXCT	Succinyl-CoA:3-ketoacid coenzyme A transferase 1, mitochondrial;Succinyl-CoA:3-ketoacid-coenzyme A transferase	A0A024R040	0,000185312	-0,56414058	Downregualted in Tumor	5019	NA
+TOP2A	DNA topoisomerase 2-alpha	P11388	1,91688E-05	-0,563375923	Downregualted in Tumor	7153	ENSG00000131747
+DDX18	ATP-dependent RNA helicase DDX18	Q9NVP1	0,000229773	-0,562808317	Downregualted in Tumor	8886	ENSG00000088205
+DDX18	ATP-dependent RNA helicase DDX18	A0A024RAH8	0,000229773	-0,562808317	Downregualted in Tumor	8886	NA
+DDX18	ATP-dependent RNA helicase DDX18	Q8N254	0,000229773	-0,562808317	Downregualted in Tumor	8886	NA
+UBA6	Ubiquitin-like modifier-activating enzyme 6	A0AVT1	6,72792E-05	-0,561977412	Downregualted in Tumor	55236	ENSG00000033178
+UBA6	Ubiquitin-like modifier-activating enzyme 6	A0A024RDB0	6,72792E-05	-0,561977412	Downregualted in Tumor	55236	NA
+LRPPRC	Leucine-rich PPR motif-containing protein, mitochondrial	P42704	0,000261184	-0,561010008	Downregualted in Tumor	10128	ENSG00000138095
+LRPPRC	Leucine-rich PPR motif-containing protein, mitochondrial	E5KNY5	0,000261184	-0,561010008	Downregualted in Tumor	10128	NA
+PDS5B	Sister chromatid cohesion protein PDS5 homolog B	Q9NTI5	0,001867767	-0,560687782	Downregualted in Tumor	23047	ENSG00000083642
+NMD3	60S ribosomal export protein NMD3	Q96D46	0,001109735	-0,559488163	Downregualted in Tumor	51068	ENSG00000169251
+NMD3	60S ribosomal export protein NMD3	C9JA08	0,001109735	-0,559488163	Downregualted in Tumor	51068	ENSG00000169251
+AKR1C3	Aldo-keto reductase family 1 member C3	P42330	0,001004736	-0,557855972	Downregualted in Tumor	8644	ENSG00000196139
+AKR1C3	Aldo-keto reductase family 1 member C3	B4DKT3	0,001004736	-0,557855972	Downregualted in Tumor	8644	NA
+DIS3	Exosome complex exonuclease RRP44	Q9Y2L1	0,010748832	-0,556322481	Downregualted in Tumor	22894	ENSG00000083520
+DIS3	Exosome complex exonuclease RRP44	G3V1J5	0,010748832	-0,556322481	Downregualted in Tumor	22894	ENSG00000083520
+NUP155	Nuclear pore complex protein Nup155	O75694	0,000260615	-0,553991552	Downregualted in Tumor	9631	ENSG00000113569
+NUP155	Nuclear pore complex protein Nup155	A0A024R071	0,000260615	-0,553991552	Downregualted in Tumor	9631	NA
+NUP155	Nuclear pore complex protein Nup155	B4DLT2	0,000260615	-0,553991552	Downregualted in Tumor	9631	NA
+NUP155	Nuclear pore complex protein Nup155	E9PF10	0,000260615	-0,553991552	Downregualted in Tumor	9631	ENSG00000113569
+IARS2	Isoleucine--tRNA ligase, mitochondrial	Q9NSE4	3,09245E-06	-0,553940186	Downregualted in Tumor	55699	ENSG00000067704
+AGPS	Alkyldihydroxyacetonephosphate synthase, peroxisomal	O00116	0,005194493	-0,552664781	Downregualted in Tumor	8540	ENSG00000018510
+AGPS	Alkyldihydroxyacetonephosphate synthase, peroxisomal	B7Z3Q4	0,005194493	-0,552664781	Downregualted in Tumor	8540	NA
+PFKFB2;DKFZp781D2217	6-phosphofructo-2-kinase/fructose-2,6-bisphosphatase 2;6-phosphofructo-2-kinase;Fructose-2,6-bisphosphatase	O60825	0,006756207	-0,55180494	Downregualted in Tumor	5208	ENSG00000123836
+MYH9	Myosin-9	P35579	2,21188E-06	-0,551475797	Downregualted in Tumor	4627	ENSG00000100345
+MYH9	Myosin-9	A0A024R1N1	2,21188E-06	-0,551475797	Downregualted in Tumor	4627	NA
+SRP72	Signal recognition particle subunit SRP72	O76094	0,000182004	-0,549295493	Downregualted in Tumor	6731	ENSG00000174780
+SRP72	Signal recognition particle subunit SRP72	V9HWK0	0,000182004	-0,549295493	Downregualted in Tumor	6731	NA
+PKP1	Plakophilin-1	A0A024R952	0,002970762	-0,547445807	Downregualted in Tumor	5317	NA
+PKP1	Plakophilin-1	Q13835	0,002970762	-0,547445807	Downregualted in Tumor	5317	ENSG00000081277
+HEATR1	NA	B2RWN5	0,000421016	-0,547069432	Downregualted in Tumor	55127	NA
+NA	NA	B2R8G6	0,006194242	-0,545898744	Downregualted in Tumor	23770	NA
+PHF6	PHD finger protein 6	Q8IWS0	0,000528454	-0,545087698	Downregualted in Tumor	84295	ENSG00000156531
+LONP1	Lon protease homolog, mitochondrial;Lon protease homolog	P36776	3,99029E-06	-0,544415417	Downregualted in Tumor	9361	ENSG00000196365
+RHPN2	Rhophilin-2	Q8IUC4	0,008934742	-0,544341495	Downregualted in Tumor	85415	ENSG00000131941
+MYO1B	Unconventional myosin-Ib	O43795	0,000658573	-0,543957369	Downregualted in Tumor	4430	ENSG00000128641
+MYO1B	Unconventional myosin-Ib	E9PDF6	0,000658573	-0,543957369	Downregualted in Tumor	4430	ENSG00000128641
+MYO1B	Unconventional myosin-Ib	B0I1S9	0,000658573	-0,543957369	Downregualted in Tumor	4430	NA
+RARS	Arginine--tRNA ligase, cytoplasmic	P54136	3,52236E-06	-0,537167128	Downregualted in Tumor	5917	ENSG00000113643
+EPHB3	Ephrin type-B receptor 3	P54753	0,003607089	-0,536997263	Downregualted in Tumor	2049	ENSG00000182580
+CYFIP1	Cytoplasmic FMR1-interacting protein 1	Q7L576	0,000120559	-0,534550298	Downregualted in Tumor	23191	ENSG00000273749
+NAPG	Gamma-soluble NSF attachment protein	Q99747	0,003279737	-0,532012848	Downregualted in Tumor	8774	ENSG00000134265
+NAPG	Gamma-soluble NSF attachment protein	Q6FHY4	0,003279737	-0,532012848	Downregualted in Tumor	8774	NA
+PARP1	Poly [ADP-ribose] polymerase 1	P09874	0,000119867	-0,530258063	Downregualted in Tumor	142	ENSG00000143799
+PARP1	Poly [ADP-ribose] polymerase 1	A0A024R3T8	0,000119867	-0,530258063	Downregualted in Tumor	142	NA
+SLC27A4	Long-chain fatty acid transport protein 4	Q6P1M0	0,0060816	-0,529901889	Downregualted in Tumor	10999	ENSG00000167114
+SLC27A4	Long-chain fatty acid transport protein 4	A0A024R8D2	0,0060816	-0,529901889	Downregualted in Tumor	10999	NA
+TTC37	Tetratricopeptide repeat protein 37	Q6PGP7	0,005695547	-0,529900533	Downregualted in Tumor	9652	ENSG00000198677
+CLTC	Clathrin heavy chain 1	Q00610	5,10397E-07	-0,529731461	Downregualted in Tumor	1213	ENSG00000141367
+CLTC	Clathrin heavy chain 1	A0A087WVQ6	5,10397E-07	-0,529731461	Downregualted in Tumor	1213	ENSG00000141367
+POLR1C	DNA-directed RNA polymerases I and III subunit RPAC1	O15160	0,008635353	-0,529139668	Downregualted in Tumor	9533	ENSG00000171453
+EMC1	ER membrane protein complex subunit 1	Q8N766	0,001383193	-0,528986159	Downregualted in Tumor	23065	ENSG00000127463
+EIF5	Eukaryotic translation initiation factor 5	P55010	0,000376016	-0,52879778	Downregualted in Tumor	1983	ENSG00000100664
+EIF5	Eukaryotic translation initiation factor 5	A0A024R6Q1	0,000376016	-0,52879778	Downregualted in Tumor	1983	NA
+GOLGA5	Golgin subfamily A member 5	Q8TBA6	0,007116923	-0,528732943	Downregualted in Tumor	9950	ENSG00000066455
+MCM5	DNA replication licensing factor MCM5	P33992	3,6312E-07	-0,526483599	Downregualted in Tumor	4174	ENSG00000100297
+MCM5	DNA replication licensing factor MCM5	B1AHB0	3,6312E-07	-0,526483599	Downregualted in Tumor	4174	NA
+JUP	Junction plakoglobin	P14923	3,94608E-05	-0,525766097	Downregualted in Tumor	3728	ENSG00000173801
+TARS	Threonine--tRNA ligase, cytoplasmic	P26639	1,86779E-05	-0,524124627	Downregualted in Tumor	6897	ENSG00000113407
+SPTBN2	Spectrin beta chain, non-erythrocytic 2	O15020	0,004505332	-0,521659629	Downregualted in Tumor	6712	ENSG00000173898
+CDC5L	Cell division cycle 5-like protein	Q99459	0,00936171	-0,520813242	Downregualted in Tumor	988	ENSG00000096401
+ABCF2	ATP-binding cassette sub-family F member 2	Q9UG63	0,000459438	-0,519250631	Downregualted in Tumor	10061	ENSG00000285292;ENSG00000033050
+KPNA2	Importin subunit alpha-1;Importin subunit alpha	P52292	0,003303035	-0,51923262	Downregualted in Tumor	3838	ENSG00000182481
+PRPF6	Pre-mRNA-processing factor 6	O94906	5,92966E-06	-0,516174011	Downregualted in Tumor	24148	ENSG00000101161
+CHD4	Chromodomain-helicase-DNA-binding protein 4	F5GWX5	8,9986E-06	-0,515809394	Downregualted in Tumor	1108	ENSG00000111642
+CHD4	Chromodomain-helicase-DNA-binding protein 4	Q14839	8,9986E-06	-0,515809394	Downregualted in Tumor	1108	ENSG00000111642
+CLPX;DKFZp586J151	ATP-dependent Clp protease ATP-binding subunit clpX-like, mitochondrial	O76031	0,008881492	-0,513959057	Downregualted in Tumor	10845	ENSG00000166855
+CLPX;DKFZp586J151	ATP-dependent Clp protease ATP-binding subunit clpX-like, mitochondrial	A0A024R5X7	0,008881492	-0,513959057	Downregualted in Tumor	10845	NA
+AIMP2	Aminoacyl tRNA synthase complex-interacting multifunctional protein 2	Q13155	0,000963028	-0,513813162	Downregualted in Tumor	7965	ENSG00000106305
+AIMP2	Aminoacyl tRNA synthase complex-interacting multifunctional protein 2	A0A024QZY1	0,000963028	-0,513813162	Downregualted in Tumor	7965	NA
+AIMP2	Aminoacyl tRNA synthase complex-interacting multifunctional protein 2	A8MU58	0,000963028	-0,513813162	Downregualted in Tumor	7965	ENSG00000106305
+CSE1L	Exportin-2	P55060	0,007896757	-0,512911365	Downregualted in Tumor	1434	ENSG00000124207
+PPL	Periplakin	O60437	9,25578E-05	-0,512628729	Downregualted in Tumor	5493	ENSG00000118898
+PTRF	Polymerase I and transcript release factor	Q6NZI2	0,000283408	-0,511973701	Downregualted in Tumor	284119	ENSG00000177469
+LMNA	Prelamin-A/C;Lamin-A/C	P02545	1,64716E-05	-0,511024739	Downregualted in Tumor	4000	ENSG00000160789
+IMMT	Mitochondrial inner membrane protein	Q16891	1,67179E-05	-0,507033688	Downregualted in Tumor	10989	ENSG00000132305
+EPRS	Bifunctional glutamate/proline--tRNA ligase;Glutamate--tRNA ligase;Proline--tRNA ligase	P07814	2,09795E-09	-0,506881715	Downregualted in Tumor	2058	ENSG00000136628
+ITGB1	Integrin beta-1	P05556	0,000911523	-0,505460162	Downregualted in Tumor	3688	ENSG00000150093
+DDX51	ATP-dependent RNA helicase DDX51	Q8N8A6	0,008800964	-0,503766626	Downregualted in Tumor	317781	ENSG00000185163
+USP32	Ubiquitin carboxyl-terminal hydrolase 32;Ubiquitin carboxyl-terminal hydrolase	Q8NFA0	0,009886583	-0,502087377	Downregualted in Tumor	84669	ENSG00000170832
+PPP3CA	Serine/threonine-protein phosphatase 2B catalytic subunit alpha isoform;Serine/threonine-protein phosphatase	Q08209	0,001933936	-0,501141094	Downregualted in Tumor	5530	ENSG00000138814
+BAZ1B	Tyrosine-protein kinase BAZ1B	Q9UIG0	0,000259687	-0,500333423	Downregualted in Tumor	9031	ENSG00000009954
+HSP90B1;TRA1	Endoplasmin	P14625	3,5097E-10	-0,498304996	Downregualted in Tumor	7184	ENSG00000166598
+HSP90B1;TRA1	Endoplasmin	V9HWP2	3,5097E-10	-0,498304996	Downregualted in Tumor	7184	NA
+PRIC295;GCN1L1	Translational activator GCN1	Q92616	0,0007628	-0,498196064	Downregualted in Tumor	10985	ENSG00000089154
+RRM1	Ribonucleoside-diphosphate reductase large subunit;Ribonucleoside-diphosphate reductase	P23921	0,000178405	-0,496686915	Downregualted in Tumor	6240	ENSG00000167325
+RRM1	Ribonucleoside-diphosphate reductase large subunit;Ribonucleoside-diphosphate reductase	B4E0I8	0,000178405	-0,496686915	Downregualted in Tumor	6240	NA
+RRM1	Ribonucleoside-diphosphate reductase large subunit;Ribonucleoside-diphosphate reductase	E9PL69	0,000178405	-0,496686915	Downregualted in Tumor	6240	ENSG00000167325
+RRM1	Ribonucleoside-diphosphate reductase large subunit;Ribonucleoside-diphosphate reductase	B4DXD1	0,000178405	-0,496686915	Downregualted in Tumor	6240	NA
+SNRNP200	U5 small nuclear ribonucleoprotein 200 kDa helicase	O75643	1,18748E-05	-0,496556151	Downregualted in Tumor	23020	ENSG00000144028
+YBX3	Y-box-binding protein 3	P16989	0,010061398	-0,493377389	Downregualted in Tumor	8531	ENSG00000060138
+YBX3	Y-box-binding protein 3	A0A024RAQ1	0,010061398	-0,493377389	Downregualted in Tumor	8531	NA
+FAM83H	Protein FAM83H	Q6ZRV2	0,00022942	-0,49308038	Downregualted in Tumor	286077	ENSG00000273889;ENSG00000180921
+TCERG1	Transcription elongation regulator 1	O14776	0,000312799	-0,492262532	Downregualted in Tumor	10915	ENSG00000113649
+PRPF19	Pre-mRNA-processing factor 19	Q9UMS4	0,001296904	-0,492103618	Downregualted in Tumor	27339	ENSG00000110107
+PSMD1	26S proteasome non-ATPase regulatory subunit 1	Q99460	2,19993E-07	-0,491036903	Downregualted in Tumor	5707	ENSG00000173692
+TCEA1	Transcription elongation factor A protein 1	P23193	0,000945425	-0,489836267	Downregualted in Tumor	6917	ENSG00000187735
+TCEA1	Transcription elongation factor A protein 1	B7Z4W0	0,000945425	-0,489836267	Downregualted in Tumor	6917	NA
+SQLE;ERG1;DKFZp686B0215	Squalene monooxygenase	Q14534	0,000101226	-0,487777001	Downregualted in Tumor	6713	ENSG00000104549
+SQLE;ERG1;DKFZp686B0215	Squalene monooxygenase	Q9UNR6	0,000101226	-0,487777001	Downregualted in Tumor	6713	NA
+SQLE;ERG1;DKFZp686B0215	Squalene monooxygenase	Q5HYI4	0,000101226	-0,487777001	Downregualted in Tumor	6713	NA
+NOC2L	Nucleolar complex protein 2 homolog	Q9Y3T9	0,009851729	-0,487245231	Downregualted in Tumor	26155	ENSG00000188976
+DYNC1H1	Cytoplasmic dynein 1 heavy chain 1	Q14204	1,88122E-05	-0,486460659	Downregualted in Tumor	1778	ENSG00000197102
+CSDE1;UNR	Cold shock domain-containing protein E1	O75534	0,000670281	-0,485482175	Downregualted in Tumor	7812	ENSG00000009307
+CSDE1;UNR	Cold shock domain-containing protein E1	A0A024R0E2	0,000670281	-0,485482175	Downregualted in Tumor	7812	NA
+CSDE1;UNR	Cold shock domain-containing protein E1	A0A024R0K2	0,000670281	-0,485482175	Downregualted in Tumor	7812	NA
+KLC1;KNS2	NA	Q7RTQ2	0,000567978	-0,484833135	Downregualted in Tumor	3831	NA
+NCLN	Nicalin	Q969V3	0,001944947	-0,48477065	Downregualted in Tumor	56926	ENSG00000125912
+SUPV3L1	ATP-dependent RNA helicase SUPV3L1, mitochondrial	Q8IYB8	0,003953606	-0,483860139	Downregualted in Tumor	6832	ENSG00000156502
+EEF2	Elongation factor 2	P13639	4,73806E-07	-0,483736047	Downregualted in Tumor	1938	ENSG00000167658
+GARS	Glycine--tRNA ligase	P41250	0,001109051	-0,482619593	Downregualted in Tumor	2617	ENSG00000106105
+ACTN1	Alpha-actinin-1	P12814	0,000625674	-0,482060076	Downregualted in Tumor	87	ENSG00000072110
+ACTN1	Alpha-actinin-1	A0A024R694	0,000625674	-0,482060076	Downregualted in Tumor	87	NA
+LMNB1	Lamin-B1	P20700	9,48334E-05	-0,477795864	Downregualted in Tumor	4001	ENSG00000113368
+FLNB;DKFZp686A1668	Filamin-B	O75369	2,3025E-05	-0,476968715	Downregualted in Tumor	2317	ENSG00000136068
+SIN3A	Paired amphipathic helix protein Sin3a	Q96ST3	0,003449057	-0,474507779	Downregualted in Tumor	25942	ENSG00000169375
+RHOT2	Mitochondrial Rho GTPase 2	Q8IXI1	0,010909363	-0,474083368	Downregualted in Tumor	89941	ENSG00000140983
+NOL11	Nucleolar protein 11	Q9H8H0	0,009811013	-0,473878989	Downregualted in Tumor	25926	ENSG00000130935
+INF2	Inverted formin-2	Q27J81	0,001565536	-0,472744349	Downregualted in Tumor	64423	ENSG00000203485
+ZNF326	DBIRD complex subunit ZNF326	Q5BKZ1	0,006373981	-0,472226478	Downregualted in Tumor	284695	ENSG00000162664
+CKAP5	Cytoskeleton-associated protein 5	Q14008	6,49349E-05	-0,471991329	Downregualted in Tumor	9793	ENSG00000175216
+FKBP15	FK506-binding protein 15;Peptidyl-prolyl cis-trans isomerase	Q5T1M5	0,008809445	-0,467665739	Downregualted in Tumor	23307	ENSG00000119321
+CTNNA1	Catenin alpha-1	P35221	0,000135553	-0,46694246	Downregualted in Tumor	1495	ENSG00000044115
+CTNNA1	Catenin alpha-1	G3XAM7	0,000135553	-0,46694246	Downregualted in Tumor	1495	ENSG00000044115
+CTNNA1	Catenin alpha-1	B4DU00	0,000135553	-0,46694246	Downregualted in Tumor	1495	NA
+CTNNA1	Catenin alpha-1	B4DKT9	0,000135553	-0,46694246	Downregualted in Tumor	1495	NA
+SMARCA4	Transcription activator BRG1	P51532	0,001084271	-0,464949632	Downregualted in Tumor	6597	ENSG00000127616
+SMARCA4	Transcription activator BRG1	A7E2E1	0,001084271	-0,464949632	Downregualted in Tumor	6597	NA
+SMARCA4	Transcription activator BRG1	Q9HBD4	0,001084271	-0,464949632	Downregualted in Tumor	6597	ENSG00000127616
+SMARCA4	Transcription activator BRG1	B3KNW7	0,001084271	-0,464949632	Downregualted in Tumor	6597	NA
+MYH14	Myosin-14	Q7Z406	1,12882E-06	-0,462183229	Downregualted in Tumor	79784	ENSG00000105357
+MYH14	Myosin-14	A1L2Z2	1,12882E-06	-0,462183229	Downregualted in Tumor	79784	ENSG00000105357
+MYH10	Myosin-10	P35580	0,002726238	-0,461755415	Downregualted in Tumor	4628	ENSG00000133026
+MYH10	Myosin-10	G1UI33	0,002726238	-0,461755415	Downregualted in Tumor	4628	NA
+NUP98	Nuclear pore complex protein Nup98-Nup96;Nuclear pore complex protein Nup98;Nuclear pore complex protein Nup96	P52948	0,003596916	-0,4602676	Downregualted in Tumor	4928	ENSG00000110713
+NCL	Nucleolin	P19338	6,20646E-06	-0,458067496	Downregualted in Tumor	4691	ENSG00000115053
+NCL	Nucleolin	A0A024R4A0	6,20646E-06	-0,458067496	Downregualted in Tumor	4691	NA
+NCL	Nucleolin	B3KM80	6,20646E-06	-0,458067496	Downregualted in Tumor	4691	NA
+SUPT5H	Transcription elongation factor SPT5	O00267	0,003882513	-0,456760684	Downregualted in Tumor	6829	ENSG00000196235
+PKN2	Serine/threonine-protein kinase N2	Q16513	0,005776501	-0,453722283	Downregualted in Tumor	5586	ENSG00000065243
+CDK1;DKFZp686L20222;CDC2	Cyclin-dependent kinase 1	P06493	0,003734342	-0,45361171	Downregualted in Tumor	983	ENSG00000170312
+CDK1;DKFZp686L20222;CDC2	Cyclin-dependent kinase 1	A0A024QZJ8	0,003734342	-0,45361171	Downregualted in Tumor	983	NA
+CDK1;DKFZp686L20222;CDC2	Cyclin-dependent kinase 1	I6L9I5	0,003734342	-0,45361171	Downregualted in Tumor	983	NA
+CDK1;DKFZp686L20222;CDC2	Cyclin-dependent kinase 1	B7Z3D6	0,003734342	-0,45361171	Downregualted in Tumor	983	NA
+CCT7	T-complex protein 1 subunit eta	Q99832	3,07804E-05	-0,446322589	Downregualted in Tumor	10574	ENSG00000135624
+MKI67	Antigen KI-67	P46013	0,002074377	-0,445360451	Downregualted in Tumor	4288	ENSG00000148773
+BCLAF1	Bcl-2-associated transcription factor 1	Q9NYF8	0,006965528	-0,441907628	Downregualted in Tumor	9774	ENSG00000029363
+CCT2	T-complex protein 1 subunit beta	P78371	0,0002999	-0,440783134	Downregualted in Tumor	10576	ENSG00000166226
+CCT2	T-complex protein 1 subunit beta	V9HW96	0,0002999	-0,440783134	Downregualted in Tumor	10576	NA
+RAD50	DNA repair protein RAD50	Q92878	0,007026855	-0,439682287	Downregualted in Tumor	10111	ENSG00000113522
+RAD50	DNA repair protein RAD50	A5D6Y3	0,007026855	-0,439682287	Downregualted in Tumor	10111	NA
+ITPR3	Inositol 1,4,5-trisphosphate receptor type 3	Q14573	0,000215742	-0,438649726	Downregualted in Tumor	3710	ENSG00000096433
+ITPR3	Inositol 1,4,5-trisphosphate receptor type 3	Q59ES2	0,000215742	-0,438649726	Downregualted in Tumor	3710	NA
+ITPR3	Inositol 1,4,5-trisphosphate receptor type 3	A6H8K3	0,000215742	-0,438649726	Downregualted in Tumor	3710	NA
+IMPDH2	Inosine-5-monophosphate dehydrogenase 2	P12268	0,000267803	-0,437409529	Downregualted in Tumor	3615	ENSG00000178035
+NAMPT;NAMPTL	Nicotinamide phosphoribosyltransferase	P43490	1,45602E-05	-0,437295946	Downregualted in Tumor	10135	ENSG00000105835
+NAMPT;NAMPTL	Nicotinamide phosphoribosyltransferase	A0A024R718	1,45602E-05	-0,437295946	Downregualted in Tumor	10135	NA
+MCM4	DNA replication licensing factor MCM4	P33991	0,000874068	-0,436909777	Downregualted in Tumor	4173	ENSG00000104738
+MCM4	DNA replication licensing factor MCM4	B4DLA6	0,000874068	-0,436909777	Downregualted in Tumor	4173	NA
+MCM4	DNA replication licensing factor MCM4	B3KMX0	0,000874068	-0,436909777	Downregualted in Tumor	4173	NA
+PITRM1	Presequence protease, mitochondrial	Q5JRX3	0,002922723	-0,433943025	Downregualted in Tumor	10531	ENSG00000107959
+ATIC	Bifunctional purine biosynthesis protein PURH;Phosphoribosylaminoimidazolecarboxamide formyltransferase;IMP cyclohydrolase	P31939	2,67666E-05	-0,433742793	Downregualted in Tumor	471	ENSG00000138363
+ATIC	Bifunctional purine biosynthesis protein PURH;Phosphoribosylaminoimidazolecarboxamide formyltransferase;IMP cyclohydrolase	V9HWH7	2,67666E-05	-0,433742793	Downregualted in Tumor	471	NA
+AARS	Alanine--tRNA ligase, cytoplasmic	P49588	0,000606196	-0,432779548	Downregualted in Tumor	16	ENSG00000090861
+HSPA8	Heat shock cognate 71 kDa protein	P11142	1,37914E-07	-0,432444442	Downregualted in Tumor	3312	ENSG00000109971
+HSPA8	Heat shock cognate 71 kDa protein	V9HW22	1,37914E-07	-0,432444442	Downregualted in Tumor	3312	NA
+IGF2R	Cation-independent mannose-6-phosphate receptor	P11717	0,000954827	-0,430970634	Downregualted in Tumor	3482	ENSG00000197081
+HSPA9	Stress-70 protein, mitochondrial	P38646	2,81011E-07	-0,430379913	Downregualted in Tumor	3313	ENSG00000113013
+AHSA1	Activator of 90 kDa heat shock protein ATPase homolog 1	O95433	0,001428097	-0,429906151	Downregualted in Tumor	10598	ENSG00000100591
+AHSA1	Activator of 90 kDa heat shock protein ATPase homolog 1	G3V438	0,001428097	-0,429906151	Downregualted in Tumor	10598	ENSG00000100591
+EDC4	Enhancer of mRNA-decapping protein 4	Q6P2E9	0,000930706	-0,425870287	Downregualted in Tumor	23644	ENSG00000038358
+NUDCD1	NudC domain-containing protein 1	Q96RS6	0,003013368	-0,423029	Downregualted in Tumor	84955	ENSG00000120526
+HNRNPU;HNRPU	Heterogeneous nuclear ribonucleoprotein U	Q00839	6,68218E-07	-0,421255039	Downregualted in Tumor	3192	ENSG00000153187
+HNRNPU;HNRPU	Heterogeneous nuclear ribonucleoprotein U	Q96BA7	6,68218E-07	-0,421255039	Downregualted in Tumor	3192	NA
+RSL1D1	Ribosomal L1 domain-containing protein 1	O76021	0,002307631	-0,419571328	Downregualted in Tumor	26156	ENSG00000171490
+KARS	Lysine--tRNA ligase	Q15046	0,000221441	-0,419313109	Downregualted in Tumor	3735	ENSG00000065427
+FLII	Protein flightless-1 homolog	Q13045	0,002808046	-0,418400283	Downregualted in Tumor	2314	ENSG00000284571;ENSG00000177731
+DHX36	Probable ATP-dependent RNA helicase DHX36	Q9H2U1	0,000874107	-0,415790009	Downregualted in Tumor	170506	ENSG00000174953
+USP9X	Probable ubiquitin carboxyl-terminal hydrolase FAF-X;Ubiquitin carboxyl-terminal hydrolase	Q93008	0,000786896	-0,415753135	Downregualted in Tumor	8239	ENSG00000124486
+USP9X	Probable ubiquitin carboxyl-terminal hydrolase FAF-X;Ubiquitin carboxyl-terminal hydrolase	Q6P468	0,000786896	-0,415753135	Downregualted in Tumor	8239	NA
+USP9X	Probable ubiquitin carboxyl-terminal hydrolase FAF-X;Ubiquitin carboxyl-terminal hydrolase	Q86X58	0,000786896	-0,415753135	Downregualted in Tumor	8239	NA
+PRPF8	Pre-mRNA-processing-splicing factor 8	Q6P2Q9	0,000122093	-0,415383969	Downregualted in Tumor	10594	ENSG00000174231;ENSG00000274442
+PSMD2;DKFZp564A2282	26S proteasome non-ATPase regulatory subunit 2	Q13200	4,35515E-06	-0,412793442	Downregualted in Tumor	5708	ENSG00000175166
+CCT8	T-complex protein 1 subunit theta	P50990	1,99422E-05	-0,412602596	Downregualted in Tumor	10694	ENSG00000156261
+CCT8	T-complex protein 1 subunit theta	Q7Z759	1,99422E-05	-0,412602596	Downregualted in Tumor	10694	NA
+MKI67IP	MKI67 FHA domain-interacting nucleolar phosphoprotein	Q9BYG3	0,009739209	-0,411261323	Downregualted in Tumor	84365	ENSG00000155438
+HIST1H1B	Histone H1.5	P16401	0,000408742	-0,411014162	Downregualted in Tumor	3009	ENSG00000184357
+NASP	Nuclear autoantigenic sperm protein	P49321	0,009244848	-0,410161335	Downregualted in Tumor	4678	ENSG00000132780
+NASP	Nuclear autoantigenic sperm protein	Q5T626	0,009244848	-0,410161335	Downregualted in Tumor	4678	NA
+SSRP1	FACT complex subunit SSRP1	Q08945	5,7846E-05	-0,409610182	Downregualted in Tumor	6749	ENSG00000149136
+SSRP1	FACT complex subunit SSRP1	A0A024R4Z6	5,7846E-05	-0,409610182	Downregualted in Tumor	6749	NA
+PPP1R13L	RelA-associated inhibitor	Q8WUF5	0,009117854	-0,405884329	Downregualted in Tumor	10848	ENSG00000104881
+PPP1R13L	RelA-associated inhibitor	A0A024R0Q5	0,009117854	-0,405884329	Downregualted in Tumor	10848	NA
+EIF5B	Eukaryotic translation initiation factor 5B	Q8N5A0	0,003219964	-0,405864341	Downregualted in Tumor	9669	NA
+EIF5B	Eukaryotic translation initiation factor 5B	O60841	0,003219964	-0,405864341	Downregualted in Tumor	9669	ENSG00000158417
+PDCD6IP	Programmed cell death 6-interacting protein	Q8WUM4	7,9496E-06	-0,403039636	Downregualted in Tumor	10015	ENSG00000170248
+ACAD9	Acyl-CoA dehydrogenase family member 9, mitochondrial	Q9H845	0,003226907	-0,401568902	Downregualted in Tumor	28976	ENSG00000177646
+DLG1	Disks large homolog 1	Q12959	0,003629588	-0,400035969	Downregualted in Tumor	1739	ENSG00000075711
+DLG1	Disks large homolog 1	B4DF78	0,003629588	-0,400035969	Downregualted in Tumor	1739	NA
+DLG1	Disks large homolog 1	B7Z4H2	0,003629588	-0,400035969	Downregualted in Tumor	1742	NA
+RBM4	RNA-binding protein 4	Q9BWF3	0,001798157	-0,398306466	Downregualted in Tumor	5936	ENSG00000173933
+SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	P34897	0,000574642	-0,398250968	Downregualted in Tumor	6472	ENSG00000182199
+SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	A0A024RB99	0,000574642	-0,398250968	Downregualted in Tumor	6472	NA
+SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	V9HW06	0,000574642	-0,398250968	Downregualted in Tumor	6472	NA
+SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	Q5HYG8	0,000574642	-0,398250968	Downregualted in Tumor	6472	NA
+SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	Q5BJF5	0,000574642	-0,398250968	Downregualted in Tumor	6472	NA
+SHMT2;DKFZp686P09201	Serine hydroxymethyltransferase, mitochondrial;Serine hydroxymethyltransferase	B4DLV4	0,000574642	-0,398250968	Downregualted in Tumor	6472	NA
+DSG2	Desmoglein-2	Q14126	0,009131078	-0,397512148	Downregualted in Tumor	1829	ENSG00000046604
+IPO7	Importin-7	O95373	0,006066039	-0,39695969	Downregualted in Tumor	10527	ENSG00000205339
+IPO7	Importin-7	B3KNG9	0,006066039	-0,39695969	Downregualted in Tumor	10527	NA
+DEK	Protein DEK	P35659	0,010221165	-0,396788057	Downregualted in Tumor	7913	ENSG00000124795
+AHCY	Adenosylhomocysteinase	P23526	3,53811E-05	-0,396443945	Downregualted in Tumor	191	ENSG00000101444
+EIF4G1;EIF4G1 variant protein	Eukaryotic translation initiation factor 4 gamma 1	Q04637	1,97275E-06	-0,394801245	Downregualted in Tumor	1981	ENSG00000114867
+EIF4G1;EIF4G1 variant protein	Eukaryotic translation initiation factor 4 gamma 1	B2RU10	1,97275E-06	-0,394801245	Downregualted in Tumor	1981	NA
+EIF4G1;EIF4G1 variant protein	Eukaryotic translation initiation factor 4 gamma 1	B2RU06	1,97275E-06	-0,394801245	Downregualted in Tumor	1981	NA
+BSG;hEMMPRIN	Basigin	P35613	0,007286546	-0,394007937	Downregualted in Tumor	682	ENSG00000172270
+BSG;hEMMPRIN	Basigin	Q54A51	0,007286546	-0,394007937	Downregualted in Tumor	682	NA
+PSMC2	26S protease regulatory subunit 7	P35998	6,30262E-06	-0,392453931	Downregualted in Tumor	5701	ENSG00000161057
+PSMC2	26S protease regulatory subunit 7	B7Z571	6,30262E-06	-0,392453931	Downregualted in Tumor	5701	NA
+MYBBP1A	Myb-binding protein 1A	Q9BQG0	0,001222085	-0,390508399	Downregualted in Tumor	10514	ENSG00000132382
+S100A14	Protein S100-A14	Q9HCY8	0,008356518	-0,389305203	Downregualted in Tumor	57402	ENSG00000189334
+CANX	Calnexin	P27824	0,000512952	-0,385605131	Downregualted in Tumor	821	ENSG00000283777;ENSG00000127022
+TKT	Transketolase	P29401	2,93242E-07	-0,384250212	Downregualted in Tumor	7086	ENSG00000163931
+TKT	Transketolase	V9HWD9	2,93242E-07	-0,384250212	Downregualted in Tumor	7086	NA
+CTNNB1	Catenin beta-1	P35222	0,00651839	-0,378622448	Downregualted in Tumor	1499	ENSG00000168036
+CTNNB1	Catenin beta-1	A0A024R2Q3	0,00651839	-0,378622448	Downregualted in Tumor	1499	NA
+CTNNB1	Catenin beta-1	B4DGU4	0,00651839	-0,378622448	Downregualted in Tumor	1499	ENSG00000168036
+ATP2A2	Sarcoplasmic/endoplasmic reticulum calcium ATPase 2	P16615	5,29743E-06	-0,376276299	Downregualted in Tumor	488	ENSG00000174437
+LIG3	DNA ligase 3;DNA ligase	P49916	0,007116296	-0,376100262	Downregualted in Tumor	3980	ENSG00000005156
+PRMT1	Protein arginine N-methyltransferase 1	Q99873	0,001223579	-0,374309195	Downregualted in Tumor	3276	ENSG00000126457
+NUP205	Nuclear pore complex protein Nup205	Q92621	0,006123003	-0,373915838	Downregualted in Tumor	23165	ENSG00000155561
+STT3B	Dolichyl-diphosphooligosaccharide--protein glycosyltransferase subunit STT3B	Q8TCJ2	0,008488702	-0,368859068	Downregualted in Tumor	201595	ENSG00000163527
+HM13	Minor histocompatibility antigen H13	Q8TCT9	7,59595E-05	-0,367178533	Downregualted in Tumor	81502	ENSG00000101294
+TRIM25	E3 ubiquitin/ISG15 ligase TRIM25	Q14258	0,00037507	-0,365648753	Downregualted in Tumor	7706	ENSG00000121060
+FARSB	Phenylalanine--tRNA ligase beta subunit	Q9NSD9	0,000557104	-0,365603644	Downregualted in Tumor	10056	ENSG00000116120
+OAT	Ornithine aminotransferase, mitochondrial;Ornithine aminotransferase, hepatic form;Ornithine aminotransferase, renal form	P04181	0,00196794	-0,36230155	Downregualted in Tumor	4942	ENSG00000065154
+EEF1G	Elongation factor 1-gamma	P26641	0,004290837	-0,361278896	Downregualted in Tumor	1937	ENSG00000254772
+EEF1G	Elongation factor 1-gamma	Q53YD7	0,004290837	-0,361278896	Downregualted in Tumor	1937	NA
+ENO1	Alpha-enolase;Enolase	P06733	1,45209E-06	-0,361085218	Downregualted in Tumor	2023	ENSG00000074800
+ENO1	Alpha-enolase;Enolase	A0A024R4F1	1,45209E-06	-0,361085218	Downregualted in Tumor	2023	NA
+TRIM28	Transcription intermediary factor 1-beta	Q13263	0,001407233	-0,358659798	Downregualted in Tumor	10155	ENSG00000130726
+HSPA5	78 kDa glucose-regulated protein	P11021	7,26849E-05	-0,357808253	Downregualted in Tumor	3309	ENSG00000044574
+HSPA5	78 kDa glucose-regulated protein	V9HWB4	7,26849E-05	-0,357808253	Downregualted in Tumor	3309	NA
+SUPT16H	FACT complex subunit SPT16	Q9Y5B9	0,006986901	-0,357005741	Downregualted in Tumor	11198	ENSG00000092201
+MYO1C	Unconventional myosin-Ic	O00159	0,003670451	-0,35394897	Downregualted in Tumor	4641	ENSG00000197879
+DNAJA1	DnaJ homolog subfamily A member 1	P31689	0,002669664	-0,352050628	Downregualted in Tumor	3301	ENSG00000086061
+DNAJA1	DnaJ homolog subfamily A member 1	B7Z5C0	0,002669664	-0,352050628	Downregualted in Tumor	3301	NA
+DKC1	H/ACA ribonucleoprotein complex subunit 4	O60832	0,002781872	-0,348276227	Downregualted in Tumor	1736	ENSG00000130826
+ADAR	Double-stranded RNA-specific adenosine deaminase	P55265	0,008295857	-0,347810357	Downregualted in Tumor	103	ENSG00000160710
+PAIP1	Polyadenylate-binding protein-interacting protein 1	Q9H074	0,009995906	-0,346405576	Downregualted in Tumor	10605	ENSG00000172239
+TRAP1	Heat shock protein 75 kDa, mitochondrial	Q12931	0,000808508	-0,34425415	Downregualted in Tumor	10131	ENSG00000126602
+TRAP1	Heat shock protein 75 kDa, mitochondrial	Q53FS6	0,000808508	-0,34425415	Downregualted in Tumor	10131	NA
+CKAP4	Cytoskeleton-associated protein 4	Q07065	0,001823837	-0,343797892	Downregualted in Tumor	10970	ENSG00000136026
+CKAP4	Cytoskeleton-associated protein 4	A0A024RBH2	0,001823837	-0,343797892	Downregualted in Tumor	10970	NA
+STT3A	Dolichyl-diphosphooligosaccharide--protein glycosyltransferase subunit STT3A	P46977	0,010825163	-0,339539879	Downregualted in Tumor	3703	ENSG00000134910
+PSMC1	26S protease regulatory subunit 4	P62191	0,000251494	-0,336763876	Downregualted in Tumor	5700	ENSG00000100764
+PSMC1	26S protease regulatory subunit 4	Q53XL8	0,000251494	-0,336763876	Downregualted in Tumor	5700	NA
+CCT3	T-complex protein 1 subunit gamma	P49368	2,58158E-05	-0,336023048	Downregualted in Tumor	7203	ENSG00000163468
+CCT3	T-complex protein 1 subunit gamma	B3KX11	2,58158E-05	-0,336023048	Downregualted in Tumor	7203	NA
+CCT3	T-complex protein 1 subunit gamma	Q59H77	2,58158E-05	-0,336023048	Downregualted in Tumor	7203	NA
+LARP1	La-related protein 1	Q6PKG0	0,005441841	-0,335928322	Downregualted in Tumor	23367	ENSG00000155506
+TMPO	Lamina-associated polypeptide 2, isoform alpha;Thymopoietin;Thymopentin	P42166	0,005005762	-0,333896162	Downregualted in Tumor	7112	ENSG00000120802
+MYOF	Myoferlin	Q9NZM1	0,009534455	-0,333101377	Downregualted in Tumor	26509	ENSG00000138119
+XRCC5	X-ray repair cross-complementing protein 5	P13010	0,00512194	-0,331755075	Downregualted in Tumor	7520	ENSG00000079246
+BAG6	Large proline-rich protein BAG6	P46379	0,004779505	-0,329656457	Downregualted in Tumor	7917	ENSG00000096155;ENSG00000204463;ENSG00000233348;ENSG00000234651;ENSG00000227761;ENSG00000229524;ENSG00000228760
+GLRX3	Glutaredoxin-3	O76003	0,00062779	-0,328765497	Downregualted in Tumor	10539	ENSG00000108010
+UFL1	E3 UFM1-protein ligase 1	O94874	0,007507858	-0,328443468	Downregualted in Tumor	23376	ENSG00000014123
+IQGAP1	Ras GTPase-activating-like protein IQGAP1	P46940	0,002621655	-0,326568465	Downregualted in Tumor	8826	ENSG00000140575
+IQGAP1	Ras GTPase-activating-like protein IQGAP1	A0A024RC65	0,002621655	-0,326568465	Downregualted in Tumor	8826	NA
+SQSTM1	Sequestosome-1	Q13501	0,009650725	-0,325786867	Downregualted in Tumor	8878	ENSG00000161011
+ERP29	Endoplasmic reticulum resident protein 29	P30040	0,003254034	-0,323632334	Downregualted in Tumor	10961	ENSG00000089248
+ERP29	Endoplasmic reticulum resident protein 29	V9HW71	0,003254034	-0,323632334	Downregualted in Tumor	10961	NA
+ERP29	Endoplasmic reticulum resident protein 29	F8VY02	0,003254034	-0,323632334	Downregualted in Tumor	10961	ENSG00000089248
+ERMP1;KIAA1815	Endoplasmic reticulum metallopeptidase 1	Q7Z2K6	0,005818326	-0,321618136	Downregualted in Tumor	79956	ENSG00000099219
+ERMP1;KIAA1815	Endoplasmic reticulum metallopeptidase 1	Q6ZMD3	0,005818326	-0,321618136	Downregualted in Tumor	79956	NA
+TCP1	T-complex protein 1 subunit alpha	P17987	1,62142E-05	-0,319703198	Downregualted in Tumor	6950	ENSG00000120438
+TCP1	T-complex protein 1 subunit alpha	E7EQR6	1,62142E-05	-0,319703198	Downregualted in Tumor	6950	ENSG00000120438
+XPO1	Exportin-1	O14980	0,009049188	-0,315575442	Downregualted in Tumor	7514	ENSG00000082898
+EIF3L	Eukaryotic translation initiation factor 3 subunit L	Q9Y262	0,004121242	-0,314002098	Downregualted in Tumor	51386	ENSG00000100129
+EIF3L	Eukaryotic translation initiation factor 3 subunit L	B0QY90	0,004121242	-0,314002098	Downregualted in Tumor	51386	ENSG00000100129
+NUDC	Nuclear migration protein nudC	Q9Y266	0,000555651	-0,313571988	Downregualted in Tumor	10726	ENSG00000090273
+SMARCA5	SWI/SNF-related matrix-associated actin-dependent regulator of chromatin subfamily A member 5	O60264	0,008338524	-0,31209843	Downregualted in Tumor	8467	ENSG00000153147
+ESYT1	Extended synaptotagmin-1	Q9BSJ8	0,002173185	-0,307160503	Downregualted in Tumor	23344	ENSG00000139641
+ESYT1	Extended synaptotagmin-1	A0A024RB17	0,002173185	-0,307160503	Downregualted in Tumor	23344	NA
+HYOU1	Hypoxia up-regulated protein 1	Q9Y4L1	0,010717677	-0,302413673	Downregualted in Tumor	10525	ENSG00000149428;ENSG00000280682
+HYOU1	Hypoxia up-regulated protein 1	B7Z766	0,010717677	-0,302413673	Downregualted in Tumor	10525	NA
+HYOU1	Hypoxia up-regulated protein 1	Q6IN67	0,010717677	-0,302413673	Downregualted in Tumor	10525	NA
+CCT4	T-complex protein 1 subunit delta	P50991	2,57866E-05	-0,29873711	Downregualted in Tumor	10575	ENSG00000115484
+CAND1	Cullin-associated NEDD8-dissociated protein 1	Q86VP6	0,000143185	-0,298093337	Downregualted in Tumor	55832	ENSG00000111530
+TLN1	Talin-1	Q9Y490	0,002399143	-0,296222901	Downregualted in Tumor	7094	ENSG00000137076
+PCNA	Proliferating cell nuclear antigen	P12004	0,00456057	-0,293625769	Downregualted in Tumor	5111	ENSG00000132646
+EIF3B;EIF3S9	Eukaryotic translation initiation factor 3 subunit B	P55884	0,000296426	-0,29314364	Downregualted in Tumor	8662	ENSG00000106263
+EIF3B;EIF3S9	Eukaryotic translation initiation factor 3 subunit B	A0A024R821	0,000296426	-0,29314364	Downregualted in Tumor	8662	NA
+EIF3B;EIF3S9	Eukaryotic translation initiation factor 3 subunit B	A4D210	0,000296426	-0,29314364	Downregualted in Tumor	8662	NA
+VARS	Valine--tRNA ligase	P26640	0,006569315	-0,288754089	Downregualted in Tumor	7407	ENSG00000096171;ENSG00000204394;ENSG00000231116;ENSG00000226589;ENSG00000224264
+VARS	Valine--tRNA ligase	A0A024RCN6	0,006569315	-0,288754089	Downregualted in Tumor	7407	NA
+XRCC6	X-ray repair cross-complementing protein 6	P12956	0,004051299	-0,288534835	Downregualted in Tumor	2547	ENSG00000196419
+XRCC6	X-ray repair cross-complementing protein 6	A0A024R1N4	0,004051299	-0,288534835	Downregualted in Tumor	2547	NA
+XRCC6	X-ray repair cross-complementing protein 6	B1AHC9	0,004051299	-0,288534835	Downregualted in Tumor	2547	ENSG00000196419
+XRCC6	X-ray repair cross-complementing protein 6	B4DE32	0,004051299	-0,288534835	Downregualted in Tumor	2547	NA
+GPS1	COP9 signalosome complex subunit 1	Q13098	0,00073682	-0,286200666	Downregualted in Tumor	2873	ENSG00000169727
+GPS1	COP9 signalosome complex subunit 1	C9JFE4	0,00073682	-0,286200666	Downregualted in Tumor	2873	ENSG00000169727
+EIF3C;EIF3CL	Eukaryotic translation initiation factor 3 subunit C;Eukaryotic translation initiation factor 3 subunit C-like protein	Q99613	0,000752413	-0,284419439	Downregualted in Tumor	8663	ENSG00000184110
+EIF3C;EIF3CL	Eukaryotic translation initiation factor 3 subunit C;Eukaryotic translation initiation factor 3 subunit C-like protein	A0A024QYU9	0,000752413	-0,284419439	Downregualted in Tumor	8663	NA
+EIF3C;EIF3CL	Eukaryotic translation initiation factor 3 subunit C;Eukaryotic translation initiation factor 3 subunit C-like protein	B5ME19	0,000752413	-0,284419439	Downregualted in Tumor	728689	ENSG00000205609
+EIF3C;EIF3CL	Eukaryotic translation initiation factor 3 subunit C;Eukaryotic translation initiation factor 3 subunit C-like protein	A0A024QYX7	0,000752413	-0,284419439	Downregualted in Tumor	728689	NA
+COPA	Coatomer subunit alpha;Xenin;Proxenin	P53621	0,000892813	-0,284170565	Downregualted in Tumor	1314	ENSG00000122218
+GTF2I	General transcription factor II-I	P78347	0,005609981	-0,2824855	Downregualted in Tumor	2969	ENSG00000263001
+GTF2I	General transcription factor II-I	X5D2J9	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
+GTF2I	General transcription factor II-I	X5D939	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
+GTF2I	General transcription factor II-I	X5DNP5	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
+GTF2I	General transcription factor II-I	A8K9W7	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
+GTF2I	General transcription factor II-I	X5DR09	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
+GTF2I	General transcription factor II-I	Q499G6	0,005609981	-0,2824855	Downregualted in Tumor	2969	NA
+GTF2I	General transcription factor II-I	Q6EKJ0	0,005609981	-0,2824855	Downregualted in Tumor	389524	ENSG00000174428
+GTF2I	General transcription factor II-I	Q86UP8	0,005609981	-0,2824855	Downregualted in Tumor	84163	ENSG00000196275
+SF3B3	Splicing factor 3B subunit 3	Q15393	0,004900947	-0,282377853	Downregualted in Tumor	23450	ENSG00000189091
+SF3B3	Splicing factor 3B subunit 3	A8K6V3	0,004900947	-0,282377853	Downregualted in Tumor	23450	NA
+NUMA1;NUMA1 variant protein	Nuclear mitotic apparatus protein 1	Q14980	0,008633235	-0,276297332	Downregualted in Tumor	4926	ENSG00000137497
+NUMA1;NUMA1 variant protein	Nuclear mitotic apparatus protein 1	Q4LE64	0,008633235	-0,276297332	Downregualted in Tumor	4926	NA
+NUMA1;NUMA1 variant protein	Nuclear mitotic apparatus protein 1	Q3SYK8	0,008633235	-0,276297332	Downregualted in Tumor	4926	NA
+LDHA	L-lactate dehydrogenase A chain;L-lactate dehydrogenase	P00338	0,002872948	-0,273672026	Downregualted in Tumor	3939	ENSG00000134333
+LDHA	L-lactate dehydrogenase A chain;L-lactate dehydrogenase	V9HWB9	0,002872948	-0,273672026	Downregualted in Tumor	3939	NA
+UPF1	Regulator of nonsense transcripts 1	Q92900	0,00270076	-0,272423291	Downregualted in Tumor	5976	ENSG00000005007
+UPF1	Regulator of nonsense transcripts 1	A0A024R7L8	0,00270076	-0,272423291	Downregualted in Tumor	5976	NA
+UPF1	Regulator of nonsense transcripts 1	A0A024R7L5	0,00270076	-0,272423291	Downregualted in Tumor	5976	NA
+UPF1	Regulator of nonsense transcripts 1	B3KY55	0,00270076	-0,272423291	Downregualted in Tumor	5976	NA
+ALDOA	Fructose-bisphosphate aldolase A;Fructose-bisphosphate aldolase	P04075	0,006948006	-0,268631618	Downregualted in Tumor	226	ENSG00000149925
+ALDOA	Fructose-bisphosphate aldolase A;Fructose-bisphosphate aldolase	V9HWN7	0,006948006	-0,268631618	Downregualted in Tumor	226	NA
+SYNCRIP	Heterogeneous nuclear ribonucleoprotein Q	O60506	0,00119751	-0,263706716	Downregualted in Tumor	10492	ENSG00000135316
+DDX6	Probable ATP-dependent RNA helicase DDX6	P26196	0,00329751	-0,263066444	Downregualted in Tumor	1656	ENSG00000110367
+DDX6	Probable ATP-dependent RNA helicase DDX6	B2R858	0,00329751	-0,263066444	Downregualted in Tumor	1656	NA
+DHX9	ATP-dependent RNA helicase A	Q08211	0,000674696	-0,262120523	Downregualted in Tumor	1660	ENSG00000135829
+DHX9	ATP-dependent RNA helicase A	B3KU66	0,000674696	-0,262120523	Downregualted in Tumor	1660	NA
+EIF3E;EIF3S6	Eukaryotic translation initiation factor 3 subunit E	P60228	0,001045379	-0,255006001	Downregualted in Tumor	3646	ENSG00000104408
+TUFM	Elongation factor Tu, mitochondrial	P49411	0,001512697	-0,253849147	Downregualted in Tumor	7284	ENSG00000178952
+PDIA4	Protein disulfide-isomerase A4	P13667	0,005066989	-0,251982478	Downregualted in Tumor	9601	ENSG00000155660
+EIF2S2	Eukaryotic translation initiation factor 2 subunit 2	P20042	0,01063129	-0,251806876	Downregualted in Tumor	8894	ENSG00000125977
+EIF2S2	Eukaryotic translation initiation factor 2 subunit 2	Q6IBR8	0,01063129	-0,251806876	Downregualted in Tumor	8894	NA
+CCT6A	T-complex protein 1 subunit zeta	P40227	0,001231951	-0,251625811	Downregualted in Tumor	908	ENSG00000146731
+CCT6A	T-complex protein 1 subunit zeta	A0A024RDL1	0,001231951	-0,251625811	Downregualted in Tumor	908	NA
+EFTUD2;U5-116KD;SNRP116	116 kDa U5 small nuclear ribonucleoprotein component	Q15029	0,007097144	-0,249333675	Downregualted in Tumor	9343	ENSG00000108883
+EFTUD2;U5-116KD;SNRP116	116 kDa U5 small nuclear ribonucleoprotein component	B3KX19	0,007097144	-0,249333675	Downregualted in Tumor	9343	NA
+VCL	Vinculin	P18206	0,007925677	-0,244972859	Downregualted in Tumor	7414	ENSG00000035403
+VCL	Vinculin	A0A024QZN4	0,007925677	-0,244972859	Downregualted in Tumor	7414	NA
+VCL	Vinculin	V9HWK2	0,007925677	-0,244972859	Downregualted in Tumor	7414	NA
+VCL	Vinculin	B3KXA2	0,007925677	-0,244972859	Downregualted in Tumor	7414	NA
+FKBP4	Peptidyl-prolyl cis-trans isomerase FKBP4;Peptidyl-prolyl cis-trans isomerase FKBP4, N-terminally processed	Q02790	0,007711285	-0,240925199	Downregualted in Tumor	2288	ENSG00000004478
+PA2G4	Proliferation-associated protein 2G4	Q9UQ80	0,000801647	-0,231617817	Downregualted in Tumor	5036	ENSG00000170515
+PA2G4	Proliferation-associated protein 2G4	A0A024RB85	0,000801647	-0,231617817	Downregualted in Tumor	5036	NA
+EEF1A1;EEF1A1P5;EEF1A1L14	Elongation factor 1-alpha 1;Elongation factor 1-alpha;Putative elongation factor 1-alpha-like 3	P68104	0,004680844	-0,223417727	Downregualted in Tumor	1915	ENSG00000156508
+EEF1A1;EEF1A1P5;EEF1A1L14	Elongation factor 1-alpha 1;Elongation factor 1-alpha;Putative elongation factor 1-alpha-like 3	Q6IPS9	0,004680844	-0,223417727	Downregualted in Tumor	1915	NA
+GAPDH	Glyceraldehyde-3-phosphate dehydrogenase	P04406	0,008278382	-0,213199066	Downregualted in Tumor	2597	ENSG00000111640
+GAPDH	Glyceraldehyde-3-phosphate dehydrogenase	V9HVZ4	0,008278382	-0,213199066	Downregualted in Tumor	2597	NA
+PGD	6-phosphogluconate dehydrogenase, decarboxylating	P52209	0,009211071	-0,212168757	Downregualted in Tumor	5226	ENSG00000142657
+PGD	6-phosphogluconate dehydrogenase, decarboxylating	B4E2U0	0,009211071	-0,212168757	Downregualted in Tumor	5226	NA
+RPN1	Dolichyl-diphosphooligosaccharide--protein glycosyltransferase subunit 1	P04843	0,005384557	-0,200910738	Downregualted in Tumor	6184	ENSG00000163902
+PABPC1	Polyadenylate-binding protein 1	P11940	0,006255424	-0,198162628	Downregualted in Tumor	26986	ENSG00000070756
+PABPC1	Polyadenylate-binding protein 1	A0A024R9C1	0,006255424	-0,198162628	Downregualted in Tumor	26986	NA
+EIF4A1	Eukaryotic initiation factor 4A-I	P60842	0,006387652	-0,184959736	Downregualted in Tumor	1973	ENSG00000161960
+PKM;PKM2	Pyruvate kinase PKM;Pyruvate kinase	P14618	0,008545371	-0,171923721	Downregualted in Tumor	5315	ENSG00000067225
+PKM;PKM2	Pyruvate kinase PKM;Pyruvate kinase	V9HWB8	0,008545371	-0,171923721	Downregualted in Tumor	5315	NA
+PKM;PKM2	Pyruvate kinase PKM;Pyruvate kinase	B4DNK4	0,008545371	-0,171923721	Downregualted in Tumor	5315	ENSG00000067225
+TUBB4B;TUBB2C	Tubulin beta-4B chain	P68371	0,007146456	-0,167302237	Downregualted in Tumor	10383	ENSG00000188229
--- a/test-data/Gene_ID_BreastUp.txt	Thu Jan 23 03:16:11 2020 -0500
+++ b/test-data/Gene_ID_BreastUp.txt	Tue Feb 04 05:16:19 2020 -0500
@@ -1,570 +1,570 @@
-Gene names	Protein names	Protein IDs	Welch test p-value	Welch test Difference	Cluster	GeneID	Ensembl_Gene	GeneID	Ensembl_Gene
-RPS3A	40S ribosomal protein S3a	P61247	0,006449854	0,172449906	Upregulated in Tumor	6189	ENSG00000145425	6189	ENSG00000145425
-RPL5	60S ribosomal protein L5	P46777	0,000934294	0,199756086	Upregulated in Tumor	6125	ENSG00000122406	6125	ENSG00000122406
-TPI1	Triosephosphate isomerase	P60174	0,001276728	0,2035502	Upregulated in Tumor	7167	ENSG00000111669	7167	ENSG00000111669
-EIF3I	Eukaryotic translation initiation factor 3 subunit I	Q13347	0,000428467	0,233844202	Upregulated in Tumor	8668	ENSG00000084623	8668	ENSG00000084623
-RPL10A	60S ribosomal protein L10a;Ribosomal protein	P62906	0,004102293	0,241825992	Upregulated in Tumor	4736	ENSG00000198755	4736	ENSG00000198755
-DSTN	Destrin	P60981	0,003869657	0,248218462	Upregulated in Tumor	11034	ENSG00000125868	11034	ENSG00000125868
-DECR1;DECR	2,4-dienoyl-CoA reductase, mitochondrial	Q16698	0,008368613	0,25237194	Upregulated in Tumor	1666	ENSG00000104325	1666	ENSG00000104325
-GOT2	Aspartate aminotransferase, mitochondrial;Aspartate aminotransferase	P00505	0,009260929	0,255778513	Upregulated in Tumor	2806	ENSG00000125166	2806	ENSG00000125166
-RAB7A	Ras-related protein Rab-7a	P51149	0,000317146	0,266870946	Upregulated in Tumor	7879	ENSG00000075785	7879	ENSG00000075785
-ILF2	Interleukin enhancer-binding factor 2	Q12905	0,000711923	0,270490101	Upregulated in Tumor	3608	ENSG00000143621	3608	ENSG00000143621
-EIF4A3	Eukaryotic initiation factor 4A-III;Eukaryotic initiation factor 4A-III, N-terminally processed	P38919	0,002250657	0,272235115	Upregulated in Tumor	9775	ENSG00000141543	9775	ENSG00000141543
-HNRNPM;ORF	Heterogeneous nuclear ribonucleoprotein M	P52272	0,000947473	0,277217468	Upregulated in Tumor	4670	ENSG00000099783	4670	ENSG00000099783
-RBMX	RNA-binding motif protein, X chromosome;RNA-binding motif protein, X chromosome, N-terminally processed	P38159	0,007018658	0,282536987	Upregulated in Tumor	27316	ENSG00000147274	27316	ENSG00000147274
-HN1L	Hematological and neurological expressed 1-like protein	Q9H910	0,005253586	0,283587347	Upregulated in Tumor	90861	ENSG00000206053	90861	ENSG00000206053
-THRAP3	Thyroid hormone receptor-associated protein 3	Q9Y2W1	0,003051785	0,288256471	Upregulated in Tumor	9967	ENSG00000054118	9967	ENSG00000054118
-RAB5A	Ras-related protein Rab-5A	P20339	0,003162221	0,294551876	Upregulated in Tumor	5868	ENSG00000144566	5868	ENSG00000144566
-VPS29;DKFZp667O202	Vacuolar protein sorting-associated protein 29	Q9UBQ0	0,002835378	0,294975183	Upregulated in Tumor	51699	ENSG00000111237	51699	ENSG00000111237
-AK2	Adenylate kinase 2, mitochondrial;Adenylate kinase 2, mitochondrial, N-terminally processed	P54819	0,001622708	0,302655716	Upregulated in Tumor	204	ENSG00000004455	204	ENSG00000004455
-CTBP1	C-terminal-binding protein 1	Q13363	0,009610663	0,302890153	Upregulated in Tumor	1487	ENSG00000159692	1487	ENSG00000159692
-PHB2	Prohibitin-2	Q99623	5,17477E-05	0,304170356	Upregulated in Tumor	11331	ENSG00000215021	11331	ENSG00000215021
-PPIA	Peptidyl-prolyl cis-trans isomerase A;Peptidyl-prolyl cis-trans isomerase A, N-terminally processed;Peptidyl-prolyl cis-trans isomerase	P62937	0,00024332	0,304746732	Upregulated in Tumor	5478	ENSG00000196262	5478	ENSG00000196262
-MYL12B;MYL12A	Myosin regulatory light chain 12B;Myosin regulatory light chain 12A	O14950	0,006444158	0,308985352	Upregulated in Tumor	103910;10627	ENSG00000118680	103910;10627	ENSG00000118680
-MYL12B;MYL12A	Myosin regulatory light chain 12B;Myosin regulatory light chain 12A	P19105	0,006444158	0,308985352	Upregulated in Tumor	10627	ENSG00000101608	10627	ENSG00000101608
-HSD17B4	Peroxisomal multifunctional enzyme type 2;(3R)-hydroxyacyl-CoA dehydrogenase;Enoyl-CoA hydratase 2	P51659	0,004073445	0,30955718	Upregulated in Tumor	3295	ENSG00000133835	3295	ENSG00000133835
-DDOST	Dolichyl-diphosphooligosaccharide--protein glycosyltransferase 48 kDa subunit	P39656	0,000213237	0,312400256	Upregulated in Tumor	1650	ENSG00000244038	1650	ENSG00000244038
-RPL18A	60S ribosomal protein L18a	Q02543	0,000285311	0,314208005	Upregulated in Tumor	6142	ENSG00000105640	6142	ENSG00000105640
-PSMB1	Proteasome subunit beta type-1	P20618	0,003713569	0,314974704	Upregulated in Tumor	5689	ENSG00000008018	5689	ENSG00000008018
-PTBP1	Polypyrimidine tract-binding protein 1	P26599	5,49128E-05	0,319663522	Upregulated in Tumor	5725	ENSG00000011304	5725	ENSG00000011304
-RPL12;hCG_21173	60S ribosomal protein L12	P30050	0,00015136	0,320453274	Upregulated in Tumor	6136	ENSG00000197958	6136	ENSG00000197958
-PHB	Prohibitin	P35232	3,08165E-05	0,321782928	Upregulated in Tumor	5245	ENSG00000167085	5245	ENSG00000167085
-ARPC1B	Actin-related protein 2/3 complex subunit 1B	O15143	0,005836811	0,328389506	Upregulated in Tumor	10095	ENSG00000130429	10095	ENSG00000130429
-ANXA5	Annexin A5;Annexin	P08758	0,006908055	0,329372942	Upregulated in Tumor	308	ENSG00000164111	308	ENSG00000164111
-RPS4X	40S ribosomal protein S4, X isoform	P62701	2,76618E-05	0,330568716	Upregulated in Tumor	6191	ENSG00000198034	6191	ENSG00000198034
-RPS4X	40S ribosomal protein S4, X isoform	Q8TD47	2,76618E-05	0,330568716	Upregulated in Tumor	140032	ENSG00000280969	140032	ENSG00000280969
-RPS4X	40S ribosomal protein S4, X isoform	P22090	2,76618E-05	0,330568716	Upregulated in Tumor	6192	ENSG00000129824	6192	ENSG00000129824
-PRDX4	Peroxiredoxin-4	Q13162	0,010575403	0,331910524	Upregulated in Tumor	10549	ENSG00000123131	10549	ENSG00000123131
-RHOA;ARHA	Transforming protein RhoA	P61586	8,92969E-05	0,333569128	Upregulated in Tumor	387	ENSG00000067560	387	ENSG00000067560
-RPS12	40S ribosomal protein S12	P25398	9,80366E-05	0,336031922	Upregulated in Tumor	6206	ENSG00000112306	6206	ENSG00000112306
-C1QBP	Complement component 1 Q subcomponent-binding protein, mitochondrial	Q07021	0,005549957	0,337463498	Upregulated in Tumor	708	ENSG00000108561	708	ENSG00000108561
-NSFL1C	NSFL1 cofactor p47	Q9UNZ2	0,001349788	0,33882771	Upregulated in Tumor	55968	ENSG00000088833	55968	ENSG00000088833
-PRDX5	Peroxiredoxin-5, mitochondrial	P30044	0,000449983	0,338934498	Upregulated in Tumor	25824	ENSG00000126432	25824	ENSG00000126432
-C22orf28	tRNA-splicing ligase RtcB homolog	Q9Y3I0	0,000492172	0,348562126	Upregulated in Tumor	51493	ENSG00000100220	51493	ENSG00000100220
-ARPC2	Actin-related protein 2/3 complex subunit 2	O15144	0,00056163	0,350278832	Upregulated in Tumor	10109	ENSG00000163466	10109	ENSG00000163466
-NAPA	Alpha-soluble NSF attachment protein	P54920	0,000502038	0,353954774	Upregulated in Tumor	8775	ENSG00000105402	8775	ENSG00000105402
-HNRNPA3	Heterogeneous nuclear ribonucleoprotein A3	P51991	0,000691255	0,354777122	Upregulated in Tumor	220988	ENSG00000170144	220988	ENSG00000170144
-RPL26;KRBA2	60S ribosomal protein L26	P61254	0,005450299	0,35694396	Upregulated in Tumor	6154	ENSG00000161970	6154	ENSG00000161970
-GNB1	Guanine nucleotide-binding protein G(I)/G(S)/G(T) subunit beta-1	P62873	0,002522529	0,358535434	Upregulated in Tumor	2782	ENSG00000078369	2782	ENSG00000078369
-GNB1	Guanine nucleotide-binding protein G(I)/G(S)/G(T) subunit beta-1	P16520	0,002522529	0,358535434	Upregulated in Tumor	2784	ENSG00000111664	2784	ENSG00000111664
-HNRPDL	Heterogeneous nuclear ribonucleoprotein D-like	O14979	0,001961692	0,359456594	Upregulated in Tumor	9987	ENSG00000152795	9987	ENSG00000152795
-UBE2V1	Ubiquitin-conjugating enzyme E2 variant 1	Q13404	0,00018786	0,361810972	Upregulated in Tumor	7335;387522	ENSG00000244687	7335;387522	ENSG00000244687
-ELAVL1	ELAV-like protein 1	Q15717	0,00037077	0,363495758	Upregulated in Tumor	1994	ENSG00000066044	1994	ENSG00000066044
-VAT1	Synaptic vesicle membrane protein VAT-1 homolog	Q99536	0,004802934	0,36517721	Upregulated in Tumor	10493	ENSG00000108828	10493	ENSG00000108828
-RPS16	40S ribosomal protein S16	P62249	9,07841E-05	0,366616637	Upregulated in Tumor	6217	ENSG00000105193	6217	ENSG00000105193
-ACBD3	Golgi resident protein GCP60	Q9H3P7	0,002016447	0,366734959	Upregulated in Tumor	64746	ENSG00000182827	64746	ENSG00000182827
-RPS8	40S ribosomal protein S8	P62241	0,000248965	0,366911036	Upregulated in Tumor	6202	ENSG00000142937	6202	ENSG00000142937
-CLTA	Clathrin light chain A	P09496	0,007998845	0,371701448	Upregulated in Tumor	1211	ENSG00000122705	1211	ENSG00000122705
-HNRNPA0	Heterogeneous nuclear ribonucleoprotein A0	Q13151	0,000158506	0,375146253	Upregulated in Tumor	10949	ENSG00000177733	10949	ENSG00000177733
-SRSF1	Serine/arginine-rich splicing factor 1	Q07955	0,000185414	0,3759751	Upregulated in Tumor	6426	ENSG00000136450	6426	ENSG00000136450
-LAP3	Cytosol aminopeptidase	P28838	0,002006641	0,377194931	Upregulated in Tumor	51056	ENSG00000002549	51056	ENSG00000002549
-YKT6	Synaptobrevin homolog YKT6	O15498	0,004796662	0,377228173	Upregulated in Tumor	10652	ENSG00000106636	10652	ENSG00000106636
-RPL7	60S ribosomal protein L7	P18124	3,95531E-05	0,378613474	Upregulated in Tumor	6129	ENSG00000147604	6129	ENSG00000147604
-NACA	Nascent polypeptide-associated complex subunit alpha	Q13765	5,38833E-05	0,381249103	Upregulated in Tumor	4666	ENSG00000196531	4666	ENSG00000196531
-RPS18	40S ribosomal protein S18	P62269	0,000118723	0,382293852	Upregulated in Tumor	6222	ENSG00000226225;ENSG00000235650;ENSG00000231500;ENSG00000223367;ENSG00000096150	6222	ENSG00000226225;ENSG00000235650;ENSG00000231500;ENSG00000223367;ENSG00000096150
-HNRNPF	Heterogeneous nuclear ribonucleoprotein F;Heterogeneous nuclear ribonucleoprotein F, N-terminally processed	P52597	0,000574637	0,382971525	Upregulated in Tumor	3185	ENSG00000169813	3185	ENSG00000169813
-RPL24	60S ribosomal protein L24	P83731	3,05022E-06	0,384070919	Upregulated in Tumor	6152	ENSG00000114391	6152	ENSG00000114391
-GLOD4	Glyoxalase domain-containing protein 4	Q9HC38	0,000839526	0,388222634	Upregulated in Tumor	51031	ENSG00000167699	51031	ENSG00000167699
-TCEB1	Transcription elongation factor B polypeptide 1	Q15369	5,17062E-05	0,388917607	Upregulated in Tumor	6921	ENSG00000154582	6921	ENSG00000154582
-EIF2B1	Translation initiation factor eIF-2B subunit alpha	Q14232	0,009981875	0,389617878	Upregulated in Tumor	1967	ENSG00000111361	1967	ENSG00000111361
-RPL15	60S ribosomal protein L15;Ribosomal protein L15	P61313	0,0011672	0,39079995	Upregulated in Tumor	6138	ENSG00000174748	6138	ENSG00000174748
-RPS27	40S ribosomal protein S27	P42677	0,000355257	0,39893706	Upregulated in Tumor	6232	ENSG00000177954	6232	ENSG00000177954
-RNPEP	Aminopeptidase B	Q9H4A4	9,84914E-06	0,400730948	Upregulated in Tumor	6051	ENSG00000176393	6051	ENSG00000176393
-RPL30	60S ribosomal protein L30	P62888	0,002178806	0,401405914	Upregulated in Tumor	6156	ENSG00000156482	6156	ENSG00000156482
-RPL19	60S ribosomal protein L19;Ribosomal protein L19	P84098	0,000511088	0,404372356	Upregulated in Tumor	6143	ENSG00000108298	6143	ENSG00000108298
-UQCR10	Cytochrome b-c1 complex subunit 9	Q9UDW1	0,005465225	0,40465117	Upregulated in Tumor	29796	ENSG00000184076	29796	ENSG00000184076
-RPS24	40S ribosomal protein S24	P62847	0,001379618	0,404852058	Upregulated in Tumor	6229	ENSG00000138326	6229	ENSG00000138326
-RPS25	40S ribosomal protein S25	P62851	6,54301E-05	0,40531096	Upregulated in Tumor	6230	ENSG00000280831;ENSG00000118181	6230	ENSG00000280831;ENSG00000118181
-RAB1A	Ras-related protein Rab-1A	P62820	0,00114492	0,40601728	Upregulated in Tumor	5861	ENSG00000138069	5861	ENSG00000138069
-RPS21	40S ribosomal protein S21	P63220	0,000481972	0,410966528	Upregulated in Tumor	6227	ENSG00000171858	6227	ENSG00000171858
-HSPB1	Heat shock protein beta-1	P04792	0,001054742	0,412110228	Upregulated in Tumor	3315	ENSG00000106211	3315	ENSG00000106211
-CDKN2A	Cyclin-dependent kinase inhibitor 2A, isoforms 1/2/3	P42771	0,008460116	0,413507483	Upregulated in Tumor	1029	ENSG00000147889	1029	ENSG00000147889
-RAB11B;RAB11A	Ras-related protein Rab-11B	Q15907	8,87824E-05	0,417097451	Upregulated in Tumor	9230	ENSG00000185236	9230	ENSG00000185236
-DAD1	Dolichyl-diphosphooligosaccharide--protein glycosyltransferase subunit DAD1	P61803	0,000388233	0,419443693	Upregulated in Tumor	1603	ENSG00000129562	1603	ENSG00000129562
-TWF2	Twinfilin-2	Q6IBS0	0,007783233	0,422543959	Upregulated in Tumor	11344	ENSG00000247596	11344	ENSG00000247596
-APMAP	Adipocyte plasma membrane-associated protein	Q9HDC9	0,000112366	0,429610865	Upregulated in Tumor	57136	ENSG00000101474	57136	ENSG00000101474
-RPS2;rps2;OK/KNS-cl.7	40S ribosomal protein S2	P15880	3,55246E-07	0,435761317	Upregulated in Tumor	6187	ENSG00000140988	6187	ENSG00000140988
-RPS11	40S ribosomal protein S11	P62280	0,000271414	0,446564997	Upregulated in Tumor	6205	ENSG00000142534	6205	ENSG00000142534
-RPL32	60S ribosomal protein L32	P62910	0,001344347	0,447186821	Upregulated in Tumor	6161	ENSG00000144713	6161	ENSG00000144713
-NDUFV1	NADH dehydrogenase [ubiquinone] flavoprotein 1, mitochondrial	P49821	0,000247468	0,451021984	Upregulated in Tumor	4723	ENSG00000167792	4723	ENSG00000167792
-PEBP1	Phosphatidylethanolamine-binding protein 1;Hippocampal cholinergic neurostimulating peptide	P30086	3,50785E-05	0,452694707	Upregulated in Tumor	5037	ENSG00000089220	5037	ENSG00000089220
-TBL2	Transducin beta-like protein 2	Q9Y4P3	0,005997874	0,453305486	Upregulated in Tumor	26608	ENSG00000106638	26608	ENSG00000106638
-MRPL38	39S ribosomal protein L38, mitochondrial	Q96DV4	0,010694906	0,454259864	Upregulated in Tumor	64978	ENSG00000204316	64978	ENSG00000204316
-RAP2C	Ras-related protein Rap-2c	Q9Y3L5	0,005254162	0,455296292	Upregulated in Tumor	57826	ENSG00000123728	57826	ENSG00000123728
-ARPC4;ARPC4-TTLL3	Actin-related protein 2/3 complex subunit 4	P59998	0,002816852	0,46004893	Upregulated in Tumor	10093	ENSG00000241553	10093	ENSG00000241553
-U2AF2	Splicing factor U2AF 65 kDa subunit	P26368	0,000363325	0,460423778	Upregulated in Tumor	11338	ENSG00000063244	11338	ENSG00000063244
-RPL11	60S ribosomal protein L11	P62913	3,87586E-05	0,461340483	Upregulated in Tumor	6135	ENSG00000142676	6135	ENSG00000142676
-ATP6V0D1	V-type proton ATPase subunit d 1	P61421	0,001358502	0,461742594	Upregulated in Tumor	9114	ENSG00000159720	9114	ENSG00000159720
-RPS19	40S ribosomal protein S19	P39019	3,33752E-05	0,462922373	Upregulated in Tumor	6223	ENSG00000105372	6223	ENSG00000105372
-GALE	UDP-glucose 4-epimerase	Q14376	0,008127318	0,466096158	Upregulated in Tumor	2582	ENSG00000117308	2582	ENSG00000117308
-RPL37A	60S ribosomal protein L37a	P61513	0,001428265	0,469591172	Upregulated in Tumor	6168	ENSG00000197756	6168	ENSG00000197756
-APOA1BP	NAD(P)H-hydrate epimerase	Q8NCW5	0,000199226	0,471432845	Upregulated in Tumor	128240	ENSG00000163382	128240	ENSG00000163382
-UBQLN1	Ubiquilin-1	Q9UMX0	0,002335759	0,472110412	Upregulated in Tumor	29979	ENSG00000135018	29979	ENSG00000135018
-EML2	Echinoderm microtubule-associated protein-like 2	O95834	0,009125507	0,474442814	Upregulated in Tumor	24139	ENSG00000125746	24139	ENSG00000125746
-MOB1A;MOB1B;MOB4A	MOB kinase activator 1A;MOB kinase activator 1B	Q9H8S9	0,006430502	0,481891028	Upregulated in Tumor	55233	ENSG00000114978	55233	ENSG00000114978
-MOB1A;MOB1B;MOB4A	MOB kinase activator 1A;MOB kinase activator 1B	Q7L9L4	0,006430502	0,481891028	Upregulated in Tumor	92597	ENSG00000173542	92597	ENSG00000173542
-TST	Thiosulfate sulfurtransferase;Sulfurtransferase	Q16762	0,00280735	0,485981608	Upregulated in Tumor	7263	ENSG00000128311	7263	ENSG00000128311
-RPL29	60S ribosomal protein L29	P47914	0,000442429	0,487356103	Upregulated in Tumor	6159	ENSG00000162244	6159	ENSG00000162244
-RPL13A;RPL13a	60S ribosomal protein L13a	P40429	6,68188E-08	0,487933716	Upregulated in Tumor	23521	ENSG00000142541	23521	ENSG00000142541
-ARFIP2	Arfaptin-2	P53365	0,003420638	0,488543202	Upregulated in Tumor	23647	ENSG00000132254	23647	ENSG00000132254
-MGST3	Microsomal glutathione S-transferase 3	O14880	0,003341245	0,489411667	Upregulated in Tumor	4259	ENSG00000143198	4259	ENSG00000143198
-PSMA5	Proteasome subunit alpha type-5	P28066	0,000506169	0,491866122	Upregulated in Tumor	5686	ENSG00000143106	5686	ENSG00000143106
-PCMT1	Protein-L-isoaspartate(D-aspartate) O-methyltransferase;Protein-L-isoaspartate O-methyltransferase	P22061	0,003322528	0,493820896	Upregulated in Tumor	5110	ENSG00000120265	5110	ENSG00000120265
-ATP5A1	ATP synthase subunit alpha, mitochondrial	P25705	3,5913E-06	0,493827891	Upregulated in Tumor	498	ENSG00000152234	498	ENSG00000152234
-RPL23A	60S ribosomal protein L23a	P62750	0,000528106	0,496368454	Upregulated in Tumor	6147	ENSG00000198242	6147	ENSG00000198242
-RPS9	40S ribosomal protein S9	P46781	3,07419E-07	0,496653595	Upregulated in Tumor	6203	ENSG00000274005;ENSG00000274646;ENSG00000278081;ENSG00000274950;ENSG00000277359;ENSG00000278270;ENSG00000277079;ENSG00000170889;ENSG00000274626;ENSG00000275323	6203	ENSG00000274950;ENSG00000170889;ENSG00000278270;ENSG00000274646
-CISD2	CDGSH iron-sulfur domain-containing protein 2	Q8N5K1	0,000534937	0,497459431	Upregulated in Tumor	493856	ENSG00000145354	493856	ENSG00000145354
-VAPA	Vesicle-associated membrane protein-associated protein A	Q9P0L0	0,003990206	0,498293133	Upregulated in Tumor	9218	ENSG00000101558	9218	ENSG00000101558
-RPSA;LAMR1P15	40S ribosomal protein SA	P08865	1,98034E-07	0,498457477	Upregulated in Tumor	3921	ENSG00000168028	3921	ENSG00000168028
-ATP5B	ATP synthase subunit beta, mitochondrial;ATP synthase subunit beta	P06576	1,33401E-05	0,500583864	Upregulated in Tumor	506	ENSG00000110955	506	ENSG00000110955
-MRPS5	28S ribosomal protein S5, mitochondrial	P82675	0,001866651	0,503299199	Upregulated in Tumor	64969	ENSG00000144029	64969	ENSG00000144029
-RER1	Protein RER1	O15258	0,002973962	0,509630398	Upregulated in Tumor	11079	ENSG00000157916	11079	ENSG00000157916
-SRSF9	Serine/arginine-rich splicing factor 9	Q13242	0,000555607	0,510798623	Upregulated in Tumor	8683	ENSG00000111786	8683	ENSG00000111786
-SELENBP1	Selenium-binding protein 1	Q13228	0,000502601	0,51150385	Upregulated in Tumor	8991	ENSG00000143416	8991	ENSG00000143416
-WASF2	Wiskott-Aldrich syndrome protein family member 2	Q9Y6W5	0,005724528	0,512030132	Upregulated in Tumor	10163	ENSG00000158195	10163	ENSG00000158195
-UFSP2	Ufm1-specific protease 2	Q9NUQ7	0,004158544	0,513093764	Upregulated in Tumor	55325	ENSG00000109775	55325	ENSG00000109775
-SEPT2	Septin-2	Q15019	0,000410267	0,513103007	Upregulated in Tumor	4735	ENSG00000168385	4735	ENSG00000168385
-GNA13	Guanine nucleotide-binding protein subunit alpha-13	Q14344	0,008572869	0,514577265	Upregulated in Tumor	10672	ENSG00000120063	10672	ENSG00000120063
-PSMB2	Proteasome subunit beta type-2;Proteasome subunit beta type	P49721	0,00089372	0,514703453	Upregulated in Tumor	5690	ENSG00000126067	5690	ENSG00000126067
-HSPE1;EPFP1	10 kDa heat shock protein, mitochondrial	P61604	0,007189585	0,515834078	Upregulated in Tumor	3336	ENSG00000115541	3336	ENSG00000115541
-CMPK1;CMPK	UMP-CMP kinase	P30085	0,000275872	0,517079651	Upregulated in Tumor	51727	ENSG00000162368	51727	ENSG00000162368
-CRABP2	Cellular retinoic acid-binding protein 2	P29373	0,000809662	0,517505	Upregulated in Tumor	1382	ENSG00000143320	1382	ENSG00000143320
-HSD17B10	3-hydroxyacyl-CoA dehydrogenase type-2	Q99714	1,23845E-06	0,519750927	Upregulated in Tumor	3028	ENSG00000072506	3028	ENSG00000072506
-ATP5L	ATP synthase subunit g, mitochondrial	O75964	0,003462004	0,521239174	Upregulated in Tumor	10632	ENSG00000167283	10632	ENSG00000167283
-MAPKAPK2	MAP kinase-activated protein kinase 2	P49137	0,004112558	0,522819118	Upregulated in Tumor	9261	ENSG00000162889	9261	ENSG00000162889
-CTSB	Cathepsin B;Cathepsin B light chain;Cathepsin B heavy chain	P07858	2,91997E-06	0,524561516	Upregulated in Tumor	1508	ENSG00000164733	1508	ENSG00000164733
-RAP1B	Ras-related protein Rap-1b;Ras-related protein Rap-1b-like protein	P61224	0,001269932	0,525840645	Upregulated in Tumor	5908	ENSG00000127314	5908	ENSG00000127314
-PSMB4	Proteasome subunit beta type-4	P28070	5,91851E-05	0,528085152	Upregulated in Tumor	5692	ENSG00000159377	5692	ENSG00000159377
-HINT1	Histidine triad nucleotide-binding protein 1	P49773	9,74355E-05	0,528570041	Upregulated in Tumor	3094	ENSG00000169567	3094	ENSG00000169567
-MIF	Macrophage migration inhibitory factor	P14174	0,002069917	0,53076975	Upregulated in Tumor	4282	ENSG00000276701;ENSG00000240972	4282	ENSG00000276701;ENSG00000240972
-RAB14	Ras-related protein Rab-14	P61106	1,04295E-06	0,533753248	Upregulated in Tumor	51552	ENSG00000119396	51552	ENSG00000119396
-RPL8	60S ribosomal protein L8	P62917	3,48607E-06	0,53632548	Upregulated in Tumor	6132	ENSG00000161016	6132	ENSG00000161016
-ECH1	Delta(3,5)-Delta(2,4)-dienoyl-CoA isomerase, mitochondrial	Q13011	1,94443E-05	0,538951368	Upregulated in Tumor	1891	ENSG00000282853;ENSG00000104823	1891	ENSG00000282853;ENSG00000104823
-RAB8A	Ras-related protein Rab-8A	P61006	0,00026041	0,539485314	Upregulated in Tumor	4218	ENSG00000167461	4218	ENSG00000167461
-SAR1A;SARA1	GTP-binding protein SAR1a	Q9NR31	5,53218E-05	0,540369727	Upregulated in Tumor	56681	ENSG00000079332	56681	ENSG00000079332
-TOMM22;MST065	Mitochondrial import receptor subunit TOM22 homolog	Q9NS69	0,001002249	0,540522209	Upregulated in Tumor	56993	ENSG00000100216	56993	ENSG00000100216
-GALK2	N-acetylgalactosamine kinase	Q01415	0,002287958	0,542921293	Upregulated in Tumor	2585	ENSG00000156958	2585	ENSG00000156958
-FKBP3	Peptidyl-prolyl cis-trans isomerase FKBP3;Peptidyl-prolyl cis-trans isomerase	Q00688	0,000556415	0,543366164	Upregulated in Tumor	2287	ENSG00000100442	2287	ENSG00000100442
-AGFG1	Arf-GAP domain and FG repeat-containing protein 1	P52594	0,008882156	0,543885145	Upregulated in Tumor	3267	ENSG00000173744	3267	ENSG00000173744
-HIST2H2AA3;HIST2H2AC	Histone H2A type 2-A;Histone H2A type 2-C	Q6FI13	0,00083916	0,544030524	Upregulated in Tumor	723790;8337	ENSG00000203812;ENSG00000272196	723790;8337	ENSG00000203812;ENSG00000272196
-HIST2H2AA3;HIST2H2AC	Histone H2A type 2-A;Histone H2A type 2-C	Q16777	0,00083916	0,544030524	Upregulated in Tumor	8338	ENSG00000184260	8338	ENSG00000184260
-GLUD1	Glutamate dehydrogenase 1, mitochondrial;Glutamate dehydrogenase	P00367	4,92675E-06	0,548768572	Upregulated in Tumor	2746	ENSG00000148672	2746	ENSG00000148672
-CNPY3	Protein canopy homolog 3	Q9BT09	0,001009337	0,548966563	Upregulated in Tumor	10695	ENSG00000137161	10695	ENSG00000137161
-ATP6AP1;FLJ00383	V-type proton ATPase subunit S1	Q15904	0,008498697	0,549419044	Upregulated in Tumor	537	ENSG00000071553	537	ENSG00000071553
-UBL4A	Ubiquitin-like protein 4A	P11441	0,001065994	0,550762333	Upregulated in Tumor	8266	ENSG00000102178	8266	ENSG00000102178
-COX6C	Cytochrome c oxidase subunit 6C	P09669	0,007504097	0,552357186	Upregulated in Tumor	1345	ENSG00000164919	1345	ENSG00000164919
-NDUFS8	NADH dehydrogenase [ubiquinone] iron-sulfur protein 8, mitochondrial	O00217	1,59847E-05	0,553248033	Upregulated in Tumor	4728	ENSG00000110717	4728	ENSG00000110717
-NUCB1	Nucleobindin-1	Q02818	0,005818278	0,554332155	Upregulated in Tumor	4924	ENSG00000104805	4924	ENSG00000104805
-SDHB	Succinate dehydrogenase [ubiquinone] iron-sulfur subunit, mitochondrial	P21912	0,000460517	0,555129448	Upregulated in Tumor	6390	ENSG00000117118	6390	ENSG00000117118
-MAPK1	Mitogen-activated protein kinase 1	P28482	5,07587E-05	0,559236177	Upregulated in Tumor	5594	ENSG00000100030	5594	ENSG00000100030
-SSBP1	Single-stranded DNA-binding protein, mitochondrial;Single-stranded DNA-binding protein	Q04837	3,5643E-07	0,559892273	Upregulated in Tumor	6742	ENSG00000106028;ENSG00000262771	6742	ENSG00000106028;ENSG00000262771
-RPL27	60S ribosomal protein L27	P61353	0,000436213	0,56161971	Upregulated in Tumor	6155	ENSG00000131469	6155	ENSG00000131469
-SOD1	Superoxide dismutase [Cu-Zn]	P00441	0,002890222	0,56525206	Upregulated in Tumor	6647	ENSG00000142168	6647	ENSG00000142168
-RPL27A;L27a	60S ribosomal protein L27a	P46776	7,05174E-06	0,566561183	Upregulated in Tumor	6157	ENSG00000166441	6157	ENSG00000166441
-LSM4	U6 snRNA-associated Sm-like protein LSm4	Q9Y4Z0	0,001775514	0,567246316	Upregulated in Tumor	25804	NA	25804	ENSG00000130520
-PSMA1	Proteasome subunit alpha type-1	P25786	5,5348E-08	0,567790481	Upregulated in Tumor	5682	ENSG00000129084	5682	ENSG00000129084
-SEC61B	Protein transport protein Sec61 subunit beta	P60468	2,18205E-05	0,568132815	Upregulated in Tumor	10952	ENSG00000106803	10952	ENSG00000106803
-RPS3	40S ribosomal protein S3	P23396	3,08471E-08	0,57193331	Upregulated in Tumor	6188	ENSG00000149273	6188	ENSG00000149273
-EIF4A2	Eukaryotic initiation factor 4A-II	Q14240	0,003407811	0,574155689	Upregulated in Tumor	1974	ENSG00000156976	1974	ENSG00000156976
-UBE2L3	Ubiquitin-conjugating enzyme E2 L3	P68036	0,000987694	0,574630647	Upregulated in Tumor	7332	ENSG00000185651	7332	ENSG00000185651
-DCPS	m7GpppX diphosphatase	Q96C86	0,00106498	0,575413985	Upregulated in Tumor	28960	ENSG00000110063	28960	ENSG00000110063
-TXNL1	Thioredoxin-like protein 1	O43396	0,002585946	0,576685425	Upregulated in Tumor	9352	ENSG00000091164	9352	ENSG00000091164
-ERH	Enhancer of rudimentary homolog	P84090	1,54531E-07	0,57936758	Upregulated in Tumor	2079	ENSG00000100632	2079	ENSG00000100632
-GRB2	Growth factor receptor-bound protein 2	P62993	0,008001926	0,580584558	Upregulated in Tumor	2885	ENSG00000177885	2885	ENSG00000177885
-CLPP	Putative ATP-dependent Clp protease proteolytic subunit, mitochondrial;ATP-dependent Clp protease proteolytic subunit	Q16740	0,000258641	0,581387471	Upregulated in Tumor	8192	ENSG00000125656	8192	ENSG00000125656
-RPS5	40S ribosomal protein S5;40S ribosomal protein S5, N-terminally processed	P46782	0,001537416	0,582168292	Upregulated in Tumor	6193	ENSG00000083845	6193	ENSG00000083845
-RPL17	60S ribosomal protein L17	P18621	9,6315E-05	0,582445497	Upregulated in Tumor	6139	ENSG00000265681	6139	ENSG00000265681
-MLPH;UNQ8200	Melanophilin	Q9BV36	0,004838756	0,582978886	Upregulated in Tumor	79083	ENSG00000115648	79083	ENSG00000115648
-PTPLAD1	Very-long-chain (3R)-3-hydroxyacyl-[acyl-carrier protein] dehydratase 3	Q9P035	0,00341719	0,584277825	Upregulated in Tumor	51495	ENSG00000074696	51495	ENSG00000074696
-SNRNP70	U1 small nuclear ribonucleoprotein 70 kDa	P08621	7,15257E-05	0,584960992	Upregulated in Tumor	6625	ENSG00000104852	6625	ENSG00000104852
-TAF15	TATA-binding protein-associated factor 2N	Q92804	0,0049619	0,585771545	Upregulated in Tumor	8148	ENSG00000270647;ENSG00000276833	8148	ENSG00000270647;ENSG00000276833
-TXNDC12	Thioredoxin domain-containing protein 12	O95881	0,000845621	0,587725369	Upregulated in Tumor	51060	ENSG00000117862	51060	ENSG00000117862
-DDT;DDTL	D-dopachrome decarboxylase;D-dopachrome decarboxylase-like protein	P30046	0,0014312	0,589163049	Upregulated in Tumor	1652	ENSG00000275003;ENSG00000099977	1652	ENSG00000275003;ENSG00000099977
-DDT;DDTL	D-dopachrome decarboxylase;D-dopachrome decarboxylase-like protein	A6NHG4	0,0014312	0,589163049	Upregulated in Tumor	100037417	ENSG00000275758;ENSG00000099974	100037417	ENSG00000275758;ENSG00000099974
-RPL9	60S ribosomal protein L9	P32969	9,51462E-08	0,589405391	Upregulated in Tumor	6133	ENSG00000163682	6133	ENSG00000163682
-UBE2I	SUMO-conjugating enzyme UBC9	P63279	0,001133306	0,592524737	Upregulated in Tumor	7329	ENSG00000103275	7329	ENSG00000103275
-SUMF2	Sulfatase-modifying factor 2	Q8NBJ7	0,003362796	0,595654369	Upregulated in Tumor	25870	ENSG00000129103	25870	ENSG00000129103
-CAPZA2	F-actin-capping protein subunit alpha-2	P47755	8,85695E-05	0,596941578	Upregulated in Tumor	830	ENSG00000198898	830	ENSG00000198898
-CAPNS1	Calpain small subunit 1	P04632	3,38404E-07	0,601447752	Upregulated in Tumor	826	ENSG00000126247	826	ENSG00000126247
-THYN1	Thymocyte nuclear protein 1	Q9P016	0,001238376	0,601539837	Upregulated in Tumor	29087	ENSG00000151500	29087	ENSG00000151500
-SNRPA	U1 small nuclear ribonucleoprotein A	P09012	0,000126541	0,601878844	Upregulated in Tumor	6626	ENSG00000077312	6626	ENSG00000077312
-TMED7	Transmembrane emp24 domain-containing protein 7	Q9Y3B3	0,000320121	0,6035974	Upregulated in Tumor	51014;100302736	ENSG00000134970	51014;100302736	ENSG00000134970
-C1orf123	UPF0587 protein C1orf123	Q9NWV4	0,000990284	0,605945454	Upregulated in Tumor	54987	ENSG00000162384	54987	ENSG00000162384
-SYAP1	Synapse-associated protein 1	Q96A49	0,005123685	0,608056681	Upregulated in Tumor	94056	ENSG00000169895	94056	ENSG00000169895
-RPL23	60S ribosomal protein L23	P62829	1,56878E-08	0,610414369	Upregulated in Tumor	9349	ENSG00000125691	9349	ENSG00000125691
-PARK7	Protein DJ-1	Q99497	8,0986E-05	0,611074118	Upregulated in Tumor	11315	ENSG00000116288	11315	ENSG00000116288
-ERAP1	Endoplasmic reticulum aminopeptidase 1	Q9NZ08	0,00281933	0,611829153	Upregulated in Tumor	51752	ENSG00000164307	51752	ENSG00000164307
-MPG	DNA-3-methyladenine glycosylase	P29372	0,007232699	0,616524229	Upregulated in Tumor	4350	ENSG00000103152	4350	ENSG00000103152
-COX5A	Cytochrome c oxidase subunit 5A, mitochondrial	P20674	0,001065828	0,619503998	Upregulated in Tumor	9377	ENSG00000178741	9377	ENSG00000178741
-FAHD1	Acylpyruvase FAHD1, mitochondrial	Q6P587	0,00240971	0,620295267	Upregulated in Tumor	81889	ENSG00000180185	81889	ENSG00000180185
-GADD45GIP1	Growth arrest and DNA damage-inducible proteins-interacting protein 1	Q8TAE8	0,007535847	0,620854697	Upregulated in Tumor	90480	ENSG00000179271	90480	ENSG00000179271
-ACAA1	3-ketoacyl-CoA thiolase, peroxisomal	P09110	0,000144905	0,621463328	Upregulated in Tumor	30	ENSG00000060971	30	ENSG00000060971
-ALYREF	THO complex subunit 4	Q86V81	6,03153E-05	0,621840149	Upregulated in Tumor	10189	ENSG00000183684	10189	ENSG00000183684
-RPA2	Replication protein A 32 kDa subunit	P15927	0,008362692	0,623102552	Upregulated in Tumor	6118	ENSG00000117748	6118	ENSG00000117748
-SRRM1	Serine/arginine repetitive matrix protein 1	Q8IYB3	0,008938713	0,624554941	Upregulated in Tumor	10250	ENSG00000133226	10250	ENSG00000133226
-RANBP3	Ran-binding protein 3	Q9H6Z4	0,006470901	0,624932617	Upregulated in Tumor	8498	ENSG00000031823	8498	ENSG00000031823
-CTSD	Cathepsin D;Cathepsin D light chain;Cathepsin D heavy chain	P07339	1,331E-05	0,624961035	Upregulated in Tumor	1509	ENSG00000117984	1509	ENSG00000117984
-ARF5	ADP-ribosylation factor 5	P84085	8,15143E-06	0,625400459	Upregulated in Tumor	381	ENSG00000004059	381	ENSG00000004059
-C14orf166	UPF0568 protein C14orf166	Q9Y224	7,65383E-06	0,625825235	Upregulated in Tumor	51637	ENSG00000087302	51637	ENSG00000087302
-ASNA1	ATPase ASNA1	O43681	0,000734859	0,629255019	Upregulated in Tumor	439	ENSG00000198356	439	ENSG00000198356
-TSN	Translin	Q15631	0,003739155	0,629494367	Upregulated in Tumor	7247	ENSG00000211460	7247	ENSG00000211460
-OPLAH	5-oxoprolinase	O14841	0,001745307	0,631558542	Upregulated in Tumor	26873	ENSG00000178814	26873	ENSG00000178814
-NDUFA4	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 4	O00483	0,000255679	0,632088478	Upregulated in Tumor	4697	ENSG00000189043	4697	ENSG00000189043
-SNX12	Sorting nexin-12	Q9UMY4	0,000355463	0,632373545	Upregulated in Tumor	29934	ENSG00000147164	29934	ENSG00000147164
-ATP6AP2	Renin receptor	O75787	0,004253929	0,632785505	Upregulated in Tumor	10159	ENSG00000182220	10159	ENSG00000182220
-ABHD10	Mycophenolic acid acyl-glucuronide esterase, mitochondrial	Q9NUJ1	0,002720823	0,633022467	Upregulated in Tumor	55347	ENSG00000144827	55347	ENSG00000144827
-SEPHS1	Selenide, water dikinase 1	P49903	0,000915013	0,634270744	Upregulated in Tumor	22929	ENSG00000086475	22929	ENSG00000086475
-NADK2	NAD kinase 2, mitochondrial	Q4G0N4	0,00327042	0,63469291	Upregulated in Tumor	133686	ENSG00000152620	133686	ENSG00000152620
-VAPB	Vesicle-associated membrane protein-associated protein B/C	O95292	0,00704167	0,635554883	Upregulated in Tumor	9217	ENSG00000124164	9217	ENSG00000124164
-CRKL	Crk-like protein	P46109	0,001390984	0,635958608	Upregulated in Tumor	1399	ENSG00000099942	1399	ENSG00000099942
-PFDN5	Prefoldin subunit 5	Q99471	0,001886301	0,639012481	Upregulated in Tumor	5204	ENSG00000123349	5204	ENSG00000123349
-RAB2A	Ras-related protein Rab-2A	P61019	2,03057E-08	0,640160355	Upregulated in Tumor	5862	ENSG00000104388	5862	ENSG00000104388
-AKR1A1	Alcohol dehydrogenase [NADP(+)]	P14550	0,000280852	0,640660478	Upregulated in Tumor	10327	ENSG00000117448	10327	ENSG00000117448
-MRPL3	39S ribosomal protein L3, mitochondrial	P09001	0,000453284	0,641497737	Upregulated in Tumor	11222	ENSG00000114686	11222	ENSG00000114686
-CYB5R1	NADH-cytochrome b5 reductase 1	Q9UHQ9	0,00127136	0,646370588	Upregulated in Tumor	51706	ENSG00000159348	51706	ENSG00000159348
-SRSF6	Serine/arginine-rich splicing factor 6	Q13247	1,5217E-06	0,646689974	Upregulated in Tumor	6431	ENSG00000124193	6431	ENSG00000124193
-RPS15A;hCG_1994130	40S ribosomal protein S15a	P62244	3,94845E-08	0,647395068	Upregulated in Tumor	6210	ENSG00000134419	6210	ENSG00000134419
-EIF1AX;EIF1AY	Eukaryotic translation initiation factor 1A, X-chromosomal;Eukaryotic translation initiation factor 1A, Y-chromosomal	P47813	0,00307505	0,64747523	Upregulated in Tumor	1964	ENSG00000173674	1964	ENSG00000173674
-EIF1AX;EIF1AY	Eukaryotic translation initiation factor 1A, X-chromosomal;Eukaryotic translation initiation factor 1A, Y-chromosomal	O14602	0,00307505	0,64747523	Upregulated in Tumor	9086	ENSG00000198692	9086	ENSG00000198692
-SNRPB2	U2 small nuclear ribonucleoprotein B	P08579	0,001398442	0,647478104	Upregulated in Tumor	6629	ENSG00000125870	6629	ENSG00000125870
-TGFBI	Transforming growth factor-beta-induced protein ig-h3	Q15582	0,007555525	0,653243968	Upregulated in Tumor	7045	ENSG00000120708	7045	ENSG00000120708
-RPS28	40S ribosomal protein S28	P62857	5,47184E-05	0,655982212	Upregulated in Tumor	6234	ENSG00000233927	6234	ENSG00000233927
-MPC2	Mitochondrial pyruvate carrier 2	O95563	0,005836647	0,65691808	Upregulated in Tumor	25874	ENSG00000143158	25874	ENSG00000143158
-FNTA	Protein farnesyltransferase/geranylgeranyltransferase type-1 subunit alpha	P49354	0,000361959	0,659308716	Upregulated in Tumor	2339	ENSG00000168522	2339	ENSG00000168522
-MARCKS	Myristoylated alanine-rich C-kinase substrate	P29966	0,002753727	0,6595431	Upregulated in Tumor	4082	ENSG00000277443	4082	ENSG00000277443
-SEC61G	Protein transport protein Sec61 subunit gamma	P60059	0,002144008	0,660006108	Upregulated in Tumor	23480	ENSG00000132432	23480	ENSG00000132432
-HIST1H4A;HIST1H4L;HIST1H4H	Histone H4	P62805	1,3668E-08	0,660103801	Upregulated in Tumor	8361;8360;8363;8362;8365;8364;8367;8366;8368;8359;8370;8294;554313;121504	ENSG00000277157;ENSG00000197061;ENSG00000197837;ENSG00000270276;ENSG00000158406;ENSG00000276966;ENSG00000273542;ENSG00000270882;ENSG00000275126;ENSG00000278637;ENSG00000197238;ENSG00000274618;ENSG00000276180;ENSG00000278705	8361;8360;8363;8362;8365;8364;8367;8366;8368;8359;8370;8294;554313;121504	ENSG00000277157;ENSG00000197061;ENSG00000197837;ENSG00000270276;ENSG00000158406;ENSG00000276966;ENSG00000273542;ENSG00000270882;ENSG00000275126;ENSG00000278637;ENSG00000197238;ENSG00000274618;ENSG00000276180;ENSG00000278705
-SEC24D	Protein transport protein Sec24D	O94855	0,002473235	0,660354605	Upregulated in Tumor	9871	ENSG00000150961	9871	ENSG00000150961
-MRPS23	28S ribosomal protein S23, mitochondrial	Q9Y3D9	4,77734E-05	0,665542428	Upregulated in Tumor	51649	ENSG00000181610	51649	ENSG00000181610
-RAB5C	Ras-related protein Rab-5C	P51148	5,17936E-05	0,665744233	Upregulated in Tumor	5878	ENSG00000108774	5878	ENSG00000108774
-TP53I3	Quinone oxidoreductase PIG3	Q53FA7	0,00514178	0,665835787	Upregulated in Tumor	9540	ENSG00000115129	9540	ENSG00000115129
-SCARB2	Lysosome membrane protein 2	Q14108	0,005331331	0,667789542	Upregulated in Tumor	950	ENSG00000138760	950	ENSG00000138760
-RAP1A	Ras-related protein Rap-1A	P62834	0,000156201	0,667847397	Upregulated in Tumor	5906	ENSG00000116473	5906	ENSG00000116473
-VAMP8	Vesicle-associated membrane protein 8	Q9BV40	0,000358941	0,669648118	Upregulated in Tumor	8673	ENSG00000118640	8673	ENSG00000118640
-RBM47	RNA-binding protein 47	A0AV96	0,001633254	0,66985625	Upregulated in Tumor	54502	ENSG00000163694	54502	ENSG00000163694
-NAGK	N-acetyl-D-glucosamine kinase	Q9UJ70	2,48313E-05	0,670363154	Upregulated in Tumor	55577	ENSG00000124357	55577	ENSG00000124357
-PFDN6	Prefoldin subunit 6	O15212	0,003728958	0,671406232	Upregulated in Tumor	10471	ENSG00000235692;ENSG00000224782;ENSG00000204220;ENSG00000237335;ENSG00000206283	10471	ENSG00000235692;ENSG00000224782;ENSG00000204220;ENSG00000237335;ENSG00000206283
-GSTK1;LOC51064	Glutathione S-transferase kappa 1	Q9Y2Q3	9,55515E-05	0,673915321	Upregulated in Tumor	373156	ENSG00000197448	373156	ENSG00000197448
-RALB	Ras-related protein Ral-B	P11234	4,2711E-05	0,675306552	Upregulated in Tumor	5899	ENSG00000144118	5899	ENSG00000144118
-UROD	Uroporphyrinogen decarboxylase	P06132	0,00181366	0,675516644	Upregulated in Tumor	7389	ENSG00000126088	7389	ENSG00000126088
-MRPL50	39S ribosomal protein L50, mitochondrial	Q8N5N7	0,000676141	0,675715393	Upregulated in Tumor	54534	ENSG00000136897	54534	ENSG00000136897
-COPS8	COP9 signalosome complex subunit 8	Q99627	0,006177366	0,676848849	Upregulated in Tumor	10920	ENSG00000198612	10920	ENSG00000198612
-SERPINB1	Leukocyte elastase inhibitor	P30740	0,000355691	0,677061762	Upregulated in Tumor	1992	ENSG00000021355	1992	ENSG00000021355
-UQCRQ	Cytochrome b-c1 complex subunit 8	O14949	0,000299908	0,677388249	Upregulated in Tumor	27089	ENSG00000164405	27089	ENSG00000164405
-ARF1;ARF3	ADP-ribosylation factor 1;ADP-ribosylation factor 3	P84077	8,50076E-09	0,677796512	Upregulated in Tumor	375	ENSG00000143761	375	ENSG00000143761
-ARF1;ARF3	ADP-ribosylation factor 1;ADP-ribosylation factor 3	P61204	8,50076E-09	0,677796512	Upregulated in Tumor	377	ENSG00000134287	377	ENSG00000134287
-CTSA;PPGB	Lysosomal protective protein;Lysosomal protective protein 32 kDa chain;Lysosomal protective protein 20 kDa chain	P10619	0,000440411	0,678127604	Upregulated in Tumor	5476	ENSG00000064601	5476	ENSG00000064601
-RPS20	40S ribosomal protein S20	P60866	1,23578E-09	0,679937834	Upregulated in Tumor	6224	ENSG00000008988	6224	ENSG00000008988
-SF3B5	Splicing factor 3B subunit 5	Q9BWJ5	0,004660664	0,680500808	Upregulated in Tumor	83443	ENSG00000169976	83443	ENSG00000169976
-SNRPD3	Small nuclear ribonucleoprotein Sm D3	P62318	1,92122E-05	0,680726283	Upregulated in Tumor	6634	ENSG00000100028	6634	ENSG00000100028
-LEMD2	LEM domain-containing protein 2	Q8NC56	0,000441016	0,682463344	Upregulated in Tumor	221496	ENSG00000161904	221496	ENSG00000161904
-PARVA	Alpha-parvin	Q9NVD7	0,000716144	0,684745512	Upregulated in Tumor	55742	ENSG00000197702	55742	ENSG00000197702
-MRPL11	39S ribosomal protein L11, mitochondrial	Q9Y3B7	0,000156236	0,686404555	Upregulated in Tumor	65003	ENSG00000174547	65003	ENSG00000174547
-PSMB3	Proteasome subunit beta type-3	P49720	4,10497E-05	0,686867847	Upregulated in Tumor	5691	ENSG00000275903;ENSG00000277791	5691	ENSG00000275903;ENSG00000277791
-PDCD6	Programmed cell death protein 6	O75340	3,20578E-06	0,688621347	Upregulated in Tumor	10016	ENSG00000249915	10016	ENSG00000249915
-SF1	Splicing factor 1	Q15637	0,010757363	0,691336774	Upregulated in Tumor	7536	ENSG00000168066	7536	ENSG00000168066
-COPZ1	Coatomer subunit zeta-1	P61923	0,000838491	0,692442961	Upregulated in Tumor	22818	ENSG00000111481	22818	ENSG00000111481
-PTRHD1	Putative peptidyl-tRNA hydrolase PTRHD1	Q6GMV3	0,010623905	0,694306529	Upregulated in Tumor	391356	ENSG00000184924	391356	ENSG00000184924
-ATP5J	ATP synthase-coupling factor 6, mitochondrial	P18859	0,001338327	0,696224523	Upregulated in Tumor	522	ENSG00000154723	522	ENSG00000154723
-RPLP2	60S acidic ribosomal protein P2	P05387	0,000119864	0,696233699	Upregulated in Tumor	6181	ENSG00000177600	6181	ENSG00000177600
-SSR4	Translocon-associated protein subunit delta	P51571	9,00188E-05	0,696789774	Upregulated in Tumor	6748	ENSG00000180879	6748	ENSG00000180879
-PGLS	6-phosphogluconolactonase	O95336	2,76893E-06	0,697272436	Upregulated in Tumor	25796	NA	25796	ENSG00000130313
-MRPL18	39S ribosomal protein L18, mitochondrial	Q9H0U6	0,005391577	0,698879498	Upregulated in Tumor	29074	NA	29074	ENSG00000112110
-NDUFA12	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 12	Q9UI09	0,00967523	0,700378134	Upregulated in Tumor	55967	ENSG00000184752	55967	ENSG00000184752
-MRPS36	28S ribosomal protein S36, mitochondrial	P82909	0,002478185	0,701781841	Upregulated in Tumor	92259	NA	92259	ENSG00000278461;ENSG00000134056
-NUTF2	Nuclear transport factor 2	P61970	0,001463604	0,703892768	Upregulated in Tumor	10204	ENSG00000102898	10204	ENSG00000102898
-MRPL4	39S ribosomal protein L4, mitochondrial	Q9BYD3	1,45118E-05	0,704003582	Upregulated in Tumor	51073	ENSG00000105364	51073	ENSG00000105364
-S100A13	Protein S100-A13	Q99584	0,000237576	0,708772198	Upregulated in Tumor	6284	ENSG00000189171	6284	ENSG00000189171
-NDUFS6	NADH dehydrogenase [ubiquinone] iron-sulfur protein 6, mitochondrial	O75380	0,002435542	0,709198651	Upregulated in Tumor	4726	ENSG00000145494	4726	ENSG00000145494
-LAMTOR1	Ragulator complex protein LAMTOR1	Q6IAA8	0,000842542	0,710545209	Upregulated in Tumor	55004	ENSG00000149357	55004	ENSG00000149357
-NIT1	Nitrilase homolog 1	Q86X76	0,000769627	0,712005852	Upregulated in Tumor	4817	ENSG00000158793	4817	ENSG00000158793
-ARHGDIA	Rho GDP-dissociation inhibitor 1	P52565	0,003386951	0,714606475	Upregulated in Tumor	396	ENSG00000141522	396	ENSG00000141522
-MRPL14	39S ribosomal protein L14, mitochondrial	Q6P1L8	0,003034731	0,717092753	Upregulated in Tumor	64928	ENSG00000180992	64928	ENSG00000180992
-TPM4	Tropomyosin alpha-4 chain	P67936	0,003552325	0,720887881	Upregulated in Tumor	7171	ENSG00000167460	7171	ENSG00000167460
-NDUFB9	NADH dehydrogenase [ubiquinone] 1 beta subcomplex subunit 9	Q9Y6M9	1,10353E-06	0,72094948	Upregulated in Tumor	4715	ENSG00000147684	4715	ENSG00000147684
-MPST	3-mercaptopyruvate sulfurtransferase;Sulfurtransferase	P25325	0,000285479	0,721375419	Upregulated in Tumor	4357	ENSG00000128309	4357	ENSG00000128309
-TRA2A;HSU53209	Transformer-2 protein homolog alpha	Q13595	0,004504834	0,721657332	Upregulated in Tumor	29896	ENSG00000164548	29896	ENSG00000164548
-MRPL49	39S ribosomal protein L49, mitochondrial	Q13405	0,005517703	0,724495765	Upregulated in Tumor	740	ENSG00000149792	740	ENSG00000149792
-DDAH2	N(G),N(G)-dimethylarginine dimethylaminohydrolase 2	O95865	0,001998853	0,72674515	Upregulated in Tumor	23564	ENSG00000233076;ENSG00000225635;ENSG00000213722;ENSG00000226634;ENSG00000227317;ENSG00000228128;ENSG00000206395	23564	ENSG00000233076;ENSG00000225635;ENSG00000213722;ENSG00000226634;ENSG00000227317;ENSG00000228128;ENSG00000206395
-PCNP	PEST proteolytic signal-containing nuclear protein	Q8WW12	0,007230854	0,727704445	Upregulated in Tumor	57092	ENSG00000081154	57092	ENSG00000081154
-PPT1	Palmitoyl-protein thioesterase 1	P50897	0,001618852	0,732551929	Upregulated in Tumor	5538	ENSG00000131238	5538	ENSG00000131238
-RAB3D	Ras-related protein Rab-3D	O95716	0,001503449	0,73467743	Upregulated in Tumor	9545	ENSG00000105514	9545	ENSG00000105514
-BLVRA	Biliverdin reductase A	P53004	5,8004E-05	0,735048498	Upregulated in Tumor	644	ENSG00000106605	644	ENSG00000106605
-GUK1;DKFZp666D023	Guanylate kinase	Q16774	0,001806065	0,735823348	Upregulated in Tumor	2987	ENSG00000143774	2987	ENSG00000143774
-TPT1	Translationally-controlled tumor protein	P13693	8,87724E-08	0,73599166	Upregulated in Tumor	7178	ENSG00000133112	7178	ENSG00000133112
-TPT1	Translationally-controlled tumor protein	Q56UQ5	8,87724E-08	0,73599166	Upregulated in Tumor	392490	NA	392490	NA
-SAP18	Histone deacetylase complex subunit SAP18	O00422	0,00221534	0,736110037	Upregulated in Tumor	10284	ENSG00000150459	10284	ENSG00000150459
-MRPS34	28S ribosomal protein S34, mitochondrial	P82930	0,004295663	0,737253606	Upregulated in Tumor	65993	ENSG00000074071	65993	ENSG00000074071
-SRSF3;SFRS3	Serine/arginine-rich splicing factor 3	P84103	1,62885E-07	0,73819955	Upregulated in Tumor	6428	ENSG00000112081	6428	ENSG00000112081
-MRPL53	39S ribosomal protein L53, mitochondrial	Q96EL3	0,000364328	0,740661442	Upregulated in Tumor	116540	ENSG00000204822	116540	ENSG00000204822
-PIN4	Peptidyl-prolyl cis-trans isomerase NIMA-interacting 4	Q9Y237	4,01308E-05	0,743586619	Upregulated in Tumor	5303	ENSG00000102309	5303	ENSG00000102309
-CNDP2	Cytosolic non-specific dipeptidase	Q96KP4	5,47558E-06	0,745224293	Upregulated in Tumor	55748	ENSG00000133313	55748	ENSG00000133313
-RPS7	40S ribosomal protein S7	P62081	6,68395E-05	0,746653866	Upregulated in Tumor	6201	ENSG00000171863	6201	ENSG00000171863
-UFC1	Ubiquitin-fold modifier-conjugating enzyme 1	Q9Y3C8	0,008695661	0,747948949	Upregulated in Tumor	51506	ENSG00000143222	51506	ENSG00000143222
-LSM14A	Protein LSM14 homolog A	Q8ND56	0,000482567	0,748221291	Upregulated in Tumor	26065	ENSG00000262860;ENSG00000257103	26065	ENSG00000262860;ENSG00000257103
-RPS14	40S ribosomal protein S14	P62263	0,010486476	0,750480384	Upregulated in Tumor	6208	ENSG00000164587	6208	ENSG00000164587
-RPL36A	60S ribosomal protein L36a	P83881	0,000363357	0,751286418	Upregulated in Tumor	6173	ENSG00000241343	6173	ENSG00000241343
-TSPO;PBR	Translocator protein	P30536	0,000195823	0,751302427	Upregulated in Tumor	706	ENSG00000100300	706	ENSG00000100300
-ATP5J2-PTCD1;PTCD1	Pentatricopeptide repeat-containing protein 1, mitochondrial	O75127	9,5151E-05	0,751370743	Upregulated in Tumor	26024	ENSG00000106246	26024	ENSG00000106246
-PURB	Transcriptional activator protein Pur-beta	Q96QR8	0,000687837	0,757081216	Upregulated in Tumor	5814	ENSG00000146676	5814	ENSG00000146676
-PURB	Transcriptional activator protein Pur-beta	Q9UJV8	0,000687837	0,757081216	Upregulated in Tumor	29942	ENSG00000172733	29942	ENSG00000172733
-PPP1R7	Protein phosphatase 1 regulatory subunit 7	Q15435	0,0005038	0,762730896	Upregulated in Tumor	5510	ENSG00000115685	5510	ENSG00000115685
-HEXA	Beta-hexosaminidase;Beta-hexosaminidase subunit alpha	P06865	1,03158E-05	0,764633238	Upregulated in Tumor	3073	ENSG00000213614	3073	ENSG00000213614
-MRPL48	39S ribosomal protein L48, mitochondrial	Q96GC5	0,002157761	0,766056275	Upregulated in Tumor	51642	ENSG00000175581	51642	ENSG00000175581
-RPS17;RPS17L	40S ribosomal protein S17;40S ribosomal protein S17-like	P08708	0,000337623	0,766456795	Upregulated in Tumor	6218	ENSG00000182774;ENSG00000278229	6218	ENSG00000182774;ENSG00000278229
-PPIL1	Peptidyl-prolyl cis-trans isomerase-like 1	Q9Y3C6	6,29746E-05	0,767280648	Upregulated in Tumor	51645	ENSG00000137168	51645	ENSG00000137168
-NDUFS5	NADH dehydrogenase [ubiquinone] iron-sulfur protein 5	O43920	0,001760265	0,768344586	Upregulated in Tumor	4725	ENSG00000168653	4725	ENSG00000168653
-RPL34	60S ribosomal protein L34	P49207	3,12189E-06	0,769054188	Upregulated in Tumor	6164	ENSG00000109475	6164	ENSG00000109475
-RBM8A	RNA-binding protein 8A	Q9Y5S9	8,45332E-06	0,772610014	Upregulated in Tumor	9939	ENSG00000265241	9939	ENSG00000265241
-NUP35	Nucleoporin NUP53	Q8NFH5	0,002354173	0,775249677	Upregulated in Tumor	129401	ENSG00000163002	129401	ENSG00000163002
-NHP2	H/ACA ribonucleoprotein complex subunit 2	Q9NX24	0,000309007	0,780774851	Upregulated in Tumor	55651	ENSG00000145912	55651	ENSG00000145912
-CHTOP	Chromatin target of PRMT1 protein	Q9Y3Y2	4,07749E-06	0,783442879	Upregulated in Tumor	26097	ENSG00000160679	26097	ENSG00000160679
-DYNLRB1;DYNLRB2	Dynein light chain roadblock-type 1;Dynein light chain roadblock-type 2	Q9NP97	0,000142712	0,785619298	Upregulated in Tumor	83658	ENSG00000125971	83658	ENSG00000125971
-DYNLRB1;DYNLRB2	Dynein light chain roadblock-type 1;Dynein light chain roadblock-type 2	Q8TF09	0,000142712	0,785619298	Upregulated in Tumor	83657	ENSG00000168589	83657	ENSG00000168589
-ECI1;DCI	Enoyl-CoA delta isomerase 1, mitochondrial	P42126	8,00151E-07	0,788665532	Upregulated in Tumor	1632	ENSG00000167969	1632	ENSG00000167969
-SNRPB;SNRPN	Small nuclear ribonucleoprotein-associated protein;Small nuclear ribonucleoprotein-associated proteins B and B;Small nuclear ribonucleoprotein-associated protein N	P14678	1,23242E-06	0,789089411	Upregulated in Tumor	6628	ENSG00000125835	6628	ENSG00000125835
-SNRPB;SNRPN	Small nuclear ribonucleoprotein-associated protein;Small nuclear ribonucleoprotein-associated proteins B and B;Small nuclear ribonucleoprotein-associated protein N	P63162	1,23242E-06	0,789089411	Upregulated in Tumor	6638;8926	ENSG00000128739	6638;8926	ENSG00000128739
-TXNDC17	Thioredoxin domain-containing protein 17	Q9BRA2	5,89119E-06	0,79294109	Upregulated in Tumor	84817	ENSG00000129235	84817	ENSG00000129235
-IFITM3	Interferon-induced transmembrane protein 3	Q01628	0,000878526	0,797556124	Upregulated in Tumor	10410	ENSG00000142089	10410	ENSG00000142089
-BCAT2	Branched-chain-amino-acid aminotransferase, mitochondrial;Branched-chain-amino-acid aminotransferase	O15382	0,000121866	0,799787544	Upregulated in Tumor	587	ENSG00000105552	587	ENSG00000105552
-ABHD14B	Alpha/beta hydrolase domain-containing protein 14B	Q96IU4	1,73804E-06	0,80009896	Upregulated in Tumor	84836	ENSG00000114779	84836	ENSG00000114779
-ITPA	Inosine triphosphate pyrophosphatase	Q9BY32	0,001866347	0,801188374	Upregulated in Tumor	3704	ENSG00000125877	3704	ENSG00000125877
-TRAPPC3	Trafficking protein particle complex subunit 3	O43617	0,000122828	0,803576504	Upregulated in Tumor	27095	ENSG00000054116	27095	ENSG00000054116
-TAPBP	Tapasin	O15533	0,009880116	0,80548973	Upregulated in Tumor	6892	ENSG00000231925;ENSG00000236490;ENSG00000206208;ENSG00000206281;ENSG00000112493	6892	ENSG00000231925;ENSG00000236490;ENSG00000206208;ENSG00000206281;ENSG00000112493
-IRGQ	Immunity-related GTPase family Q protein	Q8WZA9	0,000327427	0,805659013	Upregulated in Tumor	126298	ENSG00000167378	126298	ENSG00000167378
-RPL35A	60S ribosomal protein L35a	P18077	7,88653E-07	0,806253588	Upregulated in Tumor	6165	ENSG00000182899	6165	ENSG00000182899
-NEDD8-MDP1	NA	Q15843	0,004824634	0,806732872	Upregulated in Tumor	4738	ENSG00000129559;ENSG00000285246	4738	ENSG00000129559;ENSG00000285246
-DNAJC19	Mitochondrial import inner membrane translocase subunit TIM14	Q96DA6	0,004271446	0,808036143	Upregulated in Tumor	131118	ENSG00000205981	131118	ENSG00000205981
-CMBL	Carboxymethylenebutenolidase homolog	Q96DG6	3,69692E-05	0,80947665	Upregulated in Tumor	134147	ENSG00000164237	134147	ENSG00000164237
-PURA	Transcriptional activator protein Pur-alpha	Q00577	0,001475072	0,810229722	Upregulated in Tumor	5813	ENSG00000185129	5813	ENSG00000185129
-C9orf142	Uncharacterized protein C9orf142	Q9BUH6	1,10658E-06	0,810676347	Upregulated in Tumor	286257	ENSG00000148362	286257	ENSG00000148362
-C11orf48	NA	E9PRG8	0,000227828	0,81532378	Upregulated in Tumor	102288414	ENSG00000278615	NA	ENSG00000278615
-ARPC5	Actin-related protein 2/3 complex subunit 5	O15511	0,000492121	0,815907782	Upregulated in Tumor	10092	ENSG00000162704	10092	ENSG00000162704
-PLBD2	Putative phospholipase B-like 2;Putative phospholipase B-like 2 32 kDa form;Putative phospholipase B-like 2 45 kDa form	Q8NHP8	0,003558489	0,816284	Upregulated in Tumor	196463	ENSG00000151176	196463	ENSG00000151176
-MRPL17	39S ribosomal protein L17, mitochondrial	Q9NRX2	0,001713758	0,816585984	Upregulated in Tumor	63875	ENSG00000158042	63875	ENSG00000158042
-VIM	Vimentin	P08670	0,000599569	0,821485427	Upregulated in Tumor	7431	ENSG00000026025	7431	ENSG00000026025
-DDAH1	N(G),N(G)-dimethylarginine dimethylaminohydrolase 1	O94760	0,001126166	0,828357976	Upregulated in Tumor	23576	ENSG00000153904	23576	ENSG00000153904
-ZC3H15	Zinc finger CCCH domain-containing protein 15	Q8WU90	0,002978356	0,83146728	Upregulated in Tumor	55854	ENSG00000065548	55854	ENSG00000065548
-ARPC3	Actin-related protein 2/3 complex subunit 3	O15145	0,001357733	0,832748505	Upregulated in Tumor	10094	ENSG00000111229	10094	ENSG00000111229
-ARF4	ADP-ribosylation factor 4	P18085	2,08373E-07	0,83548072	Upregulated in Tumor	378	ENSG00000168374	378	ENSG00000168374
-PYCARD	Apoptosis-associated speck-like protein containing a CARD	Q9ULZ3	0,00147934	0,838184015	Upregulated in Tumor	29108	ENSG00000103490	29108	ENSG00000103490
-PAFAH1B2	Platelet-activating factor acetylhydrolase IB subunit beta	P68402	0,000147882	0,838330362	Upregulated in Tumor	5049	ENSG00000168092	5049	ENSG00000168092
-NDUFV2	NADH dehydrogenase [ubiquinone] flavoprotein 2, mitochondrial	P19404	2,38506E-06	0,840750919	Upregulated in Tumor	4729	ENSG00000178127	4729	ENSG00000178127
-COX6B1	Cytochrome c oxidase subunit 6B1	P14854	1,80049E-07	0,841722364	Upregulated in Tumor	1340	ENSG00000126267	1340	ENSG00000126267
-UBQLN2	Ubiquilin-2	Q9UHD9	0,000764028	0,842538702	Upregulated in Tumor	29978	ENSG00000188021	29978	ENSG00000188021
-MRPL43	39S ribosomal protein L43, mitochondrial	Q8N983	0,005752744	0,843604507	Upregulated in Tumor	84545	ENSG00000055950	84545	ENSG00000055950
-NAGLU	Alpha-N-acetylglucosaminidase;Alpha-N-acetylglucosaminidase 82 kDa form;Alpha-N-acetylglucosaminidase 77 kDa form	P54802	0,001924784	0,845330041	Upregulated in Tumor	4669	ENSG00000108784	4669	ENSG00000108784
-CRIP2	Cysteine-rich protein 2	P52943	0,001815127	0,845644765	Upregulated in Tumor	1397	ENSG00000182809	1397	ENSG00000182809
-TOMM5	Mitochondrial import receptor subunit TOM5 homolog	Q8N4H5	0,00037201	0,847381835	Upregulated in Tumor	401505	ENSG00000175768	401505	ENSG00000175768
-PHPT1;PHP14	14 kDa phosphohistidine phosphatase	Q9NRX4	0,000495134	0,849552785	Upregulated in Tumor	29085	ENSG00000054148	29085	ENSG00000054148
-TFG	Protein TFG	Q92734	0,000232283	0,850835484	Upregulated in Tumor	10342	ENSG00000114354	10342	ENSG00000114354
-GPX4	Phospholipid hydroperoxide glutathione peroxidase, mitochondrial;Glutathione peroxidase	P36969	0,001772609	0,853158061	Upregulated in Tumor	2879	ENSG00000167468	2879	ENSG00000167468
-SNX3	Sorting nexin-3	O60493	4,66059E-05	0,853443474	Upregulated in Tumor	8724	ENSG00000112335	8724	ENSG00000112335
-OSGEP	Probable tRNA threonylcarbamoyladenosine biosynthesis protein OSGEP	Q9NPF4	0,000629261	0,85744763	Upregulated in Tumor	55644	ENSG00000092094	55644	ENSG00000092094
-RPS29	40S ribosomal protein S29	P62273	3,52137E-07	0,860277798	Upregulated in Tumor	6235	ENSG00000213741	6235	ENSG00000213741
-IVD	Isovaleryl-CoA dehydrogenase, mitochondrial	P26440	6,06838E-05	0,860739247	Upregulated in Tumor	3712	ENSG00000128928	3712	ENSG00000128928
-CAPG	Macrophage-capping protein	P40121	8,82345E-09	0,861753523	Upregulated in Tumor	822	ENSG00000042493	822	ENSG00000042493
-CCDC124	Coiled-coil domain-containing protein 124	Q96CT7	0,00029274	0,861987156	Upregulated in Tumor	115098	ENSG00000007080	115098	ENSG00000007080
-SPR	Sepiapterin reductase	P35270	3,68412E-06	0,862145782	Upregulated in Tumor	6697	ENSG00000116096	6697	ENSG00000116096
-TSG101	Tumor susceptibility gene 101 protein	Q99816	0,00675249	0,863135713	Upregulated in Tumor	7251	ENSG00000074319	7251	ENSG00000074319
-UQCRB	Cytochrome b-c1 complex subunit 7	P14927	0,001828402	0,863219101	Upregulated in Tumor	7381	ENSG00000156467	7381	ENSG00000156467
-HEBP2	Heme-binding protein 2	Q9Y5Z4	0,000175397	0,863546824	Upregulated in Tumor	23593	ENSG00000051620	23593	ENSG00000051620
-WIBG	Partner of Y14 and mago	Q9BRP8	0,000233178	0,865338921	Upregulated in Tumor	84305	ENSG00000170473	84305	ENSG00000170473
-SSR3	Translocon-associated protein subunit gamma	Q9UNL2	0,000424069	0,866346228	Upregulated in Tumor	6747	ENSG00000114850	6747	ENSG00000114850
-NDUFS4	NADH dehydrogenase [ubiquinone] iron-sulfur protein 4, mitochondrial	O43181	0,000124984	0,869325508	Upregulated in Tumor	4724	ENSG00000164258	4724	ENSG00000164258
-RAB1B	Ras-related protein Rab-1B	Q9H0U4	0,006540618	0,871014846	Upregulated in Tumor	81876	ENSG00000174903	81876	ENSG00000174903
-NDUFA8	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 8	P51970	1,02435E-06	0,871487776	Upregulated in Tumor	4702	ENSG00000119421	4702	ENSG00000119421
-NDUFA5	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 5	Q16718	7,4601E-06	0,872199199	Upregulated in Tumor	4698	ENSG00000128609	4698	ENSG00000128609
-MARCKSL1	MARCKS-related protein	P49006	0,001003265	0,872411132	Upregulated in Tumor	65108	ENSG00000175130	65108	ENSG00000175130
-ARRB1	Beta-arrestin-1	P49407	0,007047213	0,872426878	Upregulated in Tumor	408	ENSG00000137486	408	ENSG00000137486
-CRK	Adapter molecule crk	P46108	0,000551314	0,873721503	Upregulated in Tumor	1398	ENSG00000167193	1398	ENSG00000167193
-GTF2F2	General transcription factor IIF subunit 2	P13984	0,00231249	0,874407169	Upregulated in Tumor	2963	ENSG00000188342	2963	ENSG00000188342
-COX7A2	Cytochrome c oxidase subunit 7A2, mitochondrial	P14406	0,006457492	0,874642827	Upregulated in Tumor	1347	ENSG00000112695	1347	ENSG00000112695
-DIABLO	Diablo homolog, mitochondrial	Q9NR28	9,88075E-05	0,876426103	Upregulated in Tumor	56616	ENSG00000184047;ENSG00000284934	56616	ENSG00000184047;ENSG00000284934
-RPS26;RPS26P11	40S ribosomal protein S26;Putative 40S ribosomal protein S26-like 1	P62854	1,27836E-07	0,885375681	Upregulated in Tumor	6231	ENSG00000197728	6231	ENSG00000197728
-RPL21	60S ribosomal protein L21	P46778	0,000225697	0,885960753	Upregulated in Tumor	6144	ENSG00000122026	6144	ENSG00000122026
-RPL31	60S ribosomal protein L31	P62899	1,48387E-10	0,886020818	Upregulated in Tumor	6160	ENSG00000071082	6160	ENSG00000071082
-MRPS14	28S ribosomal protein S14, mitochondrial	O60783	5,18417E-06	0,888010948	Upregulated in Tumor	63931	ENSG00000120333	63931	ENSG00000120333
-NDUFA9	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 9, mitochondrial	Q16795	5,20557E-06	0,891151245	Upregulated in Tumor	4704	ENSG00000139180	4704	ENSG00000139180
-MRPS17	28S ribosomal protein S17, mitochondrial	Q9Y2R5	1,90591E-05	0,891254948	Upregulated in Tumor	51373	ENSG00000239789	51373	ENSG00000239789
-MRPS17	28S ribosomal protein S17, mitochondrial	Q96SE7	1,90591E-05	0,891254948	Upregulated in Tumor	84671	ENSG00000197937	84671	ENSG00000197937
-MRPS17	28S ribosomal protein S17, mitochondrial	Q03938	1,90591E-05	0,891254948	Upregulated in Tumor	7643	ENSG00000213988	7643	ENSG00000213988
-MRPS17	28S ribosomal protein S17, mitochondrial	Q5FWF6	1,90591E-05	0,891254948	Upregulated in Tumor	285989	ENSG00000198556	285989	ENSG00000198556
-HAGH	Hydroxyacylglutathione hydrolase, mitochondrial	Q16775	0,000142964	0,891485201	Upregulated in Tumor	3029	ENSG00000063854	3029	ENSG00000063854
-COA3	Cytochrome c oxidase assembly protein 3 homolog, mitochondrial	Q9Y2R0	0,004348026	0,891880303	Upregulated in Tumor	28958	ENSG00000183978	28958	ENSG00000183978
-PRCP	Lysosomal Pro-X carboxypeptidase	P42785	0,000539092	0,900558987	Upregulated in Tumor	5547	ENSG00000137509	5547	ENSG00000137509
-SRI	Sorcin	P30626	1,14496E-06	0,900670566	Upregulated in Tumor	6717	ENSG00000075142	6717	ENSG00000075142
-AKR7A2	Aflatoxin B1 aldehyde reductase member 2	O43488	1,93783E-05	0,904988091	Upregulated in Tumor	8574	ENSG00000053371	8574	ENSG00000053371
-ALCAM	CD166 antigen	Q13740	0,002442955	0,905478489	Upregulated in Tumor	214	ENSG00000170017	214	ENSG00000170017
-ACOT1;ACOT2	Acyl-coenzyme A thioesterase 1;Acyl-coenzyme A thioesterase 2, mitochondrial	Q86TX2	0,00346165	0,915027248	Upregulated in Tumor	641371	ENSG00000184227	641371	ENSG00000184227
-ACOT1;ACOT2	Acyl-coenzyme A thioesterase 1;Acyl-coenzyme A thioesterase 2, mitochondrial	P49753	0,00346165	0,915027248	Upregulated in Tumor	10965	ENSG00000119673	10965	ENSG00000119673
-BTF3L4	Transcription factor BTF3 homolog 4	Q96K17	3,57154E-05	0,919040029	Upregulated in Tumor	91408	ENSG00000134717	91408	ENSG00000134717
-MRPL13	39S ribosomal protein L13, mitochondrial	Q9BYD1	4,21995E-06	0,921733623	Upregulated in Tumor	28998	ENSG00000172172	28998	ENSG00000172172
-LMCD1	LIM and cysteine-rich domains protein 1	Q9NZU5	0,005845333	0,923434153	Upregulated in Tumor	29995	ENSG00000071282	29995	ENSG00000071282
-VAMP3	Vesicle-associated membrane protein 3	Q15836	0,001015451	0,923661288	Upregulated in Tumor	9341	ENSG00000049245	9341	ENSG00000049245
-GM2A	Ganglioside GM2 activator;Ganglioside GM2 activator isoform short	P17900	0,000360871	0,92470411	Upregulated in Tumor	2760	ENSG00000196743	2760	ENSG00000196743
-PGRMC2	Membrane-associated progesterone receptor component 2	O15173	2,46218E-05	0,925039588	Upregulated in Tumor	10424	ENSG00000164040	10424	ENSG00000164040
-EDF1	Endothelial differentiation-related factor 1	O60869	0,000112211	0,926716515	Upregulated in Tumor	8721	ENSG00000107223	8721	ENSG00000107223
-PRKACA	cAMP-dependent protein kinase catalytic subunit alpha	P17612	0,000104305	0,927646264	Upregulated in Tumor	5566	ENSG00000072062	5566	ENSG00000072062
-PRRC1	Protein PRRC1	Q96M27	0,001800245	0,930426951	Upregulated in Tumor	133619	ENSG00000164244	133619	ENSG00000164244
-ATP6V1G1	V-type proton ATPase subunit G 1	O75348	0,000186637	0,930557537	Upregulated in Tumor	9550	ENSG00000136888	9550	ENSG00000136888
-ATP6V1G1	V-type proton ATPase subunit G 1	O95670	0,000186637	0,930557537	Upregulated in Tumor	534	ENSG00000213760;ENSG00000206445;ENSG00000234668;ENSG00000227587;ENSG00000230900;ENSG00000226850;ENSG00000234920	534	ENSG00000213760;ENSG00000206445;ENSG00000234668;ENSG00000227587;ENSG00000230900;ENSG00000226850;ENSG00000234920
-RPS13	40S ribosomal protein S13	P62277	0,000520599	0,931299947	Upregulated in Tumor	6207	ENSG00000110700	6207	ENSG00000110700
-TPD52	Tumor protein D52	P55327	6,55302E-08	0,934555657	Upregulated in Tumor	7163	ENSG00000076554	7163	ENSG00000076554
-TCEB2	Transcription elongation factor B polypeptide 2	Q15370	1,51099E-05	0,935001244	Upregulated in Tumor	6923	ENSG00000103363	6923	ENSG00000103363
-SRP9	Signal recognition particle 9 kDa protein	P49458	6,20903E-06	0,937540267	Upregulated in Tumor	6726	ENSG00000143742	6726	ENSG00000143742
-QDPR	Dihydropteridine reductase	P09417	0,001797774	0,938291745	Upregulated in Tumor	5860	ENSG00000151552	5860	ENSG00000151552
-RSU1	Ras suppressor protein 1	Q15404	3,69762E-05	0,945354557	Upregulated in Tumor	6251	ENSG00000148484	6251	ENSG00000148484
-PNPO	Pyridoxine-5-phosphate oxidase	Q9NVS9	0,000281573	0,94545511	Upregulated in Tumor	55163	ENSG00000108439	55163	ENSG00000108439
-UBE2N	Ubiquitin-conjugating enzyme E2 N	P61088	9,64186E-10	0,945973869	Upregulated in Tumor	7334	ENSG00000177889	7334	ENSG00000177889
-ARPC5L	Actin-related protein 2/3 complex subunit 5-like protein;Actin-related protein 2/3 complex subunit 5	Q9BPX5	0,001129288	0,949567481	Upregulated in Tumor	81873	ENSG00000136950	81873	ENSG00000136950
-NAA38;LSM8	N-alpha-acetyltransferase 38, NatC auxiliary subunit	O95777	0,000511873	0,952405776	Upregulated in Tumor	51691	ENSG00000128534	51691	ENSG00000128534
-TIMM13	Mitochondrial import inner membrane translocase subunit Tim13	Q9Y5L4	0,000245126	0,954265701	Upregulated in Tumor	26517	ENSG00000099800	26517	ENSG00000099800
-LGALS1	Galectin-1	P09382	2,57584E-06	0,956403297	Upregulated in Tumor	3956	ENSG00000100097	3956	ENSG00000100097
-DAK	Bifunctional ATP-dependent dihydroxyacetone kinase/FAD-AMP lyase (cyclizing);ATP-dependent dihydroxyacetone kinase;FAD-AMP lyase (cyclizing)	Q3LXA3	1,60761E-08	0,958039375	Upregulated in Tumor	26007	ENSG00000149476	26007	ENSG00000149476
-SFXN3	Sideroflexin-3	Q9BWM7	5,10462E-05	0,959084225	Upregulated in Tumor	81855	ENSG00000107819	81855	ENSG00000107819
-FAH	Fumarylacetoacetase	P16930	0,002224813	0,959991776	Upregulated in Tumor	2184	ENSG00000103876	2184	ENSG00000103876
-SGSH	N-sulphoglucosamine sulphohydrolase	P51688	0,010267475	0,961117266	Upregulated in Tumor	6448	ENSG00000181523	6448	ENSG00000181523
-COX5B	Cytochrome c oxidase subunit 5B, mitochondrial	P10606	0,000799245	0,965486587	Upregulated in Tumor	1329	ENSG00000135940	1329	ENSG00000135940
-CISD1	CDGSH iron-sulfur domain-containing protein 1	Q9NZ45	0,000321902	0,966999342	Upregulated in Tumor	55847	ENSG00000122873	55847	ENSG00000122873
-CHCHD2;CHCHD2P9	Coiled-coil-helix-coiled-coil-helix domain-containing protein 2, mitochondrial;Putative coiled-coil-helix-coiled-coil-helix domain-containing protein CHCHD2P9, mitochondrial	Q9Y6H1	0,000378176	0,969420391	Upregulated in Tumor	51142	ENSG00000106153	51142	ENSG00000106153
-BST2	Bone marrow stromal antigen 2	Q10589	0,00121497	0,969549375	Upregulated in Tumor	684	ENSG00000130303	684	ENSG00000130303
-NENF	Neudesin	Q9UMX5	9,71816E-05	0,96986955	Upregulated in Tumor	29937	ENSG00000117691	29937	ENSG00000117691
-DCTPP1	dCTP pyrophosphatase 1	Q9H773	1,35917E-06	0,97633256	Upregulated in Tumor	79077	ENSG00000179958	79077	ENSG00000179958
-NUCKS1;NUCKS	Nuclear ubiquitous casein and cyclin-dependent kinase substrate 1	Q9H1E3	0,000813545	0,980372801	Upregulated in Tumor	64710	ENSG00000069275	64710	ENSG00000069275
-DPM3	Dolichol-phosphate mannosyltransferase subunit 3	Q9P2X0	2,90301E-05	0,983913295	Upregulated in Tumor	54344	ENSG00000179085	54344	ENSG00000179085
-DNASE2	Deoxyribonuclease-2-alpha	O00115	0,000177841	0,98503924	Upregulated in Tumor	1777	ENSG00000105612	1777	ENSG00000105612
-SERPINA3	Alpha-1-antichymotrypsin;Alpha-1-antichymotrypsin His-Pro-less	P01011	0,007429485	0,986760224	Upregulated in Tumor	12	ENSG00000196136	12	ENSG00000196136
-MRPS33	28S ribosomal protein S33, mitochondrial	Q9Y291	1,76301E-07	0,988377473	Upregulated in Tumor	51650	ENSG00000090263	51650	ENSG00000090263
-RING1	E3 ubiquitin-protein ligase RING1	Q06587	0,000456426	0,990717148	Upregulated in Tumor	6015	ENSG00000235107;ENSG00000206287;ENSG00000226788;ENSG00000231115;ENSG00000228520;ENSG00000204227	6015	ENSG00000235107;ENSG00000206287;ENSG00000226788;ENSG00000231115;ENSG00000228520;ENSG00000204227
-GCA	Grancalcin	P28676	6,43692E-05	0,994704548	Upregulated in Tumor	25801	ENSG00000115271	25801	ENSG00000115271
-CHP1	Calcineurin B homologous protein 1	Q99653	0,000313499	0,999538678	Upregulated in Tumor	11261	ENSG00000187446	11261	ENSG00000187446
-SNAPIN	SNARE-associated protein Snapin	O95295	0,00024119	1,007165849	Upregulated in Tumor	23557	ENSG00000143553	23557	ENSG00000143553
-RALA	Ras-related protein Ral-A	P11233	2,22656E-05	1,010116034	Upregulated in Tumor	5898	ENSG00000006451	5898	ENSG00000006451
-CHMP2A	Charged multivesicular body protein 2a	O43633	0,00090868	1,011396031	Upregulated in Tumor	27243	ENSG00000130724	27243	ENSG00000130724
-MTPN;DKFZp761E1322	Myotrophin	P58546	0,000554499	1,015291256	Upregulated in Tumor	136319	ENSG00000105887	136319	ENSG00000105887
-MAN2B1	Lysosomal alpha-mannosidase;Lysosomal alpha-mannosidase A peptide;Lysosomal alpha-mannosidase B peptide;Lysosomal alpha-mannosidase C peptide;Lysosomal alpha-mannosidase D peptide;Lysosomal alpha-mannosidase E peptide	O00754	0,001476073	1,018915715	Upregulated in Tumor	4125	ENSG00000104774	4125	ENSG00000104774
-CYB5R3	NADH-cytochrome b5 reductase 3;NADH-cytochrome b5 reductase 3 membrane-bound form;NADH-cytochrome b5 reductase 3 soluble form	P00387	0,001595452	1,019698455	Upregulated in Tumor	1727	ENSG00000100243	1727	ENSG00000100243
-ARL3	ADP-ribosylation factor-like protein 3	P36405	2,11829E-05	1,024026828	Upregulated in Tumor	403	ENSG00000138175	403	ENSG00000138175
-MT-CO2;COX2;COII	Cytochrome c oxidase subunit 2	P00403	1,56275E-05	1,02501763	Upregulated in Tumor	4513	ENSG00000198712	4513	ENSG00000198712
-TMED1	Transmembrane emp24 domain-containing protein 1	Q13445	7,74297E-05	1,025795633	Upregulated in Tumor	11018	ENSG00000099203	11018	ENSG00000099203
-BPHL	Valacyclovir hydrolase	Q86WA6	1,5547E-08	1,026753871	Upregulated in Tumor	670	ENSG00000137274	670	ENSG00000137274
-ATP6V1D;VATD	V-type proton ATPase subunit D	Q9Y5K8	0,003297323	1,02677562	Upregulated in Tumor	51382	ENSG00000100554	51382	ENSG00000100554
-TMED4	Transmembrane emp24 domain-containing protein 4	Q7Z7H5	4,57604E-05	1,028216749	Upregulated in Tumor	222068	ENSG00000158604	222068	ENSG00000158604
-SERPINA1	Alpha-1-antitrypsin;Short peptide from AAT	P01009	0,004815945	1,034967284	Upregulated in Tumor	5265	ENSG00000197249	5265	ENSG00000197249
-FAHD2A;FAHD2B;hCG_2002650	Fumarylacetoacetate hydrolase domain-containing protein 2A;Fumarylacetoacetate hydrolase domain-containing protein 2B	Q96GK7	0,000172036	1,040382497	Upregulated in Tumor	51011	ENSG00000115042	51011	ENSG00000115042
-FAHD2A;FAHD2B;hCG_2002650	Fumarylacetoacetate hydrolase domain-containing protein 2A;Fumarylacetoacetate hydrolase domain-containing protein 2B	Q6P2I3	0,000172036	1,040382497	Upregulated in Tumor	151313	ENSG00000144199	151313	ENSG00000144199
-ISG15	Ubiquitin-like protein ISG15	P05161	0,000475148	1,041239844	Upregulated in Tumor	9636	ENSG00000187608	9636	ENSG00000187608
-CORO1A	Coronin-1A;Coronin	P31146	0,006930872	1,04246522	Upregulated in Tumor	11151	ENSG00000102879	11151	ENSG00000102879
-TIMM10	Mitochondrial import inner membrane translocase subunit Tim10	P62072	5,50996E-07	1,044737424	Upregulated in Tumor	26519	ENSG00000134809	26519	ENSG00000134809
-SLC25A11	Mitochondrial 2-oxoglutarate/malate carrier protein	Q02978	0,00025737	1,044894745	Upregulated in Tumor	8402	ENSG00000108528	8402	ENSG00000108528
-EPHX2	Bifunctional epoxide hydrolase 2;Cytosolic epoxide hydrolase 2;Lipid-phosphate phosphatase	P34913	0,000167182	1,045727638	Upregulated in Tumor	2053	ENSG00000120915	2053	ENSG00000120915
-TAGLN	Transgelin	Q01995	8,34482E-05	1,048171692	Upregulated in Tumor	6876	ENSG00000149591	6876	ENSG00000149591
-SRSF2;SFRS2	Serine/arginine-rich splicing factor 2	Q01130	3,93209E-07	1,051829222	Upregulated in Tumor	6427	ENSG00000161547	6427	ENSG00000161547
-TAX1BP3	Tax1-binding protein 3	O14907	0,00069515	1,059083303	Upregulated in Tumor	30851	ENSG00000213977	30851	ENSG00000213977
-SUB1;PC4	Activated RNA polymerase II transcriptional coactivator p15	P53999	0,000113234	1,062789339	Upregulated in Tumor	10923	ENSG00000113387	10923	ENSG00000113387
-TMED2;RNP24	Transmembrane emp24 domain-containing protein 2	Q15363	6,37555E-08	1,065583252	Upregulated in Tumor	10959	ENSG00000086598	10959	ENSG00000086598
-GPX1	Glutathione peroxidase 1;Glutathione peroxidase	P07203	1,50069E-07	1,06790982	Upregulated in Tumor	2876	ENSG00000233276	2876	ENSG00000233276
-HINT2	Histidine triad nucleotide-binding protein 2, mitochondrial	Q9BX68	1,76225E-07	1,074735252	Upregulated in Tumor	84681	ENSG00000137133	84681	ENSG00000137133
-KRT10	Keratin, type I cytoskeletal 10	P13645	0,008342243	1,074990446	Upregulated in Tumor	3858	ENSG00000186395	3858	ENSG00000186395
-PRDX3	Thioredoxin-dependent peroxide reductase, mitochondrial	P30048	2,2827E-06	1,092469777	Upregulated in Tumor	10935	ENSG00000165672	10935	ENSG00000165672
-CPPED1	Calcineurin-like phosphoesterase domain-containing protein 1	Q9BRF8	0,000574035	1,09480083	Upregulated in Tumor	55313	ENSG00000103381	55313	ENSG00000103381
-GNG5	Guanine nucleotide-binding protein G(I)/G(S)/G(O) subunit gamma-5	P63218	0,000134485	1,096054089	Upregulated in Tumor	2787	ENSG00000174021	2787	ENSG00000174021
-ATOX1	Copper transport protein ATOX1	O00244	0,003142563	1,096081426	Upregulated in Tumor	475	ENSG00000177556	475	ENSG00000177556
-TMED9	Transmembrane emp24 domain-containing protein 9	Q9BVK6	1,58661E-05	1,096902965	Upregulated in Tumor	54732	ENSG00000184840	54732	ENSG00000184840
-GYG1	Glycogenin-1	P46976	0,010378188	1,104127601	Upregulated in Tumor	2992	ENSG00000163754	2992	ENSG00000163754
-RPS10	40S ribosomal protein S10	P46783	2,34807E-06	1,109831911	Upregulated in Tumor	6204	ENSG00000124614	6204	ENSG00000124614
-HIST2H2AB	Histone H2A type 2-B	Q8IUE6	5,97206E-07	1,11298715	Upregulated in Tumor	317772	ENSG00000184270	317772	ENSG00000184270
-SRSF10	Serine/arginine-rich splicing factor 10	O75494	1,09629E-07	1,115033188	Upregulated in Tumor	10772	ENSG00000188529	10772	ENSG00000188529
-SRSF10	Serine/arginine-rich splicing factor 10	Q8WXF0	1,09629E-07	1,115033188	Upregulated in Tumor	135295	ENSG00000154548	135295	ENSG00000154548
-NDUFA11	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 11	Q86Y39	8,91065E-08	1,120636474	Upregulated in Tumor	126328	ENSG00000174886	126328	ENSG00000174886
-EIF4B	Eukaryotic translation initiation factor 4B	P23588	2,92736E-06	1,122457746	Upregulated in Tumor	1975	ENSG00000063046	1975	ENSG00000063046
-GAR1	H/ACA ribonucleoprotein complex subunit 1	Q9NY12	1,87377E-05	1,124009514	Upregulated in Tumor	54433	ENSG00000109534	54433	ENSG00000109534
-SRSF5	Serine/arginine-rich splicing factor 5	Q13243	7,83112E-06	1,128537328	Upregulated in Tumor	6430	ENSG00000100650	6430	ENSG00000100650
-RPS23	40S ribosomal protein S23	P62266	1,53903E-06	1,136417193	Upregulated in Tumor	6228	ENSG00000186468	6228	ENSG00000186468
-PRKCDBP	Protein kinase C delta-binding protein	Q969G5	0,001531379	1,137750118	Upregulated in Tumor	112464	ENSG00000170955	112464	ENSG00000170955
-MAGOHB	Protein mago nashi homolog 2	Q96A72	1,44274E-05	1,141672606	Upregulated in Tumor	55110	ENSG00000111196	55110	ENSG00000111196
-RNASET2	Ribonuclease T2	O00584	5,03418E-05	1,149760004	Upregulated in Tumor	8635	ENSG00000026297	8635	ENSG00000026297
-RAB27B	Ras-related protein Rab-27B	O00194	0,000595541	1,151737128	Upregulated in Tumor	5874	ENSG00000041353	5874	ENSG00000041353
-NDUFB7	NADH dehydrogenase [ubiquinone] 1 beta subcomplex subunit 7	P17568	2,84211E-08	1,152627836	Upregulated in Tumor	4713	ENSG00000099795	4713	ENSG00000099795
-FAU	40S ribosomal protein S30	P35544	6,63078E-06	1,157416535	Upregulated in Tumor	2197	ENSG00000149806	2197	ENSG00000149806
-PPCS	Phosphopantothenate--cysteine ligase	Q9HAB8	7,08729E-07	1,160834591	Upregulated in Tumor	79717	ENSG00000127125	79717	ENSG00000127125
-GLUL;PIG59	Glutamine synthetase	P15104	1,49284E-05	1,164011166	Upregulated in Tumor	2752	ENSG00000135821	2752	ENSG00000135821
-MUC1	Mucin-1;Mucin-1 subunit alpha;Mucin-1 subunit beta	P15941	0,000223643	1,166869483	Upregulated in Tumor	4582	ENSG00000185499	4582	ENSG00000185499
-MRPL16	39S ribosomal protein L16, mitochondrial	Q9NX20	6,08423E-06	1,17677367	Upregulated in Tumor	54948	ENSG00000166902	54948	ENSG00000166902
-MRPL28	39S ribosomal protein L28, mitochondrial	Q13084	2,95929E-05	1,179290473	Upregulated in Tumor	10573	ENSG00000086504	10573	ENSG00000086504
-NDUFA2	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 2	O43678	3,7148E-08	1,187981302	Upregulated in Tumor	4695	ENSG00000131495	4695	ENSG00000131495
-RPS27L	40S ribosomal protein S27-like;40S ribosomal protein S27	Q71UM5	5,81211E-05	1,195490878	Upregulated in Tumor	51065	ENSG00000185088	51065	ENSG00000185088
-UFM1	Ubiquitin-fold modifier 1	P61960	5,82606E-05	1,211495151	Upregulated in Tumor	51569	ENSG00000120686	51569	ENSG00000120686
-LGALS3BP	Galectin-3-binding protein	Q08380	0,00013646	1,221353732	Upregulated in Tumor	3959	ENSG00000108679	3959	ENSG00000108679
-NA	NA	A0A024RBG1	0,002286277	1,225106829	Upregulated in Tumor	11163	ENSG00000177144	11163	ENSG00000177144
-CIRBP	Cold-inducible RNA-binding protein	Q14011	5,37063E-05	1,226900969	Upregulated in Tumor	1153	ENSG00000099622	1153	ENSG00000099622
-NOP10	H/ACA ribonucleoprotein complex subunit 3	Q9NPE3	7,15423E-05	1,229556852	Upregulated in Tumor	55505	ENSG00000182117	55505	ENSG00000182117
-BANF1	Barrier-to-autointegration factor;Barrier-to-autointegration factor, N-terminally processed	O75531	0,000962584	1,238185417	Upregulated in Tumor	8815	ENSG00000175334	8815	ENSG00000175334
-RBM3	Putative RNA-binding protein 3	P98179	9,83785E-06	1,24010679	Upregulated in Tumor	5935	ENSG00000102317	5935	ENSG00000102317
-ENO2	Gamma-enolase;Enolase	P09104	0,000337305	1,248327123	Upregulated in Tumor	2026	ENSG00000111674	2026	ENSG00000111674
-RPL26L1	60S ribosomal protein L26-like 1	Q9UNX3	0,000940776	1,255271286	Upregulated in Tumor	51121	ENSG00000037241	51121	ENSG00000037241
-TOLLIP	Toll-interacting protein	Q9H0E2	6,96638E-08	1,261294979	Upregulated in Tumor	54472	ENSG00000078902	54472	ENSG00000078902
-ARHGDIB	Rho GDP-dissociation inhibitor 2	P52566	1,81897E-05	1,262124392	Upregulated in Tumor	397	ENSG00000111348	397	ENSG00000111348
-PEA15	Astrocytic phosphoprotein PEA-15	Q15121	4,08644E-06	1,269772119	Upregulated in Tumor	8682	ENSG00000162734	8682	ENSG00000162734
-NUDT21	Cleavage and polyadenylation specificity factor subunit 5	O43809	1,84893E-05	1,272238417	Upregulated in Tumor	11051	ENSG00000167005	11051	ENSG00000167005
-TMEM109	Transmembrane protein 109	Q9BVC6	2,58418E-05	1,288934537	Upregulated in Tumor	79073	ENSG00000110108	79073	ENSG00000110108
-B2M	Beta-2-microglobulin;Beta-2-microglobulin form pI 5.3	P61769	2,46456E-06	1,292645505	Upregulated in Tumor	567	ENSG00000166710;ENSG00000273686	567	ENSG00000166710;ENSG00000273686
-AGR2	Anterior gradient protein 2 homolog	O95994	3,1975E-06	1,294151422	Upregulated in Tumor	10551	ENSG00000106541	10551	ENSG00000106541
-PSMB8	Proteasome subunit beta type-8;Proteasome subunit beta type	P28062	2,76923E-05	1,316325183	Upregulated in Tumor	5696	ENSG00000230034;ENSG00000230669;ENSG00000231631;ENSG00000226201;ENSG00000236443;ENSG00000204264;ENSG00000235715;ENSG00000206298	5696	ENSG00000230034;ENSG00000230669;ENSG00000231631;ENSG00000226201;ENSG00000236443;ENSG00000204264;ENSG00000235715;ENSG00000206298
-ACP2	Lysosomal acid phosphatase	P11117	0,000125861	1,321491186	Upregulated in Tumor	53	ENSG00000134575	53	ENSG00000134575
-PSAP	Proactivator polypeptide;Saposin-A;Saposin-B-Val;Saposin-B;Saposin-C;Saposin-D	P07602	2,08247E-09	1,335868925	Upregulated in Tumor	5660	ENSG00000197746	5660	ENSG00000197746
-TIMM9	Mitochondrial import inner membrane translocase subunit Tim9	Q9Y5J7	5,34006E-05	1,340319794	Upregulated in Tumor	26520	ENSG00000100575	26520	ENSG00000100575
-PIN1	Peptidyl-prolyl cis-trans isomerase NIMA-interacting 1	Q13526	7,64377E-07	1,340640712	Upregulated in Tumor	5300	ENSG00000127445	5300	ENSG00000127445
-NDUFA6	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 6	P56556	5,3639E-07	1,34216648	Upregulated in Tumor	4700	ENSG00000184983;ENSG00000281013;ENSG00000272765;ENSG00000277365;ENSG00000273397	4700	ENSG00000184983;ENSG00000281013;ENSG00000272765;ENSG00000277365;ENSG00000273397
-SNRPD1	Small nuclear ribonucleoprotein Sm D1	P62314	1,26538E-05	1,351979524	Upregulated in Tumor	6632	ENSG00000167088	6632	ENSG00000167088
-HMGA1	High mobility group protein HMG-I/HMG-Y	P17096	5,07543E-07	1,354054029	Upregulated in Tumor	3159	ENSG00000137309	3159	ENSG00000137309
-DCXR	L-xylulose reductase	Q7Z4W1	1,5403E-09	1,375666921	Upregulated in Tumor	51181	ENSG00000169738	51181	ENSG00000169738
-SNRPF	Small nuclear ribonucleoprotein F	P62306	9,9039E-08	1,383493958	Upregulated in Tumor	6636	ENSG00000139343	6636	ENSG00000139343
-PDLIM4	PDZ and LIM domain protein 4	P50479	0,000106993	1,391852871	Upregulated in Tumor	8572	ENSG00000131435	8572	ENSG00000131435
-EFHD1	EF-hand domain-containing protein D1	Q9BUP0	4,7375E-10	1,402703482	Upregulated in Tumor	80303	ENSG00000115468	80303	ENSG00000115468
-ATP5D	ATP synthase subunit delta, mitochondrial	P30049	0,001039552	1,411125066	Upregulated in Tumor	513	ENSG00000099624	513	ENSG00000099624
-RPL38	60S ribosomal protein L38	P63173	3,22365E-05	1,422631093	Upregulated in Tumor	6169	ENSG00000172809	6169	ENSG00000172809
-GMFB	Glia maturation factor beta	P60983	2,23661E-06	1,429151931	Upregulated in Tumor	2764	ENSG00000197045	2764	ENSG00000197045
-LAMTOR3	Ragulator complex protein LAMTOR3	Q9UHA4	3,37099E-07	1,445104547	Upregulated in Tumor	8649	ENSG00000109270	8649	ENSG00000109270
-C6orf211	UPF0364 protein C6orf211	Q9H993	2,43706E-06	1,460342067	Upregulated in Tumor	79624	ENSG00000146476	79624	ENSG00000146476
-PAFAH1B3	Platelet-activating factor acetylhydrolase IB subunit gamma	Q15102	1,91563E-08	1,516004718	Upregulated in Tumor	5050	ENSG00000079462	5050	ENSG00000079462
-HEBP1	Heme-binding protein 1	Q9NRV9	0,000100904	1,525518599	Upregulated in Tumor	50865	ENSG00000013583	50865	ENSG00000013583
-SNRPG	Small nuclear ribonucleoprotein G;Small nuclear ribonucleoprotein G-like protein	P62308	2,03171E-07	1,536219656	Upregulated in Tumor	6637	ENSG00000143977	6637	ENSG00000143977
-GLA	Alpha-galactosidase A	P06280	4,53554E-05	1,540911827	Upregulated in Tumor	2717	ENSG00000102393	2717	ENSG00000102393
-TSTD1	Thiosulfate sulfurtransferase/rhodanese-like domain-containing protein 1	Q8NFU3	6,08659E-07	1,547618603	Upregulated in Tumor	100131187	ENSG00000215845	100131187	ENSG00000215845
-GRN	Granulins;Acrogranin;Paragranulin;Granulin-1;Granulin-2;Granulin-3;Granulin-4;Granulin-5;Granulin-6;Granulin-7	P28799	2,03589E-05	1,572544608	Upregulated in Tumor	2896	ENSG00000030582	2896	ENSG00000030582
-KCTD12	BTB/POZ domain-containing protein KCTD12	Q96CX2	2,60299E-06	1,584358638	Upregulated in Tumor	115207	ENSG00000178695	115207	ENSG00000178695
-KCTD12	BTB/POZ domain-containing protein KCTD12	Q6ZWB6	2,60299E-06	1,584358638	Upregulated in Tumor	386617	ENSG00000183783	386617	ENSG00000183783
-SH3BGRL	SH3 domain-binding glutamic acid-rich-like protein	O75368	2,89843E-06	1,593408089	Upregulated in Tumor	6451	ENSG00000131171	6451	ENSG00000131171
-PCBD1	Pterin-4-alpha-carbinolamine dehydratase	P61457	3,49467E-06	1,59847454	Upregulated in Tumor	5092	ENSG00000166228	5092	ENSG00000166228
-NT5C	5(3)-deoxyribonucleotidase, cytosolic type	Q8TCD5	3,27041E-07	1,610462458	Upregulated in Tumor	30833	ENSG00000125458	30833	ENSG00000125458
-RPS15	40S ribosomal protein S15	P62841	5,81458E-08	1,623098105	Upregulated in Tumor	6209	ENSG00000115268	6209	ENSG00000115268
-ATP5I	ATP synthase subunit e, mitochondrial	P56385	4,51729E-09	1,630745516	Upregulated in Tumor	521	ENSG00000169020	521	ENSG00000169020
-HMGN2	Non-histone chromosomal protein HMG-17	P05204	4,84758E-08	1,65227097	Upregulated in Tumor	3151	ENSG00000198830	3151	ENSG00000198830
-GUSB	Beta-glucuronidase	P08236	6,70288E-05	1,682758593	Upregulated in Tumor	2990	ENSG00000169919	2990	ENSG00000169919
-FN1	Fibronectin;Anastellin;Ugl-Y1;Ugl-Y2;Ugl-Y3	P02751	6,46689E-08	1,684751311	Upregulated in Tumor	2335	ENSG00000115414	2335	ENSG00000115414
-GAA	Lysosomal alpha-glucosidase;76 kDa lysosomal alpha-glucosidase;70 kDa lysosomal alpha-glucosidase	P10253	2,46841E-11	1,696219273	Upregulated in Tumor	2548	ENSG00000171298	2548	ENSG00000171298
-LSM3	U6 snRNA-associated Sm-like protein LSm3	P62310	1,36933E-06	1,700404312	Upregulated in Tumor	27258	ENSG00000170860	27258	ENSG00000170860
-C19orf10	UPF0556 protein C19orf10	Q969H8	0,00039943	1,705905626	Upregulated in Tumor	56005	ENSG00000074842	56005	ENSG00000074842
-ARL1	ADP-ribosylation factor-like protein 1	P40616	2,22982E-07	1,718017844	Upregulated in Tumor	400	ENSG00000120805	400	ENSG00000120805
-CEACAM6	Carcinoembryonic antigen-related cell adhesion molecule 6	P40199	0,000453954	1,745716409	Upregulated in Tumor	4680	ENSG00000086548	4680	ENSG00000086548
-TNC variant protein;TNC	Tenascin	P24821	2,25534E-05	1,753271768	Upregulated in Tumor	3371	ENSG00000041982	3371	ENSG00000041982
-DUSP23	Dual specificity protein phosphatase 23	Q9BVJ7	4,31768E-09	1,75431238	Upregulated in Tumor	54935	ENSG00000158716	54935	ENSG00000158716
-DPP7	Dipeptidyl peptidase 2	Q9UHL4	2,62348E-06	1,790513755	Upregulated in Tumor	29952	ENSG00000176978	29952	ENSG00000176978
-ASAH1	Acid ceramidase;Acid ceramidase subunit alpha;Acid ceramidase subunit beta	Q13510	4,07729E-09	1,805135153	Upregulated in Tumor	427	ENSG00000104763	427	ENSG00000104763
-CTSZ	Cathepsin Z	Q9UBR2	9,79252E-07	1,814517576	Upregulated in Tumor	1522	ENSG00000101160	1522	ENSG00000101160
-CYB5A	Cytochrome b5	P00167	6,55308E-06	1,829648779	Upregulated in Tumor	1528	ENSG00000166347	1528	ENSG00000166347
-TPP1	Tripeptidyl-peptidase 1	O14773	5,8468E-06	1,86223791	Upregulated in Tumor	1200	ENSG00000166340	1200	ENSG00000166340
-PLGRKT	Plasminogen receptor (KT)	Q9HBL7	1,17038E-09	1,941442605	Upregulated in Tumor	55848	ENSG00000107020	55848	ENSG00000107020
-NME3;c371H6.2	Nucleoside diphosphate kinase 3;Nucleoside diphosphate kinase	Q13232	4,54273E-07	1,942492089	Upregulated in Tumor	4832	ENSG00000103024	4832	ENSG00000103024
-CRIP1	Cysteine-rich protein 1	P50238	3,00514E-09	1,959820839	Upregulated in Tumor	1396	ENSG00000213145	1396	ENSG00000213145
-S100A4	Protein S100-A4	P26447	0,000163405	2,094376832	Upregulated in Tumor	6275	ENSG00000196154	6275	ENSG00000196154
-HLA-DRB1;HLA-DRB5	HLA class II histocompatibility antigen, DRB1-16 beta chain	Q29974	5,43355E-05	2,240464839	Upregulated in Tumor	3123	ENSG00000196126	3123	ENSG00000196126
-AGA	N(4)-(beta-N-acetylglucosaminyl)-L-asparaginase;Glycosylasparaginase alpha chain;Glycosylasparaginase beta chain	P20933	1,07557E-08	2,291171414	Upregulated in Tumor	175	ENSG00000038002	175	ENSG00000038002
-POSTN	Periostin	Q15063	5,2589E-06	2,320871994	Upregulated in Tumor	10631	ENSG00000133110	10631	ENSG00000133110
-FTL;FTL variant	Ferritin light chain;Ferritin	P02792	1,78439E-06	2,362490942	Upregulated in Tumor	2512	ENSG00000087086	2512	ENSG00000087086
-ITIH1	Inter-alpha-trypsin inhibitor heavy chain H1	P19827	0,000605	2,395791971	Upregulated in Tumor	3697	ENSG00000055957	3697	ENSG00000055957
-COL12A1	Collagen alpha-1(XII) chain	Q99715	7,37894E-10	2,644814576	Upregulated in Tumor	1303	ENSG00000111799	1303	ENSG00000111799
-TYMP;hCG_1988078	Thymidine phosphorylase	P19971	3,25161E-07	2,937479585	Upregulated in Tumor	1890	ENSG00000025708	1890	ENSG00000025708
-HLA-DRA;HLA-DRA1	HLA class II histocompatibility antigen, DR alpha chain	P01903	5,60108E-07	3,567075665	Upregulated in Tumor	3122	ENSG00000227993;ENSG00000230726;ENSG00000206308;ENSG00000226260;ENSG00000234794;ENSG00000204287;ENSG00000228987	3122	ENSG00000227993;ENSG00000230726;ENSG00000206308;ENSG00000226260;ENSG00000234794;ENSG00000204287;ENSG00000228987
+Gene names	Protein names	Protein IDs	Welch test p-value	Welch test Difference	Cluster	GeneID	Ensembl_Gene	GeneID	Ensembl_Gene
+RPS3A	40S ribosomal protein S3a	P61247	0,006449854	0,172449906	Upregulated in Tumor	6189	ENSG00000145425	6189	ENSG00000145425
+RPL5	60S ribosomal protein L5	P46777	0,000934294	0,199756086	Upregulated in Tumor	6125	ENSG00000122406	6125	ENSG00000122406
+TPI1	Triosephosphate isomerase	P60174	0,001276728	0,2035502	Upregulated in Tumor	7167	ENSG00000111669	7167	ENSG00000111669
+EIF3I	Eukaryotic translation initiation factor 3 subunit I	Q13347	0,000428467	0,233844202	Upregulated in Tumor	8668	ENSG00000084623	8668	ENSG00000084623
+RPL10A	60S ribosomal protein L10a;Ribosomal protein	P62906	0,004102293	0,241825992	Upregulated in Tumor	4736	ENSG00000198755	4736	ENSG00000198755
+DSTN	Destrin	P60981	0,003869657	0,248218462	Upregulated in Tumor	11034	ENSG00000125868	11034	ENSG00000125868
+DECR1;DECR	2,4-dienoyl-CoA reductase, mitochondrial	Q16698	0,008368613	0,25237194	Upregulated in Tumor	1666	ENSG00000104325	1666	ENSG00000104325
+GOT2	Aspartate aminotransferase, mitochondrial;Aspartate aminotransferase	P00505	0,009260929	0,255778513	Upregulated in Tumor	2806	ENSG00000125166	2806	ENSG00000125166
+RAB7A	Ras-related protein Rab-7a	P51149	0,000317146	0,266870946	Upregulated in Tumor	7879	ENSG00000075785	7879	ENSG00000075785
+ILF2	Interleukin enhancer-binding factor 2	Q12905	0,000711923	0,270490101	Upregulated in Tumor	3608	ENSG00000143621	3608	ENSG00000143621
+EIF4A3	Eukaryotic initiation factor 4A-III;Eukaryotic initiation factor 4A-III, N-terminally processed	P38919	0,002250657	0,272235115	Upregulated in Tumor	9775	ENSG00000141543	9775	ENSG00000141543
+HNRNPM;ORF	Heterogeneous nuclear ribonucleoprotein M	P52272	0,000947473	0,277217468	Upregulated in Tumor	4670	ENSG00000099783	4670	ENSG00000099783
+RBMX	RNA-binding motif protein, X chromosome;RNA-binding motif protein, X chromosome, N-terminally processed	P38159	0,007018658	0,282536987	Upregulated in Tumor	27316	ENSG00000147274	27316	ENSG00000147274
+HN1L	Hematological and neurological expressed 1-like protein	Q9H910	0,005253586	0,283587347	Upregulated in Tumor	90861	ENSG00000206053	90861	ENSG00000206053
+THRAP3	Thyroid hormone receptor-associated protein 3	Q9Y2W1	0,003051785	0,288256471	Upregulated in Tumor	9967	ENSG00000054118	9967	ENSG00000054118
+RAB5A	Ras-related protein Rab-5A	P20339	0,003162221	0,294551876	Upregulated in Tumor	5868	ENSG00000144566	5868	ENSG00000144566
+VPS29;DKFZp667O202	Vacuolar protein sorting-associated protein 29	Q9UBQ0	0,002835378	0,294975183	Upregulated in Tumor	51699	ENSG00000111237	51699	ENSG00000111237
+AK2	Adenylate kinase 2, mitochondrial;Adenylate kinase 2, mitochondrial, N-terminally processed	P54819	0,001622708	0,302655716	Upregulated in Tumor	204	ENSG00000004455	204	ENSG00000004455
+CTBP1	C-terminal-binding protein 1	Q13363	0,009610663	0,302890153	Upregulated in Tumor	1487	ENSG00000159692	1487	ENSG00000159692
+PHB2	Prohibitin-2	Q99623	5,17477E-05	0,304170356	Upregulated in Tumor	11331	ENSG00000215021	11331	ENSG00000215021
+PPIA	Peptidyl-prolyl cis-trans isomerase A;Peptidyl-prolyl cis-trans isomerase A, N-terminally processed;Peptidyl-prolyl cis-trans isomerase	P62937	0,00024332	0,304746732	Upregulated in Tumor	5478	ENSG00000196262	5478	ENSG00000196262
+MYL12B;MYL12A	Myosin regulatory light chain 12B;Myosin regulatory light chain 12A	O14950	0,006444158	0,308985352	Upregulated in Tumor	103910;10627	ENSG00000118680	103910;10627	ENSG00000118680
+MYL12B;MYL12A	Myosin regulatory light chain 12B;Myosin regulatory light chain 12A	P19105	0,006444158	0,308985352	Upregulated in Tumor	10627	ENSG00000101608	10627	ENSG00000101608
+HSD17B4	Peroxisomal multifunctional enzyme type 2;(3R)-hydroxyacyl-CoA dehydrogenase;Enoyl-CoA hydratase 2	P51659	0,004073445	0,30955718	Upregulated in Tumor	3295	ENSG00000133835	3295	ENSG00000133835
+DDOST	Dolichyl-diphosphooligosaccharide--protein glycosyltransferase 48 kDa subunit	P39656	0,000213237	0,312400256	Upregulated in Tumor	1650	ENSG00000244038	1650	ENSG00000244038
+RPL18A	60S ribosomal protein L18a	Q02543	0,000285311	0,314208005	Upregulated in Tumor	6142	ENSG00000105640	6142	ENSG00000105640
+PSMB1	Proteasome subunit beta type-1	P20618	0,003713569	0,314974704	Upregulated in Tumor	5689	ENSG00000008018	5689	ENSG00000008018
+PTBP1	Polypyrimidine tract-binding protein 1	P26599	5,49128E-05	0,319663522	Upregulated in Tumor	5725	ENSG00000011304	5725	ENSG00000011304
+RPL12;hCG_21173	60S ribosomal protein L12	P30050	0,00015136	0,320453274	Upregulated in Tumor	6136	ENSG00000197958	6136	ENSG00000197958
+PHB	Prohibitin	P35232	3,08165E-05	0,321782928	Upregulated in Tumor	5245	ENSG00000167085	5245	ENSG00000167085
+ARPC1B	Actin-related protein 2/3 complex subunit 1B	O15143	0,005836811	0,328389506	Upregulated in Tumor	10095	ENSG00000130429	10095	ENSG00000130429
+ANXA5	Annexin A5;Annexin	P08758	0,006908055	0,329372942	Upregulated in Tumor	308	ENSG00000164111	308	ENSG00000164111
+RPS4X	40S ribosomal protein S4, X isoform	P62701	2,76618E-05	0,330568716	Upregulated in Tumor	6191	ENSG00000198034	6191	ENSG00000198034
+RPS4X	40S ribosomal protein S4, X isoform	Q8TD47	2,76618E-05	0,330568716	Upregulated in Tumor	140032	ENSG00000280969	140032	ENSG00000280969
+RPS4X	40S ribosomal protein S4, X isoform	P22090	2,76618E-05	0,330568716	Upregulated in Tumor	6192	ENSG00000129824	6192	ENSG00000129824
+PRDX4	Peroxiredoxin-4	Q13162	0,010575403	0,331910524	Upregulated in Tumor	10549	ENSG00000123131	10549	ENSG00000123131
+RHOA;ARHA	Transforming protein RhoA	P61586	8,92969E-05	0,333569128	Upregulated in Tumor	387	ENSG00000067560	387	ENSG00000067560
+RPS12	40S ribosomal protein S12	P25398	9,80366E-05	0,336031922	Upregulated in Tumor	6206	ENSG00000112306	6206	ENSG00000112306
+C1QBP	Complement component 1 Q subcomponent-binding protein, mitochondrial	Q07021	0,005549957	0,337463498	Upregulated in Tumor	708	ENSG00000108561	708	ENSG00000108561
+NSFL1C	NSFL1 cofactor p47	Q9UNZ2	0,001349788	0,33882771	Upregulated in Tumor	55968	ENSG00000088833	55968	ENSG00000088833
+PRDX5	Peroxiredoxin-5, mitochondrial	P30044	0,000449983	0,338934498	Upregulated in Tumor	25824	ENSG00000126432	25824	ENSG00000126432
+C22orf28	tRNA-splicing ligase RtcB homolog	Q9Y3I0	0,000492172	0,348562126	Upregulated in Tumor	51493	ENSG00000100220	51493	ENSG00000100220
+ARPC2	Actin-related protein 2/3 complex subunit 2	O15144	0,00056163	0,350278832	Upregulated in Tumor	10109	ENSG00000163466	10109	ENSG00000163466
+NAPA	Alpha-soluble NSF attachment protein	P54920	0,000502038	0,353954774	Upregulated in Tumor	8775	ENSG00000105402	8775	ENSG00000105402
+HNRNPA3	Heterogeneous nuclear ribonucleoprotein A3	P51991	0,000691255	0,354777122	Upregulated in Tumor	220988	ENSG00000170144	220988	ENSG00000170144
+RPL26;KRBA2	60S ribosomal protein L26	P61254	0,005450299	0,35694396	Upregulated in Tumor	6154	ENSG00000161970	6154	ENSG00000161970
+GNB1	Guanine nucleotide-binding protein G(I)/G(S)/G(T) subunit beta-1	P62873	0,002522529	0,358535434	Upregulated in Tumor	2782	ENSG00000078369	2782	ENSG00000078369
+GNB1	Guanine nucleotide-binding protein G(I)/G(S)/G(T) subunit beta-1	P16520	0,002522529	0,358535434	Upregulated in Tumor	2784	ENSG00000111664	2784	ENSG00000111664
+HNRPDL	Heterogeneous nuclear ribonucleoprotein D-like	O14979	0,001961692	0,359456594	Upregulated in Tumor	9987	ENSG00000152795	9987	ENSG00000152795
+UBE2V1	Ubiquitin-conjugating enzyme E2 variant 1	Q13404	0,00018786	0,361810972	Upregulated in Tumor	7335;387522	ENSG00000244687	7335;387522	ENSG00000244687
+ELAVL1	ELAV-like protein 1	Q15717	0,00037077	0,363495758	Upregulated in Tumor	1994	ENSG00000066044	1994	ENSG00000066044
+VAT1	Synaptic vesicle membrane protein VAT-1 homolog	Q99536	0,004802934	0,36517721	Upregulated in Tumor	10493	ENSG00000108828	10493	ENSG00000108828
+RPS16	40S ribosomal protein S16	P62249	9,07841E-05	0,366616637	Upregulated in Tumor	6217	ENSG00000105193	6217	ENSG00000105193
+ACBD3	Golgi resident protein GCP60	Q9H3P7	0,002016447	0,366734959	Upregulated in Tumor	64746	ENSG00000182827	64746	ENSG00000182827
+RPS8	40S ribosomal protein S8	P62241	0,000248965	0,366911036	Upregulated in Tumor	6202	ENSG00000142937	6202	ENSG00000142937
+CLTA	Clathrin light chain A	P09496	0,007998845	0,371701448	Upregulated in Tumor	1211	ENSG00000122705	1211	ENSG00000122705
+HNRNPA0	Heterogeneous nuclear ribonucleoprotein A0	Q13151	0,000158506	0,375146253	Upregulated in Tumor	10949	ENSG00000177733	10949	ENSG00000177733
+SRSF1	Serine/arginine-rich splicing factor 1	Q07955	0,000185414	0,3759751	Upregulated in Tumor	6426	ENSG00000136450	6426	ENSG00000136450
+LAP3	Cytosol aminopeptidase	P28838	0,002006641	0,377194931	Upregulated in Tumor	51056	ENSG00000002549	51056	ENSG00000002549
+YKT6	Synaptobrevin homolog YKT6	O15498	0,004796662	0,377228173	Upregulated in Tumor	10652	ENSG00000106636	10652	ENSG00000106636
+RPL7	60S ribosomal protein L7	P18124	3,95531E-05	0,378613474	Upregulated in Tumor	6129	ENSG00000147604	6129	ENSG00000147604
+NACA	Nascent polypeptide-associated complex subunit alpha	Q13765	5,38833E-05	0,381249103	Upregulated in Tumor	4666	ENSG00000196531	4666	ENSG00000196531
+RPS18	40S ribosomal protein S18	P62269	0,000118723	0,382293852	Upregulated in Tumor	6222	ENSG00000226225;ENSG00000235650;ENSG00000231500;ENSG00000223367;ENSG00000096150	6222	ENSG00000226225;ENSG00000235650;ENSG00000231500;ENSG00000223367;ENSG00000096150
+HNRNPF	Heterogeneous nuclear ribonucleoprotein F;Heterogeneous nuclear ribonucleoprotein F, N-terminally processed	P52597	0,000574637	0,382971525	Upregulated in Tumor	3185	ENSG00000169813	3185	ENSG00000169813
+RPL24	60S ribosomal protein L24	P83731	3,05022E-06	0,384070919	Upregulated in Tumor	6152	ENSG00000114391	6152	ENSG00000114391
+GLOD4	Glyoxalase domain-containing protein 4	Q9HC38	0,000839526	0,388222634	Upregulated in Tumor	51031	ENSG00000167699	51031	ENSG00000167699
+TCEB1	Transcription elongation factor B polypeptide 1	Q15369	5,17062E-05	0,388917607	Upregulated in Tumor	6921	ENSG00000154582	6921	ENSG00000154582
+EIF2B1	Translation initiation factor eIF-2B subunit alpha	Q14232	0,009981875	0,389617878	Upregulated in Tumor	1967	ENSG00000111361	1967	ENSG00000111361
+RPL15	60S ribosomal protein L15;Ribosomal protein L15	P61313	0,0011672	0,39079995	Upregulated in Tumor	6138	ENSG00000174748	6138	ENSG00000174748
+RPS27	40S ribosomal protein S27	P42677	0,000355257	0,39893706	Upregulated in Tumor	6232	ENSG00000177954	6232	ENSG00000177954
+RNPEP	Aminopeptidase B	Q9H4A4	9,84914E-06	0,400730948	Upregulated in Tumor	6051	ENSG00000176393	6051	ENSG00000176393
+RPL30	60S ribosomal protein L30	P62888	0,002178806	0,401405914	Upregulated in Tumor	6156	ENSG00000156482	6156	ENSG00000156482
+RPL19	60S ribosomal protein L19;Ribosomal protein L19	P84098	0,000511088	0,404372356	Upregulated in Tumor	6143	ENSG00000108298	6143	ENSG00000108298
+UQCR10	Cytochrome b-c1 complex subunit 9	Q9UDW1	0,005465225	0,40465117	Upregulated in Tumor	29796	ENSG00000184076	29796	ENSG00000184076
+RPS24	40S ribosomal protein S24	P62847	0,001379618	0,404852058	Upregulated in Tumor	6229	ENSG00000138326	6229	ENSG00000138326
+RPS25	40S ribosomal protein S25	P62851	6,54301E-05	0,40531096	Upregulated in Tumor	6230	ENSG00000280831;ENSG00000118181	6230	ENSG00000280831;ENSG00000118181
+RAB1A	Ras-related protein Rab-1A	P62820	0,00114492	0,40601728	Upregulated in Tumor	5861	ENSG00000138069	5861	ENSG00000138069
+RPS21	40S ribosomal protein S21	P63220	0,000481972	0,410966528	Upregulated in Tumor	6227	ENSG00000171858	6227	ENSG00000171858
+HSPB1	Heat shock protein beta-1	P04792	0,001054742	0,412110228	Upregulated in Tumor	3315	ENSG00000106211	3315	ENSG00000106211
+CDKN2A	Cyclin-dependent kinase inhibitor 2A, isoforms 1/2/3	P42771	0,008460116	0,413507483	Upregulated in Tumor	1029	ENSG00000147889	1029	ENSG00000147889
+RAB11B;RAB11A	Ras-related protein Rab-11B	Q15907	8,87824E-05	0,417097451	Upregulated in Tumor	9230	ENSG00000185236	9230	ENSG00000185236
+DAD1	Dolichyl-diphosphooligosaccharide--protein glycosyltransferase subunit DAD1	P61803	0,000388233	0,419443693	Upregulated in Tumor	1603	ENSG00000129562	1603	ENSG00000129562
+TWF2	Twinfilin-2	Q6IBS0	0,007783233	0,422543959	Upregulated in Tumor	11344	ENSG00000247596	11344	ENSG00000247596
+APMAP	Adipocyte plasma membrane-associated protein	Q9HDC9	0,000112366	0,429610865	Upregulated in Tumor	57136	ENSG00000101474	57136	ENSG00000101474
+RPS2;rps2;OK/KNS-cl.7	40S ribosomal protein S2	P15880	3,55246E-07	0,435761317	Upregulated in Tumor	6187	ENSG00000140988	6187	ENSG00000140988
+RPS11	40S ribosomal protein S11	P62280	0,000271414	0,446564997	Upregulated in Tumor	6205	ENSG00000142534	6205	ENSG00000142534
+RPL32	60S ribosomal protein L32	P62910	0,001344347	0,447186821	Upregulated in Tumor	6161	ENSG00000144713	6161	ENSG00000144713
+NDUFV1	NADH dehydrogenase [ubiquinone] flavoprotein 1, mitochondrial	P49821	0,000247468	0,451021984	Upregulated in Tumor	4723	ENSG00000167792	4723	ENSG00000167792
+PEBP1	Phosphatidylethanolamine-binding protein 1;Hippocampal cholinergic neurostimulating peptide	P30086	3,50785E-05	0,452694707	Upregulated in Tumor	5037	ENSG00000089220	5037	ENSG00000089220
+TBL2	Transducin beta-like protein 2	Q9Y4P3	0,005997874	0,453305486	Upregulated in Tumor	26608	ENSG00000106638	26608	ENSG00000106638
+MRPL38	39S ribosomal protein L38, mitochondrial	Q96DV4	0,010694906	0,454259864	Upregulated in Tumor	64978	ENSG00000204316	64978	ENSG00000204316
+RAP2C	Ras-related protein Rap-2c	Q9Y3L5	0,005254162	0,455296292	Upregulated in Tumor	57826	ENSG00000123728	57826	ENSG00000123728
+ARPC4;ARPC4-TTLL3	Actin-related protein 2/3 complex subunit 4	P59998	0,002816852	0,46004893	Upregulated in Tumor	10093	ENSG00000241553	10093	ENSG00000241553
+U2AF2	Splicing factor U2AF 65 kDa subunit	P26368	0,000363325	0,460423778	Upregulated in Tumor	11338	ENSG00000063244	11338	ENSG00000063244
+RPL11	60S ribosomal protein L11	P62913	3,87586E-05	0,461340483	Upregulated in Tumor	6135	ENSG00000142676	6135	ENSG00000142676
+ATP6V0D1	V-type proton ATPase subunit d 1	P61421	0,001358502	0,461742594	Upregulated in Tumor	9114	ENSG00000159720	9114	ENSG00000159720
+RPS19	40S ribosomal protein S19	P39019	3,33752E-05	0,462922373	Upregulated in Tumor	6223	ENSG00000105372	6223	ENSG00000105372
+GALE	UDP-glucose 4-epimerase	Q14376	0,008127318	0,466096158	Upregulated in Tumor	2582	ENSG00000117308	2582	ENSG00000117308
+RPL37A	60S ribosomal protein L37a	P61513	0,001428265	0,469591172	Upregulated in Tumor	6168	ENSG00000197756	6168	ENSG00000197756
+APOA1BP	NAD(P)H-hydrate epimerase	Q8NCW5	0,000199226	0,471432845	Upregulated in Tumor	128240	ENSG00000163382	128240	ENSG00000163382
+UBQLN1	Ubiquilin-1	Q9UMX0	0,002335759	0,472110412	Upregulated in Tumor	29979	ENSG00000135018	29979	ENSG00000135018
+EML2	Echinoderm microtubule-associated protein-like 2	O95834	0,009125507	0,474442814	Upregulated in Tumor	24139	ENSG00000125746	24139	ENSG00000125746
+MOB1A;MOB1B;MOB4A	MOB kinase activator 1A;MOB kinase activator 1B	Q9H8S9	0,006430502	0,481891028	Upregulated in Tumor	55233	ENSG00000114978	55233	ENSG00000114978
+MOB1A;MOB1B;MOB4A	MOB kinase activator 1A;MOB kinase activator 1B	Q7L9L4	0,006430502	0,481891028	Upregulated in Tumor	92597	ENSG00000173542	92597	ENSG00000173542
+TST	Thiosulfate sulfurtransferase;Sulfurtransferase	Q16762	0,00280735	0,485981608	Upregulated in Tumor	7263	ENSG00000128311	7263	ENSG00000128311
+RPL29	60S ribosomal protein L29	P47914	0,000442429	0,487356103	Upregulated in Tumor	6159	ENSG00000162244	6159	ENSG00000162244
+RPL13A;RPL13a	60S ribosomal protein L13a	P40429	6,68188E-08	0,487933716	Upregulated in Tumor	23521	ENSG00000142541	23521	ENSG00000142541
+ARFIP2	Arfaptin-2	P53365	0,003420638	0,488543202	Upregulated in Tumor	23647	ENSG00000132254	23647	ENSG00000132254
+MGST3	Microsomal glutathione S-transferase 3	O14880	0,003341245	0,489411667	Upregulated in Tumor	4259	ENSG00000143198	4259	ENSG00000143198
+PSMA5	Proteasome subunit alpha type-5	P28066	0,000506169	0,491866122	Upregulated in Tumor	5686	ENSG00000143106	5686	ENSG00000143106
+PCMT1	Protein-L-isoaspartate(D-aspartate) O-methyltransferase;Protein-L-isoaspartate O-methyltransferase	P22061	0,003322528	0,493820896	Upregulated in Tumor	5110	ENSG00000120265	5110	ENSG00000120265
+ATP5A1	ATP synthase subunit alpha, mitochondrial	P25705	3,5913E-06	0,493827891	Upregulated in Tumor	498	ENSG00000152234	498	ENSG00000152234
+RPL23A	60S ribosomal protein L23a	P62750	0,000528106	0,496368454	Upregulated in Tumor	6147	ENSG00000198242	6147	ENSG00000198242
+RPS9	40S ribosomal protein S9	P46781	3,07419E-07	0,496653595	Upregulated in Tumor	6203	ENSG00000274005;ENSG00000274646;ENSG00000278081;ENSG00000274950;ENSG00000277359;ENSG00000278270;ENSG00000277079;ENSG00000170889;ENSG00000274626;ENSG00000275323	6203	ENSG00000274950;ENSG00000170889;ENSG00000278270;ENSG00000274646
+CISD2	CDGSH iron-sulfur domain-containing protein 2	Q8N5K1	0,000534937	0,497459431	Upregulated in Tumor	493856	ENSG00000145354	493856	ENSG00000145354
+VAPA	Vesicle-associated membrane protein-associated protein A	Q9P0L0	0,003990206	0,498293133	Upregulated in Tumor	9218	ENSG00000101558	9218	ENSG00000101558
+RPSA;LAMR1P15	40S ribosomal protein SA	P08865	1,98034E-07	0,498457477	Upregulated in Tumor	3921	ENSG00000168028	3921	ENSG00000168028
+ATP5B	ATP synthase subunit beta, mitochondrial;ATP synthase subunit beta	P06576	1,33401E-05	0,500583864	Upregulated in Tumor	506	ENSG00000110955	506	ENSG00000110955
+MRPS5	28S ribosomal protein S5, mitochondrial	P82675	0,001866651	0,503299199	Upregulated in Tumor	64969	ENSG00000144029	64969	ENSG00000144029
+RER1	Protein RER1	O15258	0,002973962	0,509630398	Upregulated in Tumor	11079	ENSG00000157916	11079	ENSG00000157916
+SRSF9	Serine/arginine-rich splicing factor 9	Q13242	0,000555607	0,510798623	Upregulated in Tumor	8683	ENSG00000111786	8683	ENSG00000111786
+SELENBP1	Selenium-binding protein 1	Q13228	0,000502601	0,51150385	Upregulated in Tumor	8991	ENSG00000143416	8991	ENSG00000143416
+WASF2	Wiskott-Aldrich syndrome protein family member 2	Q9Y6W5	0,005724528	0,512030132	Upregulated in Tumor	10163	ENSG00000158195	10163	ENSG00000158195
+UFSP2	Ufm1-specific protease 2	Q9NUQ7	0,004158544	0,513093764	Upregulated in Tumor	55325	ENSG00000109775	55325	ENSG00000109775
+SEPT2	Septin-2	Q15019	0,000410267	0,513103007	Upregulated in Tumor	4735	ENSG00000168385	4735	ENSG00000168385
+GNA13	Guanine nucleotide-binding protein subunit alpha-13	Q14344	0,008572869	0,514577265	Upregulated in Tumor	10672	ENSG00000120063	10672	ENSG00000120063
+PSMB2	Proteasome subunit beta type-2;Proteasome subunit beta type	P49721	0,00089372	0,514703453	Upregulated in Tumor	5690	ENSG00000126067	5690	ENSG00000126067
+HSPE1;EPFP1	10 kDa heat shock protein, mitochondrial	P61604	0,007189585	0,515834078	Upregulated in Tumor	3336	ENSG00000115541	3336	ENSG00000115541
+CMPK1;CMPK	UMP-CMP kinase	P30085	0,000275872	0,517079651	Upregulated in Tumor	51727	ENSG00000162368	51727	ENSG00000162368
+CRABP2	Cellular retinoic acid-binding protein 2	P29373	0,000809662	0,517505	Upregulated in Tumor	1382	ENSG00000143320	1382	ENSG00000143320
+HSD17B10	3-hydroxyacyl-CoA dehydrogenase type-2	Q99714	1,23845E-06	0,519750927	Upregulated in Tumor	3028	ENSG00000072506	3028	ENSG00000072506
+ATP5L	ATP synthase subunit g, mitochondrial	O75964	0,003462004	0,521239174	Upregulated in Tumor	10632	ENSG00000167283	10632	ENSG00000167283
+MAPKAPK2	MAP kinase-activated protein kinase 2	P49137	0,004112558	0,522819118	Upregulated in Tumor	9261	ENSG00000162889	9261	ENSG00000162889
+CTSB	Cathepsin B;Cathepsin B light chain;Cathepsin B heavy chain	P07858	2,91997E-06	0,524561516	Upregulated in Tumor	1508	ENSG00000164733	1508	ENSG00000164733
+RAP1B	Ras-related protein Rap-1b;Ras-related protein Rap-1b-like protein	P61224	0,001269932	0,525840645	Upregulated in Tumor	5908	ENSG00000127314	5908	ENSG00000127314
+PSMB4	Proteasome subunit beta type-4	P28070	5,91851E-05	0,528085152	Upregulated in Tumor	5692	ENSG00000159377	5692	ENSG00000159377
+HINT1	Histidine triad nucleotide-binding protein 1	P49773	9,74355E-05	0,528570041	Upregulated in Tumor	3094	ENSG00000169567	3094	ENSG00000169567
+MIF	Macrophage migration inhibitory factor	P14174	0,002069917	0,53076975	Upregulated in Tumor	4282	ENSG00000276701;ENSG00000240972	4282	ENSG00000276701;ENSG00000240972
+RAB14	Ras-related protein Rab-14	P61106	1,04295E-06	0,533753248	Upregulated in Tumor	51552	ENSG00000119396	51552	ENSG00000119396
+RPL8	60S ribosomal protein L8	P62917	3,48607E-06	0,53632548	Upregulated in Tumor	6132	ENSG00000161016	6132	ENSG00000161016
+ECH1	Delta(3,5)-Delta(2,4)-dienoyl-CoA isomerase, mitochondrial	Q13011	1,94443E-05	0,538951368	Upregulated in Tumor	1891	ENSG00000282853;ENSG00000104823	1891	ENSG00000282853;ENSG00000104823
+RAB8A	Ras-related protein Rab-8A	P61006	0,00026041	0,539485314	Upregulated in Tumor	4218	ENSG00000167461	4218	ENSG00000167461
+SAR1A;SARA1	GTP-binding protein SAR1a	Q9NR31	5,53218E-05	0,540369727	Upregulated in Tumor	56681	ENSG00000079332	56681	ENSG00000079332
+TOMM22;MST065	Mitochondrial import receptor subunit TOM22 homolog	Q9NS69	0,001002249	0,540522209	Upregulated in Tumor	56993	ENSG00000100216	56993	ENSG00000100216
+GALK2	N-acetylgalactosamine kinase	Q01415	0,002287958	0,542921293	Upregulated in Tumor	2585	ENSG00000156958	2585	ENSG00000156958
+FKBP3	Peptidyl-prolyl cis-trans isomerase FKBP3;Peptidyl-prolyl cis-trans isomerase	Q00688	0,000556415	0,543366164	Upregulated in Tumor	2287	ENSG00000100442	2287	ENSG00000100442
+AGFG1	Arf-GAP domain and FG repeat-containing protein 1	P52594	0,008882156	0,543885145	Upregulated in Tumor	3267	ENSG00000173744	3267	ENSG00000173744
+HIST2H2AA3;HIST2H2AC	Histone H2A type 2-A;Histone H2A type 2-C	Q6FI13	0,00083916	0,544030524	Upregulated in Tumor	723790;8337	ENSG00000203812;ENSG00000272196	723790;8337	ENSG00000203812;ENSG00000272196
+HIST2H2AA3;HIST2H2AC	Histone H2A type 2-A;Histone H2A type 2-C	Q16777	0,00083916	0,544030524	Upregulated in Tumor	8338	ENSG00000184260	8338	ENSG00000184260
+GLUD1	Glutamate dehydrogenase 1, mitochondrial;Glutamate dehydrogenase	P00367	4,92675E-06	0,548768572	Upregulated in Tumor	2746	ENSG00000148672	2746	ENSG00000148672
+CNPY3	Protein canopy homolog 3	Q9BT09	0,001009337	0,548966563	Upregulated in Tumor	10695	ENSG00000137161	10695	ENSG00000137161
+ATP6AP1;FLJ00383	V-type proton ATPase subunit S1	Q15904	0,008498697	0,549419044	Upregulated in Tumor	537	ENSG00000071553	537	ENSG00000071553
+UBL4A	Ubiquitin-like protein 4A	P11441	0,001065994	0,550762333	Upregulated in Tumor	8266	ENSG00000102178	8266	ENSG00000102178
+COX6C	Cytochrome c oxidase subunit 6C	P09669	0,007504097	0,552357186	Upregulated in Tumor	1345	ENSG00000164919	1345	ENSG00000164919
+NDUFS8	NADH dehydrogenase [ubiquinone] iron-sulfur protein 8, mitochondrial	O00217	1,59847E-05	0,553248033	Upregulated in Tumor	4728	ENSG00000110717	4728	ENSG00000110717
+NUCB1	Nucleobindin-1	Q02818	0,005818278	0,554332155	Upregulated in Tumor	4924	ENSG00000104805	4924	ENSG00000104805
+SDHB	Succinate dehydrogenase [ubiquinone] iron-sulfur subunit, mitochondrial	P21912	0,000460517	0,555129448	Upregulated in Tumor	6390	ENSG00000117118	6390	ENSG00000117118
+MAPK1	Mitogen-activated protein kinase 1	P28482	5,07587E-05	0,559236177	Upregulated in Tumor	5594	ENSG00000100030	5594	ENSG00000100030
+SSBP1	Single-stranded DNA-binding protein, mitochondrial;Single-stranded DNA-binding protein	Q04837	3,5643E-07	0,559892273	Upregulated in Tumor	6742	ENSG00000106028;ENSG00000262771	6742	ENSG00000106028;ENSG00000262771
+RPL27	60S ribosomal protein L27	P61353	0,000436213	0,56161971	Upregulated in Tumor	6155	ENSG00000131469	6155	ENSG00000131469
+SOD1	Superoxide dismutase [Cu-Zn]	P00441	0,002890222	0,56525206	Upregulated in Tumor	6647	ENSG00000142168	6647	ENSG00000142168
+RPL27A;L27a	60S ribosomal protein L27a	P46776	7,05174E-06	0,566561183	Upregulated in Tumor	6157	ENSG00000166441	6157	ENSG00000166441
+LSM4	U6 snRNA-associated Sm-like protein LSm4	Q9Y4Z0	0,001775514	0,567246316	Upregulated in Tumor	25804	NA	25804	ENSG00000130520
+PSMA1	Proteasome subunit alpha type-1	P25786	5,5348E-08	0,567790481	Upregulated in Tumor	5682	ENSG00000129084	5682	ENSG00000129084
+SEC61B	Protein transport protein Sec61 subunit beta	P60468	2,18205E-05	0,568132815	Upregulated in Tumor	10952	ENSG00000106803	10952	ENSG00000106803
+RPS3	40S ribosomal protein S3	P23396	3,08471E-08	0,57193331	Upregulated in Tumor	6188	ENSG00000149273	6188	ENSG00000149273
+EIF4A2	Eukaryotic initiation factor 4A-II	Q14240	0,003407811	0,574155689	Upregulated in Tumor	1974	ENSG00000156976	1974	ENSG00000156976
+UBE2L3	Ubiquitin-conjugating enzyme E2 L3	P68036	0,000987694	0,574630647	Upregulated in Tumor	7332	ENSG00000185651	7332	ENSG00000185651
+DCPS	m7GpppX diphosphatase	Q96C86	0,00106498	0,575413985	Upregulated in Tumor	28960	ENSG00000110063	28960	ENSG00000110063
+TXNL1	Thioredoxin-like protein 1	O43396	0,002585946	0,576685425	Upregulated in Tumor	9352	ENSG00000091164	9352	ENSG00000091164
+ERH	Enhancer of rudimentary homolog	P84090	1,54531E-07	0,57936758	Upregulated in Tumor	2079	ENSG00000100632	2079	ENSG00000100632
+GRB2	Growth factor receptor-bound protein 2	P62993	0,008001926	0,580584558	Upregulated in Tumor	2885	ENSG00000177885	2885	ENSG00000177885
+CLPP	Putative ATP-dependent Clp protease proteolytic subunit, mitochondrial;ATP-dependent Clp protease proteolytic subunit	Q16740	0,000258641	0,581387471	Upregulated in Tumor	8192	ENSG00000125656	8192	ENSG00000125656
+RPS5	40S ribosomal protein S5;40S ribosomal protein S5, N-terminally processed	P46782	0,001537416	0,582168292	Upregulated in Tumor	6193	ENSG00000083845	6193	ENSG00000083845
+RPL17	60S ribosomal protein L17	P18621	9,6315E-05	0,582445497	Upregulated in Tumor	6139	ENSG00000265681	6139	ENSG00000265681
+MLPH;UNQ8200	Melanophilin	Q9BV36	0,004838756	0,582978886	Upregulated in Tumor	79083	ENSG00000115648	79083	ENSG00000115648
+PTPLAD1	Very-long-chain (3R)-3-hydroxyacyl-[acyl-carrier protein] dehydratase 3	Q9P035	0,00341719	0,584277825	Upregulated in Tumor	51495	ENSG00000074696	51495	ENSG00000074696
+SNRNP70	U1 small nuclear ribonucleoprotein 70 kDa	P08621	7,15257E-05	0,584960992	Upregulated in Tumor	6625	ENSG00000104852	6625	ENSG00000104852
+TAF15	TATA-binding protein-associated factor 2N	Q92804	0,0049619	0,585771545	Upregulated in Tumor	8148	ENSG00000270647;ENSG00000276833	8148	ENSG00000270647;ENSG00000276833
+TXNDC12	Thioredoxin domain-containing protein 12	O95881	0,000845621	0,587725369	Upregulated in Tumor	51060	ENSG00000117862	51060	ENSG00000117862
+DDT;DDTL	D-dopachrome decarboxylase;D-dopachrome decarboxylase-like protein	P30046	0,0014312	0,589163049	Upregulated in Tumor	1652	ENSG00000275003;ENSG00000099977	1652	ENSG00000275003;ENSG00000099977
+DDT;DDTL	D-dopachrome decarboxylase;D-dopachrome decarboxylase-like protein	A6NHG4	0,0014312	0,589163049	Upregulated in Tumor	100037417	ENSG00000275758;ENSG00000099974	100037417	ENSG00000275758;ENSG00000099974
+RPL9	60S ribosomal protein L9	P32969	9,51462E-08	0,589405391	Upregulated in Tumor	6133	ENSG00000163682	6133	ENSG00000163682
+UBE2I	SUMO-conjugating enzyme UBC9	P63279	0,001133306	0,592524737	Upregulated in Tumor	7329	ENSG00000103275	7329	ENSG00000103275
+SUMF2	Sulfatase-modifying factor 2	Q8NBJ7	0,003362796	0,595654369	Upregulated in Tumor	25870	ENSG00000129103	25870	ENSG00000129103
+CAPZA2	F-actin-capping protein subunit alpha-2	P47755	8,85695E-05	0,596941578	Upregulated in Tumor	830	ENSG00000198898	830	ENSG00000198898
+CAPNS1	Calpain small subunit 1	P04632	3,38404E-07	0,601447752	Upregulated in Tumor	826	ENSG00000126247	826	ENSG00000126247
+THYN1	Thymocyte nuclear protein 1	Q9P016	0,001238376	0,601539837	Upregulated in Tumor	29087	ENSG00000151500	29087	ENSG00000151500
+SNRPA	U1 small nuclear ribonucleoprotein A	P09012	0,000126541	0,601878844	Upregulated in Tumor	6626	ENSG00000077312	6626	ENSG00000077312
+TMED7	Transmembrane emp24 domain-containing protein 7	Q9Y3B3	0,000320121	0,6035974	Upregulated in Tumor	51014;100302736	ENSG00000134970	51014;100302736	ENSG00000134970
+C1orf123	UPF0587 protein C1orf123	Q9NWV4	0,000990284	0,605945454	Upregulated in Tumor	54987	ENSG00000162384	54987	ENSG00000162384
+SYAP1	Synapse-associated protein 1	Q96A49	0,005123685	0,608056681	Upregulated in Tumor	94056	ENSG00000169895	94056	ENSG00000169895
+RPL23	60S ribosomal protein L23	P62829	1,56878E-08	0,610414369	Upregulated in Tumor	9349	ENSG00000125691	9349	ENSG00000125691
+PARK7	Protein DJ-1	Q99497	8,0986E-05	0,611074118	Upregulated in Tumor	11315	ENSG00000116288	11315	ENSG00000116288
+ERAP1	Endoplasmic reticulum aminopeptidase 1	Q9NZ08	0,00281933	0,611829153	Upregulated in Tumor	51752	ENSG00000164307	51752	ENSG00000164307
+MPG	DNA-3-methyladenine glycosylase	P29372	0,007232699	0,616524229	Upregulated in Tumor	4350	ENSG00000103152	4350	ENSG00000103152
+COX5A	Cytochrome c oxidase subunit 5A, mitochondrial	P20674	0,001065828	0,619503998	Upregulated in Tumor	9377	ENSG00000178741	9377	ENSG00000178741
+FAHD1	Acylpyruvase FAHD1, mitochondrial	Q6P587	0,00240971	0,620295267	Upregulated in Tumor	81889	ENSG00000180185	81889	ENSG00000180185
+GADD45GIP1	Growth arrest and DNA damage-inducible proteins-interacting protein 1	Q8TAE8	0,007535847	0,620854697	Upregulated in Tumor	90480	ENSG00000179271	90480	ENSG00000179271
+ACAA1	3-ketoacyl-CoA thiolase, peroxisomal	P09110	0,000144905	0,621463328	Upregulated in Tumor	30	ENSG00000060971	30	ENSG00000060971
+ALYREF	THO complex subunit 4	Q86V81	6,03153E-05	0,621840149	Upregulated in Tumor	10189	ENSG00000183684	10189	ENSG00000183684
+RPA2	Replication protein A 32 kDa subunit	P15927	0,008362692	0,623102552	Upregulated in Tumor	6118	ENSG00000117748	6118	ENSG00000117748
+SRRM1	Serine/arginine repetitive matrix protein 1	Q8IYB3	0,008938713	0,624554941	Upregulated in Tumor	10250	ENSG00000133226	10250	ENSG00000133226
+RANBP3	Ran-binding protein 3	Q9H6Z4	0,006470901	0,624932617	Upregulated in Tumor	8498	ENSG00000031823	8498	ENSG00000031823
+CTSD	Cathepsin D;Cathepsin D light chain;Cathepsin D heavy chain	P07339	1,331E-05	0,624961035	Upregulated in Tumor	1509	ENSG00000117984	1509	ENSG00000117984
+ARF5	ADP-ribosylation factor 5	P84085	8,15143E-06	0,625400459	Upregulated in Tumor	381	ENSG00000004059	381	ENSG00000004059
+C14orf166	UPF0568 protein C14orf166	Q9Y224	7,65383E-06	0,625825235	Upregulated in Tumor	51637	ENSG00000087302	51637	ENSG00000087302
+ASNA1	ATPase ASNA1	O43681	0,000734859	0,629255019	Upregulated in Tumor	439	ENSG00000198356	439	ENSG00000198356
+TSN	Translin	Q15631	0,003739155	0,629494367	Upregulated in Tumor	7247	ENSG00000211460	7247	ENSG00000211460
+OPLAH	5-oxoprolinase	O14841	0,001745307	0,631558542	Upregulated in Tumor	26873	ENSG00000178814	26873	ENSG00000178814
+NDUFA4	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 4	O00483	0,000255679	0,632088478	Upregulated in Tumor	4697	ENSG00000189043	4697	ENSG00000189043
+SNX12	Sorting nexin-12	Q9UMY4	0,000355463	0,632373545	Upregulated in Tumor	29934	ENSG00000147164	29934	ENSG00000147164
+ATP6AP2	Renin receptor	O75787	0,004253929	0,632785505	Upregulated in Tumor	10159	ENSG00000182220	10159	ENSG00000182220
+ABHD10	Mycophenolic acid acyl-glucuronide esterase, mitochondrial	Q9NUJ1	0,002720823	0,633022467	Upregulated in Tumor	55347	ENSG00000144827	55347	ENSG00000144827
+SEPHS1	Selenide, water dikinase 1	P49903	0,000915013	0,634270744	Upregulated in Tumor	22929	ENSG00000086475	22929	ENSG00000086475
+NADK2	NAD kinase 2, mitochondrial	Q4G0N4	0,00327042	0,63469291	Upregulated in Tumor	133686	ENSG00000152620	133686	ENSG00000152620
+VAPB	Vesicle-associated membrane protein-associated protein B/C	O95292	0,00704167	0,635554883	Upregulated in Tumor	9217	ENSG00000124164	9217	ENSG00000124164
+CRKL	Crk-like protein	P46109	0,001390984	0,635958608	Upregulated in Tumor	1399	ENSG00000099942	1399	ENSG00000099942
+PFDN5	Prefoldin subunit 5	Q99471	0,001886301	0,639012481	Upregulated in Tumor	5204	ENSG00000123349	5204	ENSG00000123349
+RAB2A	Ras-related protein Rab-2A	P61019	2,03057E-08	0,640160355	Upregulated in Tumor	5862	ENSG00000104388	5862	ENSG00000104388
+AKR1A1	Alcohol dehydrogenase [NADP(+)]	P14550	0,000280852	0,640660478	Upregulated in Tumor	10327	ENSG00000117448	10327	ENSG00000117448
+MRPL3	39S ribosomal protein L3, mitochondrial	P09001	0,000453284	0,641497737	Upregulated in Tumor	11222	ENSG00000114686	11222	ENSG00000114686
+CYB5R1	NADH-cytochrome b5 reductase 1	Q9UHQ9	0,00127136	0,646370588	Upregulated in Tumor	51706	ENSG00000159348	51706	ENSG00000159348
+SRSF6	Serine/arginine-rich splicing factor 6	Q13247	1,5217E-06	0,646689974	Upregulated in Tumor	6431	ENSG00000124193	6431	ENSG00000124193
+RPS15A;hCG_1994130	40S ribosomal protein S15a	P62244	3,94845E-08	0,647395068	Upregulated in Tumor	6210	ENSG00000134419	6210	ENSG00000134419
+EIF1AX;EIF1AY	Eukaryotic translation initiation factor 1A, X-chromosomal;Eukaryotic translation initiation factor 1A, Y-chromosomal	P47813	0,00307505	0,64747523	Upregulated in Tumor	1964	ENSG00000173674	1964	ENSG00000173674
+EIF1AX;EIF1AY	Eukaryotic translation initiation factor 1A, X-chromosomal;Eukaryotic translation initiation factor 1A, Y-chromosomal	O14602	0,00307505	0,64747523	Upregulated in Tumor	9086	ENSG00000198692	9086	ENSG00000198692
+SNRPB2	U2 small nuclear ribonucleoprotein B	P08579	0,001398442	0,647478104	Upregulated in Tumor	6629	ENSG00000125870	6629	ENSG00000125870
+TGFBI	Transforming growth factor-beta-induced protein ig-h3	Q15582	0,007555525	0,653243968	Upregulated in Tumor	7045	ENSG00000120708	7045	ENSG00000120708
+RPS28	40S ribosomal protein S28	P62857	5,47184E-05	0,655982212	Upregulated in Tumor	6234	ENSG00000233927	6234	ENSG00000233927
+MPC2	Mitochondrial pyruvate carrier 2	O95563	0,005836647	0,65691808	Upregulated in Tumor	25874	ENSG00000143158	25874	ENSG00000143158
+FNTA	Protein farnesyltransferase/geranylgeranyltransferase type-1 subunit alpha	P49354	0,000361959	0,659308716	Upregulated in Tumor	2339	ENSG00000168522	2339	ENSG00000168522
+MARCKS	Myristoylated alanine-rich C-kinase substrate	P29966	0,002753727	0,6595431	Upregulated in Tumor	4082	ENSG00000277443	4082	ENSG00000277443
+SEC61G	Protein transport protein Sec61 subunit gamma	P60059	0,002144008	0,660006108	Upregulated in Tumor	23480	ENSG00000132432	23480	ENSG00000132432
+HIST1H4A;HIST1H4L;HIST1H4H	Histone H4	P62805	1,3668E-08	0,660103801	Upregulated in Tumor	8361;8360;8363;8362;8365;8364;8367;8366;8368;8359;8370;8294;554313;121504	ENSG00000277157;ENSG00000197061;ENSG00000197837;ENSG00000270276;ENSG00000158406;ENSG00000276966;ENSG00000273542;ENSG00000270882;ENSG00000275126;ENSG00000278637;ENSG00000197238;ENSG00000274618;ENSG00000276180;ENSG00000278705	8361;8360;8363;8362;8365;8364;8367;8366;8368;8359;8370;8294;554313;121504	ENSG00000277157;ENSG00000197061;ENSG00000197837;ENSG00000270276;ENSG00000158406;ENSG00000276966;ENSG00000273542;ENSG00000270882;ENSG00000275126;ENSG00000278637;ENSG00000197238;ENSG00000274618;ENSG00000276180;ENSG00000278705
+SEC24D	Protein transport protein Sec24D	O94855	0,002473235	0,660354605	Upregulated in Tumor	9871	ENSG00000150961	9871	ENSG00000150961
+MRPS23	28S ribosomal protein S23, mitochondrial	Q9Y3D9	4,77734E-05	0,665542428	Upregulated in Tumor	51649	ENSG00000181610	51649	ENSG00000181610
+RAB5C	Ras-related protein Rab-5C	P51148	5,17936E-05	0,665744233	Upregulated in Tumor	5878	ENSG00000108774	5878	ENSG00000108774
+TP53I3	Quinone oxidoreductase PIG3	Q53FA7	0,00514178	0,665835787	Upregulated in Tumor	9540	ENSG00000115129	9540	ENSG00000115129
+SCARB2	Lysosome membrane protein 2	Q14108	0,005331331	0,667789542	Upregulated in Tumor	950	ENSG00000138760	950	ENSG00000138760
+RAP1A	Ras-related protein Rap-1A	P62834	0,000156201	0,667847397	Upregulated in Tumor	5906	ENSG00000116473	5906	ENSG00000116473
+VAMP8	Vesicle-associated membrane protein 8	Q9BV40	0,000358941	0,669648118	Upregulated in Tumor	8673	ENSG00000118640	8673	ENSG00000118640
+RBM47	RNA-binding protein 47	A0AV96	0,001633254	0,66985625	Upregulated in Tumor	54502	ENSG00000163694	54502	ENSG00000163694
+NAGK	N-acetyl-D-glucosamine kinase	Q9UJ70	2,48313E-05	0,670363154	Upregulated in Tumor	55577	ENSG00000124357	55577	ENSG00000124357
+PFDN6	Prefoldin subunit 6	O15212	0,003728958	0,671406232	Upregulated in Tumor	10471	ENSG00000235692;ENSG00000224782;ENSG00000204220;ENSG00000237335;ENSG00000206283	10471	ENSG00000235692;ENSG00000224782;ENSG00000204220;ENSG00000237335;ENSG00000206283
+GSTK1;LOC51064	Glutathione S-transferase kappa 1	Q9Y2Q3	9,55515E-05	0,673915321	Upregulated in Tumor	373156	ENSG00000197448	373156	ENSG00000197448
+RALB	Ras-related protein Ral-B	P11234	4,2711E-05	0,675306552	Upregulated in Tumor	5899	ENSG00000144118	5899	ENSG00000144118
+UROD	Uroporphyrinogen decarboxylase	P06132	0,00181366	0,675516644	Upregulated in Tumor	7389	ENSG00000126088	7389	ENSG00000126088
+MRPL50	39S ribosomal protein L50, mitochondrial	Q8N5N7	0,000676141	0,675715393	Upregulated in Tumor	54534	ENSG00000136897	54534	ENSG00000136897
+COPS8	COP9 signalosome complex subunit 8	Q99627	0,006177366	0,676848849	Upregulated in Tumor	10920	ENSG00000198612	10920	ENSG00000198612
+SERPINB1	Leukocyte elastase inhibitor	P30740	0,000355691	0,677061762	Upregulated in Tumor	1992	ENSG00000021355	1992	ENSG00000021355
+UQCRQ	Cytochrome b-c1 complex subunit 8	O14949	0,000299908	0,677388249	Upregulated in Tumor	27089	ENSG00000164405	27089	ENSG00000164405
+ARF1;ARF3	ADP-ribosylation factor 1;ADP-ribosylation factor 3	P84077	8,50076E-09	0,677796512	Upregulated in Tumor	375	ENSG00000143761	375	ENSG00000143761
+ARF1;ARF3	ADP-ribosylation factor 1;ADP-ribosylation factor 3	P61204	8,50076E-09	0,677796512	Upregulated in Tumor	377	ENSG00000134287	377	ENSG00000134287
+CTSA;PPGB	Lysosomal protective protein;Lysosomal protective protein 32 kDa chain;Lysosomal protective protein 20 kDa chain	P10619	0,000440411	0,678127604	Upregulated in Tumor	5476	ENSG00000064601	5476	ENSG00000064601
+RPS20	40S ribosomal protein S20	P60866	1,23578E-09	0,679937834	Upregulated in Tumor	6224	ENSG00000008988	6224	ENSG00000008988
+SF3B5	Splicing factor 3B subunit 5	Q9BWJ5	0,004660664	0,680500808	Upregulated in Tumor	83443	ENSG00000169976	83443	ENSG00000169976
+SNRPD3	Small nuclear ribonucleoprotein Sm D3	P62318	1,92122E-05	0,680726283	Upregulated in Tumor	6634	ENSG00000100028	6634	ENSG00000100028
+LEMD2	LEM domain-containing protein 2	Q8NC56	0,000441016	0,682463344	Upregulated in Tumor	221496	ENSG00000161904	221496	ENSG00000161904
+PARVA	Alpha-parvin	Q9NVD7	0,000716144	0,684745512	Upregulated in Tumor	55742	ENSG00000197702	55742	ENSG00000197702
+MRPL11	39S ribosomal protein L11, mitochondrial	Q9Y3B7	0,000156236	0,686404555	Upregulated in Tumor	65003	ENSG00000174547	65003	ENSG00000174547
+PSMB3	Proteasome subunit beta type-3	P49720	4,10497E-05	0,686867847	Upregulated in Tumor	5691	ENSG00000275903;ENSG00000277791	5691	ENSG00000275903;ENSG00000277791
+PDCD6	Programmed cell death protein 6	O75340	3,20578E-06	0,688621347	Upregulated in Tumor	10016	ENSG00000249915	10016	ENSG00000249915
+SF1	Splicing factor 1	Q15637	0,010757363	0,691336774	Upregulated in Tumor	7536	ENSG00000168066	7536	ENSG00000168066
+COPZ1	Coatomer subunit zeta-1	P61923	0,000838491	0,692442961	Upregulated in Tumor	22818	ENSG00000111481	22818	ENSG00000111481
+PTRHD1	Putative peptidyl-tRNA hydrolase PTRHD1	Q6GMV3	0,010623905	0,694306529	Upregulated in Tumor	391356	ENSG00000184924	391356	ENSG00000184924
+ATP5J	ATP synthase-coupling factor 6, mitochondrial	P18859	0,001338327	0,696224523	Upregulated in Tumor	522	ENSG00000154723	522	ENSG00000154723
+RPLP2	60S acidic ribosomal protein P2	P05387	0,000119864	0,696233699	Upregulated in Tumor	6181	ENSG00000177600	6181	ENSG00000177600
+SSR4	Translocon-associated protein subunit delta	P51571	9,00188E-05	0,696789774	Upregulated in Tumor	6748	ENSG00000180879	6748	ENSG00000180879
+PGLS	6-phosphogluconolactonase	O95336	2,76893E-06	0,697272436	Upregulated in Tumor	25796	NA	25796	ENSG00000130313
+MRPL18	39S ribosomal protein L18, mitochondrial	Q9H0U6	0,005391577	0,698879498	Upregulated in Tumor	29074	NA	29074	ENSG00000112110
+NDUFA12	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 12	Q9UI09	0,00967523	0,700378134	Upregulated in Tumor	55967	ENSG00000184752	55967	ENSG00000184752
+MRPS36	28S ribosomal protein S36, mitochondrial	P82909	0,002478185	0,701781841	Upregulated in Tumor	92259	NA	92259	ENSG00000278461;ENSG00000134056
+NUTF2	Nuclear transport factor 2	P61970	0,001463604	0,703892768	Upregulated in Tumor	10204	ENSG00000102898	10204	ENSG00000102898
+MRPL4	39S ribosomal protein L4, mitochondrial	Q9BYD3	1,45118E-05	0,704003582	Upregulated in Tumor	51073	ENSG00000105364	51073	ENSG00000105364
+S100A13	Protein S100-A13	Q99584	0,000237576	0,708772198	Upregulated in Tumor	6284	ENSG00000189171	6284	ENSG00000189171
+NDUFS6	NADH dehydrogenase [ubiquinone] iron-sulfur protein 6, mitochondrial	O75380	0,002435542	0,709198651	Upregulated in Tumor	4726	ENSG00000145494	4726	ENSG00000145494
+LAMTOR1	Ragulator complex protein LAMTOR1	Q6IAA8	0,000842542	0,710545209	Upregulated in Tumor	55004	ENSG00000149357	55004	ENSG00000149357
+NIT1	Nitrilase homolog 1	Q86X76	0,000769627	0,712005852	Upregulated in Tumor	4817	ENSG00000158793	4817	ENSG00000158793
+ARHGDIA	Rho GDP-dissociation inhibitor 1	P52565	0,003386951	0,714606475	Upregulated in Tumor	396	ENSG00000141522	396	ENSG00000141522
+MRPL14	39S ribosomal protein L14, mitochondrial	Q6P1L8	0,003034731	0,717092753	Upregulated in Tumor	64928	ENSG00000180992	64928	ENSG00000180992
+TPM4	Tropomyosin alpha-4 chain	P67936	0,003552325	0,720887881	Upregulated in Tumor	7171	ENSG00000167460	7171	ENSG00000167460
+NDUFB9	NADH dehydrogenase [ubiquinone] 1 beta subcomplex subunit 9	Q9Y6M9	1,10353E-06	0,72094948	Upregulated in Tumor	4715	ENSG00000147684	4715	ENSG00000147684
+MPST	3-mercaptopyruvate sulfurtransferase;Sulfurtransferase	P25325	0,000285479	0,721375419	Upregulated in Tumor	4357	ENSG00000128309	4357	ENSG00000128309
+TRA2A;HSU53209	Transformer-2 protein homolog alpha	Q13595	0,004504834	0,721657332	Upregulated in Tumor	29896	ENSG00000164548	29896	ENSG00000164548
+MRPL49	39S ribosomal protein L49, mitochondrial	Q13405	0,005517703	0,724495765	Upregulated in Tumor	740	ENSG00000149792	740	ENSG00000149792
+DDAH2	N(G),N(G)-dimethylarginine dimethylaminohydrolase 2	O95865	0,001998853	0,72674515	Upregulated in Tumor	23564	ENSG00000233076;ENSG00000225635;ENSG00000213722;ENSG00000226634;ENSG00000227317;ENSG00000228128;ENSG00000206395	23564	ENSG00000233076;ENSG00000225635;ENSG00000213722;ENSG00000226634;ENSG00000227317;ENSG00000228128;ENSG00000206395
+PCNP	PEST proteolytic signal-containing nuclear protein	Q8WW12	0,007230854	0,727704445	Upregulated in Tumor	57092	ENSG00000081154	57092	ENSG00000081154
+PPT1	Palmitoyl-protein thioesterase 1	P50897	0,001618852	0,732551929	Upregulated in Tumor	5538	ENSG00000131238	5538	ENSG00000131238
+RAB3D	Ras-related protein Rab-3D	O95716	0,001503449	0,73467743	Upregulated in Tumor	9545	ENSG00000105514	9545	ENSG00000105514
+BLVRA	Biliverdin reductase A	P53004	5,8004E-05	0,735048498	Upregulated in Tumor	644	ENSG00000106605	644	ENSG00000106605
+GUK1;DKFZp666D023	Guanylate kinase	Q16774	0,001806065	0,735823348	Upregulated in Tumor	2987	ENSG00000143774	2987	ENSG00000143774
+TPT1	Translationally-controlled tumor protein	P13693	8,87724E-08	0,73599166	Upregulated in Tumor	7178	ENSG00000133112	7178	ENSG00000133112
+TPT1	Translationally-controlled tumor protein	Q56UQ5	8,87724E-08	0,73599166	Upregulated in Tumor	392490	NA	392490	NA
+SAP18	Histone deacetylase complex subunit SAP18	O00422	0,00221534	0,736110037	Upregulated in Tumor	10284	ENSG00000150459	10284	ENSG00000150459
+MRPS34	28S ribosomal protein S34, mitochondrial	P82930	0,004295663	0,737253606	Upregulated in Tumor	65993	ENSG00000074071	65993	ENSG00000074071
+SRSF3;SFRS3	Serine/arginine-rich splicing factor 3	P84103	1,62885E-07	0,73819955	Upregulated in Tumor	6428	ENSG00000112081	6428	ENSG00000112081
+MRPL53	39S ribosomal protein L53, mitochondrial	Q96EL3	0,000364328	0,740661442	Upregulated in Tumor	116540	ENSG00000204822	116540	ENSG00000204822
+PIN4	Peptidyl-prolyl cis-trans isomerase NIMA-interacting 4	Q9Y237	4,01308E-05	0,743586619	Upregulated in Tumor	5303	ENSG00000102309	5303	ENSG00000102309
+CNDP2	Cytosolic non-specific dipeptidase	Q96KP4	5,47558E-06	0,745224293	Upregulated in Tumor	55748	ENSG00000133313	55748	ENSG00000133313
+RPS7	40S ribosomal protein S7	P62081	6,68395E-05	0,746653866	Upregulated in Tumor	6201	ENSG00000171863	6201	ENSG00000171863
+UFC1	Ubiquitin-fold modifier-conjugating enzyme 1	Q9Y3C8	0,008695661	0,747948949	Upregulated in Tumor	51506	ENSG00000143222	51506	ENSG00000143222
+LSM14A	Protein LSM14 homolog A	Q8ND56	0,000482567	0,748221291	Upregulated in Tumor	26065	ENSG00000262860;ENSG00000257103	26065	ENSG00000262860;ENSG00000257103
+RPS14	40S ribosomal protein S14	P62263	0,010486476	0,750480384	Upregulated in Tumor	6208	ENSG00000164587	6208	ENSG00000164587
+RPL36A	60S ribosomal protein L36a	P83881	0,000363357	0,751286418	Upregulated in Tumor	6173	ENSG00000241343	6173	ENSG00000241343
+TSPO;PBR	Translocator protein	P30536	0,000195823	0,751302427	Upregulated in Tumor	706	ENSG00000100300	706	ENSG00000100300
+ATP5J2-PTCD1;PTCD1	Pentatricopeptide repeat-containing protein 1, mitochondrial	O75127	9,5151E-05	0,751370743	Upregulated in Tumor	26024	ENSG00000106246	26024	ENSG00000106246
+PURB	Transcriptional activator protein Pur-beta	Q96QR8	0,000687837	0,757081216	Upregulated in Tumor	5814	ENSG00000146676	5814	ENSG00000146676
+PURB	Transcriptional activator protein Pur-beta	Q9UJV8	0,000687837	0,757081216	Upregulated in Tumor	29942	ENSG00000172733	29942	ENSG00000172733
+PPP1R7	Protein phosphatase 1 regulatory subunit 7	Q15435	0,0005038	0,762730896	Upregulated in Tumor	5510	ENSG00000115685	5510	ENSG00000115685
+HEXA	Beta-hexosaminidase;Beta-hexosaminidase subunit alpha	P06865	1,03158E-05	0,764633238	Upregulated in Tumor	3073	ENSG00000213614	3073	ENSG00000213614
+MRPL48	39S ribosomal protein L48, mitochondrial	Q96GC5	0,002157761	0,766056275	Upregulated in Tumor	51642	ENSG00000175581	51642	ENSG00000175581
+RPS17;RPS17L	40S ribosomal protein S17;40S ribosomal protein S17-like	P08708	0,000337623	0,766456795	Upregulated in Tumor	6218	ENSG00000182774;ENSG00000278229	6218	ENSG00000182774;ENSG00000278229
+PPIL1	Peptidyl-prolyl cis-trans isomerase-like 1	Q9Y3C6	6,29746E-05	0,767280648	Upregulated in Tumor	51645	ENSG00000137168	51645	ENSG00000137168
+NDUFS5	NADH dehydrogenase [ubiquinone] iron-sulfur protein 5	O43920	0,001760265	0,768344586	Upregulated in Tumor	4725	ENSG00000168653	4725	ENSG00000168653
+RPL34	60S ribosomal protein L34	P49207	3,12189E-06	0,769054188	Upregulated in Tumor	6164	ENSG00000109475	6164	ENSG00000109475
+RBM8A	RNA-binding protein 8A	Q9Y5S9	8,45332E-06	0,772610014	Upregulated in Tumor	9939	ENSG00000265241	9939	ENSG00000265241
+NUP35	Nucleoporin NUP53	Q8NFH5	0,002354173	0,775249677	Upregulated in Tumor	129401	ENSG00000163002	129401	ENSG00000163002
+NHP2	H/ACA ribonucleoprotein complex subunit 2	Q9NX24	0,000309007	0,780774851	Upregulated in Tumor	55651	ENSG00000145912	55651	ENSG00000145912
+CHTOP	Chromatin target of PRMT1 protein	Q9Y3Y2	4,07749E-06	0,783442879	Upregulated in Tumor	26097	ENSG00000160679	26097	ENSG00000160679
+DYNLRB1;DYNLRB2	Dynein light chain roadblock-type 1;Dynein light chain roadblock-type 2	Q9NP97	0,000142712	0,785619298	Upregulated in Tumor	83658	ENSG00000125971	83658	ENSG00000125971
+DYNLRB1;DYNLRB2	Dynein light chain roadblock-type 1;Dynein light chain roadblock-type 2	Q8TF09	0,000142712	0,785619298	Upregulated in Tumor	83657	ENSG00000168589	83657	ENSG00000168589
+ECI1;DCI	Enoyl-CoA delta isomerase 1, mitochondrial	P42126	8,00151E-07	0,788665532	Upregulated in Tumor	1632	ENSG00000167969	1632	ENSG00000167969
+SNRPB;SNRPN	Small nuclear ribonucleoprotein-associated protein;Small nuclear ribonucleoprotein-associated proteins B and B;Small nuclear ribonucleoprotein-associated protein N	P14678	1,23242E-06	0,789089411	Upregulated in Tumor	6628	ENSG00000125835	6628	ENSG00000125835
+SNRPB;SNRPN	Small nuclear ribonucleoprotein-associated protein;Small nuclear ribonucleoprotein-associated proteins B and B;Small nuclear ribonucleoprotein-associated protein N	P63162	1,23242E-06	0,789089411	Upregulated in Tumor	6638;8926	ENSG00000128739	6638;8926	ENSG00000128739
+TXNDC17	Thioredoxin domain-containing protein 17	Q9BRA2	5,89119E-06	0,79294109	Upregulated in Tumor	84817	ENSG00000129235	84817	ENSG00000129235
+IFITM3	Interferon-induced transmembrane protein 3	Q01628	0,000878526	0,797556124	Upregulated in Tumor	10410	ENSG00000142089	10410	ENSG00000142089
+BCAT2	Branched-chain-amino-acid aminotransferase, mitochondrial;Branched-chain-amino-acid aminotransferase	O15382	0,000121866	0,799787544	Upregulated in Tumor	587	ENSG00000105552	587	ENSG00000105552
+ABHD14B	Alpha/beta hydrolase domain-containing protein 14B	Q96IU4	1,73804E-06	0,80009896	Upregulated in Tumor	84836	ENSG00000114779	84836	ENSG00000114779
+ITPA	Inosine triphosphate pyrophosphatase	Q9BY32	0,001866347	0,801188374	Upregulated in Tumor	3704	ENSG00000125877	3704	ENSG00000125877
+TRAPPC3	Trafficking protein particle complex subunit 3	O43617	0,000122828	0,803576504	Upregulated in Tumor	27095	ENSG00000054116	27095	ENSG00000054116
+TAPBP	Tapasin	O15533	0,009880116	0,80548973	Upregulated in Tumor	6892	ENSG00000231925;ENSG00000236490;ENSG00000206208;ENSG00000206281;ENSG00000112493	6892	ENSG00000231925;ENSG00000236490;ENSG00000206208;ENSG00000206281;ENSG00000112493
+IRGQ	Immunity-related GTPase family Q protein	Q8WZA9	0,000327427	0,805659013	Upregulated in Tumor	126298	ENSG00000167378	126298	ENSG00000167378
+RPL35A	60S ribosomal protein L35a	P18077	7,88653E-07	0,806253588	Upregulated in Tumor	6165	ENSG00000182899	6165	ENSG00000182899
+NEDD8-MDP1	NA	Q15843	0,004824634	0,806732872	Upregulated in Tumor	4738	ENSG00000129559;ENSG00000285246	4738	ENSG00000129559;ENSG00000285246
+DNAJC19	Mitochondrial import inner membrane translocase subunit TIM14	Q96DA6	0,004271446	0,808036143	Upregulated in Tumor	131118	ENSG00000205981	131118	ENSG00000205981
+CMBL	Carboxymethylenebutenolidase homolog	Q96DG6	3,69692E-05	0,80947665	Upregulated in Tumor	134147	ENSG00000164237	134147	ENSG00000164237
+PURA	Transcriptional activator protein Pur-alpha	Q00577	0,001475072	0,810229722	Upregulated in Tumor	5813	ENSG00000185129	5813	ENSG00000185129
+C9orf142	Uncharacterized protein C9orf142	Q9BUH6	1,10658E-06	0,810676347	Upregulated in Tumor	286257	ENSG00000148362	286257	ENSG00000148362
+C11orf48	NA	E9PRG8	0,000227828	0,81532378	Upregulated in Tumor	102288414	ENSG00000278615	NA	ENSG00000278615
+ARPC5	Actin-related protein 2/3 complex subunit 5	O15511	0,000492121	0,815907782	Upregulated in Tumor	10092	ENSG00000162704	10092	ENSG00000162704
+PLBD2	Putative phospholipase B-like 2;Putative phospholipase B-like 2 32 kDa form;Putative phospholipase B-like 2 45 kDa form	Q8NHP8	0,003558489	0,816284	Upregulated in Tumor	196463	ENSG00000151176	196463	ENSG00000151176
+MRPL17	39S ribosomal protein L17, mitochondrial	Q9NRX2	0,001713758	0,816585984	Upregulated in Tumor	63875	ENSG00000158042	63875	ENSG00000158042
+VIM	Vimentin	P08670	0,000599569	0,821485427	Upregulated in Tumor	7431	ENSG00000026025	7431	ENSG00000026025
+DDAH1	N(G),N(G)-dimethylarginine dimethylaminohydrolase 1	O94760	0,001126166	0,828357976	Upregulated in Tumor	23576	ENSG00000153904	23576	ENSG00000153904
+ZC3H15	Zinc finger CCCH domain-containing protein 15	Q8WU90	0,002978356	0,83146728	Upregulated in Tumor	55854	ENSG00000065548	55854	ENSG00000065548
+ARPC3	Actin-related protein 2/3 complex subunit 3	O15145	0,001357733	0,832748505	Upregulated in Tumor	10094	ENSG00000111229	10094	ENSG00000111229
+ARF4	ADP-ribosylation factor 4	P18085	2,08373E-07	0,83548072	Upregulated in Tumor	378	ENSG00000168374	378	ENSG00000168374
+PYCARD	Apoptosis-associated speck-like protein containing a CARD	Q9ULZ3	0,00147934	0,838184015	Upregulated in Tumor	29108	ENSG00000103490	29108	ENSG00000103490
+PAFAH1B2	Platelet-activating factor acetylhydrolase IB subunit beta	P68402	0,000147882	0,838330362	Upregulated in Tumor	5049	ENSG00000168092	5049	ENSG00000168092
+NDUFV2	NADH dehydrogenase [ubiquinone] flavoprotein 2, mitochondrial	P19404	2,38506E-06	0,840750919	Upregulated in Tumor	4729	ENSG00000178127	4729	ENSG00000178127
+COX6B1	Cytochrome c oxidase subunit 6B1	P14854	1,80049E-07	0,841722364	Upregulated in Tumor	1340	ENSG00000126267	1340	ENSG00000126267
+UBQLN2	Ubiquilin-2	Q9UHD9	0,000764028	0,842538702	Upregulated in Tumor	29978	ENSG00000188021	29978	ENSG00000188021
+MRPL43	39S ribosomal protein L43, mitochondrial	Q8N983	0,005752744	0,843604507	Upregulated in Tumor	84545	ENSG00000055950	84545	ENSG00000055950
+NAGLU	Alpha-N-acetylglucosaminidase;Alpha-N-acetylglucosaminidase 82 kDa form;Alpha-N-acetylglucosaminidase 77 kDa form	P54802	0,001924784	0,845330041	Upregulated in Tumor	4669	ENSG00000108784	4669	ENSG00000108784
+CRIP2	Cysteine-rich protein 2	P52943	0,001815127	0,845644765	Upregulated in Tumor	1397	ENSG00000182809	1397	ENSG00000182809
+TOMM5	Mitochondrial import receptor subunit TOM5 homolog	Q8N4H5	0,00037201	0,847381835	Upregulated in Tumor	401505	ENSG00000175768	401505	ENSG00000175768
+PHPT1;PHP14	14 kDa phosphohistidine phosphatase	Q9NRX4	0,000495134	0,849552785	Upregulated in Tumor	29085	ENSG00000054148	29085	ENSG00000054148
+TFG	Protein TFG	Q92734	0,000232283	0,850835484	Upregulated in Tumor	10342	ENSG00000114354	10342	ENSG00000114354
+GPX4	Phospholipid hydroperoxide glutathione peroxidase, mitochondrial;Glutathione peroxidase	P36969	0,001772609	0,853158061	Upregulated in Tumor	2879	ENSG00000167468	2879	ENSG00000167468
+SNX3	Sorting nexin-3	O60493	4,66059E-05	0,853443474	Upregulated in Tumor	8724	ENSG00000112335	8724	ENSG00000112335
+OSGEP	Probable tRNA threonylcarbamoyladenosine biosynthesis protein OSGEP	Q9NPF4	0,000629261	0,85744763	Upregulated in Tumor	55644	ENSG00000092094	55644	ENSG00000092094
+RPS29	40S ribosomal protein S29	P62273	3,52137E-07	0,860277798	Upregulated in Tumor	6235	ENSG00000213741	6235	ENSG00000213741
+IVD	Isovaleryl-CoA dehydrogenase, mitochondrial	P26440	6,06838E-05	0,860739247	Upregulated in Tumor	3712	ENSG00000128928	3712	ENSG00000128928
+CAPG	Macrophage-capping protein	P40121	8,82345E-09	0,861753523	Upregulated in Tumor	822	ENSG00000042493	822	ENSG00000042493
+CCDC124	Coiled-coil domain-containing protein 124	Q96CT7	0,00029274	0,861987156	Upregulated in Tumor	115098	ENSG00000007080	115098	ENSG00000007080
+SPR	Sepiapterin reductase	P35270	3,68412E-06	0,862145782	Upregulated in Tumor	6697	ENSG00000116096	6697	ENSG00000116096
+TSG101	Tumor susceptibility gene 101 protein	Q99816	0,00675249	0,863135713	Upregulated in Tumor	7251	ENSG00000074319	7251	ENSG00000074319
+UQCRB	Cytochrome b-c1 complex subunit 7	P14927	0,001828402	0,863219101	Upregulated in Tumor	7381	ENSG00000156467	7381	ENSG00000156467
+HEBP2	Heme-binding protein 2	Q9Y5Z4	0,000175397	0,863546824	Upregulated in Tumor	23593	ENSG00000051620	23593	ENSG00000051620
+WIBG	Partner of Y14 and mago	Q9BRP8	0,000233178	0,865338921	Upregulated in Tumor	84305	ENSG00000170473	84305	ENSG00000170473
+SSR3	Translocon-associated protein subunit gamma	Q9UNL2	0,000424069	0,866346228	Upregulated in Tumor	6747	ENSG00000114850	6747	ENSG00000114850
+NDUFS4	NADH dehydrogenase [ubiquinone] iron-sulfur protein 4, mitochondrial	O43181	0,000124984	0,869325508	Upregulated in Tumor	4724	ENSG00000164258	4724	ENSG00000164258
+RAB1B	Ras-related protein Rab-1B	Q9H0U4	0,006540618	0,871014846	Upregulated in Tumor	81876	ENSG00000174903	81876	ENSG00000174903
+NDUFA8	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 8	P51970	1,02435E-06	0,871487776	Upregulated in Tumor	4702	ENSG00000119421	4702	ENSG00000119421
+NDUFA5	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 5	Q16718	7,4601E-06	0,872199199	Upregulated in Tumor	4698	ENSG00000128609	4698	ENSG00000128609
+MARCKSL1	MARCKS-related protein	P49006	0,001003265	0,872411132	Upregulated in Tumor	65108	ENSG00000175130	65108	ENSG00000175130
+ARRB1	Beta-arrestin-1	P49407	0,007047213	0,872426878	Upregulated in Tumor	408	ENSG00000137486	408	ENSG00000137486
+CRK	Adapter molecule crk	P46108	0,000551314	0,873721503	Upregulated in Tumor	1398	ENSG00000167193	1398	ENSG00000167193
+GTF2F2	General transcription factor IIF subunit 2	P13984	0,00231249	0,874407169	Upregulated in Tumor	2963	ENSG00000188342	2963	ENSG00000188342
+COX7A2	Cytochrome c oxidase subunit 7A2, mitochondrial	P14406	0,006457492	0,874642827	Upregulated in Tumor	1347	ENSG00000112695	1347	ENSG00000112695
+DIABLO	Diablo homolog, mitochondrial	Q9NR28	9,88075E-05	0,876426103	Upregulated in Tumor	56616	ENSG00000184047;ENSG00000284934	56616	ENSG00000184047;ENSG00000284934
+RPS26;RPS26P11	40S ribosomal protein S26;Putative 40S ribosomal protein S26-like 1	P62854	1,27836E-07	0,885375681	Upregulated in Tumor	6231	ENSG00000197728	6231	ENSG00000197728
+RPL21	60S ribosomal protein L21	P46778	0,000225697	0,885960753	Upregulated in Tumor	6144	ENSG00000122026	6144	ENSG00000122026
+RPL31	60S ribosomal protein L31	P62899	1,48387E-10	0,886020818	Upregulated in Tumor	6160	ENSG00000071082	6160	ENSG00000071082
+MRPS14	28S ribosomal protein S14, mitochondrial	O60783	5,18417E-06	0,888010948	Upregulated in Tumor	63931	ENSG00000120333	63931	ENSG00000120333
+NDUFA9	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 9, mitochondrial	Q16795	5,20557E-06	0,891151245	Upregulated in Tumor	4704	ENSG00000139180	4704	ENSG00000139180
+MRPS17	28S ribosomal protein S17, mitochondrial	Q9Y2R5	1,90591E-05	0,891254948	Upregulated in Tumor	51373	ENSG00000239789	51373	ENSG00000239789
+MRPS17	28S ribosomal protein S17, mitochondrial	Q96SE7	1,90591E-05	0,891254948	Upregulated in Tumor	84671	ENSG00000197937	84671	ENSG00000197937
+MRPS17	28S ribosomal protein S17, mitochondrial	Q03938	1,90591E-05	0,891254948	Upregulated in Tumor	7643	ENSG00000213988	7643	ENSG00000213988
+MRPS17	28S ribosomal protein S17, mitochondrial	Q5FWF6	1,90591E-05	0,891254948	Upregulated in Tumor	285989	ENSG00000198556	285989	ENSG00000198556
+HAGH	Hydroxyacylglutathione hydrolase, mitochondrial	Q16775	0,000142964	0,891485201	Upregulated in Tumor	3029	ENSG00000063854	3029	ENSG00000063854
+COA3	Cytochrome c oxidase assembly protein 3 homolog, mitochondrial	Q9Y2R0	0,004348026	0,891880303	Upregulated in Tumor	28958	ENSG00000183978	28958	ENSG00000183978
+PRCP	Lysosomal Pro-X carboxypeptidase	P42785	0,000539092	0,900558987	Upregulated in Tumor	5547	ENSG00000137509	5547	ENSG00000137509
+SRI	Sorcin	P30626	1,14496E-06	0,900670566	Upregulated in Tumor	6717	ENSG00000075142	6717	ENSG00000075142
+AKR7A2	Aflatoxin B1 aldehyde reductase member 2	O43488	1,93783E-05	0,904988091	Upregulated in Tumor	8574	ENSG00000053371	8574	ENSG00000053371
+ALCAM	CD166 antigen	Q13740	0,002442955	0,905478489	Upregulated in Tumor	214	ENSG00000170017	214	ENSG00000170017
+ACOT1;ACOT2	Acyl-coenzyme A thioesterase 1;Acyl-coenzyme A thioesterase 2, mitochondrial	Q86TX2	0,00346165	0,915027248	Upregulated in Tumor	641371	ENSG00000184227	641371	ENSG00000184227
+ACOT1;ACOT2	Acyl-coenzyme A thioesterase 1;Acyl-coenzyme A thioesterase 2, mitochondrial	P49753	0,00346165	0,915027248	Upregulated in Tumor	10965	ENSG00000119673	10965	ENSG00000119673
+BTF3L4	Transcription factor BTF3 homolog 4	Q96K17	3,57154E-05	0,919040029	Upregulated in Tumor	91408	ENSG00000134717	91408	ENSG00000134717
+MRPL13	39S ribosomal protein L13, mitochondrial	Q9BYD1	4,21995E-06	0,921733623	Upregulated in Tumor	28998	ENSG00000172172	28998	ENSG00000172172
+LMCD1	LIM and cysteine-rich domains protein 1	Q9NZU5	0,005845333	0,923434153	Upregulated in Tumor	29995	ENSG00000071282	29995	ENSG00000071282
+VAMP3	Vesicle-associated membrane protein 3	Q15836	0,001015451	0,923661288	Upregulated in Tumor	9341	ENSG00000049245	9341	ENSG00000049245
+GM2A	Ganglioside GM2 activator;Ganglioside GM2 activator isoform short	P17900	0,000360871	0,92470411	Upregulated in Tumor	2760	ENSG00000196743	2760	ENSG00000196743
+PGRMC2	Membrane-associated progesterone receptor component 2	O15173	2,46218E-05	0,925039588	Upregulated in Tumor	10424	ENSG00000164040	10424	ENSG00000164040
+EDF1	Endothelial differentiation-related factor 1	O60869	0,000112211	0,926716515	Upregulated in Tumor	8721	ENSG00000107223	8721	ENSG00000107223
+PRKACA	cAMP-dependent protein kinase catalytic subunit alpha	P17612	0,000104305	0,927646264	Upregulated in Tumor	5566	ENSG00000072062	5566	ENSG00000072062
+PRRC1	Protein PRRC1	Q96M27	0,001800245	0,930426951	Upregulated in Tumor	133619	ENSG00000164244	133619	ENSG00000164244
+ATP6V1G1	V-type proton ATPase subunit G 1	O75348	0,000186637	0,930557537	Upregulated in Tumor	9550	ENSG00000136888	9550	ENSG00000136888
+ATP6V1G1	V-type proton ATPase subunit G 1	O95670	0,000186637	0,930557537	Upregulated in Tumor	534	ENSG00000213760;ENSG00000206445;ENSG00000234668;ENSG00000227587;ENSG00000230900;ENSG00000226850;ENSG00000234920	534	ENSG00000213760;ENSG00000206445;ENSG00000234668;ENSG00000227587;ENSG00000230900;ENSG00000226850;ENSG00000234920
+RPS13	40S ribosomal protein S13	P62277	0,000520599	0,931299947	Upregulated in Tumor	6207	ENSG00000110700	6207	ENSG00000110700
+TPD52	Tumor protein D52	P55327	6,55302E-08	0,934555657	Upregulated in Tumor	7163	ENSG00000076554	7163	ENSG00000076554
+TCEB2	Transcription elongation factor B polypeptide 2	Q15370	1,51099E-05	0,935001244	Upregulated in Tumor	6923	ENSG00000103363	6923	ENSG00000103363
+SRP9	Signal recognition particle 9 kDa protein	P49458	6,20903E-06	0,937540267	Upregulated in Tumor	6726	ENSG00000143742	6726	ENSG00000143742
+QDPR	Dihydropteridine reductase	P09417	0,001797774	0,938291745	Upregulated in Tumor	5860	ENSG00000151552	5860	ENSG00000151552
+RSU1	Ras suppressor protein 1	Q15404	3,69762E-05	0,945354557	Upregulated in Tumor	6251	ENSG00000148484	6251	ENSG00000148484
+PNPO	Pyridoxine-5-phosphate oxidase	Q9NVS9	0,000281573	0,94545511	Upregulated in Tumor	55163	ENSG00000108439	55163	ENSG00000108439
+UBE2N	Ubiquitin-conjugating enzyme E2 N	P61088	9,64186E-10	0,945973869	Upregulated in Tumor	7334	ENSG00000177889	7334	ENSG00000177889
+ARPC5L	Actin-related protein 2/3 complex subunit 5-like protein;Actin-related protein 2/3 complex subunit 5	Q9BPX5	0,001129288	0,949567481	Upregulated in Tumor	81873	ENSG00000136950	81873	ENSG00000136950
+NAA38;LSM8	N-alpha-acetyltransferase 38, NatC auxiliary subunit	O95777	0,000511873	0,952405776	Upregulated in Tumor	51691	ENSG00000128534	51691	ENSG00000128534
+TIMM13	Mitochondrial import inner membrane translocase subunit Tim13	Q9Y5L4	0,000245126	0,954265701	Upregulated in Tumor	26517	ENSG00000099800	26517	ENSG00000099800
+LGALS1	Galectin-1	P09382	2,57584E-06	0,956403297	Upregulated in Tumor	3956	ENSG00000100097	3956	ENSG00000100097
+DAK	Bifunctional ATP-dependent dihydroxyacetone kinase/FAD-AMP lyase (cyclizing);ATP-dependent dihydroxyacetone kinase;FAD-AMP lyase (cyclizing)	Q3LXA3	1,60761E-08	0,958039375	Upregulated in Tumor	26007	ENSG00000149476	26007	ENSG00000149476
+SFXN3	Sideroflexin-3	Q9BWM7	5,10462E-05	0,959084225	Upregulated in Tumor	81855	ENSG00000107819	81855	ENSG00000107819
+FAH	Fumarylacetoacetase	P16930	0,002224813	0,959991776	Upregulated in Tumor	2184	ENSG00000103876	2184	ENSG00000103876
+SGSH	N-sulphoglucosamine sulphohydrolase	P51688	0,010267475	0,961117266	Upregulated in Tumor	6448	ENSG00000181523	6448	ENSG00000181523
+COX5B	Cytochrome c oxidase subunit 5B, mitochondrial	P10606	0,000799245	0,965486587	Upregulated in Tumor	1329	ENSG00000135940	1329	ENSG00000135940
+CISD1	CDGSH iron-sulfur domain-containing protein 1	Q9NZ45	0,000321902	0,966999342	Upregulated in Tumor	55847	ENSG00000122873	55847	ENSG00000122873
+CHCHD2;CHCHD2P9	Coiled-coil-helix-coiled-coil-helix domain-containing protein 2, mitochondrial;Putative coiled-coil-helix-coiled-coil-helix domain-containing protein CHCHD2P9, mitochondrial	Q9Y6H1	0,000378176	0,969420391	Upregulated in Tumor	51142	ENSG00000106153	51142	ENSG00000106153
+BST2	Bone marrow stromal antigen 2	Q10589	0,00121497	0,969549375	Upregulated in Tumor	684	ENSG00000130303	684	ENSG00000130303
+NENF	Neudesin	Q9UMX5	9,71816E-05	0,96986955	Upregulated in Tumor	29937	ENSG00000117691	29937	ENSG00000117691
+DCTPP1	dCTP pyrophosphatase 1	Q9H773	1,35917E-06	0,97633256	Upregulated in Tumor	79077	ENSG00000179958	79077	ENSG00000179958
+NUCKS1;NUCKS	Nuclear ubiquitous casein and cyclin-dependent kinase substrate 1	Q9H1E3	0,000813545	0,980372801	Upregulated in Tumor	64710	ENSG00000069275	64710	ENSG00000069275
+DPM3	Dolichol-phosphate mannosyltransferase subunit 3	Q9P2X0	2,90301E-05	0,983913295	Upregulated in Tumor	54344	ENSG00000179085	54344	ENSG00000179085
+DNASE2	Deoxyribonuclease-2-alpha	O00115	0,000177841	0,98503924	Upregulated in Tumor	1777	ENSG00000105612	1777	ENSG00000105612
+SERPINA3	Alpha-1-antichymotrypsin;Alpha-1-antichymotrypsin His-Pro-less	P01011	0,007429485	0,986760224	Upregulated in Tumor	12	ENSG00000196136	12	ENSG00000196136
+MRPS33	28S ribosomal protein S33, mitochondrial	Q9Y291	1,76301E-07	0,988377473	Upregulated in Tumor	51650	ENSG00000090263	51650	ENSG00000090263
+RING1	E3 ubiquitin-protein ligase RING1	Q06587	0,000456426	0,990717148	Upregulated in Tumor	6015	ENSG00000235107;ENSG00000206287;ENSG00000226788;ENSG00000231115;ENSG00000228520;ENSG00000204227	6015	ENSG00000235107;ENSG00000206287;ENSG00000226788;ENSG00000231115;ENSG00000228520;ENSG00000204227
+GCA	Grancalcin	P28676	6,43692E-05	0,994704548	Upregulated in Tumor	25801	ENSG00000115271	25801	ENSG00000115271
+CHP1	Calcineurin B homologous protein 1	Q99653	0,000313499	0,999538678	Upregulated in Tumor	11261	ENSG00000187446	11261	ENSG00000187446
+SNAPIN	SNARE-associated protein Snapin	O95295	0,00024119	1,007165849	Upregulated in Tumor	23557	ENSG00000143553	23557	ENSG00000143553
+RALA	Ras-related protein Ral-A	P11233	2,22656E-05	1,010116034	Upregulated in Tumor	5898	ENSG00000006451	5898	ENSG00000006451
+CHMP2A	Charged multivesicular body protein 2a	O43633	0,00090868	1,011396031	Upregulated in Tumor	27243	ENSG00000130724	27243	ENSG00000130724
+MTPN;DKFZp761E1322	Myotrophin	P58546	0,000554499	1,015291256	Upregulated in Tumor	136319	ENSG00000105887	136319	ENSG00000105887
+MAN2B1	Lysosomal alpha-mannosidase;Lysosomal alpha-mannosidase A peptide;Lysosomal alpha-mannosidase B peptide;Lysosomal alpha-mannosidase C peptide;Lysosomal alpha-mannosidase D peptide;Lysosomal alpha-mannosidase E peptide	O00754	0,001476073	1,018915715	Upregulated in Tumor	4125	ENSG00000104774	4125	ENSG00000104774
+CYB5R3	NADH-cytochrome b5 reductase 3;NADH-cytochrome b5 reductase 3 membrane-bound form;NADH-cytochrome b5 reductase 3 soluble form	P00387	0,001595452	1,019698455	Upregulated in Tumor	1727	ENSG00000100243	1727	ENSG00000100243
+ARL3	ADP-ribosylation factor-like protein 3	P36405	2,11829E-05	1,024026828	Upregulated in Tumor	403	ENSG00000138175	403	ENSG00000138175
+MT-CO2;COX2;COII	Cytochrome c oxidase subunit 2	P00403	1,56275E-05	1,02501763	Upregulated in Tumor	4513	ENSG00000198712	4513	ENSG00000198712
+TMED1	Transmembrane emp24 domain-containing protein 1	Q13445	7,74297E-05	1,025795633	Upregulated in Tumor	11018	ENSG00000099203	11018	ENSG00000099203
+BPHL	Valacyclovir hydrolase	Q86WA6	1,5547E-08	1,026753871	Upregulated in Tumor	670	ENSG00000137274	670	ENSG00000137274
+ATP6V1D;VATD	V-type proton ATPase subunit D	Q9Y5K8	0,003297323	1,02677562	Upregulated in Tumor	51382	ENSG00000100554	51382	ENSG00000100554
+TMED4	Transmembrane emp24 domain-containing protein 4	Q7Z7H5	4,57604E-05	1,028216749	Upregulated in Tumor	222068	ENSG00000158604	222068	ENSG00000158604
+SERPINA1	Alpha-1-antitrypsin;Short peptide from AAT	P01009	0,004815945	1,034967284	Upregulated in Tumor	5265	ENSG00000197249	5265	ENSG00000197249
+FAHD2A;FAHD2B;hCG_2002650	Fumarylacetoacetate hydrolase domain-containing protein 2A;Fumarylacetoacetate hydrolase domain-containing protein 2B	Q96GK7	0,000172036	1,040382497	Upregulated in Tumor	51011	ENSG00000115042	51011	ENSG00000115042
+FAHD2A;FAHD2B;hCG_2002650	Fumarylacetoacetate hydrolase domain-containing protein 2A;Fumarylacetoacetate hydrolase domain-containing protein 2B	Q6P2I3	0,000172036	1,040382497	Upregulated in Tumor	151313	ENSG00000144199	151313	ENSG00000144199
+ISG15	Ubiquitin-like protein ISG15	P05161	0,000475148	1,041239844	Upregulated in Tumor	9636	ENSG00000187608	9636	ENSG00000187608
+CORO1A	Coronin-1A;Coronin	P31146	0,006930872	1,04246522	Upregulated in Tumor	11151	ENSG00000102879	11151	ENSG00000102879
+TIMM10	Mitochondrial import inner membrane translocase subunit Tim10	P62072	5,50996E-07	1,044737424	Upregulated in Tumor	26519	ENSG00000134809	26519	ENSG00000134809
+SLC25A11	Mitochondrial 2-oxoglutarate/malate carrier protein	Q02978	0,00025737	1,044894745	Upregulated in Tumor	8402	ENSG00000108528	8402	ENSG00000108528
+EPHX2	Bifunctional epoxide hydrolase 2;Cytosolic epoxide hydrolase 2;Lipid-phosphate phosphatase	P34913	0,000167182	1,045727638	Upregulated in Tumor	2053	ENSG00000120915	2053	ENSG00000120915
+TAGLN	Transgelin	Q01995	8,34482E-05	1,048171692	Upregulated in Tumor	6876	ENSG00000149591	6876	ENSG00000149591
+SRSF2;SFRS2	Serine/arginine-rich splicing factor 2	Q01130	3,93209E-07	1,051829222	Upregulated in Tumor	6427	ENSG00000161547	6427	ENSG00000161547
+TAX1BP3	Tax1-binding protein 3	O14907	0,00069515	1,059083303	Upregulated in Tumor	30851	ENSG00000213977	30851	ENSG00000213977
+SUB1;PC4	Activated RNA polymerase II transcriptional coactivator p15	P53999	0,000113234	1,062789339	Upregulated in Tumor	10923	ENSG00000113387	10923	ENSG00000113387
+TMED2;RNP24	Transmembrane emp24 domain-containing protein 2	Q15363	6,37555E-08	1,065583252	Upregulated in Tumor	10959	ENSG00000086598	10959	ENSG00000086598
+GPX1	Glutathione peroxidase 1;Glutathione peroxidase	P07203	1,50069E-07	1,06790982	Upregulated in Tumor	2876	ENSG00000233276	2876	ENSG00000233276
+HINT2	Histidine triad nucleotide-binding protein 2, mitochondrial	Q9BX68	1,76225E-07	1,074735252	Upregulated in Tumor	84681	ENSG00000137133	84681	ENSG00000137133
+KRT10	Keratin, type I cytoskeletal 10	P13645	0,008342243	1,074990446	Upregulated in Tumor	3858	ENSG00000186395	3858	ENSG00000186395
+PRDX3	Thioredoxin-dependent peroxide reductase, mitochondrial	P30048	2,2827E-06	1,092469777	Upregulated in Tumor	10935	ENSG00000165672	10935	ENSG00000165672
+CPPED1	Calcineurin-like phosphoesterase domain-containing protein 1	Q9BRF8	0,000574035	1,09480083	Upregulated in Tumor	55313	ENSG00000103381	55313	ENSG00000103381
+GNG5	Guanine nucleotide-binding protein G(I)/G(S)/G(O) subunit gamma-5	P63218	0,000134485	1,096054089	Upregulated in Tumor	2787	ENSG00000174021	2787	ENSG00000174021
+ATOX1	Copper transport protein ATOX1	O00244	0,003142563	1,096081426	Upregulated in Tumor	475	ENSG00000177556	475	ENSG00000177556
+TMED9	Transmembrane emp24 domain-containing protein 9	Q9BVK6	1,58661E-05	1,096902965	Upregulated in Tumor	54732	ENSG00000184840	54732	ENSG00000184840
+GYG1	Glycogenin-1	P46976	0,010378188	1,104127601	Upregulated in Tumor	2992	ENSG00000163754	2992	ENSG00000163754
+RPS10	40S ribosomal protein S10	P46783	2,34807E-06	1,109831911	Upregulated in Tumor	6204	ENSG00000124614	6204	ENSG00000124614
+HIST2H2AB	Histone H2A type 2-B	Q8IUE6	5,97206E-07	1,11298715	Upregulated in Tumor	317772	ENSG00000184270	317772	ENSG00000184270
+SRSF10	Serine/arginine-rich splicing factor 10	O75494	1,09629E-07	1,115033188	Upregulated in Tumor	10772	ENSG00000188529	10772	ENSG00000188529
+SRSF10	Serine/arginine-rich splicing factor 10	Q8WXF0	1,09629E-07	1,115033188	Upregulated in Tumor	135295	ENSG00000154548	135295	ENSG00000154548
+NDUFA11	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 11	Q86Y39	8,91065E-08	1,120636474	Upregulated in Tumor	126328	ENSG00000174886	126328	ENSG00000174886
+EIF4B	Eukaryotic translation initiation factor 4B	P23588	2,92736E-06	1,122457746	Upregulated in Tumor	1975	ENSG00000063046	1975	ENSG00000063046
+GAR1	H/ACA ribonucleoprotein complex subunit 1	Q9NY12	1,87377E-05	1,124009514	Upregulated in Tumor	54433	ENSG00000109534	54433	ENSG00000109534
+SRSF5	Serine/arginine-rich splicing factor 5	Q13243	7,83112E-06	1,128537328	Upregulated in Tumor	6430	ENSG00000100650	6430	ENSG00000100650
+RPS23	40S ribosomal protein S23	P62266	1,53903E-06	1,136417193	Upregulated in Tumor	6228	ENSG00000186468	6228	ENSG00000186468
+PRKCDBP	Protein kinase C delta-binding protein	Q969G5	0,001531379	1,137750118	Upregulated in Tumor	112464	ENSG00000170955	112464	ENSG00000170955
+MAGOHB	Protein mago nashi homolog 2	Q96A72	1,44274E-05	1,141672606	Upregulated in Tumor	55110	ENSG00000111196	55110	ENSG00000111196
+RNASET2	Ribonuclease T2	O00584	5,03418E-05	1,149760004	Upregulated in Tumor	8635	ENSG00000026297	8635	ENSG00000026297
+RAB27B	Ras-related protein Rab-27B	O00194	0,000595541	1,151737128	Upregulated in Tumor	5874	ENSG00000041353	5874	ENSG00000041353
+NDUFB7	NADH dehydrogenase [ubiquinone] 1 beta subcomplex subunit 7	P17568	2,84211E-08	1,152627836	Upregulated in Tumor	4713	ENSG00000099795	4713	ENSG00000099795
+FAU	40S ribosomal protein S30	P35544	6,63078E-06	1,157416535	Upregulated in Tumor	2197	ENSG00000149806	2197	ENSG00000149806
+PPCS	Phosphopantothenate--cysteine ligase	Q9HAB8	7,08729E-07	1,160834591	Upregulated in Tumor	79717	ENSG00000127125	79717	ENSG00000127125
+GLUL;PIG59	Glutamine synthetase	P15104	1,49284E-05	1,164011166	Upregulated in Tumor	2752	ENSG00000135821	2752	ENSG00000135821
+MUC1	Mucin-1;Mucin-1 subunit alpha;Mucin-1 subunit beta	P15941	0,000223643	1,166869483	Upregulated in Tumor	4582	ENSG00000185499	4582	ENSG00000185499
+MRPL16	39S ribosomal protein L16, mitochondrial	Q9NX20	6,08423E-06	1,17677367	Upregulated in Tumor	54948	ENSG00000166902	54948	ENSG00000166902
+MRPL28	39S ribosomal protein L28, mitochondrial	Q13084	2,95929E-05	1,179290473	Upregulated in Tumor	10573	ENSG00000086504	10573	ENSG00000086504
+NDUFA2	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 2	O43678	3,7148E-08	1,187981302	Upregulated in Tumor	4695	ENSG00000131495	4695	ENSG00000131495
+RPS27L	40S ribosomal protein S27-like;40S ribosomal protein S27	Q71UM5	5,81211E-05	1,195490878	Upregulated in Tumor	51065	ENSG00000185088	51065	ENSG00000185088
+UFM1	Ubiquitin-fold modifier 1	P61960	5,82606E-05	1,211495151	Upregulated in Tumor	51569	ENSG00000120686	51569	ENSG00000120686
+LGALS3BP	Galectin-3-binding protein	Q08380	0,00013646	1,221353732	Upregulated in Tumor	3959	ENSG00000108679	3959	ENSG00000108679
+NA	NA	A0A024RBG1	0,002286277	1,225106829	Upregulated in Tumor	11163	ENSG00000177144	11163	ENSG00000177144
+CIRBP	Cold-inducible RNA-binding protein	Q14011	5,37063E-05	1,226900969	Upregulated in Tumor	1153	ENSG00000099622	1153	ENSG00000099622
+NOP10	H/ACA ribonucleoprotein complex subunit 3	Q9NPE3	7,15423E-05	1,229556852	Upregulated in Tumor	55505	ENSG00000182117	55505	ENSG00000182117
+BANF1	Barrier-to-autointegration factor;Barrier-to-autointegration factor, N-terminally processed	O75531	0,000962584	1,238185417	Upregulated in Tumor	8815	ENSG00000175334	8815	ENSG00000175334
+RBM3	Putative RNA-binding protein 3	P98179	9,83785E-06	1,24010679	Upregulated in Tumor	5935	ENSG00000102317	5935	ENSG00000102317
+ENO2	Gamma-enolase;Enolase	P09104	0,000337305	1,248327123	Upregulated in Tumor	2026	ENSG00000111674	2026	ENSG00000111674
+RPL26L1	60S ribosomal protein L26-like 1	Q9UNX3	0,000940776	1,255271286	Upregulated in Tumor	51121	ENSG00000037241	51121	ENSG00000037241
+TOLLIP	Toll-interacting protein	Q9H0E2	6,96638E-08	1,261294979	Upregulated in Tumor	54472	ENSG00000078902	54472	ENSG00000078902
+ARHGDIB	Rho GDP-dissociation inhibitor 2	P52566	1,81897E-05	1,262124392	Upregulated in Tumor	397	ENSG00000111348	397	ENSG00000111348
+PEA15	Astrocytic phosphoprotein PEA-15	Q15121	4,08644E-06	1,269772119	Upregulated in Tumor	8682	ENSG00000162734	8682	ENSG00000162734
+NUDT21	Cleavage and polyadenylation specificity factor subunit 5	O43809	1,84893E-05	1,272238417	Upregulated in Tumor	11051	ENSG00000167005	11051	ENSG00000167005
+TMEM109	Transmembrane protein 109	Q9BVC6	2,58418E-05	1,288934537	Upregulated in Tumor	79073	ENSG00000110108	79073	ENSG00000110108
+B2M	Beta-2-microglobulin;Beta-2-microglobulin form pI 5.3	P61769	2,46456E-06	1,292645505	Upregulated in Tumor	567	ENSG00000166710;ENSG00000273686	567	ENSG00000166710;ENSG00000273686
+AGR2	Anterior gradient protein 2 homolog	O95994	3,1975E-06	1,294151422	Upregulated in Tumor	10551	ENSG00000106541	10551	ENSG00000106541
+PSMB8	Proteasome subunit beta type-8;Proteasome subunit beta type	P28062	2,76923E-05	1,316325183	Upregulated in Tumor	5696	ENSG00000230034;ENSG00000230669;ENSG00000231631;ENSG00000226201;ENSG00000236443;ENSG00000204264;ENSG00000235715;ENSG00000206298	5696	ENSG00000230034;ENSG00000230669;ENSG00000231631;ENSG00000226201;ENSG00000236443;ENSG00000204264;ENSG00000235715;ENSG00000206298
+ACP2	Lysosomal acid phosphatase	P11117	0,000125861	1,321491186	Upregulated in Tumor	53	ENSG00000134575	53	ENSG00000134575
+PSAP	Proactivator polypeptide;Saposin-A;Saposin-B-Val;Saposin-B;Saposin-C;Saposin-D	P07602	2,08247E-09	1,335868925	Upregulated in Tumor	5660	ENSG00000197746	5660	ENSG00000197746
+TIMM9	Mitochondrial import inner membrane translocase subunit Tim9	Q9Y5J7	5,34006E-05	1,340319794	Upregulated in Tumor	26520	ENSG00000100575	26520	ENSG00000100575
+PIN1	Peptidyl-prolyl cis-trans isomerase NIMA-interacting 1	Q13526	7,64377E-07	1,340640712	Upregulated in Tumor	5300	ENSG00000127445	5300	ENSG00000127445
+NDUFA6	NADH dehydrogenase [ubiquinone] 1 alpha subcomplex subunit 6	P56556	5,3639E-07	1,34216648	Upregulated in Tumor	4700	ENSG00000184983;ENSG00000281013;ENSG00000272765;ENSG00000277365;ENSG00000273397	4700	ENSG00000184983;ENSG00000281013;ENSG00000272765;ENSG00000277365;ENSG00000273397
+SNRPD1	Small nuclear ribonucleoprotein Sm D1	P62314	1,26538E-05	1,351979524	Upregulated in Tumor	6632	ENSG00000167088	6632	ENSG00000167088
+HMGA1	High mobility group protein HMG-I/HMG-Y	P17096	5,07543E-07	1,354054029	Upregulated in Tumor	3159	ENSG00000137309	3159	ENSG00000137309
+DCXR	L-xylulose reductase	Q7Z4W1	1,5403E-09	1,375666921	Upregulated in Tumor	51181	ENSG00000169738	51181	ENSG00000169738
+SNRPF	Small nuclear ribonucleoprotein F	P62306	9,9039E-08	1,383493958	Upregulated in Tumor	6636	ENSG00000139343	6636	ENSG00000139343
+PDLIM4	PDZ and LIM domain protein 4	P50479	0,000106993	1,391852871	Upregulated in Tumor	8572	ENSG00000131435	8572	ENSG00000131435
+EFHD1	EF-hand domain-containing protein D1	Q9BUP0	4,7375E-10	1,402703482	Upregulated in Tumor	80303	ENSG00000115468	80303	ENSG00000115468
+ATP5D	ATP synthase subunit delta, mitochondrial	P30049	0,001039552	1,411125066	Upregulated in Tumor	513	ENSG00000099624	513	ENSG00000099624
+RPL38	60S ribosomal protein L38	P63173	3,22365E-05	1,422631093	Upregulated in Tumor	6169	ENSG00000172809	6169	ENSG00000172809
+GMFB	Glia maturation factor beta	P60983	2,23661E-06	1,429151931	Upregulated in Tumor	2764	ENSG00000197045	2764	ENSG00000197045
+LAMTOR3	Ragulator complex protein LAMTOR3	Q9UHA4	3,37099E-07	1,445104547	Upregulated in Tumor	8649	ENSG00000109270	8649	ENSG00000109270
+C6orf211	UPF0364 protein C6orf211	Q9H993	2,43706E-06	1,460342067	Upregulated in Tumor	79624	ENSG00000146476	79624	ENSG00000146476
+PAFAH1B3	Platelet-activating factor acetylhydrolase IB subunit gamma	Q15102	1,91563E-08	1,516004718	Upregulated in Tumor	5050	ENSG00000079462	5050	ENSG00000079462
+HEBP1	Heme-binding protein 1	Q9NRV9	0,000100904	1,525518599	Upregulated in Tumor	50865	ENSG00000013583	50865	ENSG00000013583
+SNRPG	Small nuclear ribonucleoprotein G;Small nuclear ribonucleoprotein G-like protein	P62308	2,03171E-07	1,536219656	Upregulated in Tumor	6637	ENSG00000143977	6637	ENSG00000143977
+GLA	Alpha-galactosidase A	P06280	4,53554E-05	1,540911827	Upregulated in Tumor	2717	ENSG00000102393	2717	ENSG00000102393
+TSTD1	Thiosulfate sulfurtransferase/rhodanese-like domain-containing protein 1	Q8NFU3	6,08659E-07	1,547618603	Upregulated in Tumor	100131187	ENSG00000215845	100131187	ENSG00000215845
+GRN	Granulins;Acrogranin;Paragranulin;Granulin-1;Granulin-2;Granulin-3;Granulin-4;Granulin-5;Granulin-6;Granulin-7	P28799	2,03589E-05	1,572544608	Upregulated in Tumor	2896	ENSG00000030582	2896	ENSG00000030582
+KCTD12	BTB/POZ domain-containing protein KCTD12	Q96CX2	2,60299E-06	1,584358638	Upregulated in Tumor	115207	ENSG00000178695	115207	ENSG00000178695
+KCTD12	BTB/POZ domain-containing protein KCTD12	Q6ZWB6	2,60299E-06	1,584358638	Upregulated in Tumor	386617	ENSG00000183783	386617	ENSG00000183783
+SH3BGRL	SH3 domain-binding glutamic acid-rich-like protein	O75368	2,89843E-06	1,593408089	Upregulated in Tumor	6451	ENSG00000131171	6451	ENSG00000131171
+PCBD1	Pterin-4-alpha-carbinolamine dehydratase	P61457	3,49467E-06	1,59847454	Upregulated in Tumor	5092	ENSG00000166228	5092	ENSG00000166228
+NT5C	5(3)-deoxyribonucleotidase, cytosolic type	Q8TCD5	3,27041E-07	1,610462458	Upregulated in Tumor	30833	ENSG00000125458	30833	ENSG00000125458
+RPS15	40S ribosomal protein S15	P62841	5,81458E-08	1,623098105	Upregulated in Tumor	6209	ENSG00000115268	6209	ENSG00000115268
+ATP5I	ATP synthase subunit e, mitochondrial	P56385	4,51729E-09	1,630745516	Upregulated in Tumor	521	ENSG00000169020	521	ENSG00000169020
+HMGN2	Non-histone chromosomal protein HMG-17	P05204	4,84758E-08	1,65227097	Upregulated in Tumor	3151	ENSG00000198830	3151	ENSG00000198830
+GUSB	Beta-glucuronidase	P08236	6,70288E-05	1,682758593	Upregulated in Tumor	2990	ENSG00000169919	2990	ENSG00000169919
+FN1	Fibronectin;Anastellin;Ugl-Y1;Ugl-Y2;Ugl-Y3	P02751	6,46689E-08	1,684751311	Upregulated in Tumor	2335	ENSG00000115414	2335	ENSG00000115414
+GAA	Lysosomal alpha-glucosidase;76 kDa lysosomal alpha-glucosidase;70 kDa lysosomal alpha-glucosidase	P10253	2,46841E-11	1,696219273	Upregulated in Tumor	2548	ENSG00000171298	2548	ENSG00000171298
+LSM3	U6 snRNA-associated Sm-like protein LSm3	P62310	1,36933E-06	1,700404312	Upregulated in Tumor	27258	ENSG00000170860	27258	ENSG00000170860
+C19orf10	UPF0556 protein C19orf10	Q969H8	0,00039943	1,705905626	Upregulated in Tumor	56005	ENSG00000074842	56005	ENSG00000074842
+ARL1	ADP-ribosylation factor-like protein 1	P40616	2,22982E-07	1,718017844	Upregulated in Tumor	400	ENSG00000120805	400	ENSG00000120805
+CEACAM6	Carcinoembryonic antigen-related cell adhesion molecule 6	P40199	0,000453954	1,745716409	Upregulated in Tumor	4680	ENSG00000086548	4680	ENSG00000086548
+TNC variant protein;TNC	Tenascin	P24821	2,25534E-05	1,753271768	Upregulated in Tumor	3371	ENSG00000041982	3371	ENSG00000041982
+DUSP23	Dual specificity protein phosphatase 23	Q9BVJ7	4,31768E-09	1,75431238	Upregulated in Tumor	54935	ENSG00000158716	54935	ENSG00000158716
+DPP7	Dipeptidyl peptidase 2	Q9UHL4	2,62348E-06	1,790513755	Upregulated in Tumor	29952	ENSG00000176978	29952	ENSG00000176978
+ASAH1	Acid ceramidase;Acid ceramidase subunit alpha;Acid ceramidase subunit beta	Q13510	4,07729E-09	1,805135153	Upregulated in Tumor	427	ENSG00000104763	427	ENSG00000104763
+CTSZ	Cathepsin Z	Q9UBR2	9,79252E-07	1,814517576	Upregulated in Tumor	1522	ENSG00000101160	1522	ENSG00000101160
+CYB5A	Cytochrome b5	P00167	6,55308E-06	1,829648779	Upregulated in Tumor	1528	ENSG00000166347	1528	ENSG00000166347
+TPP1	Tripeptidyl-peptidase 1	O14773	5,8468E-06	1,86223791	Upregulated in Tumor	1200	ENSG00000166340	1200	ENSG00000166340
+PLGRKT	Plasminogen receptor (KT)	Q9HBL7	1,17038E-09	1,941442605	Upregulated in Tumor	55848	ENSG00000107020	55848	ENSG00000107020
+NME3;c371H6.2	Nucleoside diphosphate kinase 3;Nucleoside diphosphate kinase	Q13232	4,54273E-07	1,942492089	Upregulated in Tumor	4832	ENSG00000103024	4832	ENSG00000103024
+CRIP1	Cysteine-rich protein 1	P50238	3,00514E-09	1,959820839	Upregulated in Tumor	1396	ENSG00000213145	1396	ENSG00000213145
+S100A4	Protein S100-A4	P26447	0,000163405	2,094376832	Upregulated in Tumor	6275	ENSG00000196154	6275	ENSG00000196154
+HLA-DRB1;HLA-DRB5	HLA class II histocompatibility antigen, DRB1-16 beta chain	Q29974	5,43355E-05	2,240464839	Upregulated in Tumor	3123	ENSG00000196126	3123	ENSG00000196126
+AGA	N(4)-(beta-N-acetylglucosaminyl)-L-asparaginase;Glycosylasparaginase alpha chain;Glycosylasparaginase beta chain	P20933	1,07557E-08	2,291171414	Upregulated in Tumor	175	ENSG00000038002	175	ENSG00000038002
+POSTN	Periostin	Q15063	5,2589E-06	2,320871994	Upregulated in Tumor	10631	ENSG00000133110	10631	ENSG00000133110
+FTL;FTL variant	Ferritin light chain;Ferritin	P02792	1,78439E-06	2,362490942	Upregulated in Tumor	2512	ENSG00000087086	2512	ENSG00000087086
+ITIH1	Inter-alpha-trypsin inhibitor heavy chain H1	P19827	0,000605	2,395791971	Upregulated in Tumor	3697	ENSG00000055957	3697	ENSG00000055957
+COL12A1	Collagen alpha-1(XII) chain	Q99715	7,37894E-10	2,644814576	Upregulated in Tumor	1303	ENSG00000111799	1303	ENSG00000111799
+TYMP;hCG_1988078	Thymidine phosphorylase	P19971	3,25161E-07	2,937479585	Upregulated in Tumor	1890	ENSG00000025708	1890	ENSG00000025708
+HLA-DRA;HLA-DRA1	HLA class II histocompatibility antigen, DR alpha chain	P01903	5,60108E-07	3,567075665	Upregulated in Tumor	3122	ENSG00000227993;ENSG00000230726;ENSG00000206308;ENSG00000226260;ENSG00000234794;ENSG00000204287;ENSG00000228987	3122	ENSG00000227993;ENSG00000230726;ENSG00000206308;ENSG00000226260;ENSG00000234794;ENSG00000204287;ENSG00000228987