美文网首页生物信息可视化
把基因画在染色体上

把基因画在染色体上

作者: iBioinformatics | 来源:发表于2022-10-07 09:29 被阅读0次

参考简书:链接:https://www.jianshu.com/p/e924e33c60c9

需要六个R包:RIdeogram,RColorBrewer,ggbio,gggenes,Gviz,ggplot2

library(RIdeogram)
library(RColorBrewer)
library(ggbio)
library(gggenes)
library(Gviz)
library(ggplot2)
#1、准备染色体长度文件
DmChromosome <- data.table::fread("grape38_chr_len",data.table=FALSE) 
#2、gene密度信息
Dmdensity <- GFFex(input="grape38.gff3",
                   karyotype="grape38_chr_len",
                   feature="gene",window=10000)
#input为gff文件类型,karyotype染色体文件。
#Dmdensity文件最后为一个四列文件:染色体,染色体起始位置,染色体终止位置,以及这段windows中的gene个数。

#marker型绘图,有marker/line/polygon/heatmap四种绘图方法。
#3、marker型需要Type/ Shape/ Chr/ Start/ End/ color。
#它仅对type一栏绘制图例,marker型只适合展示少量基因,如下展示7个基因。
gene_list<- data.table::fread('geneinfo')
head(gene_list)
ideogram(karyotype=DmChromosome, #染色体信息
               overlaid=Dmdensity, #基因密度
               label=gene_list, #目标基因标签
               label_type="marker",width=135)

convertSVG("chromosome.svg",device="png")
#4、line/polygon/heatmap绘图
#需要制作一个类似于基因密度信息的表,包含Chr/ Start/ End/ Value_1/ Color_1/ Value_2/ Color_2。
gene_list_v<- data.table::fread('SNPdensity')
ideogram(karyotype=DmChromosome, #染色体信息
                   overlaid=Dmdensity, #基因密度
                   label=gene_list_v, #目标基因标签
                   label_type="line",width=135)
convertSVG("chromosome.svg",device="png")
#heatmap型绘图
ideogram(karyotype=DmChromosome,
         overlaid=Dmdensity,
         label=gene_list_v,
         label_type="heatmap",width=135,
         colorset1 = c("#f7f7f7", "#2c7fb8"),
         colorset2 = c("#f7f7f7", "#e34a33"))
convertSVG("chromosome.svg",device="png")

heatmap图没有line图清楚。

二、gggenes,把具体基因画在染色体上


head(example_genes)
dim(example_genes)
p1 <- ggplot(example_genes,aes(xmin=start,xmax=end,y=molecule,fill=gene)) +
     geom_gene_arrow() +
     facet_wrap(~ molecule,scales="free",ncol=1) +
     scale_fill_brewer(palette="Set3") +
     theme_genes()
p1
#对齐某一基因
dummies <- make_alignment_dummies(example_genes,aes(xmin=start,xmax=end,y=molecule,id=gene),on="genE")
p1 + geom_blank(data=dummies)
#写上基因名
p2 <- ggplot(example_genes,aes(xmin=start,xmax=end,y=molecule,fill=gene)) +
     geom_gene_arrow(arrowhead_height=unit(3,"mm"),arrowhead_width=unit(1,"mm")) +
     facet_wrap(~ molecule,scales="free",ncol=1) +
     scale_fill_brewer(palette="Set3") +
     theme_genes()
p2
p2 + geom_gene_label(aes(label=gene),align="left")

#区分正负链
p3 <- ggplot(example_genes,aes(xmin=start,xmax=end,y=molecule, fill=gene,forward=direction)) +
     geom_gene_arrow() +
     facet_wrap(~ molecule,scales="free",ncol=1) +
     scale_fill_brewer(palette="Set3") +
     theme_genes()
p3
#基因亚结构
head(example_subgenes);dim(example_subgenes)
p4 <- ggplot(example_genes,aes(xmin=start,xmax=end,y=molecule)) +
     facet_wrap(~ molecule, scales="free",ncol = 1) +
     geom_gene_arrow(fill="white") +
     geom_subgene_arrow(data=example_subgenes, aes(xmin=start,xmax=end,y=molecule,fill=gene,xsubmin=from,xsubmax=to),color="black",alpha=.7) +
     theme_genes()
p4

相关文章

  • 把基因画在染色体上

    之前有一次,我导说“能不能把这些基因按顺序画在果蝇的染色体上”,因此,我寻找了一些实现这个需求的方法。经过一番奇奇...

  • 把基因画在染色体上

    参考简书:链接:https://www.jianshu.com/p/e924e33c60c9[https://ww...

  • 遗传图谱基础原理

    遗传图谱:genetic map,又称遗传连锁图谱,是指根据基因在染色体上的重组值(交换值),将染色体上的各个基因...

  • 基础知识 — Exons,Introns,ORF,CDS,UTR

    1.核酸,基因,DNA,染色体,基因组,同源染色体,等位基因 核酸,基因,DNA,染色体 核酸:一种通常位于细胞核...

  • peaks 密度图

    计算Macs产生的peaks在基因组不同染色体上的分布,这里把染色体划分成10^5 bp一个bin。 代码实战

  • 怎样找到祖先?

    怎么通过基因来推测你的祖先呢? 我们都知道,人的基因在染色体上。人有23对染色体,其中22对是常染色体,1对性染色...

  • 遗传方面的一些基本概念

    等位基因: 非等位基因: 同源染色体: 异质性: 常染色体:常染色体是指所有非性染色体(性染色体在人类中有X和Y染...

  • gff文件格式(每一列的含义)

    GFF全称Generic Feature Format, 描述了基因组上各种特征的区间信息,包括染色体,基因,转录...

  • 基因组注释流程

    一、使用Regtag将contig挂到染色体上 二、使用Repeatmasker进行基因组数据屏蔽: 三、基因预测...

  • 【名词解释】synteny / collinearity / i

    synteny collinearity 用来描述基因组的共线性 synteny 共线性:同源基因在相应染色体上...

网友评论

    本文标题:把基因画在染色体上

    本文链接:https://www.haomeiwen.com/subject/czteartx.html