#From drive (enrichment.all-Resistant-or-Sensitives_Fus-vs-Control_strains-factored.xlsx) #load excell
library(readxl)
sens <- read_excel("factored.xlsx", sheet = 1)
resistant <- read_excel("factored.xlsx", sheet = 2)
## New names:
## • `` -> `...1`
resistant$`#category` <- resistant$...1
resistant <- resistant[,-1]
#selected combine gene
sens_go_pro <- sens[sens$`#category` == "GO Process",]
resis_go_pro <- resistant[resistant$`#category` == "GO Process",]
ortak_terimler <- intersect(sens_go_pro$`term ID`, resis_go_pro$`term ID`)
ortak_sens <- sens_go_pro[sens_go_pro$`term ID` %in% ortak_terimler, ]
ortak_sens$grup <- "resistant"
ortak_resis <- resis_go_pro[resis_go_pro$`term ID` %in% ortak_terimler, ]
ortak_resis$grup <- "sensitive"
birlesik_go_pro <- rbind(ortak_sens, ortak_resis)
saveRDS(birlesik_go_pro, "~/birlesik_go_pro.rds")
birlesik_go_pro <- readRDS("~/birlesik_go_pro.rds")
reactable::reactable(birlesik_go_pro)
library(ggplot2)
data <- birlesik_go_pro
ggplot(data, aes(x = grup, y = `term description`, color = `false discovery rate`)) +
geom_point() +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) +
labs(x = "Grup", y = "Term Description", color = "False Discovery Rate", title = "False Discovery Rate by Term Description and Group") +
scale_color_gradient(low = "green", high = "red")
library(ggplot2)
data <- birlesik_go_pro
ggplot(data, aes(x = grup, y = `term description`, color = `false discovery rate`, size = `background gene count`)) +
geom_point() +
scale_size_continuous(range = c(2, 6)) +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) +
labs(x = "Grup", y = "Term Description", color = "False Discovery Rate", size = "Observed Gene Count", title = "False Discovery Rate and Observed Gene Count by Term Description and Group") +
scale_color_gradient(low = "green", high = "red")
library(ggplot2)
data <- birlesik_go_pro
ggplot(data, aes(x = grup, y = `term description`, color = `false discovery rate`, size = `background gene count`, alpha = `strength`)) +
geom_point() +
scale_size_continuous(range = c(2, 6)) +
scale_alpha_continuous(range = c(0.5, 1)) +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) +
labs(x = "Grup", y = "Term Description", color = "False Discovery Rate", size = "Background Gene Count", alpha = "Strength", title = "False Discovery Rate, Background Gene Count, and Strength by Term Description and Group") +
scale_color_gradient(low = "green", high = "red")
library(ggplot2)
data <- birlesik_go_pro
ggplot(data, aes(x = grup, y = `term description`, color = strength, size = `background gene count`)) +
geom_point() +
scale_size_continuous(range = c(2, 6)) +
theme(axis.text.x = element_text(angle = 45, hjust = 1)) +
labs(x = "Grup", y = "Term Description", color = "Strength", size = "Background Gene Count", title = "Strength and Background Gene Count by Term Description and Group") +
scale_color_gradient(low = "green", high = "red")
#Result #“Response to stimulus” yüksekse, bu iki türün de bir uyarıcıya tepki olarak benzer biyolojik süreçleri etkinleştirdiğini gösterebilir. Organizmanın bir dış uyarıcıya yanıt olarak ortaya çıkan çeşitli biyolojik süreçleri ifade eder. Bu, çevresel değişikliklere uyum sağlamak için organizmanın verdiği bir tepki olabilir. #“Carbohydrate derivative catabolic process” düşükse, bu, organizmanın karbonhidrat türetilmiş bileşiklerin parçalanması ve enerji üretimi için kullanılmasıyla ilgili biyolojik süreçlerde düşük aktivite olduğunu gösterebilir.