annotate small_rna_clusters.r @ 0:8028521b6e4f draft

"planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
author artbio
date Mon, 07 Oct 2019 12:51:25 -0400
parents
children 160e35e432a0
Ignore whitespace changes - Everywhere: Within whitespace: At end of lines:
rev   line source
0
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
1 ## Setup R error handling to go to stderr
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
2 options( show.error.messages=F,
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
3 error = function () { cat( geterrmessage(), file=stderr() ); q( "no", 1, F ) } )
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
4 options(warn = -1)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
5 library(RColorBrewer)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
6 library(lattice)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
7 library(latticeExtra)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
8 library(grid)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
9 library(gridExtra)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
10 library(optparse)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
11
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
12 option_list <- list(
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
13 make_option(c("-f", "--first_dataframe"), type="character", help="path to first dataframe"),
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
14 make_option("--first_plot_method", type = "character", help="How additional data should be plotted"),
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
15 make_option("--output_pdf", type = "character", help="path to the pdf file with plots")
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
16 )
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
17
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
18 parser <- OptionParser(usage = "%prog [options] file", option_list = option_list)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
19 args = parse_args(parser)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
20
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
21 # data frames implementation
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
22
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
23 ## first table
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
24 Table = read.delim(args$first_dataframe, header=T, row.names=NULL)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
25 colnames(Table)[1] <- "Dataset"
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
26 dropcol <- c("Strandness", "z.score") # not used by this Rscript and is dropped for backward compatibility
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
27 Table <- Table[,!(names(Table) %in% dropcol)]
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
28 if (args$first_plot_method == "Counts" | args$first_plot_method == "Size") {
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
29 Table <- within(Table, Counts[Polarity=="R"] <- (Counts[Polarity=="R"]*-1))
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
30 }
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
31 n_samples=length(unique(Table$Dataset))
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
32 samples = unique(Table$Dataset)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
33 genes=unique(Table$Chromosome)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
34 per_gene_readmap=lapply(genes, function(x) subset(Table, Chromosome==x))
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
35 per_gene_limit=lapply(genes, function(x) c(1, unique(subset(Table, Chromosome==x)$Chrom_length)) )
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
36 n_genes=length(per_gene_readmap)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
37
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
38 ## functions
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
39 plot_unit = function(df, method=args$first_plot_method, ...) {
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
40 p = xyplot(Counts~Coordinate|factor(Dataset, levels=unique(Dataset))+factor(Chromosome, levels=unique(Chromosome)),
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
41 data=df,
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
42 type='h',
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
43 lwd=1.5,
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
44 scales= list(relation="free", x=list(rot=0, cex=0.7, axs="i", tck=0.5), y=list(tick.number=4, rot=90, cex=0.7)),
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
45 xlab=NULL, main=NULL, ylab=NULL,
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
46 as.table=T,
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
47 origin = 0,
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
48 horizontal=FALSE,
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
49 group=Polarity,
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
50 col=c("red","blue"),
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
51 par.strip.text = list(cex=0.7),
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
52 ...)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
53 p=combineLimits(p)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
54 }
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
55
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
56 ## function parameters
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
57 par.settings.firstplot = list(layout.heights=list(top.padding=-2, bottom.padding=-2),strip.background=list(col=c("lightblue","lightgreen")))
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
58 title_first_method = list(Counts="Read Counts", Coverage="Coverage depths", Median="Median sizes", Mean="Mean sizes", Size="Size Distributions")
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
59 legend_first_method =list(Counts="Read count", Coverage="Coverage depth", Median="Median size", Mean="Mean size", Size="Read count")
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
60 bottom_first_method =list(Counts="Coordinates (nucleotides)",Coverage="Coordinates (nucleotides)", Median="Coordinates (nucleotides)", Mean="Coordinates (nucleotides)", Size="Sizes of reads")
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
61
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
62 ## Plotting Functions
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
63 single_plot <- function(...) {
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
64 width = 8.2677 * n_samples / 2
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
65 rows_per_page=8
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
66 graph_heights=c(rep(40,8),10)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
67 pdf(file=args$output_pdf, paper="special", height=15, width=width)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
68 for (i in seq(1,n_genes,rows_per_page)) {
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
69 start=i
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
70 end=i+rows_per_page-1
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
71 if (end>n_genes) {end=n_genes}
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
72 if (end-start+1 < 8) {graph_heights=c(rep(c(40),end-start+1),10,rep(c(40),8-(end-start+1)))}
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
73 first_plot.list = lapply(per_gene_readmap[start:end], function(x) update(useOuterStrips(plot_unit(x, par.settings=par.settings.firstplot),strip.left=strip.custom(par.strip.text = list(cex=0.5)))))
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
74 plot.list=rbind(first_plot.list)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
75 args_list=c(plot.list, list( nrow=rows_per_page+1, ncol=1, heights=unit(graph_heights, rep("mm", 9)),
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
76 top=textGrob("Cluster Read Counts (Peaks in middle of clusters)", gp=gpar(cex=1), vjust=0, just="top"),
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
77 left=textGrob("Read Counts", gp=gpar(cex=1), vjust=0, hjust=0, x=1, y=(-0.41/7)*(end-start-(6.23/0.41)), rot=90),
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
78 sub=textGrob("Coordinates (nucleotides)", gp=gpar(cex=1), just="bottom", vjust=2)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
79 )
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
80 )
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
81 do.call(grid.arrange, args_list)
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
82 }
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
83 devname=dev.off()
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
84 }
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
85
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
86 # main
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
87 single_plot()
8028521b6e4f "planemo upload for repository https://github.com/ARTbio/tools-artbio/tree/master/tools/small_rna_clusters commit f38805cf151cbda1cf7de0a92cdfeb5978f26547"
artbio
parents:
diff changeset
88