Previous changeset 12:9c037181588e (2017-02-01) Next changeset 14:225cb8347572 (2017-11-29) |
Commit message:
planemo upload commit 301d42e88026afdac618f4ec56fc6cbe19e3e419 |
modified:
CAMERA.r README.rst abims_CAMERA_annotateDiffreport.xml lib.r macros.xml static/images/annotate_workflow.png test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv |
added:
test-data/CASMI_extended_NEG_rules.csv test-data/CASMI_extended_POS_rules.csv test-data/faahKO-single.xset.merged.group.retcor.group.fillpeaks.RData test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.rules.dataMatrix.tsv test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.rules.variableMetadata.tsv test-data/ko15.CDF test-data/ko16.CDF test-data/wt15.CDF test-data/wt16.CDF |
removed:
tool_dependencies.xml |
b |
diff -r 9c037181588e -r 1c30ff90f3ae CAMERA.r --- a/CAMERA.r Wed Feb 01 12:24:04 2017 -0500 +++ b/CAMERA.r Fri Apr 07 07:42:18 2017 -0400 |
[ |
@@ -11,12 +11,12 @@ #pkgs=c("xcms","batch") pkgs=c("parallel","BiocGenerics", "Biobase", "Rcpp", "mzR", "xcms","snow","igraph","CAMERA","multtest","batch") for(p in pkgs) { - suppressPackageStartupMessages(suppressWarnings(library(p, quietly=TRUE, logical.return=TRUE, character.only=TRUE))) - cat(p,"\t",as.character(packageVersion(p)),"\n",sep="") + suppressPackageStartupMessages(suppressWarnings(library(p, quietly=TRUE, logical.return=TRUE, character.only=TRUE))) + cat(p,"\t",as.character(packageVersion(p)),"\n",sep="") } source_local <- function(fname){ argv <- commandArgs(trailingOnly = FALSE); base_dir <- dirname(substring(argv[grep("--file=", argv)], 8)); source(paste(base_dir, fname, sep="/")) } -cat("\n\n"); +cat("\n\n"); @@ -34,25 +34,25 @@ #image is an .RData file necessary to use xset variable given by previous tools if (!is.null(listArguments[["image"]])){ - load(listArguments[["image"]]); listArguments[["image"]]=NULL + load(listArguments[["image"]]); listArguments[["image"]]=NULL } if (listArguments[["xfunction"]] %in% c("combinexsAnnos")) { - load(listArguments[["image_pos"]]) - xaP=xa - listOFlistArgumentsP=listOFlistArguments - if (exists("xsAnnotate_object")) xaP=xsAnnotate_object - - diffrepP=NULL - if (exists("diffrep")) diffrepP=diffrep + load(listArguments[["image_pos"]]) + xaP=xa + listOFlistArgumentsP=listOFlistArguments + if (exists("xsAnnotate_object")) xaP=xsAnnotate_object + + diffrepP=NULL + if (exists("diffrep")) diffrepP=diffrep - load(listArguments[["image_neg"]]) - xaN=xa - listOFlistArgumentsN=listOFlistArguments - if (exists("xsAnnotate_object")) xaN=xsAnnotate_object + load(listArguments[["image_neg"]]) + xaN=xa + listOFlistArgumentsN=listOFlistArguments + if (exists("xsAnnotate_object")) xaN=xsAnnotate_object - diffrepN=NULL - if (exists("diffrep")) diffrepN=diffrep + diffrepN=NULL + if (exists("diffrep")) diffrepN=diffrep } @@ -73,67 +73,42 @@ xsetRdataOutput = paste(thefunction,"RData",sep=".") if (!is.null(listArguments[["xsetRdataOutput"]])){ - xsetRdataOutput = listArguments[["xsetRdataOutput"]]; listArguments[["xsetRdataOutput"]]=NULL + xsetRdataOutput = listArguments[["xsetRdataOutput"]]; listArguments[["xsetRdataOutput"]]=NULL } rplotspdf = "Rplots.pdf" if (!is.null(listArguments[["rplotspdf"]])){ - rplotspdf = listArguments[["rplotspdf"]]; listArguments[["rplotspdf"]]=NULL + rplotspdf = listArguments[["rplotspdf"]]; listArguments[["rplotspdf"]]=NULL } dataMatrixOutput = "dataMatrix.tsv" if (!is.null(listArguments[["dataMatrixOutput"]])){ - dataMatrixOutput = listArguments[["dataMatrixOutput"]]; listArguments[["dataMatrixOutput"]]=NULL + dataMatrixOutput = listArguments[["dataMatrixOutput"]]; listArguments[["dataMatrixOutput"]]=NULL } variableMetadataOutput = "variableMetadata.tsv" if (!is.null(listArguments[["variableMetadataOutput"]])){ - variableMetadataOutput = listArguments[["variableMetadataOutput"]]; listArguments[["variableMetadataOutput"]]=NULL -} - -if (!is.null(listArguments[["new_file_path"]])){ - new_file_path = listArguments[["new_file_path"]]; listArguments[["new_file_path"]]=NULL + variableMetadataOutput = listArguments[["variableMetadataOutput"]]; listArguments[["variableMetadataOutput"]]=NULL } #Import the different functions source_local("lib.r") -#necessary to unzip .zip file uploaded to Galaxy -#thanks to .zip file it's possible to upload many file as the same time conserving the tree hierarchy of directories - - -if (!is.null(listArguments[["zipfile"]])){ - zipfile= listArguments[["zipfile"]]; listArguments[["zipfile"]]=NULL -} - # We unzip automatically the chromatograms from the zip files. if (thefunction %in% c("annotatediff")) { - if(exists("zipfile") && (zipfile!="")) { - if(!file.exists(zipfile)){ - error_message=paste("Cannot access the Zip file:",zipfile,". Please, contact your administrator ... if you have one!") - print(error_message) - stop(error_message) - } - - #unzip - suppressWarnings(unzip(zipfile, unzip="unzip")) - - #get the directory name - filesInZip=unzip(zipfile, list=T); - directories=unique(unlist(lapply(strsplit(filesInZip$Name,"/"), function(x) x[1]))); - directories=directories[!(directories %in% c("__MACOSX")) & file.info(directories)$isdir] - directory = "." - if (length(directories) == 1) directory = directories - - cat("files_root_directory\t",directory,"\n") - } + if (!exists("zipfile")) zipfile=NULL + if (!exists("singlefile")) singlefile=NULL + rawFilePath = getRawfilePathFromArguments(singlefile, zipfile, listArguments) + zipfile = rawFilePath$zipfile + singlefile = rawFilePath$singlefile + listArguments = rawFilePath$listArguments + directory = retrieveRawfileInTheWorkingDirectory(singlefile, zipfile) } - #addition of xset object to the list of arguments in the first position if (exists("xset") != 0){ - listArguments=append(list(xset), listArguments) + listArguments=append(list(xset), listArguments) } cat("\n\n") @@ -149,25 +124,32 @@ if (thefunction %in% c("annotatediff")) { - results_list=annotatediff(xset=xset,listArguments=listArguments,variableMetadataOutput=variableMetadataOutput,dataMatrixOutput=dataMatrixOutput,new_file_path=new_file_path) - xa=results_list[["xa"]] - diffrep=results_list[["diffrep"]] - variableMetadata=results_list[["variableMetadata"]] + results_list=annotatediff(xset=xset,listArguments=listArguments,variableMetadataOutput=variableMetadataOutput,dataMatrixOutput=dataMatrixOutput) + xa=results_list[["xa"]] + diffrep=results_list[["diffrep"]] + variableMetadata=results_list[["variableMetadata"]] - cat("\n\n") - cat("\tXSET OBJECT INFO\n") - print(xa) + cat("\n\n") + cat("\tXSET OBJECT INFO\n") + print(xa) } if (thefunction %in% c("combinexsAnnos")) { - cAnnot=combinexsAnnos_function(xaP=xaP,xaN=xaN,listOFlistArgumentsP=listOFlistArgumentsP,listOFlistArgumentsN=listOFlistArgumentsN,diffrepP=diffrepP,diffrepN=diffrepN,convert_param=listArguments[["convert_param"]],pos=listArguments[["pos"]],tol=listArguments[["tol"]],ruleset=listArguments[["ruleset"]],keep_meta=listArguments[["keep_meta"]],variableMetadataOutput=variableMetadataOutput) + cAnnot=combinexsAnnos_function( + xaP=xaP,xaN=xaN, + listOFlistArgumentsP=listOFlistArgumentsP,listOFlistArgumentsN=listOFlistArgumentsN, + diffrepP=diffrepP,diffrepN=diffrepN, + pos=listArguments[["pos"]],tol=listArguments[["tol"]],ruleset=listArguments[["ruleset"]],keep_meta=listArguments[["keep_meta"]], + convertRTMinute=listArguments[["convertRTMinute"]], numDigitsMZ=listArguments[["numDigitsMZ"]], numDigitsRT=listArguments[["numDigitsRT"]], + variableMetadataOutput=variableMetadataOutput + ) } dev.off() #saving R data in .Rdata file to save the variables used in the present tool -objects2save = c("xa","variableMetadata","diffrep","cAnnot","listOFlistArguments","zipfile") +objects2save = c("xa","variableMetadata","diffrep","cAnnot","listOFlistArguments","zipfile","singlefile") save(list=objects2save[objects2save %in% ls()], file=xsetRdataOutput) cat("\n\n") |
b |
diff -r 9c037181588e -r 1c30ff90f3ae README.rst --- a/README.rst Wed Feb 01 12:24:04 2017 -0500 +++ b/README.rst Fri Apr 07 07:42:18 2017 -0400 |
b |
@@ -2,6 +2,21 @@ Changelog/News -------------- +**Version 2.2.0 - 03/02/2017** + +- BUGFIX: the diffreport ids didn't convert the rt in minute as the other export + +- UPDATE: the settings (digits, convertion in minutes) of the identifiants will no longer modify the native one. Because we want to be conservative and because it can be dangerous for the data integrity during a futur merge of the table, we decide to put those customization in a new column namecustom within the variableMetadata. + +- IMPROVEMENT: add some sections within the form to separate the different parts of the process + +- IMPROVEMENT: add the possibility to use defined ruleset + +- IMPROVEMENT: add the possibility to set the MZ digit within the identifiants + +- IMPROVEMENT: CAMERA.annotate is now compatible with merged individual data from xcms.xcmsSet + + **Version 2.1.5 - 21/04/2016** - UPGRADE: upgrate the CAMERA version from 1.22.0 to 1.26.0 @@ -22,26 +37,15 @@ - UPDATE: refactoring of internal management of inputs/outputs -VERSION 2.1.0 - 09/10/2015** +**VERSION 2.1.0 - 09/10/2015** - BUGFIX: There was a bug with the CAMERA.annotate (generating a bad dataMatrix (intensities which don't match with the metabolites)) -VERSION 2.1.0 - 07/06/2015** +**VERSION 2.1.0 - 07/06/2015** - IMPROVEMENT: new datatype/dataset formats (rdata.camera.positive, rdata.camera.negative, rdata.camera.quick ...) will facilitate the sequence of tools and so avoid incompatibility errors. - IMPROVEMENT: parameter labels have changed to facilitate their reading. - UPDATE: merged with annotateDiffreport. Some parameters are dedicated to experiences with several conditions - - - -Test Status ------------ - -Planemo test using conda: passed - -Planemo test using source env.sh: passed - -Planemo shed_test : passed |
b |
diff -r 9c037181588e -r 1c30ff90f3ae abims_CAMERA_annotateDiffreport.xml --- a/abims_CAMERA_annotateDiffreport.xml Wed Feb 01 12:24:04 2017 -0500 +++ b/abims_CAMERA_annotateDiffreport.xml Fri Apr 07 07:42:18 2017 -0400 |
[ |
b'@@ -1,7 +1,7 @@\n-<tool id="abims_CAMERA_annotateDiffreport" name="CAMERA.annotate" version="2.1.5">\n+<tool id="abims_CAMERA_annotateDiffreport" name="CAMERA.annotate" version="2.2.0">\n \n <description>CAMERA annotate function. Returns annotation results (isotope peaks, adducts and fragments) and a diffreport if more than one condition.</description>\n- \n+\n <macros>\n <import>macros.xml</import>\n </macros>\n@@ -11,213 +11,225 @@\n \n <command><![CDATA[\n @COMMAND_CAMERA_SCRIPT@\n- xfunction annotatediff \n- image $image\n+ xfunction annotatediff\n+ image \'$image\'\n \n- variableMetadataOutput $variableMetadata\n- dataMatrixOutput $datamatrix\n- xsetRdataOutput $rdata\n-\n- convert_param $convert_param num_digits $num_digits \n nSlaves \\${GALAXY_SLOTS:-1}\n- sigma $sigma perfwhm $perfwhm \n- maxcharge $maxcharge maxiso $maxiso minfrac $minfrac\n- ppm $ppm mzabs $mzabs intval $intval \n- max_peaks $max_peaks\n+\n+ ## output\n+ variableMetadataOutput \'$variableMetadata\'\n+ dataMatrixOutput \'$datamatrix\'\n+\n+ ## groupFWHM\n+ sigma $groupfwhm.sigma\n+ perfwhm $groupfwhm.perfwhm\n+\n+ ## findGeneral\n+ ppm $findgeneral.ppm\n+ mzabs $findgeneral.mzabs\n+\n+ ## findIsotopes\n+ maxcharge $findisotopes.maxcharge\n+ maxiso $findisotopes.maxiso\n+ minfrac $findisotopes.minfrac\n+\n quick $quick_block.quick\n- #if $quick_block.quick == "FALSE"\n- polarity $quick_block.polarity\n- cor_eic_th $quick_block.cor_eic_th\n- graphMethod $quick_block.graphMethod \n- pval $quick_block.pval \n- calcCiS $quick_block.calcCiS\n- calcIso $quick_block.calcIso\n- calcCaS $quick_block.calcCaS\n- multiplier $quick_block.multiplier\n+ #if $quick_block.quick == "FALSE":\n+ xsetRdataOutput \'$rdata_quick_false\'\n+\n+ ## groupcorr\n+ cor_eic_th $quick_block.groupcorr.cor_eic_th\n+ graphMethod $quick_block.groupcorr.graphMethod\n+ pval $quick_block.groupcorr.pval\n+ calcCiS $quick_block.groupcorr.calcCiS\n+ calcIso $quick_block.groupcorr.calcIso\n+ calcCaS $quick_block.groupcorr.calcCaS\n+\n+ ## findadducts\n+ polarity $quick_block.findadducts.polarity\n+ max_peaks $quick_block.findadducts.max_peaks\n+ #if $quick_block.findadducts.rules_block.rules_select == "FALSE":\n+ multiplier $quick_block.findadducts.rules_block.multiplier\n+ #else\n+ rules $quick_block.findadducts.rules_block.rules\n+ #end if\n+ #else\n+ xsetRdataOutput \'$rdata_quick_true\'\n #end if\n \n- #if $options.option == "show":\n+ #if $diffreport.options.option == "show":\n+ ## diffreport\n runDiffreport TRUE\n- eicmax $options.eicmax\n- eicwidth $options.eicwidth\n- value $options.value\n- sortpval $options.sortpval \n- h $options.h\n- w $options.w\n- mzdec $options.mzdec\n- new_file_path ${__new_file_path__}/primary_${output_diffreport.id}_\n+ eicmax $diffreport.options.eicmax\n+ eicwidth $diffreport.options.eicwidth\n+ value $diffreport.options.value\n+ sortpval $diffreport.options.sortpval\n+ h $diffreport.options.h\n+ w $diffreport.options.w\n+ mzdec $diffreport.options.mzdec\n #end if\n- \n- @COMMAND_ZIPFILE_LOAD@\n+\n+ @COMMAND_PEAKLIST@\n+\n+ @COMMAND_FILE_LOAD@\n \n ]]></command>\n \n <inputs>\n- \n- \n+\n+\n <param name="image" type="data" label="RData file" format="rdata.xcms.fillpeaks,rdata" help="output file from another function xcms (fillPeaks)" />\n \n- <param name="convert_param" type="boolean" che'..b'ive |\n+|CAMERA_combinexsAnnot |xset.annotate.Rdata | rdata.camera.positive or rdata.camera.negative |\n +---------------------------+---------------------------------------+------------------------------------------------+\n |Determine Vdk or Lowess |xset.annotate.dataMatrix.tsv | Tabular |\n +---------------------------+---------------------------------------+------------------------------------------------+\n@@ -303,6 +315,22 @@\n +---------------------------+---------------------------+\n \n \n+[Optional] User defined ruleset:\n+--------------------------------\n+\n+Example:\n+\n+ | "name","nmol","charge","massdiff","oidscore","quasi","ips"\n+ | "[M-H]-",1,-1,-1.007276,1,1,1\n+ | "[M-2H]2-",1,-2,-2.014552,2,0,1\n+ | "[M-3H]3-",1,-3,-3.021828,3,0,1\n+ | "[M-2H+Na]-",1,-1,20.974666,4,0,0.25\n+ | "[M-H+Cl]2-",1,-2,33.962126,5,0,1\n+ | "[M-2H+K]-",1,-1,36.948606,6,0,0.25\n+ | "[M+Cl]-",1,-1,34.969402,7,1,1\n+ | "[M+2Cl]2-",1,-2,69.938804,8,0,1\n+ | "[2M-H]-",2,-1,-1.007276,1,0,0.5\n+\n ----------\n Parameters\n ----------\n@@ -328,7 +356,7 @@\n xset.annotate.dataMatrix.tsv\n \n | A tabular file which represents for each metabolite (row), the value of the intensity in each sample (column).\n- \n+\n xset.annotate.zip\n \n | It contains filebase_eic, filebase_box and filebase.tsv for one conditon vs another (Anova analysis).\n@@ -336,10 +364,10 @@\n xset.annotate.Rdata rdata.camera.quick or rdata.camera.positive or rdata.camera.negative\n \n | Rdata file, that be used outside Galaxy in R.\n- \n+\n ------\n \n-.. class:: infomark \n+.. class:: infomark\n \n The output **"xset.annotate.dataMatrix.tsv"** is a tabular file. You can continue your analysis using it in the following tools of the workflow:\n \n@@ -349,7 +377,7 @@\n | PCA (Statistical analysis)\n | Hierarchical Clustering (Statistical analysis)\n \n- \n+\n ---------------------------------------------------\n \n ---------------\n@@ -377,7 +405,7 @@\n | eicmax -> **200**\n | eicwidth -> **200 (default)**\n \n- \n+\n \n Output files\n ------------\n@@ -386,7 +414,7 @@\n \n .. image:: annotatediffreport_dataMatrix.png\n \n-**Example of a part of xset.annotate.variableMetadata.tsv output** \n+**Example of a part of xset.annotate.variableMetadata.tsv output**\n \n .. image:: annotatediffreport_variableMetadata.png\n \n@@ -396,9 +424,24 @@\n Changelog/News\n --------------\n \n+**Version 2.2.0 - 28/03/2017**\n+\n+- BUGFIX: the diffreport ids didn\'t convert the rt in minute as the other export\n+\n+- UPDATE: the settings (digits, convertion in minutes) of the identifiants will no longer modify the native one. Because we want to be conservative and because it can be dangerous for the data integrity during a futur merge of the table, we decide to put those customization in a new column namecustom within the variableMetadata.\n+\n+- IMPROVEMENT: add some sections within to separate the different parts of the process\n+\n+- IMPROVEMENT: add the possibility to use defined ruleset\n+\n+- IMPROVEMENT: add the possibility to set the MZ digit within the identifiants\n+\n+- IMPROVEMENT: CAMERA.annotate is now compatible with merged individual data from xcms.xcmsSet\n+\n+\n **Version 2.1.5 - 21/04/2016**\n \n-- UPGRADE: upgrate the CAMERA version from 1.22.0 to 1.26.0\n+- UPGRADE: upgrade the CAMERA version from 1.22.0 to 1.26.0\n \n \n **Version 2.1.4 - 18/04/2016**\n@@ -417,12 +460,12 @@\n - UPDATE: refactoring of internal management of inputs/outputs\n \n \n-VERSION 2.1.0 - 09/10/2015**\n+**VERSION 2.1.0 - 09/10/2015**\n \n - BUGFIX: There was a bug with the CAMERA.annotate (generating a bad dataMatrix (intensities which don\'t match with the metabolites))\n \n \n-VERSION 2.1.0 - 07/06/2015**\n+**VERSION 2.1.0 - 07/06/2015**\n \n - IMPROVEMENT: new datatype/dataset formats (rdata.camera.positive, rdata.camera.negative, rdata.camera.quick ...) will facilitate the sequence of tools and so avoid incompatibility errors.\n \n@@ -437,5 +480,3 @@\n \n \n </tool>\n- \n- \n' |
b |
diff -r 9c037181588e -r 1c30ff90f3ae lib.r --- a/lib.r Wed Feb 01 12:24:04 2017 -0500 +++ b/lib.r Fri Apr 07 07:42:18 2017 -0400 |
[ |
b'@@ -1,188 +1,304 @@\n-# lib.r version="2.2.1"\n+# lib.r\n+\n+#@author G. Le Corguille\n+#The function create a pdf from the different png generated by diffreport\n+diffreport_png2pdf <- function(filebase) {\n+ dir.create("pdf")\n \n-#The function create a pdf from the different png generated by diffreport\n-diffreport_png2pdf <- function(filebase, new_file_path) {\n+ pdfEicOutput = paste0("pdf/",filebase,"-eic_pdf.pdf")\n+ pdfBoxOutput = paste0("pdf/",filebase,"-box_pdf.pdf")\n+\n+ system(paste0("gm convert ",filebase,"_eic/*.png ",pdfEicOutput))\n+ system(paste0("gm convert ",filebase,"_box/*.png ",pdfBoxOutput))\n+\n+}\n \n- pdfEicOutput = paste(new_file_path,filebase,"-eic_visible_pdf",sep="")\n- pdfBoxOutput = paste(new_file_path,filebase,"-box_visible_pdf",sep="")\n+#@author G. Le Corguille\n+#This function convert if it is required the Retention Time in minutes\n+RTSecondToMinute <- function(variableMetadata, convertRTMinute) {\n+ if (convertRTMinute){\n+ #converting the retention times (seconds) into minutes\n+ print("converting the retention times into minutes in the variableMetadata")\n+ variableMetadata[,"rt"]=variableMetadata[,"rt"]/60\n+ variableMetadata[,"rtmin"]=variableMetadata[,"rtmin"]/60\n+ variableMetadata[,"rtmax"]=variableMetadata[,"rtmax"]/60\n+ }\n+ return (variableMetadata)\n+}\n \n- system(paste("gm convert ",filebase,"_eic/*.png ",filebase,"_eic.pdf",sep=""))\n- system(paste("gm convert ",filebase,"_box/*.png ",filebase,"_box.pdf",sep=""))\n-\n- file.copy(paste(filebase,"_eic.pdf",sep=""), pdfEicOutput)\n- file.copy(paste(filebase,"_box.pdf",sep=""), pdfBoxOutput)\n+#@author G. Le Corguille\n+#This function format ions identifiers\n+formatIonIdentifiers <- function(variableMetadata, numDigitsRT=0, numDigitsMZ=0) {\n+ splitDeco = strsplit(as.character(variableMetadata$name),"_")\n+ idsDeco = sapply(splitDeco, function(x) { deco=unlist(x)[2]; if (is.na(deco)) return ("") else return(paste0("_",deco)) })\n+ namecustom = make.unique(paste0("M",round(variableMetadata[,"mz"],numDigitsMZ),"T",round(variableMetadata[,"rt"],numDigitsRT),idsDeco))\n+ variableMetadata=cbind(name=variableMetadata$name, namecustom=namecustom, variableMetadata[,!(colnames(variableMetadata) %in% c("name"))])\n+ return(variableMetadata)\n }\n \n #The function annotateDiffreport without the corr function which bugs\n-annotatediff <- function(xset=xset, listArguments=listArguments, variableMetadataOutput="variableMetadata.tsv", dataMatrixOutput="dataMatrix.tsv",new_file_path=NULL) {\n- # Resolve the bug with x11, with the function png\n- options(bitmapType=\'cairo\')\n-\n- #Check if the fillpeaks step has been done previously, if it hasn\'t, there is an error message and the execution is stopped.\n- res=try(is.null(xset@filled))\n-\n- # ------ annot -------\n- listArguments[["calcCiS"]]=as.logical(listArguments[["calcCiS"]])\n- listArguments[["calcIso"]]=as.logical(listArguments[["calcIso"]])\n- listArguments[["calcCaS"]]=as.logical(listArguments[["calcCaS"]])\n+annotatediff <- function(xset=xset, listArguments=listArguments, variableMetadataOutput="variableMetadata.tsv", dataMatrixOutput="dataMatrix.tsv") {\n+ # Resolve the bug with x11, with the function png\n+ options(bitmapType=\'cairo\')\n \n- #graphMethod parameter bugs where this parameter is not defined in quick=true\n- if(listArguments[["quick"]]==TRUE) {\n- xa= annotate(object=xset,nSlaves=1,sigma=listArguments[["sigma"]],perfwhm=listArguments[["perfwhm"]],maxcharge=listArguments[["maxcharge"]],maxiso=listArguments[["maxiso"]],minfrac=listArguments[["minfrac"]],ppm=listArguments[["ppm"]],mzabs=listArguments[["mzabs"]],quick=listArguments[["quick"]],polarity=listArguments[["polarity"]],max_peaks=listArguments[["max_peaks"]],intval=listArguments[["intval"]])\n- }\n- else {\n- xa= annotate(object=xset,nSlaves=1,sigma=listArguments[["sigma"]],perfwhm=listArguments[["perfwhm"]],graphMethod=listArguments[["graphMethod"]],cor_eic_th=listArguments[["cor_'..b'sep="\\t", quote=FALSE, row.names=FALSE, file=variableMetadataOutput)\n+ return(variableMetadata);\n \n }\n+\n+# This function get the raw file path from the arguments\n+getRawfilePathFromArguments <- function(singlefile, zipfile, listArguments) {\n+ if (!is.null(listArguments[["zipfile"]])) zipfile = listArguments[["zipfile"]]\n+ if (!is.null(listArguments[["zipfilePositive"]])) zipfile = listArguments[["zipfilePositive"]]\n+ if (!is.null(listArguments[["zipfileNegative"]])) zipfile = listArguments[["zipfileNegative"]]\n+\n+ if (!is.null(listArguments[["singlefile_galaxyPath"]])) {\n+ singlefile_galaxyPaths = listArguments[["singlefile_galaxyPath"]];\n+ singlefile_sampleNames = listArguments[["singlefile_sampleName"]]\n+ }\n+ if (!is.null(listArguments[["singlefile_galaxyPathPositive"]])) {\n+ singlefile_galaxyPaths = listArguments[["singlefile_galaxyPathPositive"]];\n+ singlefile_sampleNames = listArguments[["singlefile_sampleNamePositive"]]\n+ }\n+ if (!is.null(listArguments[["singlefile_galaxyPathNegative"]])) {\n+ singlefile_galaxyPaths = listArguments[["singlefile_galaxyPathNegative"]];\n+ singlefile_sampleNames = listArguments[["singlefile_sampleNameNegative"]]\n+ }\n+ if (exists("singlefile_galaxyPaths")){\n+ singlefile_galaxyPaths = unlist(strsplit(singlefile_galaxyPaths,","))\n+ singlefile_sampleNames = unlist(strsplit(singlefile_sampleNames,","))\n+\n+ singlefile=NULL\n+ for (singlefile_galaxyPath_i in seq(1:length(singlefile_galaxyPaths))) {\n+ singlefile_galaxyPath=singlefile_galaxyPaths[singlefile_galaxyPath_i]\n+ singlefile_sampleName=singlefile_sampleNames[singlefile_galaxyPath_i]\n+ singlefile[[singlefile_sampleName]] = singlefile_galaxyPath\n+ }\n+ }\n+ for (argument in c("zipfile","zipfilePositive","zipfileNegative","singlefile_galaxyPath","singlefile_sampleName","singlefile_galaxyPathPositive","singlefile_sampleNamePositive","singlefile_galaxyPathNegative","singlefile_sampleNameNegative")) {\n+ listArguments[[argument]]=NULL\n+ }\n+ return(list(zipfile=zipfile, singlefile=singlefile, listArguments=listArguments))\n+}\n+\n+\n+# This function retrieve the raw file in the working directory\n+# - if zipfile: unzip the file with its directory tree\n+# - if singlefiles: set symlink with the good filename\n+retrieveRawfileInTheWorkingDirectory <- function(singlefile, zipfile) {\n+ if(!is.null(singlefile) && (length("singlefile")>0)) {\n+ for (singlefile_sampleName in names(singlefile)) {\n+ singlefile_galaxyPath = singlefile[[singlefile_sampleName]]\n+ if(!file.exists(singlefile_galaxyPath)){\n+ error_message=paste("Cannot access the sample:",singlefile_sampleName,"located:",singlefile_galaxyPath,". Please, contact your administrator ... if you have one!")\n+ print(error_message); stop(error_message)\n+ }\n+\n+ file.symlink(singlefile_galaxyPath,singlefile_sampleName)\n+ }\n+ directory = "."\n+\n+ }\n+ if(!is.null(zipfile) && (zipfile!="")) {\n+ if(!file.exists(zipfile)){\n+ error_message=paste("Cannot access the Zip file:",zipfile,". Please, contact your administrator ... if you have one!")\n+ print(error_message)\n+ stop(error_message)\n+ }\n+\n+ #list all file in the zip file\n+ #zip_files=unzip(zipfile,list=T)[,"Name"]\n+\n+ #unzip\n+ suppressWarnings(unzip(zipfile, unzip="unzip"))\n+\n+ #get the directory name\n+ filesInZip=unzip(zipfile, list=T);\n+ directories=unique(unlist(lapply(strsplit(filesInZip$Name,"/"), function(x) x[1])));\n+ directories=directories[!(directories %in% c("__MACOSX")) & file.info(directories)$isdir]\n+ directory = "."\n+ if (length(directories) == 1) directory = directories\n+\n+ cat("files_root_directory\\t",directory,"\\n")\n+\n+ }\n+ return (directory)\n+}\n' |
b |
diff -r 9c037181588e -r 1c30ff90f3ae macros.xml --- a/macros.xml Wed Feb 01 12:24:04 2017 -0500 +++ b/macros.xml Fri Apr 07 07:42:18 2017 -0400 |
[ |
b'@@ -2,12 +2,11 @@\n <macros>\n <xml name="requirements">\n <requirements>\n-\t <requirement type="package" version="0.4_1">r-snow</requirement>\n+ <requirement type="package" version="0.4_1">r-snow</requirement>\n <requirement type="package" version="1.26.0">bioconductor-camera</requirement>\n <requirement type="package" version="2.26.0">bioconductor-multtest</requirement>\n-\t <requirement type="package" version="1.1_4">r-batch</requirement>\n- <requirement type="package" version="1.6.27">libpng</requirement>\n- <requirement type="package" version="1.3.20">graphicsmagick</requirement>\n+ <requirement type="package" version="1.1_4">r-batch</requirement>\n+ <requirement type="package" version="1.3.23">graphicsmagick</requirement>\n </requirements>\n </xml>\n <xml name="stdio">\n@@ -19,33 +18,137 @@\n <token name="@COMMAND_CAMERA_SCRIPT@">\n LANG=C Rscript $__tool_directory__/CAMERA.r\n </token>\n- \n- <!-- zipfile load for planemo test -->\n- <token name="@COMMAND_ZIPFILE_LOAD@">\n- #if $zipfile_load_conditional.zipfile_load_select == "yes":\n- #if $zipfile_load_conditional.zip_file:\n- zipfile $zipfile_load_conditional.zip_file\n+\n+ <!-- raw file load for planemo test -->\n+ <token name="@COMMAND_FILE_LOAD@">\n+ #if $file_load_section.file_load_conditional.file_load_select == "yes":\n+ #if $file_load_section.file_load_conditional.input[0].is_of_type("mzxml") or $file_load_section.file_load_conditional.input[0].is_of_type("mzml") or $file_load_section.file_load_conditional.input[0].is_of_type("mzdata") or $file_load_section.file_load_conditional.input[0].is_of_type("netcdf"):\n+ #set singlefile_galaxyPath = \',\'.join( [ str( $single_file ) for $single_file in $file_load_section.file_load_conditional.input ] )\n+ #set singlefile_sampleName = \',\'.join( [ str( $single_file.name ) for $single_file in $file_load_section.file_load_conditional.input ] )\n+ singlefile_galaxyPath \'$singlefile_galaxyPath\' singlefile_sampleName \'$singlefile_sampleName\'\n+ #else\n+ zipfile \'$file_load_section.file_load_conditional.input\'\n #end if\n- #end if \n+ #end if\n+ </token>\n+\n+ <xml name="input_file_load">\n+ <section name="file_load_section" title="Resubmit your raw dataset or your zip file">\n+ <conditional name="file_load_conditional">\n+ <param name="file_load_select" type="select" label="Resubmit your dataset or your zip file" help="Use only if you get a message which say that your original dataset or zip file have been deleted on the server." >\n+ <option value="no" >no need</option>\n+ <option value="yes" >yes</option>\n+ </param>\n+ <when value="no">\n+ </when>\n+ <when value="yes">\n+ <param name="input" type="data" format="mzxml,mzml,mzdata,netcdf,no_unzip.zip,zip" multiple="true" label="File(s) from your history containing your chromatograms" help="Single file mode for the format: mzxml, mzml, mzdata and netcdf. Zip file mode for the format: no_unzip.zip, zip. See the help section below." />\n+ </when>\n+ </conditional>\n+ </section>\n+ </xml>\n+\n+ <xml name="test_file_load_zip">\n+ <section name="file_load_section">\n+ <conditional name="file_load_conditional">\n+ <param name="file_load_select" value="yes" />\n+ <param name="input" value="faahKO_reduce.zip" ftype="zip" />\n+ </conditional>\n+ </section>\n+ </xml>\n+\n+ <xml name="test_file_load_single">\n+ <section name="file_load_section">\n+ <conditional name="file_load_conditional">\n+ <param name="file_load_select" value="yes" />\n+ <param name="input'..b'ion>\n+\n+ <xml name="input_peaklist">\n+ <section name="export" title="Export options">\n+ <param name="convertRTMinute" type="boolean" checked="false" truevalue="TRUE" falsevalue="FALSE" label="Convert retention time (seconds) into minutes" help="Convert the columns rtmed, rtmin and rtmax into minutes"/>\n+ <param name="numDigitsMZ" type="integer" value="4" label="Number of decimal places for mass values reported in ions\' identifiers." help="A minimum of 4 decimal places is recommended. Useful to avoid duplicates within identifiers" />\n+ <param name="numDigitsRT" type="integer" value="0" label="Number of decimal places for retention time values reported in ions\' identifiers." help="Useful to avoid duplicates within identifiers" />\n+ <param name="intval" type="select" label="General used intensity value" help="[intval] See the help section below">\n+ <option value="into" selected="true">into</option>\n+ <option value="maxo" >maxo</option>\n+ <option value="intb">intb</option>\n </param>\n- <when value="no">\n- </when>\n- <when value="yes">\n- <param name="zip_file" type="data" format="no_unzip.zip,zip" label="Zip file" />\n- </when>\n+ </section>\n+ </xml>\n+\n+ <xml name="test_peaklist">\n+ <section name="export">\n+ <param name="convertRTMinute" value="True"/>\n+ <param name="numDigitsMZ" value="4" />\n+ <param name="numDigitsRT" value="1" />\n+ <param name="intval" value="into"/>\n+ </section>\n+ </xml>\n+\n+ <!-- annotate_diffreport <test> commun part -->\n+ <xml name="test_annotate_diffreport">\n+ <section name="groupfwhm">\n+ <param name="sigma" value="6"/>\n+ <param name="perfwhm" value="0.6"/>\n+ </section>\n+ <section name="findisotopes">\n+ <param name="maxcharge" value="3"/>\n+ <param name="maxiso" value="4"/>\n+ <param name="minfrac" value="0.5"/>\n+ </section>\n+ <section name="findgeneral">\n+ <param name="ppm" value="5"/>\n+ <param name="mzabs" value="0.015"/>\n+ <param name="max_peaks" value="100"/>\n+ </section>\n+ <section name="diffreport">\n+ <conditional name="options">\n+ <param name="option" value="show"/>\n+ <param name="eicmax" value="200"/>\n+ <param name="eicwidth" value="200"/>\n+ <param name="value" value="into"/>\n+ <param name="h" value="480"/>\n+ <param name="w" value="640"/>\n+ <param name="mzdec" value="2"/>\n+ <param name="sortpval" value="False"/>\n+ </conditional>\n+ </section>\n+ <expand macro="test_peaklist"/>\n+ </xml>\n+\n+ <xml name="test_annotate_quick_false">\n+ <param name="quick" value="FALSE"/>\n+ <section name="groupcorr">\n+ <param name="cor_eic_th" value="0.75"/>\n+ <param name="graphMethod" value="hcs"/>\n+ <param name="pval" value="0.05"/>\n+ <param name="calcCiS" value="True"/>\n+ <param name="calcIso" value="False"/>\n+ <param name="calcCaS" value="False"/>\n+ </section>\n+ </xml>\n+\n+ <xml name="test_annotate_quick_true">\n+ <conditional name="quick_block">\n+ <param name="quick" value="TRUE"/>\n </conditional>\n </xml>\n- \n+\n <token name="@HELP_AUTHORS@">\n .. class:: infomark\n \n-**Authors** Colin A. Smith csmith@scripps.edu, Ralf Tautenhahn rtautenh@gmail.com, Steffen Neumann sneumann@ipb-halle.de, Paul Benton hpaul.benton08@imperial.ac.uk and Christopher Conley cjconley@ucdavis.edu \n+**Authors** Colin A. Smith csmith@scripps.edu, Ralf Tautenhahn rtautenh@gmail.com, Steffen Neumann sneumann@ipb-halle.de, Paul Benton hpaul.benton08@imperial.ac.uk and Christopher Conley cjconley@ucdavis.edu\n \n .. class:: infomark\n \n' |
b |
diff -r 9c037181588e -r 1c30ff90f3ae static/images/annotate_workflow.png |
b |
Binary file static/images/annotate_workflow.png has changed |
b |
diff -r 9c037181588e -r 1c30ff90f3ae test-data/CASMI_extended_NEG_rules.csv --- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/test-data/CASMI_extended_NEG_rules.csv Fri Apr 07 07:42:18 2017 -0400 |
[ |
@@ -0,0 +1,111 @@ +"name","nmol","charge","massdiff","oidscore","quasi","ips" +"[M-H]-",1,-1,-1.007276,1,1,1 +"[M-2H]2-",1,-2,-2.014552,2,0,1 +"[M-3H]3-",1,-3,-3.021828,3,0,1 +"[M-2H+Na]-",1,-1,20.974666,4,0,0.25 +"[M-H+Cl]2-",1,-2,33.962126,5,0,1 +"[M-2H+K]-",1,-1,36.948606,6,0,0.25 +"[M+Cl]-",1,-1,34.969402,7,1,1 +"[M+2Cl]2-",1,-2,69.938804,8,0,1 +"[2M-H]-",2,-1,-1.007276,1,0,0.5 +"[2M-2H]2-",2,-2,-2.014552,2,0,0.5 +"[2M-3H]3-",2,-3,-3.021828,3,0,0.5 +"[2M-2H+Na]-",2,-1,20.974666,4,0,0.25 +"[2M-H+Cl]2-",2,-2,33.962126,5,0,0.5 +"[2M-2H+K]-",2,-1,36.948606,6,0,0.25 +"[2M+Cl]-",2,-1,34.969402,7,0,0.5 +"[2M+2Cl]2-",2,-2,69.938804,8,0,0.5 +"[3M-H]-",3,-1,-1.007276,1,0,0.5 +"[3M-2H]2-",3,-2,-2.014552,2,0,0.5 +"[3M-3H]3-",3,-3,-3.021828,3,0,0.5 +"[3M-2H+Na]-",3,-1,20.974666,4,0,0.25 +"[3M-H+Cl]2-",3,-2,33.962126,5,0,0.5 +"[3M-2H+K]-",3,-1,36.948606,6,0,0.25 +"[3M+Cl]-",3,-1,34.969402,7,0,0.5 +"[3M+2Cl]2-",3,-2,69.938804,8,0,0.5 +"[M+Cl+NaCOOH]-",1,-1,102.956842,9,0,0.5 +"[M-H+NaCOOH]-",1,-1,66.980164,10,0,0.5 +"[M+Cl+HCOOH]-",1,-1,80.974872,11,0,0.5 +"[M+HCOO]-",1,-1,44.99765,12,0,1 +"[M+Cl+CF3COOH]-",1,-1,148.962402,13,0,0.5 +"[M-H+CF3COOH]-",1,-1,112.985724,14,0,0.5 +"[M+Cl+NH3]-",1,-1,51.995952,15,0,0.5 +"[M-H+NH3]-",1,-1,16.019274,16,0,0.5 +"[M-H-CH4]-",1,-1,-17.038576,17,0,0.25 +"[M-H-CO]-",1,-1,-29.002176,18,0,0.25 +"[M-H-C2H2O2]-",1,-1,-47.012746,19,0,0.25 +"[M-H-C3H2O3]-",1,-1,-87.007666,20,0,0.25 +"[M-H-C5H8O4]-",1,-1,-133.049536,21,0,0.25 +"[M-H-C6H10O4]-",1,-1,-147.065186,22,0,0.25 +"[M-H-C6H10O5]-",1,-1,-163.060096,23,0,0.25 +"[M-H-C6H8O6]-",1,-1,-177.039366,24,0,0.25 +"[M-H-H2]-",1,-1,-3.02292607,25,0,0.25 +"[M-H-CH2]-",1,-1,-15.02292607,26,0,0.25 +"[M-H-CH3]-",1,-1,-16.030751105,27,0,0.25 +"[M-H-NH3]-",1,-1,-18.033826,28,0,0.25 +"[M-H-H2O]-",1,-1,-19.0178407,29,0,0.25 +"[M-H-H4O2]-",1,-1,-37.0284054,30,0,0.25 +"[M-H-HF]-",1,-1,-21.013504255,31,0,0.25 +"[M-H-C2H2]-",1,-1,-27.02292607,32,0,0.25 +"[M-H-C2H3]-",1,-1,-28.030751105,33,0,0.25 +"[M-H-HCN]-",1,-1,-28.018175037,34,0,0.25 +"[M-H-C2H4]-",1,-1,-29.03857614,35,0,0.25 +"[M-H-C2H6]-",1,-1,-31.05422621,36,0,0.25 +"[M-H-CH2O]-",1,-1,-31.0178407,37,0,0.25 +"[M-H-CH5N]-",1,-1,-32.049475177,38,0,0.25 +"[M-H-CH4O]-",1,-1,-33.03349077,39,0,0.25 +"[M-H-H2S]-",1,-1,-34.99499677,40,0,0.25 +"[M-H-HCl]-",1,-1,-36.983953755,41,0,0.25 +"[M-H-C3H2]-",1,-1,-39.02292607,42,0,0.25 +"[M-H-C2N]-",1,-1,-39.010350002,43,0,0.25 +"[M-H-F2]-",1,-1,-39.00408244,44,0,0.25 +"[M-H-C3H3]-",1,-1,-40.030751105,45,0,0.25 +"[M-H-HC2N]-",1,-1,-40.018175037,46,0,0.25 +"[M-H-C3H4]-",1,-1,-41.03857614,47,0,0.25 +"[M-H-C3H6]-",1,-1,-43.05422621,48,0,0.25 +"[M-H-C2H2O]-",1,-1,-43.0178407,49,0,0.25 +"[M-H-C3H6]-",1,-1,-43.05422621,50,0,0.25 +"[M-H-NCO]-",1,-1,-43.005264632,51,0,0.25 +"[M-H-CN2H2]-",1,-1,-43.029074074,52,0,0.25 +"[M-H-HCNO]-",1,-1,-44.013089667,53,0,0.25 +"[M-H-C2H4O]-",1,-1,-45.03349077,54,0,0.25 +"[M-H-CO2]-",1,-1,-44.99710526,55,0,0.25 +"[M-H-N2O]-",1,-1,-45.008338634,56,0,0.25 +"[M-H-CONH2]-",1,-1,-45.020914702,57,0,0.25 +"[M-H-NC2H7]-",1,-1,-46.065125247,58,0,0.25 +"[M-H-C2H6O]-",1,-1,-47.04914084,59,0,0.25 +"[M-H-NO2]-",1,-1,-47.000179262,60,0,0.25 +"[M-H-CH4S]-",1,-1,-49.01064684,61,0,0.25 +"[M-H-C4H4]-",1,-1,-53.03857614,62,0,0.25 +"[M-H-C2N2]-",1,-1,-53.013424004,63,0,0.25 +"[M-H-C4H6]-",1,-1,-55.05422621,64,0,0.25 +"[M-H-C4H8]-",1,-1,-57.06987628,65,0,0.25 +"[M-H-C3H6O]-",1,-1,-59.04914084,66,0,0.25 +"[M-H-C4H10]-",1,-1,-59.08552635,67,0,0.25 +"[M-H-C2H5NO]-",1,-1,-60.044389807,68,0,0.25 +"[M-H-C3H8O]-",1,-1,-61.06479091,69,0,0.25 +"[M-H-C2H4O2]-",1,-1,-61.0284054,70,0,0.25 +"[M-H-C2H5Cl]-",1,-1,-65.015253895,71,0,0.25 +"[M-H-C5H4]-",1,-1,-65.03857614,72,0,0.25 +"[M-H-SO2]-",1,-1,-64.96917596,73,0,0.25 +"[M-H-C5H8]-",1,-1,-69.06987628,74,0,0.25 +"[M-H-C5H12]-",1,-1,-73.10117642,75,0,0.25 +"[M-H-C3H6O2]-",1,-1,-75.04405547,76,0,0.25 +"[M-H-C4H10O]-",1,-1,-75.08044098,77,0,0.25 +"[M-H-C6H6]-",1,-1,-79.05422621,78,0,0.25 +"[M-H-CS2]-",1,-1,-76.9514174,79,0,0.25 +"[M-H-C5H5N]-",1,-1,-80.049475177,80,0,0.25 +"[M-H-HBr]-",1,-1,-80.933437135,81,0,0.25 +"[M-H-C2F4]-",1,-1,-101.00088888,82,0,0.25 +"[M-H-C2F6]-",1,-1,-138.99769532,83,0,0.25 +"[M-H-C7H6O2]-",1,-1,-123.04405547,84,0,0.25 +"[M-H-HI]-",1,-1,-128.919574035,85,0,0.25 +"[M-H-H6O3]-",1,-1,-55.0389701,87,0,0.25 +"[M-H-H8O4]-",1,-1,-73.0495348,88,0,0.25 +"[M-H-H10O5]-",1,-1,-91.0600995,89,0,0.25 +"[M-H-H12O6]-",1,-1,-109.0706642,90,0,0.25 +"[M-H-H14O7]-",1,-1,-127.0812289,91,0,0.25 +"[M-H-CH6O3]-",1,-1,-67.0389701,93,0,0.25 +"[M-H-CH4O2]-",1,-1,-49.0284054,94,0,0.25 +"[M-H-NaOH]-",1,-1,-40.999783365,95,0,0.25 +"[M-H-KOH]-",1,-1,-56.973723065,96,0,0.25 |
b |
diff -r 9c037181588e -r 1c30ff90f3ae test-data/CASMI_extended_POS_rules.csv --- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/test-data/CASMI_extended_POS_rules.csv Fri Apr 07 07:42:18 2017 -0400 |
[ |
b'@@ -0,0 +1,312 @@\n+"name","nmol","charge","massdiff","oidscore","quasi","ips"\r\n+"[M+H]+",1,1,1.007276,1,1,1\r\n+"[M+2H]2+",1,2,2.014552,2,0,1\r\n+"[M+3H]3+",1,3,3.021828,3,0,1\r\n+"[M+H+Na]2+",1,2,23.996494,4,0,0.5\r\n+"[M+H+K]2+",1,2,39.970434,6,0,0.5\r\n+"[M+Na]+",1,1,22.989218,7,1,1\r\n+"[M+2Na]2+",1,2,45.978436,8,0,0.75\r\n+"[M+K]+",1,1,38.963158,9,1,1\r\n+"[M+Na+K]2+",1,2,61.952376,10,0,0.75\r\n+"[M+2Na+K]3+",1,3,84.941594,11,0,0.75\r\n+"[M+2K]2+",1,2,77.926316,12,0,0.75\r\n+"[M+Na+2K]3+",1,3,100.915534,13,0,0.75\r\n+"[M+2Na-H]+",1,1,44.97116,15,0,0.25\r\n+"[M+3Na-H]2+",1,2,67.960378,16,0,0.25\r\n+"[M+Na+K-H]+",1,1,60.9451,17,0,0.25\r\n+"[M+2Na+K-H]2+",1,2,83.934318,18,0,0.25\r\n+"[M+3Na+K-H]3+",1,3,106.923536,19,0,0.25\r\n+"[M+Na+2K-H]2+",1,2,99.908258,20,0,0.25\r\n+"[M+2Na+2K-H]3+",1,3,122.897476,21,0,0.25\r\n+"[M+2K-H]+",1,1,76.91904,23,0,0.25\r\n+"[M+3K-H]2+",1,2,115.882198,24,0,0.25\r\n+"[M+Na+3K-H]3+",1,3,138.871416,25,0,0.25\r\n+"[2M+H]+",2,1,1.007276,1,0,0.5\r\n+"[2M+2H]2+",2,2,2.014552,2,0,0.5\r\n+"[2M+3H]3+",2,3,3.021828,3,0,0.5\r\n+"[2M+H+Na]2+",2,2,23.996494,4,0,0.5\r\n+"[2M+H+K]2+",2,2,39.970434,6,0,0.5\r\n+"[2M+Na]+",2,1,22.989218,7,0,0.5\r\n+"[2M+2Na]2+",2,2,45.978436,8,0,0.5\r\n+"[2M+K]+",2,1,38.963158,9,0,0.5\r\n+"[2M+Na+K]2+",2,2,61.952376,10,0,0.5\r\n+"[2M+2Na+K]3+",2,3,84.941594,11,0,0.5\r\n+"[2M+2K]2+",2,2,77.926316,12,0,0.5\r\n+"[2M+Na+2K]3+",2,3,100.915534,13,0,0.5\r\n+"[2M+2Na-H]+",2,1,44.97116,15,0,0.25\r\n+"[2M+3Na-H]2+",2,2,67.960378,16,0,0.25\r\n+"[2M+Na+K-H]+",2,1,60.9451,17,0,0.25\r\n+"[2M+2Na+K-H]2+",2,2,83.934318,18,0,0.25\r\n+"[2M+3Na+K-H]3+",2,3,106.923536,19,0,0.25\r\n+"[2M+Na+2K-H]2+",2,2,99.908258,20,0,0.25\r\n+"[2M+2Na+2K-H]3+",2,3,122.897476,21,0,0.25\r\n+"[2M+2K-H]+",2,1,76.91904,23,0,0.25\r\n+"[2M+3K-H]2+",2,2,115.882198,24,0,0.25\r\n+"[2M+Na+3K-H]3+",2,3,138.871416,25,0,0.25\r\n+"[3M+H]+",3,1,1.007276,1,0,0.5\r\n+"[3M+2H]2+",3,2,2.014552,2,0,0.5\r\n+"[3M+3H]3+",3,3,3.021828,3,0,0.5\r\n+"[3M+H+Na]2+",3,2,23.996494,4,0,0.5\r\n+"[3M+H+K]2+",3,2,39.970434,6,0,0.5\r\n+"[3M+Na]+",3,1,22.989218,7,0,0.5\r\n+"[3M+2Na]2+",3,2,45.978436,8,0,0.5\r\n+"[3M+K]+",3,1,38.963158,9,0,0.5\r\n+"[3M+Na+K]2+",3,2,61.952376,10,0,0.5\r\n+"[3M+2Na+K]3+",3,3,84.941594,11,0,0.5\r\n+"[3M+2K]2+",3,2,77.926316,12,0,0.5\r\n+"[3M+Na+2K]3+",3,3,100.915534,13,0,0.5\r\n+"[3M+2Na-H]+",3,1,44.97116,15,0,0.25\r\n+"[3M+3Na-H]2+",3,2,67.960378,16,0,0.25\r\n+"[3M+Na+K-H]+",3,1,60.9451,17,0,0.25\r\n+"[3M+2Na+K-H]2+",3,2,83.934318,18,0,0.25\r\n+"[3M+3Na+K-H]3+",3,3,106.923536,19,0,0.25\r\n+"[3M+Na+2K-H]2+",3,2,99.908258,20,0,0.25\r\n+"[3M+2Na+2K-H]3+",3,3,122.897476,21,0,0.25\r\n+"[3M+2K-H]+",3,1,76.91904,23,0,0.25\r\n+"[3M+3K-H]2+",3,2,115.882198,24,0,0.25\r\n+"[3M+Na+3K-H]3+",3,3,138.871416,25,0,0.25\r\n+"[M+Na+NaCOOH]+",1,1,90.976658,27,0,0.5\r\n+"[M+K+NaCOOH]+",1,1,106.950598,28,0,0.5\r\n+"[M+Na+HCOOH]+",1,1,68.994688,29,0,0.5\r\n+"[M+K+HCOOH]+",1,1,84.968628,30,0,0.5\r\n+"[M+H+HCOOH]+",1,1,47.012746,31,0,0.5\r\n+"[M+Na+CF3COOH]+",1,1,136.982218,32,0,0.5\r\n+"[M+K+CF3COOH]+",1,1,152.956158,33,0,0.5\r\n+"[M+H+CF3COOH]+",1,1,115.000276,34,0,0.5\r\n+"[M+Na+NH3]+",1,1,40.015768,35,0,0.5\r\n+"[M+K+NH3]+",1,1,55.989708,36,0,0.5\r\n+"[M+H+NH3]+",1,1,18.033826,37,0,0.5\r\n+"[M+H-CH4]+",1,1,-15.024024,38,0,0.25\r\n+"[M+2H-CH4]2+",1,2,-14.016748,39,0,0.25\r\n+"[M+3H-CH4]3+",1,3,-13.009472,40,0,0.25\r\n+"[M+H-CO]+",1,1,-26.987624,41,0,0.25\r\n+"[M+2H-CO]2+",1,2,-25.980348,42,0,0.25\r\n+"[M+3H-CO]3+",1,3,-24.973072,43,0,0.25\r\n+"[M+H-C2H2O2]+",1,1,-44.998194,44,0,0.25\r\n+"[M+2H-C2H2O2]2+",1,2,-43.990918,45,0,0.25\r\n+"[M+3H-C2H2O2]3+",1,3,-42.983642,46,0,0.25\r\n+"[M+H-C3H2O3]+",1,1,-84.993114,47,0,0.25\r\n+"[M+2H-C3H2O3]2+",1,2,-83.985838,48,0,0.25\r\n+"[M+3H-C3H2O3]3+",1,3,-82.978562,49,0,0.25\r\n+"[M+H-C5H8O4]+",1,1,-131.034984,50,0,0.25\r\n+"[M+2H-C5H8O4]2+",1,2,-130.027708,51,0,0.25\r\n+"[M+3H-C5H8O4]3+",1,3,-129.020432,52,0,0.25\r\n+"[M+H-C6H10O4]+",1,1,-145.050634,53,0,0.25\r\n+"[M+2H-C6H10O4]2+",1,2,-144.043358,54,0,0.25\r\n+"[M+3H-C6H10O4]3+",1,3,-143.036082,55,0,0.25\r\n+"[M+H-C6H10O5]+",1,1,-161.045544,56,0,0.25\r\n+"[M+2H-C6H10O5]2+",1,2,-160.038268,57,0,0.25\r\n+"[M+3H-C6H10O5]3+",1,3,-159.030992,58,0,0.25'..b'[M+H-C3H6O]+",1,1,-57.03458884,185,0,0.25\r\n+"[M+2H-C3H6O]2+",1,2,-56.02731284,186,0,0.25\r\n+"[M+3H-C3H6O]3+",1,3,-55.02003684,187,0,0.25\r\n+"[M+H-C4H10]+",1,1,-57.07097435,188,0,0.25\r\n+"[M+2H-C4H10]2+",1,2,-56.06369835,189,0,0.25\r\n+"[M+3H-C4H10]3+",1,3,-55.05642235,190,0,0.25\r\n+"[M+H-C2H5NO]+",1,1,-58.029837807,191,0,0.25\r\n+"[M+2H-C2H5NO]2+",1,2,-57.022561807,192,0,0.25\r\n+"[M+3H-C2H5NO]3+",1,3,-56.015285807,193,0,0.25\r\n+"[M+H-C3H8O]+",1,1,-59.05023891,194,0,0.25\r\n+"[M+2H-C3H8O]2+",1,2,-58.04296291,195,0,0.25\r\n+"[M+3H-C3H8O]3+",1,3,-57.03568691,196,0,0.25\r\n+"[M+H-C2H4O2]+",1,1,-59.0138534,197,0,0.25\r\n+"[M+2H-C2H4O2]2+",1,2,-58.0065774,198,0,0.25\r\n+"[M+3H-C2H4O2]3+",1,3,-56.9993014,199,0,0.25\r\n+"[M+H-C2H5Cl]+",1,1,-63.000701895,200,0,0.25\r\n+"[M+2H-C2H5Cl]2+",1,2,-61.993425895,201,0,0.25\r\n+"[M+3H-C2H5Cl]3+",1,3,-60.986149895,202,0,0.25\r\n+"[M+H-C5H4]+",1,1,-63.02402414,203,0,0.25\r\n+"[M+2H-C5H4]2+",1,2,-62.01674814,204,0,0.25\r\n+"[M+3H-C5H4]3+",1,3,-61.00947214,205,0,0.25\r\n+"[M+H-SO2]+",1,1,-62.95462396,206,0,0.25\r\n+"[M+2H-SO2]2+",1,2,-61.94734796,207,0,0.25\r\n+"[M+3H-SO2]3+",1,3,-60.94007196,208,0,0.25\r\n+"[M+H-C5H8]+",1,1,-67.05532428,209,0,0.25\r\n+"[M+2H-C5H8]2+",1,2,-66.04804828,210,0,0.25\r\n+"[M+3H-C5H8]3+",1,3,-65.04077228,211,0,0.25\r\n+"[M+H-C5H12]+",1,1,-71.08662442,212,0,0.25\r\n+"[M+2H-C5H12]2+",1,2,-70.07934842,213,0,0.25\r\n+"[M+3H-C5H12]3+",1,3,-69.07207242,214,0,0.25\r\n+"[M+H-C3H6O2]+",1,1,-73.02950347,215,0,0.25\r\n+"[M+2H-C3H6O2]2+",1,2,-72.02222747,216,0,0.25\r\n+"[M+3H-C3H6O2]3+",1,3,-71.01495147,217,0,0.25\r\n+"[M+H-C4H10O]+",1,1,-73.06588898,218,0,0.25\r\n+"[M+2H-C4H10O]2+",1,2,-72.05861298,219,0,0.25\r\n+"[M+3H-C4H10O]3+",1,3,-71.05133698,220,0,0.25\r\n+"[M+H-C6H6]+",1,1,-77.03967421,221,0,0.25\r\n+"[M+2H-C6H6]2+",1,2,-76.03239821,222,0,0.25\r\n+"[M+3H-C6H6]3+",1,3,-75.02512221,223,0,0.25\r\n+"[M+H-CS2]+",1,1,-74.9368654,224,0,0.25\r\n+"[M+2H-CS2]2+",1,2,-73.9295894,225,0,0.25\r\n+"[M+3H-CS2]3+",1,3,-72.9223134,226,0,0.25\r\n+"[M+H-C5H5N]+",1,1,-78.034923177,227,0,0.25\r\n+"[M+2H-C5H5N]2+",1,2,-77.027647177,228,0,0.25\r\n+"[M+3H-C5H5N]3+",1,3,-76.020371177,229,0,0.25\r\n+"[M+H-HBr]+",1,1,-78.918885135,230,0,0.25\r\n+"[M+2H-HBr]2+",1,2,-77.911609135,231,0,0.25\r\n+"[M+3H-HBr]3+",1,3,-76.904333135,232,0,0.25\r\n+"[M+H-C2F4]+",1,1,-98.98633688,233,0,0.25\r\n+"[M+2H-C2F4]2+",1,2,-97.97906088,234,0,0.25\r\n+"[M+3H-C2F4]3+",1,3,-96.97178488,235,0,0.25\r\n+"[M+H-C2F6]+",1,1,-136.98314332,236,0,0.25\r\n+"[M+2H-C2F6]2+",1,2,-135.97586732,237,0,0.25\r\n+"[M+3H-C2F6]3+",1,3,-134.96859132,238,0,0.25\r\n+"[M+H-C7H6O2]+",1,1,-121.02950347,239,0,0.25\r\n+"[M+2H-C7H6O2]2+",1,2,-120.02222747,240,0,0.25\r\n+"[M+3H-C7H6O2]3+",1,3,-119.01495147,241,0,0.25\r\n+"[M+H-HI]+",1,1,-126.905022035,242,0,0.25\r\n+"[M+2H-HI]2+",1,2,-125.897746035,243,0,0.25\r\n+"[M+3H-HI]3+",1,3,-124.890470035,244,0,0.25\r\n+"[M+H-H6O3]+",1,1,-53.0244181,248,0,0.25\r\n+"[M+2H-H6O3]2+",1,2,-52.0171421,249,0,0.25\r\n+"[M+3H-H6O3]3+",1,3,-51.0098661,250,0,0.25\r\n+"[M+H-H8O4]+",1,1,-71.0349828,251,0,0.25\r\n+"[M+2H-H8O4]2+",1,2,-70.0277068,252,0,0.25\r\n+"[M+3H-H8O4]3+",1,3,-69.0204308,253,0,0.25\r\n+"[M+H-H10O5]+",1,1,-89.0455475,254,0,0.25\r\n+"[M+2H-H10O5]2+",1,2,-88.0382715,255,0,0.25\r\n+"[M+3H-H10O5]3+",1,3,-87.0309955,256,0,0.25\r\n+"[M+H-H12O6]+",1,1,-107.0561122,257,0,0.25\r\n+"[M+2H-H12O6]2+",1,2,-106.0488362,258,0,0.25\r\n+"[M+3H-H12O6]3+",1,3,-105.0415602,259,0,0.25\r\n+"[M+H-H14O7]+",1,1,-125.0666769,260,0,0.25\r\n+"[M+2H-H14O7]2+",1,2,-124.0594009,261,0,0.25\r\n+"[M+3H-H14O7]3+",1,3,-123.0521249,262,0,0.25\r\n+"[M+H-CH6O3]+",1,1,-65.0244181,266,0,0.25\r\n+"[M+2H-CH6O3]2+",1,2,-64.0171421,267,0,0.25\r\n+"[M+3H-CH6O3]3+",1,3,-63.0098661,268,0,0.25\r\n+"[M+H-CH4O2]+",1,1,-47.0138534,269,0,0.25\r\n+"[M+2H-CH4O2]2+",1,2,-46.0065774,270,0,0.25\r\n+"[M+3H-CH4O2]3+",1,3,-44.9993014,271,0,0.25\r\n+"[M+H-NaOH]+",1,1,-38.985231365,272,0,0.25\r\n+"[M+2H-NaOH]2+",1,2,-37.977955365,273,0,0.25\r\n+"[M+3H-NaOH]3+",1,3,-36.970679365,274,0,0.25\r\n+"[M+H-KOH]+",1,1,-54.959171065,275,0,0.25\r\n+"[M+2H-KOH]2+",1,2,-53.951895065,276,0,0.25\r\n+"[M+3H-KOH]3+",1,3,-52.944619065,277,0,0.25\r\n' |
b |
diff -r 9c037181588e -r 1c30ff90f3ae test-data/faahKO-single.xset.merged.group.retcor.group.fillpeaks.RData |
b |
Binary file test-data/faahKO-single.xset.merged.group.retcor.group.fillpeaks.RData has changed |
b |
diff -r 9c037181588e -r 1c30ff90f3ae test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv --- a/test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv Wed Feb 01 12:24:04 2017 -0500 +++ b/test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.dataMatrix.tsv Fri Apr 07 07:42:18 2017 -0400 |
b |
b'@@ -182,7 +182,7 @@\n M212T3941\t0\t0\t1197.22500000004\t0\n M212T3970\t155.689673877202\t0\t838.732800000007\t0\n M212T3804\t0\t0\t1062.49919999995\t0\n-M213T3904\t0\t1230.08999999997\t0\t0\n+M213T3904_1\t0\t1230.08999999997\t0\t0\n M213T4087\t0\t0\t0\t1056.24000000001\n M213T3699\t0\t0\t0\t2142.48500000007\n M213T3793\t0\t3184.77499999996\t0\t0\n@@ -190,7 +190,7 @@\n M213T2688\t0\t5023.65000000018\t0\t0\n M213T3487\t8261.63499999989\t0\t0\t0\n M213T4135\t1010.12467927487\t172.279374858226\t0\t1228.52499999999\n-M213T3904\t1081.29983333335\t0\t700.103750256462\t1711.00602968181\n+M213T3904_2\t1081.29983333335\t0\t700.103750256462\t1711.00602968181\n M213T2866\t0\t9848.54499999999\t0\t0\n M213T3283\t0\t5371.08000000019\t1374.37696617401\t1789.50584149986\n M213T3836\t536.790799509607\t0\t419.296573102181\t5720.0750000002\n@@ -335,13 +335,13 @@\n M223T3313\t0\t3240.70080000003\t0\t0\n M224T4048\t0\t779.370000000007\t0\t118.093822218595\n M224T4012\t0\t0\t1216.00499999997\t0\n-M224T3097\t0\t4964.18000000017\t0\t0\n+M224T3097_1\t0\t4964.18000000017\t0\t0\n M224T3165\t0\t2834.21499999993\t0\t1599.39813285254\n M224T3761\t784.00195025327\t2252.86262342991\t2904.40800000005\t0\n M224T2739\t7904.81499999989\t0\t0\t0\n M224T2979\t16924.983409091\t0\t6208.83004073805\t1743.57335870174\n M224T2954\t4743.51500000016\t0\t0\t1737.19023073431\n-M224T3097\t0\t0\t0\t6100.36999999992\n+M224T3097_2\t0\t0\t0\t6100.36999999992\n M224T2909\t1439.22939638862\t0\t5973.60500000021\t0\n M224T3052\t0\t0\t4151.94500000015\t1483.25818381136\n M224T3074\t0\t3954.75500000014\t0\t0\n@@ -796,7 +796,7 @@\n M254T3082\t10735.4354696213\t10226.6214999999\t5000.92016733439\t1456.89586045183\n M254T3528\t0\t2067.36499999997\t0\t0\n M254T3960\t587.860834853306\t196.225263914304\t0\t1854.52499999999\n-M254T3902\t323.145865665311\t0\t0\t1369.37500000005\n+M254T3902_1\t323.145865665311\t0\t0\t1369.37500000005\n M254T2927\t0\t6479.09999999985\t0\t0\n M254T3379\t0\t4134.39975000008\t962.466461446885\t0\n M254T3261\t10767.7820000002\t0\t0\t0\n@@ -813,7 +813,7 @@\n M254T2804\t0\t5123.80999999995\t1490.36357498886\t2132.64652048757\n M254T3277\t12377.5850000004\t18560.9823750003\t9588.74205405444\t0\n M254T4105\t0\t959.345000000033\t0\t243.426297233091\n-M254T3902\t524.652370000034\t1727.2058439476\t312.233942059826\t1846.60923076924\n+M254T3902_2\t524.652370000034\t1727.2058439476\t312.233942059826\t1846.60923076924\n M255T3929\t2021.97999999995\t0\t0\t0\n M255T4074\t294.557048935163\t0\t2408.27849999992\t0\n M255T4111\t1197.45059631817\t0\t0\t2250.2645714287\n@@ -1150,9 +1150,9 @@\n M276T3077\t0\t6451.9060000001\t0\t0\n M276T3716\t0\t3369.20577777774\t0\t0\n M276T3765\t0\t1311.46999999997\t234.428194546826\t1833.9984450473\n-M276T3867\t113.552433065314\t2896.81499999999\t0\t341.188481234697\n+M276T3867_1\t113.552433065314\t2896.81499999999\t0\t341.188481234697\n M276T3496\t4892.33507471811\t2874.90499999993\t1606.89745276928\t1797.86632777711\n-M276T3867\t1347.32150000002\t0\t0\t732.510425074664\n+M276T3867_2\t1347.32150000002\t0\t0\t732.510425074664\n M276T3778\t4684.04500000006\t2919.65750737896\t2967.27412953143\t442.895784592734\n M276T4109\t2001.54364285715\t112.874592384196\t1030.71045061812\t108.538311136801\n M276T4005\t777.722166666639\t0\t0\t0\n@@ -1735,10 +1735,10 @@\n M309T4180\t414.632134822523\t1144.01499999997\t0\t0\n M309T3985\t3163.99186583752\t2281.47059809708\t28385.9576956521\t3273.90087643464\n M309T4149\t0\t0\t0\t1256.59462499993\n-M310T3461\t36258.0630753291\t534331.077923075\t63364.2486390118\t21058.5811919054\n+M310T3461_1\t36258.0630753291\t534331.077923075\t63364.2486390118\t21058.5811919054\n M310T4201\t270.096443583602\t1540.0349421739\t0\t904.533874999991\n M310T2926\t135328.05026087\t82033.1251526926\t107511.434843213\t95307.4161584627\n-M310T3461\t72928.5388695646\t9060.4834167398\t43575.164528626\t89770.4875909093\n+M310T3461_2\t72928.5388695646\t9060.4834167398\t43575.164528626\t89770.4875909093\n M310T3484\t9991.07390724506\t43590.0440000006\t8651.98130329359\t21231.974486064\n M310T2522\t0\t0\t0\t5998.64499999992\n M310T2584\t0\t2560.33999999994\t4509.75360000004\t6593.34499999991\n@@ -1977,7 +1977,7 @@\n M323T3910\t1294.54365263385\t3196.68264006145\t3444.34490000008\t0\n M323T3351\t790.706305477901\t893.615000000031\t0\t0\n M323T4059\t0\t1408.5\t0\t138.14096421908\n-M324T2708\t886.898519467729\t7570.'..b'.6847900913\t27771.4461176469\t0\n+M578T3296_1\t271.769310365731\t1612.6847900913\t27771.4461176469\t0\n M578T4169\t0\t0\t0\t10191.2799999998\n M578T4183\t6566.73999999985\t0\t1509.30034256449\t0\n M578T3335\t0\t0\t0\t1730.88999999996\n@@ -7474,8 +7474,8 @@\n M578T2627\t5897.73120000005\t0\t1703.4085001727\t0\n M578T2823\t0\t625.429689257525\t1158.75224564973\t5087.5827857142\n M578T3397\t0\t4460.2499999999\t10944.7357499998\t0\n-M578T3296\t0\t0\t15139.7624999995\t0\n-M578T3525\t0\t1725.52526263461\t0\t1151.83999999997\n+M578T3296_2\t0\t0\t15139.7624999995\t0\n+M578T3525_1\t0\t1725.52526263461\t0\t1151.83999999997\n M578T2863\t0\t1137.88610086279\t0\t6125.10892307694\n M578T3664\t7866.61966260738\t21057.6567387522\t6694.21440000006\t0\n M578T3753\t0\t0\t3444.56499999992\t2161.58040689481\n@@ -7498,7 +7498,7 @@\n M578T3711\t1207.73596507746\t9443.91285714301\t2726.85964479057\t0\n M578T3834\t1797006.00545455\t68270.738466602\t1461649.20674704\t0\n M578T3122\t4278.01062753194\t0\t5516.62499999987\t0\n-M578T3525\t0\t0\t0\t1544.65499999996\n+M578T3525_2\t0\t0\t0\t1544.65499999996\n M578T2710\t0\t395.07572393755\t0\t1910.62079999991\n M579T2700\t0\t0\t3680.87999999991\t0\n M579T2614\t3906.23999999991\t657.299999999975\t0\t0\n@@ -7609,7 +7609,7 @@\n M582T3926\t4325.65999999994\t0\t463.655372755083\t5775.09398174128\n M582T4177\t3740.13272727271\t0\t3500.99507055468\t0\n M582T3473\t34318.7630769232\t21818.0567062937\t36387.3919458424\t846.135486558828\n-M582T3848\t3706.26414215403\t2375.73727172652\t21326.255\t2184.38504961376\n+M582T3848_1\t3706.26414215403\t2375.73727172652\t21326.255\t2184.38504961376\n M582T3351\t7252.23586542253\t1818.08994825976\t11770.3650000004\t0\n M582T3377\t3313.49155065192\t5288.55970033321\t15756.42\t14687.8036690723\n M582T3987\t0\t0\t3724.57552935945\t13385.4449999997\n@@ -7624,7 +7624,7 @@\n M582T3970\t9966.41430434512\t59220.4082294011\t4932.63698859328\t160504.868090909\n M582T3725\t3174.45340524226\t6887.56500000009\t0\t0\n M582T2894\t3208.38147928956\t0\t18092.0015833333\t0\n-M582T3848\t0\t4178.55000000015\t0\t1785.97268831806\n+M582T3848_2\t0\t4178.55000000015\t0\t1785.97268831806\n M582T4185\t4236.45500000015\t0\t5535.18404372073\t2135.5308045648\n M583T3933\t0\t0\t3458.3342857142\t0\n M583T2617\t514.305183361411\t0\t2012.55274236495\t2694.92999999996\n@@ -7816,7 +7816,7 @@\n M588T2863\t1455.41158765376\t1793.53455598184\t3201.0517261516\t10308.1060833333\n M588T3201\t6222.43999999992\t0\t0\t0\n M589T2744\t1867.14191786999\t6209.25866666675\t2045.34607773754\t0\n-M589T3027\t0\t4485.2899999999\t0\t1036.25051933095\n+M589T3027_1\t0\t4485.2899999999\t0\t1036.25051933095\n M589T2708\t3250.50500000011\t0\t0\t0\n M589T2669\t0\t3514.98999999995\t0\t2274.88465862483\n M589T3041\t0\t0\t3453.95499999992\t1584.46338550673\n@@ -7828,7 +7828,7 @@\n M589T3399\t0\t0\t1752.61333333336\t0\n M589T4171\t924.796799999954\t0\t0\t142.379847026552\n M589T4211\t141.349674086105\t0\t971.776285714342\t0\n-M589T3027\t2604.25713408938\t0\t1469.671409555\t5762.33000000006\n+M589T3027_2\t2604.25713408938\t0\t1469.671409555\t5762.33000000006\n M589T4078\t2508.69499999994\t0\t0\t1585.0993232845\n M589T3066\t5769.66878713768\t8291.36999999989\t0\t0\n M589T3098\t2178.48371465977\t0\t10767.6181666668\t1971.07232973347\n@@ -7998,7 +7998,7 @@\n M595T2655\t0\t765.239870733435\t1233.21808896358\t4982.95999999993\n M595T2603\t60509.4258518521\t6683.93068686915\t19792.9643102431\t3440.16429307587\n M595T3000\t82683.667879537\t316155.893850002\t1007151.89818182\t60036.1307137129\n-M595T2650\t832.837290081034\t0\t6429.01999999985\t844.334372955168\n+M595T2650_1\t832.837290081034\t0\t6429.01999999985\t844.334372955168\n M595T3780\t127545.669125001\t4735.55583624839\t149919.4475625\t4845.0498192778\n M595T4205\t6956.14718749993\t4852.197541911\t3880.19666617499\t3978.9811068691\n M595T2543\t0\t600.864000000001\t4907.84000000017\t0\n@@ -8009,7 +8009,7 @@\n M595T2520\t907.635555555574\t5554.18500000003\t583.703555555567\t0\n M595T2753\t0\t1373.37213215749\t0\t1687.07000000006\n M595T4209\t1174.82660389549\t2642.1377457943\t8118.931777778\t3677.34004605241\n-M595T2650\t0\t2237.94999999995\t0\t0\n+M595T2650_2\t0\t2237.94999999995\t0\t0\n M595T2818\t0\t0\t3530.63999999992\t0\n M595T3782\t17889.5149999996\t0\t31617.7414604441\t424.113789166877\n M595T3326\t508.758898013783\t1840.43999999996\t0\t0\n' |
b |
diff -r 9c037181588e -r 1c30ff90f3ae test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.rules.dataMatrix.tsv --- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.rules.dataMatrix.tsv Fri Apr 07 07:42:18 2017 -0400 |
b |
b'@@ -0,0 +1,8158 @@\n+name\tko15\tko16\twt15\twt16\n+M200T2874\t76871.5724822568\t506848.884266667\t54795.557051693\t70712.7019597617\n+M200T3877\t1144.01499999999\t508.190132093174\t167.153311923928\t0\n+M200T3676\t0\t0\t5108.15999999988\t3298.99587926868\n+M200T3486\t6029.94499999992\t0\t0\t0\n+M200T3529\t0\t0\t4586.52650000006\t0\n+M200T3184\t0\t4333.4849999999\t0\t0\n+M200T3817\t0\t0\t1018.81499999998\t0\n+M200T3978\t0\t0\t0\t1242.61000000004\n+M201T3544\t0\t2863.6449999999\t0\t0\n+M201T4063\t0\t0\t1339.64000000005\t212.633272048894\n+M201T3783\t0\t0\t1680.81000000006\t0\n+M201T3274\t0\t1428.56579382624\t4090.91000000014\t2632.56262635375\n+M201T2556\t0\t14307.2299999999\t0\t0\n+M201T3626\t0\t1129.74329389996\t846.832572052814\t2931.24499999993\n+M201T3138\t23998.304598303\t254581.758476187\t61872.928839246\t23938.5867670927\n+M201T3509\t4023.61499999999\t716.684794188254\t0\t0\n+M201T4066\t354.759136757153\t120.799333675191\t1275.47500000004\t217.235067034405\n+M201T3687\t0\t0\t2906.20499999993\t0\n+M201T3998\t0\t0\t1657.33500000006\t0\n+M201T3799\t0\t0\t628.988532860297\t3245.80999999992\n+M201T3936\t0\t0\t1284.72816666668\t0\n+M201T4037\t0\t0\t0\t1220.69999999998\n+M201T4155\t0\t774.575999999962\t0\t0\n+M201T3883\t0\t1220.70000000004\t596.06839236263\t0\n+M202T3855\t892.050000000031\t0\t0\t0\n+M202T4020\t0\t0\t831.015000000029\t0\n+M202T3301\t2759.095\t0\t203.041783144463\t0\n+M202T4069\t515.477113310478\t0\t754.233600000007\t0\n+M202T3280\t0\t3872.96250000005\t0\t0\n+M202T3321\t3588.54500000001\t0\t2184.14587440592\t680.752724149015\n+M202T3171\t7682.58500000004\t0\t0\t0\n+M202T3763\t0\t0\t1151.71733333335\t0\n+M202T3377\t9879.84499999977\t0\t0\t0\n+M202T3269\t77227.3769090911\t4845.50686607645\t43819.3479046752\t9586.93001142395\n+M202T4141\t0\t0\t0\t732.419999999983\n+M202T4033\t0\t688.600000000024\t0\t0\n+M202T3895\t248.545776466807\t841.96999999998\t0\t3098.52044641804\n+M202T4009\t1147.18712241809\t1629.165\t764.696680521557\t472.632308163321\n+M202T3186\t10430.8884626037\t3806.07999999999\t1823.13851904744\t2108.81069363708\n+M202T2900\t36435.3079999996\t5925.29111289948\t18920.5714858276\t5543.76952406103\n+M202T3943\t0\t0\t1461.71\t131.70361488243\n+M202T3292\t0\t0\t0\t3372.57500000002\n+M203T4038\t0\t0\t0\t978.124999999977\n+M203T3317\t0\t0\t0\t1136.19000000004\n+M203T3306\t431.124790089052\t1694.89499999996\t0\t2048.62135448795\n+M203T3979\t527.419034783012\t0\t2796.65500000002\t2329.6554046415\n+M203T4141\t0\t1020.37999999998\t124.572393433318\t691.733108650811\n+M203T3348\t0\t2974.74816666671\t0\t0\n+M203T3327\t3852.53759999981\t0\t0\t0\n+M203T2679\t0\t0\t0\t6346.07499999991\n+M203T4179\t257.608663224945\t804.409999999981\t0\t750.373044499613\n+M203T3790\t0\t2690.23500000009\t374.050323368023\t795.962510881292\n+M203T3722\t639.681095784589\t0\t0\t3345.96999999992\n+M203T4057\t0\t0\t832.191847925998\t1550.91499999999\n+M204T3523\t0\t110.759221778917\t967.169999999987\t0\n+M204T3061\t3905.96266666662\t0\t0\t0\n+M204T4128\t0\t0\t0\t793.455000000074\n+M204T3665\t3002.85120000003\t0\t401.30435850189\t0\n+M204T4023\t1111.14999999999\t1447.15657402239\t0\t109.024210593649\n+M204T4142\t0\t0\t0\t1089.24000000004\n+M204T3843\t0\t419.889287204237\t1676.11500000006\t1632.68532194826\n+M204T3397\t964.058693506483\t162.861069898986\t691.3363891851\t1586.91\n+M204T2627\t0\t0\t3518.12000000012\t0\n+M204T4075\t0\t1062.63500000004\t0\t0\n+M204T3703\t0\t0\t0\t1446.05999999997\n+M204T3597\t405.142351380973\t0\t0\t1032.90000000004\n+M205T3574\t1707.7862088125\t0\t0\t2466.43999999994\n+M205T2586\t0\t0\t2287.73759999989\t9189.67999999988\n+M205T2787\t1924712.01585714\t1757150.9648\t2129885.09357143\t1634341.9855862\n+M205T4040\t2600.69759999987\t0\t0\t0\n+M205T3782\t2777.8750000001\t0\t5180.14999999997\t0\n+M205T3917\t0\t3392.55866666671\t285.445337336418\t910.731294074392\n+M205T3761\t0\t0\t2425.44000000002\t0\n+M205T4064\t0\t0\t1198.79000000004\t0\n+M206T4080\t0\t575.630156425085\t793.454999999982\t0\n+M206T3292\t0\t0\t0\t1023.50999999998\n+M206T3088\t0\t0\t0\t4682.47999999989\n+M206T3350\t226.392005428193\t0\t641.649999999985\t0\n+M206T4105\t1685.41525000004\t1169.58129372772\t874.647416671435\t271.335617444158\n+M206T3192\t1563.6763381678\t10174.0649999999\t0\t438.085464589443\n+M206T2786\t213659.293920001\t283980.633536123\t253825.557279999\t241844.442068965\n+M206T3444\t1711.85904903243\t5245.74642732371\t4162.05892651987\t3090.62'..b'8T3915\t2421.055\t0\t0\t0\n+M598T4240\t780.835199999962\t0\t0\t0\n+M598T3872\t0\t0\t923.232000000008\t0\n+M598T2842\t4328.7899999999\t0\t0\t0\n+M598T2529\t0\t0\t3350.66499999992\t0\n+M598T2738\t0\t1410.85151214631\t3392.92\t0\n+M598T3057\t1964.95661826158\t0\t3904.17600000003\t0\n+M598T2566\t428.80999999999\t704.249999999984\t5259.96499999993\t419.366399999979\n+M598T3685\t0\t0\t0\t2907.39840000003\n+M598T3161\t0\t1976.32135156572\t0\t1547.78500000005\n+M598T3574\t4893.75500000017\t0\t0\t0\n+M598T3247\t0\t0\t11160.015\t0\n+M598T3740\t6735.75999999984\t1507.48470651824\t0\t1204.11021794332\n+M598T2986\t2726.56464877876\t7907.94500000028\t1858.99545730168\t0\n+M598T3721\t7601.78150954762\t29323.4050000004\t0\t48876.8056363635\n+M598T3848\t0\t19344.1924374998\t2689.81421000592\t19147.856234332\n+M598T4223\t0\t0\t0\t852.92499999998\n+M598T3218\t0\t16185.5021250003\t7823.81125148536\t2693.06700579228\n+M598T2831\t5337.7886250001\t2892.25018630074\t2041.28568142639\t0\n+M598T3699\t23655.1372269246\t0\t8555.87680238366\t28572.205000001\n+M598T3811\t10279.2954993742\t201593.909999999\t6054.00661583122\t38867.0801165145\n+M598T3705\t18053.2113055963\t307529.419597421\t16924.3734137891\t65022.6200000009\n+M598T3493\t0\t0\t9308.62000000032\t0\n+M598T3116\t3137.82499999993\t0\t0\t0\n+M598T4234\t1558.64039999994\t0\t433.505000000001\t282.560050600392\n+M598T3368\t6528.77505295252\t0\t0\t7501.04499999995\n+M598T3406\t2523.54098664481\t711.921989369875\t4532.24000000016\t0\n+M598T3822\t910.075584336678\t126881.278714286\t3278.69127651828\t0\n+M598T2677\t0\t2826.02880000002\t0\t0\n+M598T2662\t2139.08160000002\t0\t0\t238.034675483067\n+M598T2956\t5756.0700000002\t1517.11899102972\t0\t0\n+M598T3177\t0\t2838.6076666667\t0\t0\n+M598T2531\t0\t1600.99499999996\t0\t259.78999999999\n+M598T4020\t4444.59999999997\t0\t0\t0\n+M598T2762\t0\t5078.42499999999\t1057.00399020397\t0\n+M599T4229\t0\t267.670604372541\t0\t881.094999999979\n+M599T3183\t0\t0\t0\t2164.39499999999\n+M599T2931\t0\t2557.20999999994\t0\t0\n+M599T2850\t0\t0\t0\t3757.56499999997\n+M599T2619\t0\t2237.94999999995\t0\t1052.80414846231\n+M599T3091\t0\t0\t0\t5745.1150000002\n+M599T2620\t24597.6221333335\t1782.1843965059\t2466.61604554878\t2547.59399043552\n+M599T4187\t136.620679491087\t0\t769.979999999982\t0\n+M599T2881\t5238.07829488764\t1749.21839582845\t2554.91912426183\t3269.28500000002\n+M599T3739\t0\t8220.94499999976\t0\t1042.07319821065\n+M599T4202\t1370.93999999996\t0\t404.178568977319\t115.970242221925\n+M599T4160\t2031.49238929167\t8068.71033333314\t4524.36445961151\t5823.36499999964\n+M599T3701\t0\t0\t55051.9369090907\t0\n+M599T3473\t1906.58949953166\t1115.24697230194\t6239.51160209002\t6298.5500000001\n+M599T4137\t3531.90007828117\t607.713962924625\t13849.6178571426\t0\n+M599T3845\t0\t0\t5238.05500000018\t7674.11104164754\n+M599T3722\t22852.13\t0\t0\t0\n+M599T3978\t0\t15327.6100000005\t2043.71536740086\t0\n+M599T4055\t798856.451441174\t53721.8508316141\t897286.005000001\t60505.2372470137\n+M599T3926\t28263.7381960734\t1934575.64687074\t31095.0992688255\t2271127.28014893\n+M599T3741\t2472129.73859259\t0\t1909653.70493332\t7165.99058468708\n+M599T3433\t35592.8437333336\t1352.22852619787\t0\t7482.12284985986\n+M599T4127\t185983.548870884\t536493.298793183\t75567.9488087375\t707685.939314288\n+M599T3728\t93179.0431097422\t0\t797434.72246154\t0\n+M599T4125\t2425.45826820981\t354770.43852632\t19846.7110475478\t239730.793013582\n+M599T2844\t0\t5415.77280000005\t1593.6345093066\t1186.34708319397\n+M599T2970\t8188.19424252287\t7861.19461826181\t0\t12502.4521250001\n+M599T3812\t79625.6350000028\t11601.8667295452\t19502.9954796907\t1381.41279238145\n+M600T2728\t0\t0\t0\t1760.62499999996\n+M600T3605\t0\t0\t0\t5001.73999999997\n+M600T3410\t3353.79499999992\t0\t0\t0\n+M600T3002\t0\t5849.96999999986\t0\t0\n+M600T2526\t0\t0\t3209.81499999996\t0\n+M600T2559\t0\t2928.1150000001\t0\t0\n+M600T2605\t6022.12000000021\t796.585000000028\t0\t2331.63714285708\n+M600T2778\t0\t0\t0\t2608.74386666668\n+M600T3440\t0\t8782.77999999999\t0\t0\n+M600T3074\t2505.99623596844\t0\t0\t3430.04160000003\n+M600T2840\t0\t0\t0\t1987.33833333336\n+M600T3456\t4671.52499999989\t0\t0\t1358.70443022736\n+M600T3351\t2327.15500000008\t0\t0\t0\n+M600T2539\t0\t3639.80233333338\t0\t1359.81120000001\n+M600T3208\t7784.31000000027\t1147.23597499922\t0\t2048.69405448434\n+M600T2969\t9211.58999999991\t0\t0\t5345.43474031158\n' |
b |
diff -r 9c037181588e -r 1c30ff90f3ae test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.rules.variableMetadata.tsv --- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.rules.variableMetadata.tsv Fri Apr 07 07:42:18 2017 -0400 |
[ |
b'@@ -0,0 +1,8158 @@\n+name\tnamecustom\tmz\tmzmin\tmzmax\trt\trtmin\trtmax\tnpeaks\tKO\tWT\tisotopes\tadduct\tpcgroup\tfold\ttstat\tpvalue\n+M200T2874\tM200.1T47.9\t200.100006103516\t200.100006103516\t200.100006103516\t47.8944650465364\t47.8944650465364\t47.8944650465364\t1\t1\t0\t\t\t4758\t4.65085295060662\t-1.06493655910147\t0.479605513245819\n+M200T3877\tM200.2T64.6\t200.199996948242\t200.199996948242\t200.199996948242\t64.612093192559\t64.612093192559\t64.612093192559\t1\t1\t0\t\t\t2728\t9.88436970273782\t-2.25887629759232\t0.240554009337641\n+M200T3676\tM200.2T61.3\t200.199996948242\t200.199996948242\t200.199996948242\t61.2701429122315\t61.2701429122315\t61.2701429122315\t1\t0\t1\t\t\t3702\tInf\t4.64698353395969\t0.13493854409364\n+M200T3486\tM200.2T58.1\t200.199996948242\t200.199996948242\t200.199996948242\t58.0952197061014\t58.0952197061014\t58.0952197061014\t1\t1\t0\t\t\t1771\tInf\t-1\t0.5\n+M200T3529\tM200.2T58.8\t200.199996948242\t200.199996948242\t200.199996948242\t58.8194456415545\t58.8194456415545\t58.8194456415545\t1\t0\t1\t\t\t370\tInf\t1\t0.5\n+M200T3184\tM200.2T53.1\t200.199996948242\t200.199996948242\t200.199996948242\t53.0741227792108\t53.0741227792108\t53.0741227792108\t1\t1\t0\t\t\t40\tInf\t-1\t0.5\n+M200T3817\tM200.3T63.6\t200.300003051758\t200.300003051758\t200.300003051758\t63.6095503993271\t63.6095503993271\t63.6095503993271\t1\t0\t1\t\t\t2375\tInf\t1\t0.5\n+M200T3978\tM200.3T66.3\t200.300003051758\t200.300003051758\t200.300003051758\t66.2933347129474\t66.2933347129474\t66.2933347129474\t1\t0\t1\t\t\t1981\tInf\t1\t0.5\n+M201T3544\tM200.8T59.1\t200.800003051758\t200.800003051758\t200.800003051758\t59.0600521059129\t59.0600521059129\t59.0600521059129\t1\t1\t0\t\t\t2331\tInf\t-1\t0.5\n+M201T4063\tM200.8T67.7\t200.800003051758\t200.800003051758\t200.800003051758\t67.7094807306269\t67.7094807306269\t67.7094807306269\t1\t0\t1\t\t\t213\tInf\t1.37734161966442\t0.399789013602801\n+M201T3783\tM200.8T63.1\t200.800003051758\t200.800003051758\t200.800003051758\t63.0552323830999\t63.0552323830999\t63.0552323830999\t1\t0\t1\t\t\t3662\tInf\t1\t0.5\n+M201T3274\tM200.9T54.6\t200.900009155273\t200.900009155273\t200.900009155273\t54.565562819362\t54.565562819362\t54.565562819362\t1\t0\t1\t\t\t5027\t4.70644940219791\t2.59368058676224\t0.122082365514126\n+M201T2556\tM200.9T42.6\t200.900009155273\t200.900009155273\t200.900009155273\t42.5984162432725\t42.5984162432725\t42.5984162432725\t1\t1\t0\t\t\t3065\tInf\t-1\t0.5\n+M201T3626\tM200.9T60.4\t200.900009155273\t200.900009155273\t200.900009155273\t60.4324998003135\t60.4324998003135\t60.4324998003135\t1\t0\t1\t\t\t1600\t3.34419119144363\t1.11702356726728\t0.408252476299869\n+M201T3138\tM201.1T52.3\t201.100006103516\t201.100006103516\t201.100006103516\t52.3059069442773\t52.3059069442773\t52.3059069442773\t1\t1\t0\t\t\t67\t3.24641816551149\t-0.824914731473309\t0.555087522533288\n+M201T3509\tM201.2T58.5\t201.199996948242\t201.199996948242\t201.199996948242\t58.489427289443\t58.489427289443\t58.489427289443\t1\t1\t0\t\t\t4513\tInf\t-1.43344416094946\t0.387782408900977\n+M201T4066\tM201.2T67.8\t201.199996948242\t201.199996948242\t201.199996948242\t67.7620137906804\t67.7620137906804\t67.7620137906804\t1\t0\t1\t\t\t3859\t3.13885706983073\t0.938510278186573\t0.508748560086896\n+M201T3687\tM201.2T61.5\t201.199996948242\t201.199996948242\t201.199996948242\t61.4531553385096\t61.4531553385096\t61.4531553385096\t1\t0\t1\t\t\t573\tInf\t1\t0.5\n+M201T3998\tM201.2T66.6\t201.199996948242\t201.199996948242\t201.199996948242\t66.6322657418973\t66.6322657418973\t66.6322657418973\t1\t0\t1\t\t\t6148\tInf\t1\t0.5\n+M201T3799\tM201.2T63.3\t201.199996948242\t201.199996948242\t201.199996948242\t63.3109132648164\t63.3109132648164\t63.3109132648164\t1\t0\t1\t\t\t2829\tInf\t1.48072712698114\t0.378143149183639\n+M201T3936\tM201.3T65.6\t201.300003051758\t201.300003051758\t201.300003051758\t65.6072513111386\t65.6072513111386\t65.6072513111386\t1\t0\t1\t\t\t4130\tInf\t1\t0.5\n+M201T4037\tM201.3T67.3\t201.300003051758\t201.300003051758\t201.300003051758\t67.2818438258993\t67.2818438258993\t67.2818438258993\t1\t0\t1\t\t\t3747\tInf\t1\t0.5\n+M201T4155\tM201.3T69.3\t201.300003051758\t201.300003051758\t201.300003051758\t69.2512124838132\t69.2512124838132\t69.2512124838132\t1\t1\t0\t\t\t306\tInf\t-1\t0.5\n+M201T3883\tM201.3T64.7\t201.300003051758\t201.300003051758\t201.300003051758\t64.7098459836957\t64.7098459836957\t64.70'..b'67.6515031255186\t3\t1\t1\t\t\t3410\t1.12340560356011\t0.0939016699101903\t0.933848304485567\n+M599T3926\tM599.3T65.4\t599.299987792969\t599.299987792969\t599.299987792969\t65.4307028752848\t65.4307028752848\t65.4307028752848\t2\t0\t1\t\t\t63\t1.17290410867693\t0.115381880483191\t0.918920868266012\n+M599T3741\tM599.3T62.4\t599.299987792969\t599.299987792969\t599.299987792969\t62.3516833479731\t62.263722865781\t62.4396438301653\t2\t1\t1\t\t\t1025\t1.28970384870994\t-0.178016131518077\t0.87605328155016\n+M599T3433\tM599.3T57.2\t599.299987792969\t599.299987792969\t599.299987792969\t57.2211040099898\t57.2211040099898\t57.2211040099898\t1\t1\t0\t\t\t4884\t4.93777942448826\t-0.840632123084489\t0.544862077556411\n+M599T4127\tM599.3T68.8\t599.299987792969\t599.299987792969\t599.299987792969\t68.7816594215337\t68.7816594215337\t68.7816594215337\t1\t0\t1\t\t[M-H+NaCOOH]- 532.325\t23\t1.0841231669298\t0.0840863294693396\t0.942480191266044\n+M599T3728\tM599.4T62.1\t599.400024414062\t599.400024414062\t599.400024414062\t62.1322943738121\t62.1322943738121\t62.1322943738121\t1\t0\t1\t\t\t3590\t8.55809091667057\t0.877183469531961\t0.538430859645099\n+M599T4125\tM599.4T68.8\t599.400024414062\t599.400024414062\t599.400024414062\t68.7551909651299\t68.7551909651299\t68.7551909651299\t1\t1\t0\t\t\t1517\t1.3760664587884\t-0.235040198509613\t0.839694750291835\n+M599T2844\tM599.4T47.4\t599.400024414062\t599.400024414062\t599.400024414062\t47.4005486508707\t47.4005486508707\t47.4005486508707\t1\t1\t0\t\t\t5535\t1.94813261160072\t-0.485317468025549\t0.711632461795722\n+M599T2970\tM599.4T49.5\t599.400024414062\t599.400024414062\t599.400024414062\t49.4982749726645\t49.4982749726645\t49.4982749726645\t1\t0\t1\t\t\t3287\t1.28369928557392\t-0.283602299449437\t0.824023298371347\n+M599T3812\tM599.4T63.5\t599.400024414062\t599.400024414062\t599.400024414062\t63.5371921982908\t63.5371921982908\t63.5371921982908\t1\t1\t0\t\t\t2402\t4.36821098980058\t-0.999245621681714\t0.483251011195392\n+M600T2728\tM599.5T45.5\t599.5\t599.5\t599.5\t45.4677875324447\t45.4677875324447\t45.4677875324447\t1\t0\t1\t\t\t2541\tInf\t1\t0.5\n+M600T3605\tM599.5T60.1\t599.5\t599.5\t599.5\t60.0797479558412\t60.0797479558412\t60.0797479558412\t1\t0\t1\t\t\t1463\tInf\t1\t0.5\n+M600T3410\tM599.5T56.8\t599.5\t599.5\t599.5\t56.8268960641633\t56.8268960641633\t56.8268960641633\t1\t1\t0\t\t\t2557\tInf\t-1\t0.5\n+M600T3002\tM599.5T50\t599.5\t599.5\t599.5\t50.0288900062087\t50.0288900062087\t50.0288900062087\t1\t1\t0\t\t\t4097\tInf\t-1\t0.5\n+M600T2526\tM599.8T42.1\t599.799987792969\t599.799987792969\t599.799987792969\t42.0933680813334\t42.0933680813334\t42.0933680813334\t1\t0\t1\t\t\t5966\tInf\t1\t0.5\n+M600T2559\tM599.8T42.7\t599.799987792969\t599.799987792969\t599.799987792969\t42.6505829099392\t42.6505829099392\t42.6505829099392\t1\t1\t0\t\t\t3097\tInf\t-1\t0.5\n+M600T2605\tM599.9T43.4\t599.900024414062\t599.900024414062\t599.900024414062\t43.4106412919152\t43.3311778044834\t43.4901047793471\t2\t1\t1\t\t\t5240\t2.92442802298341\t-0.784160705393036\t0.544781690982514\n+M600T2778\tM599.9T46.3\t599.900024414062\t599.900024414062\t599.900024414062\t46.2937117304691\t46.2937117304691\t46.2937117304691\t1\t0\t1\t\t[M+Cl]- 564.928\t4269\tInf\t1\t0.5\n+M600T3440\tM600T57.3\t600\t600\t600\t57.3369163968925\t57.3369163968925\t57.3369163968925\t1\t1\t0\t\t\t2940\tInf\t-1\t0.5\n+M600T3074\tM600T51.2\t600\t600\t600\t51.2322779954189\t51.2322779954189\t51.2322779954189\t1\t0\t1\t\t\t2446\t1.36873373980727\t0.217526620333269\t0.849603759563344\n+M600T2840\tM600T47.3\t600\t600\t600\t47.3390372548507\t47.3390372548507\t47.3390372548507\t1\t0\t1\t\t\t4643\tInf\t1\t0.5\n+M600T3456\tM600T57.6\t600\t600\t600\t57.592710737334\t57.592710737334\t57.592710737334\t1\t1\t0\t\t\t1301\t3.43822018687183\t-0.680935393339883\t0.605619546160086\n+M600T3351\tM600T55.8\t600\t600\t600\t55.8476159036111\t55.8476159036111\t55.8476159036111\t1\t1\t0\t\t\t688\tInf\t-1\t0.5\n+M600T2539\tM600T42.3\t600\t600\t600\t42.3115162432725\t42.3115162432725\t42.3115162432725\t1\t1\t0\t\t\t5560\t2.67669683359966\t-0.586792116233081\t0.644186443362018\n+M600T3208\tM600T53.5\t600\t600\t600\t53.47251935441\t53.47251935441\t53.47251935441\t1\t1\t0\t\t\t4342\t4.3596289819114\t-0.990898619184961\t0.481024727063404\n+M600T2969\tM600T49.5\t600\t600\t600\t49.4912576707445\t49.4912576707445\t49.4912576707445\t1\t1\t0\t\t\t72\t1.72326301741792\t-0.363011971451661\t0.758693604731551\n' |
b |
diff -r 9c037181588e -r 1c30ff90f3ae test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv --- a/test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv Wed Feb 01 12:24:04 2017 -0500 +++ b/test-data/faahKO.xset.group.retcor.group.fillPeaks.annotate.variableMetadata.tsv Fri Apr 07 07:42:18 2017 -0400 |
b |
b'@@ -1,8158 +1,8158 @@\n-name\tmz\tmzmin\tmzmax\trt\trtmin\trtmax\tnpeaks\tKO\tWT\tisotopes\tadduct\tpcgroup\tfold\ttstat\tpvalue\n-M200T2874\t200.100006103516\t200.100006103516\t200.100006103516\t2873.66790279219\t2873.66790279219\t2873.66790279219\t1\t1\t0\t\t\t4758\t4.65085295060662\t-1.06493655910147\t0.479605513245819\n-M200T3877\t200.199996948242\t200.199996948242\t200.199996948242\t3876.72559155354\t3876.72559155354\t3876.72559155354\t1\t1\t0\t\t\t2728\t9.88436970273782\t-2.25887629759232\t0.240554009337641\n-M200T3676\t200.199996948242\t200.199996948242\t200.199996948242\t3676.20857473389\t3676.20857473389\t3676.20857473389\t1\t0\t1\t\t\t3702\tInf\t4.64698353395969\t0.13493854409364\n-M200T3486\t200.199996948242\t200.199996948242\t200.199996948242\t3485.71318236608\t3485.71318236608\t3485.71318236608\t1\t1\t0\t\t\t1771\tInf\t-1\t0.5\n-M200T3529\t200.199996948242\t200.199996948242\t200.199996948242\t3529.16673849327\t3529.16673849327\t3529.16673849327\t1\t0\t1\t\t\t370\tInf\t1\t0.5\n-M200T3184\t200.199996948242\t200.199996948242\t200.199996948242\t3184.44736675265\t3184.44736675265\t3184.44736675265\t1\t1\t0\t\t\t40\tInf\t-1\t0.5\n-M200T3817\t200.300003051758\t200.300003051758\t200.300003051758\t3816.57302395962\t3816.57302395962\t3816.57302395962\t1\t0\t1\t\t\t2375\tInf\t1\t0.5\n-M200T3978\t200.300003051758\t200.300003051758\t200.300003051758\t3977.60008277685\t3977.60008277685\t3977.60008277685\t1\t0\t1\t\t\t1981\tInf\t1\t0.5\n-M201T3544\t200.800003051758\t200.800003051758\t200.800003051758\t3543.60312635477\t3543.60312635477\t3543.60312635477\t1\t1\t0\t\t\t2331\tInf\t-1\t0.5\n-M201T4063\t200.800003051758\t200.800003051758\t200.800003051758\t4062.56884383761\t4062.56884383761\t4062.56884383761\t1\t0\t1\t\t\t213\tInf\t1.37734161966442\t0.399789013602801\n-M201T3783\t200.800003051758\t200.800003051758\t200.800003051758\t3783.31394298599\t3783.31394298599\t3783.31394298599\t1\t0\t1\t\t\t3662\tInf\t1\t0.5\n-M201T3274\t200.900009155273\t200.900009155273\t200.900009155273\t3273.93376916172\t3273.93376916172\t3273.93376916172\t1\t0\t1\t\t\t5027\t4.70644940219791\t2.59368058676224\t0.122082365514126\n-M201T2556\t200.900009155273\t200.900009155273\t200.900009155273\t2555.90497459635\t2555.90497459635\t2555.90497459635\t1\t1\t0\t\t\t3065\tInf\t-1\t0.5\n-M201T3626\t200.900009155273\t200.900009155273\t200.900009155273\t3625.94998801881\t3625.94998801881\t3625.94998801881\t1\t0\t1\t\t\t1600\t3.34419119144363\t1.11702356726728\t0.408252476299869\n-M201T3138\t201.100006103516\t201.100006103516\t201.100006103516\t3138.35441665664\t3138.35441665664\t3138.35441665664\t1\t1\t0\t\t\t67\t3.24641816551149\t-0.824914731473309\t0.555087522533288\n-M201T3509\t201.199996948242\t201.199996948242\t201.199996948242\t3509.36563736658\t3509.36563736658\t3509.36563736658\t1\t1\t0\t\t\t4513\tInf\t-1.43344416094946\t0.387782408900977\n-M201T4066\t201.199996948242\t201.199996948242\t201.199996948242\t4065.72082744082\t4065.72082744082\t4065.72082744082\t1\t0\t1\t\t\t3859\t3.13885706983073\t0.938510278186573\t0.508748560086896\n-M201T3687\t201.199996948242\t201.199996948242\t201.199996948242\t3687.18932031058\t3687.18932031058\t3687.18932031058\t1\t0\t1\t\t\t573\tInf\t1\t0.5\n-M201T3998\t201.199996948242\t201.199996948242\t201.199996948242\t3997.93594451384\t3997.93594451384\t3997.93594451384\t1\t0\t1\t\t\t6148\tInf\t1\t0.5\n-M201T3799\t201.199996948242\t201.199996948242\t201.199996948242\t3798.65479588899\t3798.65479588899\t3798.65479588899\t1\t0\t1\t\t\t2829\tInf\t1.48072712698114\t0.378143149183639\n-M201T3936\t201.300003051758\t201.300003051758\t201.300003051758\t3936.43507866832\t3936.43507866832\t3936.43507866832\t1\t0\t1\t\t\t4130\tInf\t1\t0.5\n-M201T4037\t201.300003051758\t201.300003051758\t201.300003051758\t4036.91062955396\t4036.91062955396\t4036.91062955396\t1\t0\t1\t\t\t3747\tInf\t1\t0.5\n-M201T4155\t201.300003051758\t201.300003051758\t201.300003051758\t4155.07274902879\t4155.07274902879\t4155.07274902879\t1\t1\t0\t\t\t306\tInf\t-1\t0.5\n-M201T3883\t201.300003051758\t201.300003051758\t201.300003051758\t3882.59075902174\t3882.59075902174\t3882.59075902174\t1\t1\t0\t\t\t2221\t2.04791935898759\t-0.459809553421658\t0.705094466870333\n-M202T3855\t201.699996948242\t201.699996948242\t201.699996948242\t3854.64092716079\t3854.64092716079\t3854.64092716079\t1\t1\t0\t\t\t1344\tInf\t-1\t0.5\n-M202T4020\t201.699996948242\t201.699996948242\t201.699996948242\t4020.0088'..b'2969\t599.299987792969\t599.299987792969\t67.5781408999495\t67.5781408999495\t67.6515031255186\t3\t1\t1\t\t\t77\t1.12340560356011\t0.0939016699101903\t0.933848304485567\n+M599T3926\tM599.3T65.4\t599.299987792969\t599.299987792969\t599.299987792969\t65.4307028752848\t65.4307028752848\t65.4307028752848\t2\t0\t1\t\t\t63\t1.17290410867693\t0.115381880483191\t0.918920868266012\n+M599T3741\tM599.3T62.4\t599.299987792969\t599.299987792969\t599.299987792969\t62.3516833479731\t62.263722865781\t62.4396438301653\t2\t1\t1\t\t\t14\t1.28970384870994\t-0.178016131518077\t0.87605328155016\n+M599T3433\tM599.3T57.2\t599.299987792969\t599.299987792969\t599.299987792969\t57.2211040099898\t57.2211040099898\t57.2211040099898\t1\t1\t0\t\t\t137\t4.93777942448826\t-0.840632123084489\t0.544862077556411\n+M599T4127\tM599.3T68.8\t599.299987792969\t599.299987792969\t599.299987792969\t68.7816594215337\t68.7816594215337\t68.7816594215337\t1\t0\t1\t\t\t23\t1.0841231669298\t0.0840863294693396\t0.942480191266044\n+M599T3728\tM599.4T62.1\t599.400024414062\t599.400024414062\t599.400024414062\t62.1322943738121\t62.1322943738121\t62.1322943738121\t1\t0\t1\t\t\t84\t8.55809091667057\t0.877183469531961\t0.538430859645099\n+M599T4125\tM599.4T68.8\t599.400024414062\t599.400024414062\t599.400024414062\t68.7551909651299\t68.7551909651299\t68.7551909651299\t1\t1\t0\t\t\t23\t1.3760664587884\t-0.235040198509613\t0.839694750291835\n+M599T2844\tM599.4T47.4\t599.400024414062\t599.400024414062\t599.400024414062\t47.4005486508707\t47.4005486508707\t47.4005486508707\t1\t1\t0\t\t\t181\t1.94813261160072\t-0.485317468025549\t0.711632461795722\n+M599T2970\tM599.4T49.5\t599.400024414062\t599.400024414062\t599.400024414062\t49.4982749726645\t49.4982749726645\t49.4982749726645\t1\t0\t1\t\t\t72\t1.28369928557392\t-0.283602299449437\t0.824023298371347\n+M599T3812\tM599.4T63.5\t599.400024414062\t599.400024414062\t599.400024414062\t63.5371921982908\t63.5371921982908\t63.5371921982908\t1\t1\t0\t\t\t46\t4.36821098980058\t-0.999245621681714\t0.483251011195392\n+M600T2728\tM599.5T45.5\t599.5\t599.5\t599.5\t45.4677875324447\t45.4677875324447\t45.4677875324447\t1\t0\t1\t\t\t49\tInf\t1\t0.5\n+M600T3605\tM599.5T60.1\t599.5\t599.5\t599.5\t60.0797479558412\t60.0797479558412\t60.0797479558412\t1\t0\t1\t\t\t22\tInf\t1\t0.5\n+M600T3410\tM599.5T56.8\t599.5\t599.5\t599.5\t56.8268960641633\t56.8268960641633\t56.8268960641633\t1\t1\t0\t\t\t50\tInf\t-1\t0.5\n+M600T3002\tM599.5T50\t599.5\t599.5\t599.5\t50.0288900062087\t50.0288900062087\t50.0288900062087\t1\t1\t0\t\t\t105\tInf\t-1\t0.5\n+M600T2526\tM599.8T42.1\t599.799987792969\t599.799987792969\t599.799987792969\t42.0933680813334\t42.0933680813334\t42.0933680813334\t1\t0\t1\t\t\t241\tInf\t1\t0.5\n+M600T2559\tM599.8T42.7\t599.799987792969\t599.799987792969\t599.799987792969\t42.6505829099392\t42.6505829099392\t42.6505829099392\t1\t1\t0\t\t\t65\tInf\t-1\t0.5\n+M600T2605\tM599.9T43.4\t599.900024414062\t599.900024414062\t599.900024414062\t43.4106412919152\t43.3311778044834\t43.4901047793471\t2\t1\t1\t\t\t157\t2.92442802298341\t-0.784160705393036\t0.544781690982514\n+M600T2778\tM599.9T46.3\t599.900024414062\t599.900024414062\t599.900024414062\t46.2937117304691\t46.2937117304691\t46.2937117304691\t1\t0\t1\t\t\t112\tInf\t1\t0.5\n+M600T3440\tM600T57.3\t600\t600\t600\t57.3369163968925\t57.3369163968925\t57.3369163968925\t1\t1\t0\t\t\t62\tInf\t-1\t0.5\n+M600T3074\tM600T51.2\t600\t600\t600\t51.2322779954189\t51.2322779954189\t51.2322779954189\t1\t0\t1\t\t\t48\t1.36873373980727\t0.217526620333269\t0.849603759563344\n+M600T2840\tM600T47.3\t600\t600\t600\t47.3390372548507\t47.3390372548507\t47.3390372548507\t1\t0\t1\t\t\t125\tInf\t1\t0.5\n+M600T3456\tM600T57.6\t600\t600\t600\t57.592710737334\t57.592710737334\t57.592710737334\t1\t1\t0\t\t\t19\t3.43822018687183\t-0.680935393339883\t0.605619546160086\n+M600T3351\tM600T55.8\t600\t600\t600\t55.8476159036111\t55.8476159036111\t55.8476159036111\t1\t1\t0\t\t\t7\tInf\t-1\t0.5\n+M600T2539\tM600T42.3\t600\t600\t600\t42.3115162432725\t42.3115162432725\t42.3115162432725\t1\t1\t0\t\t\t184\t2.67669683359966\t-0.586792116233081\t0.644186443362018\n+M600T3208\tM600T53.5\t600\t600\t600\t53.47251935441\t53.47251935441\t53.47251935441\t1\t1\t0\t\t\t113\t4.3596289819114\t-0.990898619184961\t0.481024727063404\n+M600T2969\tM600T49.5\t600\t600\t600\t49.4912576707445\t49.4912576707445\t49.4912576707445\t1\t1\t0\t\t\t72\t1.72326301741792\t-0.363011971451661\t0.758693604731551\n' |
b |
diff -r 9c037181588e -r 1c30ff90f3ae test-data/ko15.CDF |
b |
Binary file test-data/ko15.CDF has changed |
b |
diff -r 9c037181588e -r 1c30ff90f3ae test-data/ko16.CDF |
b |
Binary file test-data/ko16.CDF has changed |
b |
diff -r 9c037181588e -r 1c30ff90f3ae test-data/wt15.CDF |
b |
Binary file test-data/wt15.CDF has changed |
b |
diff -r 9c037181588e -r 1c30ff90f3ae test-data/wt16.CDF |
b |
Binary file test-data/wt16.CDF has changed |
b |
diff -r 9c037181588e -r 1c30ff90f3ae tool_dependencies.xml --- a/tool_dependencies.xml Wed Feb 01 12:24:04 2017 -0500 +++ /dev/null Thu Jan 01 00:00:00 1970 +0000 |
b |
@@ -1,12 +0,0 @@ -<?xml version="1.0"?> -<tool_dependency> - <package name="R" version="3.1.2"> - <repository changeset_revision="4d2fd1413b56" name="package_r_3_1_2" owner="iuc" toolshed="https://toolshed.g2.bx.psu.edu" /> - </package> - <package name="bioconductor-camera" version="1.26.0"> - <repository changeset_revision="fd308c76626b" name="package_bioconductor_camera_1_26_0" owner="lecorguille" toolshed="https://toolshed.g2.bx.psu.edu" /> - </package> - <package name="graphicsmagick" version="1.3.20"> - <repository changeset_revision="f2855f4cbc8f" name="package_graphicsmagick_1_3_20" owner="iuc" toolshed="https://toolshed.g2.bx.psu.edu" /> - </package> -</tool_dependency> |