annotate heatmap_viz.R @ 0:00960579bcd3 draft default tip

planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
author proteore
date Tue, 28 Aug 2018 10:37:03 -0400
parents
children
Ignore whitespace changes - Everywhere: Within whitespace: At end of lines:
rev   line source
0
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
1 #!/usr/bin/Rscript
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
2
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
3 suppressMessages(library('plotly'))
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
4 suppressMessages(library('heatmaply'))
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
5
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
6 #packageVersion('plotly')
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
7
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
8 get_args <- function(){
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
9
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
10 ## Collect arguments
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
11 args <- commandArgs(TRUE)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
12
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
13 ## Default setting when no arguments passed
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
14 if(length(args) < 1) {
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
15 args <- c("--help")
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
16 }
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
17
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
18 ## Help section
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
19 if("--help" %in% args) {
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
20 cat("Pathview R script
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
21 Arguments:
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
22 --help Print this test
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
23 --input path of the input file (must contains a colum of uniprot and/or geneID accession number)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
24 --output Output file
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
25 --type type of output file, could be html, pdf, jpg or png
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
26 --cols Columns to use for heatmap, exemple : '3:8' to use columns from the third to the 8th
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
27 --row_names Column which contains row names
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
28 --header True or False
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
29 --col_text_angle Angle of columns label ; from -90 to 90 degres
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
30
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
31 Example:
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
32 ./heatmap_viz.R --input='dat.nucl.norm.imputed.tsv' --output='heatmap.html' --cols='3:8' --row_names='2' --header=TRUE --col_text_angle=0 \n\n")
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
33
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
34 q(save="no")
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
35 }
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
36
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
37 #save(args,file="/home/dchristiany/proteore_project/ProteoRE/tools/pathview/args.Rda")
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
38 #load("/home/dchristiany/proteore_project/ProteoRE/tools/pathview/args.Rda")
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
39 parseArgs <- function(x) strsplit(sub("^--", "", x), "=")
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
40 argsDF <- as.data.frame(do.call("rbind", parseArgs(args)))
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
41 args <- as.list(as.character(argsDF$V2))
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
42 names(args) <- argsDF$V1
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
43
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
44 return(args)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
45 }
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
46
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
47 read_file <- function(path,header){
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
48 file <- try(read.table(path,header=header, sep="\t",stringsAsFactors = FALSE, quote=""),silent=TRUE)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
49 if (inherits(file,"try-error")){
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
50 stop("File not found !")
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
51 }else{
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
52 return(file)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
53 }
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
54 }
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
55
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
56 str2bool <- function(x){
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
57 if (any(is.element(c("t","true"),tolower(x)))){
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
58 return (TRUE)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
59 }else if (any(is.element(c("f","false"),tolower(x)))){
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
60 return (FALSE)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
61 }else{
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
62 return(NULL)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
63 }
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
64 }
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
65
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
66 args <- get_args()
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
67 header=str2bool(args$header)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
68 output <- rapply(strsplit(args$output,"\\."),c) #remove extension
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
69 output <- paste(output[1:length(output)-1],collapse=".")
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
70 output <- paste(output,args$type,sep=".")
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
71 first_col=as.numeric(substr(args$cols,1,1))
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
72 last_col=as.numeric(substr(args$cols,3,3))
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
73
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
74 ###save and load args in rda file for testing
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
75 #save(args,file="/home/dchristiany/proteore_project/ProteoRE/tools/heatmap_viz/args.Rda")
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
76 #load("/home/dchristiany/proteore_project/ProteoRE/tools/heatmap_viz/args.Rda")
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
77
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
78
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
79 uto <- read_file(args$input,header = header)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
80 uto_light <- uto[,first_col:last_col]
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
81 rownames(uto_light) <- uto[,as.numeric(args$row_names)]
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
82 colnames(uto_light) <- sapply(colnames(uto_light),function(x) gsub("iBAQ_","",x),USE.NAMES = FALSE)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
83
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
84 if (header) {
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
85 heatmaply(uto_light, file=output, margins=c(100,50,NA,0), plot_method="plotly", labRow = rownames(uto_light), labCol = names(uto_light),
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
86 grid_gap = 0,cexCol = 1, column_text_angle = as.numeric(args$col_text_angle), width = 1000, height=1000, colors = c('blue','green','yellow','red'))
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
87 }else{
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
88 names(uto_light) <-c(first_col:last_col)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
89 heatmaply(uto_light, file=output, margins=c(100,50,NA,0), plot_method="plotly", labRow = rownames(uto_light),
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
90 grid_gap = 0,cexCol = 1, column_text_angle = as.numeric(args$col_text_angle), width = 1000, height=1000, colors = c('blue','green','yellow','red'))
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
91 }
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
92
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
93
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
94 #write.table(uto_light, file = "uto_light.tsv",sep="\t",row.names = FALSE)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
95
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
96 ####heatmaply
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
97
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
98 simulateExprData <- function(n, n0, p, rho0, rho1){
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
99 # n: total number of subjects
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
100 # n0: number of subjects with exposure 0
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
101 # n1: number of subjects with exposure 1
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
102 # p: number of genes
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
103 # rho0: rho between Z_i and Z_j for subjects with exposure 0
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
104 # rho1: rho between Z_i and Z_j for subjects with exposure 1
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
105
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
106 # Simulate gene expression values according to exposure 0 or 1,
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
107 # according to a centered multivariate normal distribution with
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
108 # covariance between Z_i and Z_j being rho^|i-j|
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
109 n1 <- n - n0
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
110 times <- 1:p
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
111 H <- abs(outer(times, times, "-"))
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
112 V0 <- rho0^H
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
113 V1 <- rho1^H
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
114
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
115 # rows are people, columns are genes
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
116 genes0 <- MASS::mvrnorm(n = n0, mu = rep(0,p), Sigma = V0)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
117 genes1 <- MASS::mvrnorm(n = n1, mu = rep(0,p), Sigma = V1)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
118 genes <- rbind(genes0,genes1)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
119 return(genes)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
120 }
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
121
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
122 #genes <- simulateExprData(n = 50, n0 = 25, p = 100, rho0 = 0.01, rho1 = 0.95)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
123
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
124 #heatmaply(genes, k_row = 2, k_col = 2)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
125
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
126 #heatmaply(cor(genes), k_row = 2, k_col = 2)
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
127
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
128
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
129
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
130
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
131
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
132
00960579bcd3 planemo upload commit 004439cca3c2fd3b5132eff246d846e5050bfd4f-dirty
proteore
parents:
diff changeset
133