当前位置: 首页 > article >正文

单细胞-第四节 多样本数据分析,下游画图

文件在单细胞\5_GC_py\1_single_cell\2_plots.Rmd

1.细胞数量条形图

rm(list = ls())
library(Seurat)
load("seu.obj.Rdata")

dat = as.data.frame(table(Idents(seu.obj)))
dat$label = paste(dat$Var1,dat$Freq,sep = ":")
head(dat)
library(ggplot2)
library(paletteer)
#View(palettes_d_names)
ggplot(dat,aes(x = Freq,fill = Var1,y = Var1))+
  scale_fill_paletteer_d("ggsci::category20_d3")+
  geom_bar(stat = "identity")+
  theme_bw()+
  geom_text(aes(x = 0,label = label),hjust = 0)+
  theme(axis.text.y = element_blank(),   # 隐藏纵坐标刻度文字
        axis.ticks.y = element_blank(),
        axis.title.y = element_blank())  # 隐藏纵坐标刻度线

在这里插入图片描述

2.细胞比例条形图

seu.obj$seurat_annotation = seu.obj@active.ident
ggplot(seu.obj@meta.data,aes(orig.ident,fill = seurat_annotation))+
  geom_bar(position = "fill", alpha = 0.9,width = 0.5)+
  scale_fill_paletteer_d("ggsci::category20_d3")+
  theme_classic()+
  coord_flip()+
  coord_fixed(ratio = 4) #纵轴长度是横轴的4

在这里插入图片描述

3.小提琴图

load("markers.Rdata")
library(tidyverse)
g = allmarkers %>% group_by(cluster) %>% top_n(1,wt = avg_log2FC) %>% pull(gene)

m = as.matrix(seu.obj@assays$RNA@layers$data)
rownames(m) = Features(seu.obj)
colnames(m) = Cells(seu.obj)
vln.df <- m %>%
  t() %>%
  as.data.frame()%>%
  select(g) %>% 
  rownames_to_column("CB") %>% 
  mutate(cluster = seu.obj$seurat_annotation)%>%
  pivot_longer(cols = 2:(ncol(.)-1),#宽边长
               names_to = "gene",
               values_to = "exp") %>% 
  mutate(gene = factor(gene,levels = g))
head(vln.df)
# 自定义颜色
library(paletteer)
my_color = paletteer_d(`"ggsci::category20_d3"`)
my_color = colorRampPalette(my_color)(length(unique(vln.df$cluster)))
# 画图
p1 <- ggplot(vln.df,aes(exp,cluster),color=factor(cluster))+
  geom_violin(aes(fill=cluster),scale = "width")+
  scale_fill_manual(values = my_color)+
  facet_grid(.~gene,scales = "free_y", switch = "x")+
  scale_x_continuous(expand = c(0,0),position = "top")+
  theme_bw()+
  theme(
    panel.grid = element_blank(),
    axis.title.x.top = element_blank(),
    #axis.ticks.x.bottom = element_blank(),
    axis.text.x.top= element_text(hjust = 1,vjust = NULL,color = "black",size = 7),
    #axis.title.y.left = element_blank(),
    #axis.ticks.y.left = element_blank(),
    #axis.text.y.left = element_blank(),
    legend.position = "none",
    panel.spacing.y = unit(0, "cm"),
    strip.text.y = element_text(angle=0,size = 14,hjust = 0),
    strip.background.y = element_blank()
  )
p1

在这里插入图片描述

4.气泡图

g = allmarkers %>% group_by(cluster) %>% top_n(5,wt = avg_log2FC) %>% pull(gene) %>% unique()
DotPlot(seu.obj,features = g,cols = "RdYlBu")+RotatedAxis()

在这里插入图片描述

5.GC基因韦恩图

f = read.delim("gcgene.txt",header = F)
k = allmarkers$p_val_adj<0.05 & allmarkers$avg_log2FC>2
table(k)
g = intersect(allmarkers$gene[k],f$V1)
save(g,file = "g.Rdata")
library(tinyarray)
draw_venn(list(pyroptosis = f$V1,
               marker = unique(allmarkers$gene[k])),"")
ggsave("venn.png")

在这里插入图片描述

m = as.matrix(seu.obj@assays$RNA@layers$data)
rownames(m) = Features(seu.obj)
colnames(m) = Cells(seu.obj)
m = m[g,]
ac = data.frame(row.names = colnames(m),
                celltype = Idents(seu.obj))
library(dplyr)
ac = arrange(ac,celltype)
m = m[,rownames(ac)]
pheatmap::pheatmap(m,show_colnames = F,cluster_cols = F,cluster_rows = F,scale = "row",breaks = seq(-1.6,3,length.out = 100),annotation_col = ac)

在这里插入图片描述

6.差异焦亡基因富集分析

e = quick_enrich(g,destdir = tempdir())
e[[4]]+e[[3]]

在这里插入图片描述


http://www.kler.cn/a/525088.html

相关文章:

  • ping命令详解Type 8和0 或者Type 3
  • Kafka 副本机制(包含AR、ISR、OSR、HW 和 LEO 介绍)
  • 网关登录校验
  • gitee——报错修改本地密码
  • Android车机DIY开发之学习篇(七)NDK交叉工具构建
  • 消息队列篇--通信协议篇--应用层协议和传输层协议理解
  • Helm Chart 详解:从入门到精通
  • nodeJS 系统学习-章节4-回调函数
  • 图片上传实现图片预览的功能
  • 浏览器同源策略:从“源”到安全限制的全面解析
  • 【力扣每日一题】存在重复元素 II 解题思路
  • C ++ 1
  • SpringCloudGateWay和Sentinel结合做黑白名单来源控制
  • 计算机的错误计算(二百二十五)
  • gesp(C++六级)(6)洛谷:P10109:[GESP202312 六级] 工作沟通
  • C++ ——— 仿函数
  • 【2024年华为OD机试】(B卷,100分)- 模拟消息队列 (JavaScriptJava PythonC/C++)
  • FreeRTOS从入门到精通 第十三章(信号量)
  • Linux 信号驱动IO
  • 基于Springboot的健身房管理系统【附源码】
  • es6中关于let的使用以及案例,包括但不限于块级作用域,不允许重复声明,没有变量提升,暂存性死区,不与顶层对象挂钩
  • [SUCTF 2018]MultiSQL1
  • 微博热搜时光机逆向(js逆向)
  • 【力扣系列题目】最后一块石头的重量 分割回文串 验证回文串 等差数列划分{最大堆 背包 动态规划}
  • SSM总结
  • SpringBoot项目创建