Mercurial > repos > ecology > pampa_communitymetrics
changeset 0:ddd5b2e74b8b draft
"planemo upload for repository https://github.com/ColineRoyaux/PAMPA-Galaxy commit 07f1028cc764f920b1e6419c151f04ab4e3600fa"
| author | ecology | 
|---|---|
| date | Tue, 21 Jul 2020 06:00:10 -0400 | 
| parents | |
| children | e2b0eec4e788 | 
| files | CalculateCommunityMetrics.xml FunctExeCalcCommIndexesGalaxy.r FunctPAMPAGalaxy.r pampa_macros.xml test-data/Community_metrics_cropped.tabular test-data/ObservationsSansszcl_cropped.tabular | 
| diffstat | 6 files changed, 7227 insertions(+), 0 deletions(-) [+] | 
line wrap: on
 line diff
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/CalculateCommunityMetrics.xml Tue Jul 21 06:00:10 2020 -0400 @@ -0,0 +1,96 @@ +<tool id="pampa_communitymetrics" name="Calculate community metrics" version="@VERSION@"> + <description>calculate community metrics from abundance data</description> + <macros> + <import>pampa_macros.xml</import> + </macros> + <expand macro="Pampa_requirements"/> + <command detect_errors="exit_code"><![CDATA[ + Rscript + '$__tool_directory__/FunctExeCalcCommIndexesGalaxy.r' + '$input' + '$indexes' + '$__tool_directory__/FunctPAMPAGalaxy.r' + '$output_community' + ]]> + </command> + <inputs> + <expand macro="pampa_input_calculate"/> + <param name="indexes" type="select" label="Choose the community metrics you want to compute" help="Presence/absence, Species richness, Simpson and Shannon index are systematically computed." multiple="true"> + <option selected="true" value="all">All</option> + <option value="simpson.l">1-Simpson</option> + <option value="pielou">Pielou</option> + <option value="hill">Hill</option> + </param> + </inputs> + <outputs> + <data name="output_community" from_work_dir="TabCommunityIndexes.tabular" format="tabular"/> + </outputs> + <tests> + <test> + <param name="input" value="ObservationsSansszcl_cropped.tabular"/> + <param name="indexes" value="all"/> + <output name="output_community" value="Community_metrics_cropped.tabular"/> + </test> + </tests> + <help><![CDATA[ +=============================================== +Calculate community metrics from abundance data +=============================================== + +**What it does** + +This tool from PAMPA toolsuite computes community metrics from abundance data: + +- Specific richness +- Shannon index +- Simpson index +- Pielou index +- Hill index +- Relative richness + +| + +**Input description** + +A tabular file with observation data. Must at least contain three columns 'observation.unit' +which associate year and location or 'year' and 'location', 'species.code' with species ID and 'number' for abundance. + ++------------------+--------------+------------+ +| observation.unit | species.code | number | ++==================+==============+============+ +| site_yearID | speciesID | 4 | ++------------------+--------------+------------+ +| ... | ... | ... | ++------------------+--------------+------------+ + +OR + ++------+----------+--------------+------------+ +| year | location | species.code | number | ++======+==========+==============+============+ +| 2000 |locationID| speciesID | 4 | ++------+----------+--------------+------------+ +| ... | ... | ... | ... | ++------+----------+--------------+------------+ + +The data frame may also contain: + +- 'size.class' field with 'G' representing big individuals in given species, 'M' middle-sized individuals and 'P' small individuals +- 'rotation' field for STAVIRO data + +| + +**Output** + +A tabular file with every metrics selected computed per observation unit + +| + +**Source** + +Derived from PAMPA scripts (https://wwz.ifremer.fr/pampa/Meth.-Outils/Outils) written by Yves Reecht. + + ]]></help> + + <expand macro="pampa_bibref" /> +</tool>
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/FunctExeCalcCommIndexesGalaxy.r Tue Jul 21 06:00:10 2020 -0400 @@ -0,0 +1,157 @@ +#Rscript + +##################################################################################################################### +##################################################################################################################### +################################# Calculate community indexes from observation data ################################# +##################################################################################################################### +##################################################################################################################### + +###################### Packages R + +suppressMessages(library(tidyr)) + +###################### Load arguments and declaring variables + +args = commandArgs(trailingOnly=TRUE) +#options(encoding = "UTF-8") + +if (length(args) < 4) { + stop("At least one argument must be supplied, an input dataset file (.tabular).", call.=FALSE) #si pas d'arguments -> affiche erreur et quitte / if no args -> error and exit1 + +} else { + Importdata<-args[1] ###### Nom du fichier importé avec son extension / file name imported with the file type ".filetype" + index <- args[2] ###### List of selected metrics to calculate + source(args[3]) ###### Import functions + +} +#### Data must be a dataframe with at least 3 variables : unitobs representing location and year ("observation.unit"), species code ("species.code") and abundance ("number") + + +#Import des données / Import data +obs<- read.table(Importdata,sep="\t",dec=".",header=TRUE,encoding="UTF-8") # +obs[obs == -999] <- NA +factors <- fact.det.f(Obs=obs) +ObsType <- def.typeobs.f(Obs=obs) +obs <- create.unitobs(data=obs) + +vars_data<-c("observation.unit","species.code","number") +err_msg_data<-"The input dataset doesn't have the right format. It need to have at least the following 3 variables :\n- observation.unit (or point and year)\n- species.code\n- number\n" +check_file(obs,err_msg_data,vars_data,3) + + + +#################################################################################################### +################## create community metrics table ## Function : calcBiodiv.f ####################### +#################################################################################################### + +######################################################################################################################## +calcBiodiv.f <- function(Data, MPA, unitobs="observation.unit", code.especes="species.code", nombres="number", + indices=index) +{ + ## Purpose: calcul des indices de biodiversité + ## ---------------------------------------------------------------------- + ## Arguments: Data : les données à partir desquelles calculer les + ## indices. Doivent comporter au minimum (colones) : + ## * unités d'observations/sites + ## * espèces présentes + ## * nombre d'individus /espèce/unitobs. + ## refesp : le référentiel espèces. + ## MPA : l'AMP (chaîne de charactères). + ## unitobs : nom de la colone d'unités d'observation. + ## code.especes : nom de la colone d'espèces. + ## nombres : nom de la colone de nombres. + ## indices : liste des indices à calculer + ## (vecteur de caractères) + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 29 oct. 2010, 08:58 + + ## Supression de tout ce qui n'a pas d'espèce précisee (peut être du non biotique ou identification >= genre) : + + notspline <- grep("(sp\\.)$|([1-9])$|^(Absencemacrofaune)$|^(NoID)$|^(Acrobranc)$|^(Acrodigit)$|^(Acroencr)$|^(Acrosubm)$|^(Acrotabu)$|^(Adredure)$|^(Adremoll)$|^(Algaturf)$|^(Balimona)$|^(Corablan)$|^(CoradurV)$|^(Coraenal)$|^(Coramor1)$|^(Coramor2)$|^(Coramou)$|^( Dallcora)$|^(Debrcora)$|^(Debris)$|^(Hare)$|^(HexaChar)$|^(MuraCong)$|^(Nacrbran)$|^(Nacrcham)$|^(Nacrencr)$|^(Nacrfoli)$|^(Nacrmass)$|^(Nacrsubm)$|^(Recrcora)$|^(Roche)$|^(Sable)$|^(Vase)$",Data[, code.especes], value=FALSE) + if (length(notspline) != 0) + { + Data <- Data[-notspline, ] + }else{} + + ## Suppression des niveaux de facteur inutilisés : + Data <- dropLevels.f(df=Data) + + + ## Si les données ne sont pas encore agrégées /espèce/unitobs on le fait ici : + if (nrow(Data) > nrow(expand.grid(unique(Data[ , unitobs]), unique(Data[ , code.especes])))) + { + Data <- agregations.generic.f(Data=Data, metrics=nombres, + factors=c(unitobs, code.especes), + listFact=NULL) + }else{} + + df.biodiv <- as.data.frame(as.table(tapply(Data[ , nombres], + Data[ , unitobs], + sum, na.rm=TRUE))) + + colnames(df.biodiv) <- c(unitobs, nombres) + +## ################################################## + ## Richesse spécifique : + Data$pres.abs <- presAbs.f(nombres=Data[ , nombres], logical = FALSE) + + df.biodiv$species.richness <- as.vector(tapply(Data$pres.abs, + Data[ , unitobs], sum, na.rm=TRUE), + "integer") + ## ... as.vector to avoid the class "array". + + ## ################################################## + ## Indices de Simpson et Shannon et dérivés : + + matNombres <- tapply(Data[ , nombres], # Matrice de nombres d'individus /espèce/unitobs. + list(Data[ , unitobs], Data[ , code.especes]), + sum, na.rm=TRUE) + + matNombres[is.na(matNombres)] <- 0 # Vrais zéros + + ## Proportion d'individus de chaque espèce dans l'unitobs : + propIndiv <- sweep(matNombres, 1, + apply(matNombres, 1, sum, na.rm = TRUE), # Nombre d'individus / unitobs ; équiv df.biodiv$nombre. + FUN="/") + + ## Indices de Simpson : + df.biodiv$simpson <- apply(propIndiv^2, 1, sum, na.rm=TRUE) + + if (any(is.element(c("all", "simpson.l"), indices))) + { + df.biodiv$simpson.l <- 1 - df.biodiv$simpson + } + + ## calcul de l'indice de Shannon : + df.biodiv$shannon <- -1 * apply(propIndiv * log(propIndiv), 1, sum, na.rm=TRUE) + + ## calcul de l'indice de Pielou : + if (any(is.element(c("all", "pielou"), indices))) + { + df.biodiv$pielou <- df.biodiv$shannon / log(df.biodiv$species.richness) + } + + ## calcul de l'indice de Hill : + if (any(is.element(c("all", "hill"), indices))) + { + df.biodiv$hill <- (1 - df.biodiv$simpson) / exp(df.biodiv$shannon) + # équiv df.biodiv$l.simpson / exp(df.biodiv$shannon) + } + + + return(df.biodiv) +} + +################# Analysis + +res <- calc.numbers.f(obs, ObsType=ObsType , factors=factors, nbName="number") + +tableCommunityIndexes <- calcBiodiv.f(res, MPA, unitobs="observation.unit", code.especes="species.code", nombres="number", + indices=index) +tableCommunityIndexes <- create.year.point(tableCommunityIndexes) +#Save dataframe in a tabular format + +filenameComm <- "TabCommunityIndexes.tabular" +write.table(tableCommunityIndexes, filenameComm, row.names=FALSE, sep="\t", dec=".",fileEncoding="UTF-8") +cat(paste("\nWrite table with Community indexes. \n--> \"",filenameComm,"\"\n",sep="")) +
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/FunctPAMPAGalaxy.r Tue Jul 21 06:00:10 2020 -0400 @@ -0,0 +1,3568 @@ +#Rscript + + +################################################################################################################################## +####################### PAMPA Galaxy tools functions : Calculate metrics, compute GLM and plot ################################# +################################################################################################################################## + +#### Based on Yves Reecht R script +#### Modified by Coline ROYAUX for integrating within Galaxy-E + +######################################### start of the function fact.def.f called by FunctExeCalcCommIndexesGalaxy.r and FunctExeCalcPresAbsGalaxy.r +####### Define the finest aggregation with the observation table + +fact.det.f <- function (Obs, + size.class="size.class", + code.especes="species.code", + unitobs="observation.unit") +{ + if (any(is.element(c(size.class), colnames(obs))) && all(! is.na(obs[, size.class]))) + { + factors <- c(unitobs, code.especes, size.class) + }else{ + factors <- c(unitobs, code.especes) + } + return(factors) +} + +######################################### end of the function fact.def.f + +######################################### start of the function def.typeobs.f called by FunctExeCalcCommIndexesGalaxy.r and FunctExeCalcPresAbsGalaxy.r +####### Define observation type from colnames + +def.typeobs.f <- function(Obs) +{ + if (any(is.element(c("rotation","rot","rotate"),colnames(obs)))) + { + ObsType <- "SVR" + }else{ + ObsType <- "other" + } + return(ObsType) +} +######################################### end of the function fact.def.f + +######################################### start of the function create.unitobs called by FunctExeCalcCommIndexesGalaxy.r and FunctExeCalcPresAbsGalaxy.r +####### Create unitobs column when inexistant +create.unitobs <- function(data,year="year",point="point", unitobs="observation.unit") +{ + if (is.element(paste(unitobs),colnames(data)) && all(grepl("[1-2][0|8|9][0-9]{2}_.*",data[,unitobs])==FALSE)) + { + unitab <- data + + }else{ + + unitab <- unite(data,col="observation.unit",c(year,point)) + } + return(unitab) +} +######################################### start of the function create.unitobs + +######################################### start of the function create.year.point called by FunctExeCalcCommIndexesGalaxy.r and FunctExeCalcPresAbsGalaxy.r +####### separate unitobs column when existant +create.year.point <- function(data,year="year",point="point", unitobs="observation.unit") +{ + if (all(grepl("[1-2][0|8|9][0-9]{2}_.*",data[,unitobs]))==TRUE) + { + tab <- separate(data,col=unitobs,into=c(year,point),sep="_") + }else{ + tab <- separate(data,col=unitobs,into=c("site1", year,"obs"),sep=c(2,4)) + tab <- unite(tab, col=point, c("site1","obs")) + + } + + tab <- cbind(tab,observation.unit = data[,unitobs]) + + return(tab) +} +######################################### start of the function create.unitobs + +######################################### start of the function check_file called by every Galaxy Rscripts + +check_file<-function(dataset,err_msg,vars,nb_vars){ + + ## Purpose: General function to check integrity of input file. Will + ## check numbers and contents of variables(colnames). + ## return an error message and exit if mismatch detected + ## ---------------------------------------------------------------------- + ## Arguments: dataset : dataset name + ## err_msg : output error + ## vars : expected name of variables + ## nb_vars : expected number of variables + ## ---------------------------------------------------------------------- + ## Author: Alan Amosse, Benjamin Yguel + + if(ncol(dataset) < nb_vars){ #checking for right number of columns in the file if not = error message + cat("\nerr nb var\n") + stop(err_msg, call.=FALSE) + } + + for(i in vars){ + if(!(i %in% names(dataset))){ #checking colnames + stop(err_msg,call.=FALSE) + } + } +} + +######################################### end of the function check_file + + +######################################### start of the function statRotationsNumber.f called by calc.numbers.f + +statRotationsNumber.f <- function(factors, obs) +{ + ## Purpose: Computing abundance statistics by rotation (max, sd) + ## on SVR data + ## ---------------------------------------------------------------------- + ## Arguments: factors : Names of aggregation factors + ## obs : observation data + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 29 oct. 2012, 16:01 modified by Coline ROYAUX 04 june 2020 + + ## Identification of valid rotations : + if (is.element("observation.unit", factors)) + { + ## valid rotations (empty must be there as well) : + rotations <- tapply(obs$rotation, + as.list(obs[ , c("observation.unit", "rotation"), drop=FALSE]), + function(x)length(x) > 0) + + ## Changing NA rotations in FALSE : + rotations[is.na(rotations)] <- FALSE + }else{ + #stop(mltext("statRotations.err.1")) + } + + ## ########################################################### + ## Abundance per rotation at chosen aggregation factors : + nombresR <- tapply(obs$number, + as.list(obs[ , c(factors, "rotation"), drop=FALSE]), + function(x,...){ifelse(all(is.na(x)), NA, sum(x,...))}, + na.rm = TRUE) + + ## If valid rotation NA are considered 0 : + nombresR <- sweep(nombresR, + match(names(dimnames(rotations)), names(dimnames(nombresR)), nomatch=NULL), + rotations, # Tableau des secteurs valides (booléens). + function(x, y) + { + x[is.na(x) & y] <- 0 # Lorsque NA et secteur valide => 0. + return(x) + }) + + ## ################################################## + ## Statistics : + + ## Means : + nombresMean <- apply(nombresR, which(is.element(names(dimnames(nombresR)), factors)), + function(x,...){ifelse(all(is.na(x)), NA, mean(x,...))}, na.rm=TRUE) + + ## Maxima : + nombresMax <- apply(nombresR, which(is.element(names(dimnames(nombresR)), factors)), + function(x,...){ifelse(all(is.na(x)), NA, max(x,...))}, na.rm=TRUE) + + ## SD : + nombresSD <- apply(nombresR, which(is.element(names(dimnames(nombresR)), factors)), + function(x,...){ifelse(all(is.na(x)), NA, sd(x,...))}, na.rm=TRUE) + + ## Valid rotations count : + nombresRotations <- apply(rotations, 1, sum, na.rm=TRUE) + + ## Results returned as list : + return(list(nombresMean=nombresMean, nombresMax=nombresMax, nombresSD=nombresSD, + nombresRotations=nombresRotations, nombresTot=nombresR)) +} + +######################################### end of the function statRotationsNumber.f + +######################################### start of the function calcNumber.default.f called by calc.numbers.f + +calcNumber.default.f <- function(obs, + factors=c("observation.unit", "species.code", "size.class"), + nbName="number") +{ + ## Purpose : Compute abundances at finest aggregation + ## --------------------------------------------------------------------- + ## Arguments: obs : observation table + ## factors : aggregation factors + ## nbName : name of abundance column. + ## + ## Output: array with ndimensions = nfactors. + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 19 déc. 2011, 13:38 modified by Coline ROYAUX 04 june 2020 + + ## Sum individuals number : + nbr <- tapply(obs[ , nbName], + as.list(obs[ , factors]), + sum, na.rm = TRUE) + + ## Absences as "true zero" : + nbr[is.na(nbr)] <- 0 + + return(nbr) +} + +######################################### end of the function calcNumber.default.f + +######################################### start of the function calc.numbers.f + +calc.numbers.f <- function(obs, ObsType="", factors=c("observation.unit", "species.code", "size.class"), nbName="number") +{ + ## Purpose: Produce data.frame used as table from output of calcNumber.default.f(). + ## ---------------------------------------------------------------------- + ## Arguments: obs : observation table + ## ObsType : Type of observation (SVR, LIT, ...) + ## factors : aggregation factors + ## nbName : name of abundance column + ## + ## Output: data.frame with (N aggregation factors + 1) columns + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 19 déc. 2011, 13:46 modified by Coline ROYAUX 04 june 2020 + + if (ObsType == "SVR") + { + ## Compute SVR abundances statistics : + statRotations <- statRotationsNumber.f(factors=factors, + obs=obs) + + ## Mean for rotating videos (3 rotations at most times) : + nbr <- statRotations[["nombresMean"]] + + }else{ + + nbr <- calcNumber.default.f(obs, factors, nbName) + } + + res <- as.data.frame(as.table(nbr), responseName=nbName) + + if (is.element("size.class", colnames(res))) + { + res$size.class[res$size.class == ""] <- NA + }else{} + + ## If integer abundances : + if (isTRUE(all.equal(res[ , nbName], as.integer(res[ , nbName])))) + { + res[ , nbName] <- as.integer(res[ , nbName]) + }else{} + + if (ObsType == "SVR") + { + ## statistics on abundances : + res$number.max <- as.vector(statRotations[["nombresMax"]]) + res$number.sd <- as.vector(statRotations[["nombresSD"]]) + + }else{} + + return(res) +} + +######################################### end of the function calc.numbers.f + +######################################### start of the function presAbs.f called by calcBiodiv.f + +presAbs.f <- function(nombres, logical=FALSE) +{ + ## Purpose: Compute presence absence from abundances + ## ---------------------------------------------------------------------- + ## Arguments: nombres : vector of individuals count. + ## logical : (boolean) results as boolean or 0/1 ? + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 29 oct. 2010, 10:20 modified by Coline ROYAUX 04 june 2020 + + if (any(nombres < 0, na.rm=TRUE)) + { + stop("Negative abundances!") + }else{} + + if (logical) + { + return(nombres > 0) + }else{ + nombres[nombres > 0] <- 1 + return(nombres) + } +} + +######################################### end of the function presAbs.f + +######################################### start of the function betterCbind called by agregations.generic.f + +betterCbind <- function(..., dfList=NULL, deparse.level = 1) +{ + ## Purpose: Apply cbind to data frame with mathcing columns but without + ## redundancies. + ## ---------------------------------------------------------------------- + ## Arguments: same as cbind... + ## dfList : data.frames list + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 17 janv. 2012, 21:10 modified by Coline ROYAUX 04 june 2020 + + if (is.null(dfList)) + { + dfList <- list(...) + }else{} + + return(do.call(cbind, + c(list(dfList[[1]][ , c(tail(colnames(dfList[[1]]), -1), + head(colnames(dfList[[1]]), 1))]), + lapply(dfList[-1], + function(x, colDel) + { + return(x[ , !is.element(colnames(x), + colDel), + drop=FALSE]) + }, + colDel=colnames(dfList[[1]])), + deparse.level=deparse.level))) +} + +######################################### end of the function betterCbind + +######################################### start of the function agregation.f called by agregations.generic.f + +agregation.f <- function(metric, Data, factors, casMetrique, + nbName="number") +{ + ## Purpose: metric aggregation + ## ---------------------------------------------------------------------- + ## Arguments: metric: colnames of chosen metric + ## Data: Unaggregated data table + ## factors: aggregation factors vector + ## casMetrique: named vector of observation types depending + ## on chosen metric + ## nbName : abundance column name + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 20 déc. 2011, 14:29 modified by Coline ROYAUX 04 june 2020 + + switch(casMetrique[metric], + "sum"={ + res <- tapply(Data[ , metric], + as.list(Data[ , factors, drop=FALSE]), + function(x) + { + ifelse(all(is.na(x)), + NA, + sum(x, na.rm=TRUE)) + }) + }, + "w.mean"={ + res <- tapply(1:nrow(Data), + as.list(Data[ , factors, drop=FALSE]), + function(ii) + { + ifelse(all(is.na(Data[ii, metric])), + NA, + weighted.mean(Data[ii, metric], + Data[ii, nbName], + na.rm=TRUE)) + }) + }, + "w.mean.colonies"={ + res <- tapply(1:nrow(Data), + as.list(Data[ , factors, drop=FALSE]), + function(ii) + { + ifelse(all(is.na(Data[ii, metric])), + NA, + weighted.mean(Data[ii, metric], + Data[ii, "colonies"], + na.rm=TRUE)) + }) + }, + "w.mean.prop"={ + res <- tapply(1:nrow(Data), + as.list(Data[ , factors, drop=FALSE]), + function(ii) + { + ifelse(all(is.na(Data[ii, metric])) || sum(Data[ii, "nombre.tot"], na.rm=TRUE) == 0, + NA, + ifelse(all(na.omit(Data[ii, metric]) == 0), # Pour ne pas avoir NaN. + 0, + (sum(Data[ii, nbName][ !is.na(Data[ii, metric])], na.rm=TRUE) / + sum(Data[ii, "nombre.tot"], na.rm=TRUE)) * + ## Correction if size class isn't an aggregation factor + ## (otherwise value divided by number of present classes) : + ifelse(is.element("size.class", factors), + 100, + 100 * length(unique(Data$size.class))))) + }) + + }, + "w.mean.prop.bio"={ + res <- tapply(1:nrow(Data), + as.list(Data[ , factors, drop=FALSE]), + function(ii) + { + ifelse(all(is.na(Data[ii, metric])) || sum(Data[ii, "tot.biomass"], na.rm=TRUE) == 0, + NA, + ifelse(all(na.omit(Data[ii, metric]) == 0), # Pour ne pas avoir NaN. + 0, + (sum(Data[ii, "biomass"][ !is.na(Data[ii, metric])], na.rm=TRUE) / + sum(Data[ii, "tot.biomass"], na.rm=TRUE)) * + ## Correction if size class isn't an aggregation factor + ## (otherwise value divided by number of present classes) : + ifelse(is.element("size.class", factors), + 100, + 100 * length(unique(Data$size.class))))) + }) + + }, + "pres"={ + res <- tapply(Data[ , metric], + as.list(Data[ , factors, drop=FALSE]), + function(x) + { + ifelse(all(is.na(x)), # When only NAs. + NA, + ifelse(any(x > 0, na.rm=TRUE), # Otherwise... + 1, # ... presence if at least one observation in the group. + 0)) + }) + }, + "nbMax"={ + ## Recuperation of raw abundances with selections : + nbTmp <- getReducedSVRdata.f(dataName=".NombresSVR", data=Data) + + ## Sum by factor cross / rotation : + nbTmp2 <- apply(nbTmp, + which(is.element(names(dimnames(nbTmp)), c(factors, "rotation"))), + function(x) + { + ifelse(all(is.na(x)), NA, sum(x, na.rm=TRUE)) + }) + + ## Sum by factor cross : + res <- as.array(apply(nbTmp2, + which(is.element(names(dimnames(nbTmp)), factors)), + function(x) + { + ifelse(all(is.na(x)), NA, max(x, na.rm=TRUE)) + })) + }, + "nbSD"={ + ## Recuperation of raw abundances with selections : + nbTmp <- getReducedSVRdata.f(dataName=".NombresSVR", data=Data) + + ## Sum by factor cross / rotation : + nbTmp2 <- apply(nbTmp, + which(is.element(names(dimnames(nbTmp)), c(factors, "rotation"))), + function(x) + { + ifelse(all(is.na(x)), NA, sum(x, na.rm=TRUE)) + }) + + ## Sum by factor cross : + res <- as.array(apply(nbTmp2, + which(is.element(names(dimnames(nbTmp)), factors)), + function(x) + { + ifelse(all(is.na(x)), NA, sd(x, na.rm=TRUE)) + })) + }, + "densMax"={ + ## Recuperation of raw abundances with selections : + densTmp <- getReducedSVRdata.f(dataName=".DensitesSVR", data=Data) + + ## Sum by factor cross / rotation : + densTmp2 <- apply(densTmp, + which(is.element(names(dimnames(densTmp)), c(factors, "rotation"))), + function(x) + { + ifelse(all(is.na(x)), NA, sum(x, na.rm=TRUE)) + }) + + ## Sum by factor cross : + res <- as.array(apply(densTmp2, + which(is.element(names(dimnames(densTmp)), factors)), + function(x) + { + ifelse(all(is.na(x)), NA, max(x, na.rm=TRUE)) + })) + }, + "densSD"={ + ## Recuperation of raw abundances with selections : + densTmp <- getReducedSVRdata.f(dataName=".DensitesSVR", data=Data) + + ## Sum by factor cross / rotation : + densTmp2 <- apply(densTmp, + which(is.element(names(dimnames(densTmp)), c(factors, "rotation"))), + function(x) + { + ifelse(all(is.na(x)), NA, sum(x, na.rm=TRUE)) + }) + + ## Sum by factor cross : + res <- as.array(apply(densTmp2, + which(is.element(names(dimnames(densTmp)), factors)), + function(x) + { + ifelse(all(is.na(x)), NA, sd(x, na.rm=TRUE)) + })) + }, + "%.nesting"={ + res <- tapply(1:nrow(Data), + as.list(Data[ , factors, drop=FALSE]), + function(ii) + { + ifelse(all(is.na(Data[ii, metric])), + NA, + weighted.mean(Data[ii, metric], + Data[ii, "readable.tracks"], + na.rm=TRUE)) + }) + }, + stop("Not implemented!") + ) + + ## dimension names + names(dimnames(res)) <- c(factors) + + ## Transformation to long format : + reslong <- as.data.frame(as.table(res), responseName=metric) + reslong <- reslong[ , c(tail(colnames(reslong), 1), head(colnames(reslong), -1))] # metric first + + return(reslong) +} + +######################################### end of the function agregation.f + +######################################### start of the function agregations.generic.f called y calcBiodiv.f in FucntExeCalcCommIndexesGalaxy.r + +agregations.generic.f <- function(Data, metrics, factors, listFact=NULL, unitSpSz=NULL, unitSp=NULL, + nbName="number") +{ + ## Purpose: Aggregate data + ## ---------------------------------------------------------------------- + ## Arguments: Data : data set + ## metrics : aggregated metric + ## factors : aggregation factors + ## listFact : other factors to aggregate and add to output + ## unitSpSz : Metrics table by unitobs/species/Size Class + ## unitSp : Metrics table by unitobs/species + ## nbName : abundance colname + ## + ## Output : aggregated data frame + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 18 oct. 2010, 15:47 modified by Coline ROYAUX 04 june 2020 + + ## trt depending on metric type : + casMetrique <- c("number"="sum", + "mean.length"="w.mean", + "taille_moy"="w.mean", + "biomass"="sum", + "Biomass"="sum", + "weight"="sum", + "mean.weight"="w.mean", + "density"="sum", + "Density"="sum", + "CPUE"="sum", + "CPUE.biomass"="sum", + "pres.abs"="pres", + "abundance.prop.SC"="w.mean.prop", # Not OK [!!!] ? + "biomass.prop.SC"="w.mean.prop.bio", # Not OK [!!!] ? + ## Benthos : + "colonies"="sum", + "coverage"="sum", + "mean.size.colonies"="w.mean.colonies", + ## SVR (expérimental) : + "number.max"="nbMax", + "number.sd"="nbSD", + "density.max"="densMax", + "density.sd"="densSD", + "biomass.max"="sum", + "spawning.success"="%.nesting", + "spawnings"="sum", + "readable.tracks"="sum", + "tracks.number"="sum") + + ## add "readable.tracks" for egg laying percentage : + if (any(casMetrique[metrics] == "%.nesting")) + { + if (is.element("size.class", colnames(Data))) + { + if (is.null(unitSpSz)) stop("unitSpSz doit être défini") + + Data <- merge(Data, + unitSpSz[ , c("species.code", "observation.unit", "size.class", "readable.tracks")], + by=c("species.code", "observation.unit", "size.class"), + suffixes=c("", ".y")) + }else{ + if (is.null(unitSp)) stop("unitSp must be defined") + + Data <- merge(Data, + unitSp[ , c("species.code", "observation.unit", "readable.tracks")], + by=c("species.code", "observation.unit"), + suffixes=c("", ".y")) + } + }else{} + + ## Add "number" field for computing ponderate means if absent : + if (any(casMetrique[metrics] == "w.mean" | casMetrique[metrics] == "w.mean.prop")) + { + if (is.element("size.class", colnames(Data))) + { + if (is.null(unitSpSz)) stop("unitSpSz must be defined") + + Data <- merge(Data, + unitSpSz[ , c("species.code", "observation.unit", "size.class", nbName)], + by=c("species.code", "observation.unit", "size.class"), + suffixes=c("", ".y")) + + ## add tot abundance / species / observation unit : + nbTot <- tapply(unitSpSz[ , nbName], + as.list(unitSpSz[ , c("species.code", "observation.unit")]), + sum, na.rm=TRUE) + + Data <- merge(Data, + as.data.frame(as.table(nbTot), responseName="nombre.tot")) + }else{ + if (is.null(unitSp)) stop("unitSp must be defined") + + Data <- merge(Data, + unitSp[ , c("species.code", "observation.unit", nbName)], # [!!!] unitSpSz ? + by=c("species.code", "observation.unit"), + suffixes=c("", ".y")) + } + }else{} + + ## Add biomass field of biomass proportion by size class : + if (any(casMetrique[metrics] == "w.mean.prop.bio")) + { + if (is.null(unitSpSz)) stop("unitSpSz doit être défini") + + Data <- merge(Data, + unitSpSz[ , c("species.code", "observation.unit", "size.class", "biomass")], + by=c("species.code", "observation.unit", "size.class"), + suffixes=c("", ".y")) + + ## add tot biomass / species / observation unit : + biomTot <- tapply(unitSpSz$biomass, + as.list(unitSpSz[ , c("species.code", "observation.unit")]), + function(x) + { + ifelse(all(is.na(x)), + NA, + sum(x, na.rm=TRUE)) + }) + + Data <- merge(Data, + as.data.frame(as.table(biomTot), responseName="tot.biomass")) + } + + ## add colony field for ponderate means pondérées if absent : + if (any(casMetrique[metrics] == "w.mean.colonies" & ! is.element("colonies", colnames(Data)))) + { + Data$colonies <- unitSp[match(apply(Data[ , c("species.code", "observation.unit")], + 1, paste, collapse="*"), + apply(unitSp[ , c("species.code", "observation.unit")], + 1, paste, collapse="*")), "colonies"] + }else{} + + + ## Aggregation of metric depending on factors : + reslong <- betterCbind(dfList=lapply(metrics, # sapply used to have names + agregation.f, + Data=Data, factors=factors, casMetrique=casMetrique, + nbName=nbName)) + + ## Aggregation and add other factors : + if ( ! (is.null(listFact) || length(listFact) == 0)) + { + reslong <- cbind(reslong, + sapply(Data[ , listFact, drop=FALSE], + function(fact) + { + tapply(fact, + as.list(Data[ , factors, drop=FALSE]), + function(x) + { + if (length(x) > 1 && length(unique(x)) > 1) # must be one modality + { + return(NULL) # otherwise it is NULL + }else{ + unique(as.character(x)) + } + }) + })) + }else{} + + ## If some factors aren't at the right class : + if (any(tmp <- sapply(reslong[ , listFact, drop=FALSE], class) != sapply(Data[ , listFact, drop=FALSE], class))) + { + for (i in which(tmp)) + { + switch(sapply(Data[ , listFact, drop=FALSE], class)[i], + "integer"={ + reslong[ , listFact[i]] <- as.integer(as.character(reslong[ , listFact[i]])) + }, + "numeric"={ + reslong[ , listFact[i]] <- as.numeric(as.character(reslong[ , listFact[i]])) + }, + reslong[ , listFact[i]] <- eval(call(paste("as", sapply(Data[ , listFact, drop=FALSE], class)[i], sep="."), + reslong[ , listFact[i]])) + ) + } + }else{} + + ## Initial order of factors levels : + reslong <- as.data.frame(sapply(colnames(reslong), + function(x) + { + if (is.factor(reslong[ , x])) + { + return(factor(reslong[ , x], levels=levels(Data[ , x]))) + }else{ + return(reslong[ , x]) + } + }, simplify=FALSE)) + + + ## Check of other aggregated factors supplémentaires. There must be no NULL elements : + if (any(sapply(reslong[ , listFact], function(x){any(is.null(unlist(x)))}))) + { + warning(paste("One of the suppl. factors is probably a subset", + " of the observations grouping factor(s).", sep="")) + return(NULL) + }else{ + return(reslong) + } +} + +######################################### end of the function agregations.generic.f + +######################################### start of the function dropLevels.f called y calcBiodiv.f in FucntExeCalcCommIndexesGalaxy.r and modeleLineaireWP2.unitobs.f in FunctExeCalcGLMGalaxy.r +dropLevels.f <- function(df, which=NULL) +{ + ## Purpose: Suppress unused levels of factors + ## ---------------------------------------------------------------------- + ## Arguments: df : a data.frame + ## which : included columns index (all by default) + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 10 août 2010, 13:29 modified by Coline ROYAUX 04 june 2020 + + if (class(df) != "data.frame") + { + stop("'df' must be a data.frame") + }else{ + if (is.null(which)) + { + x <- as.data.frame(sapply(df, function(x) + { + return(x[ ,drop=TRUE]) + }, simplify=FALSE), + stringsAsFactors=FALSE) + }else{ # Only some columns used + x <- df + + x[ , which] <- as.data.frame(sapply(df[ , which, drop=FALSE], + function(x) + { + return(x[ , drop=TRUE]) + }, simplify=FALSE), + stringsAsFactors=FALSE) + } + + return(x) + } +} +######################################### end of the function dropLevels.f + +######################################### start of the function subsetToutesTables.f called by modeleLineaireWP2.unitobs.f in FunctExeCalcGLMGalaxy.r + +subsetToutesTables.f <- function(metrique, tabMetrics, facteurs, selections, + tabUnitobs, refesp, tableMetrique="", nbName="number", ObsType = "", + exclude=NULL, add=c("species.code", "observation.unit")) +{ + ## Purpose: Extract useful data only from chosen metrics and factors + ## ---------------------------------------------------------------------- + ## Arguments: metrique : chosen metric + ## facteurs : all chosen factors + ## selections : corresponding modality selected + ## tableMetrique : metrics table name + ## exclude : factors levels to exclude + ## add : field to add to data table + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 6 août 2010, 16:46 modified by Coline ROYAUX 04 june 2020 + + ## If no metrics table available : + if (is.element(tableMetrique, c("", "TableOccurrences", "TablePresAbs"))) + { + tableMetrique <- "unitSp" + }else{} + + casTables <- c("unitSp"="unitSp", + "TablePresAbs"="unitSp", + "unitSpSz"="unitSpSz") + + ## Recuperation of metrics table : + dataMetrique <- tabMetrics + unitobs <- tabUnitobs + refesp <- refesp + + ## If no metrics available or already computed : + if (is.element(metrique, c("", "occurrence.frequency"))) + { + metrique <- "tmp" + dataMetrique$tmp <- 0 + dataMetrique$tmp[dataMetrique[ , nbName] > 0] <- 1 + }else{} + + if (!is.null(add)) + { + metriques <- c(metrique, add[is.element(add, colnames(dataMetrique))]) + }else{ + metriques <- metrique + } + + ## Subset depending on metrics table + switch(casTables[tableMetrique], + ## Observation table by unitobs and species : + unitSp={ + restmp <- cbind(dataMetrique[!is.na(dataMetrique[ , metrique]) , metriques, drop=FALSE], + unitobs[match(dataMetrique$observation.unit[!is.na(dataMetrique[ , metrique])], + unitobs$observation.unit), # ajout des colonnes sélectionnées d'unitobs + facteurs[is.element(facteurs, colnames(unitobs))], drop=FALSE], + refesp[match(dataMetrique$species.code[!is.na(dataMetrique[ , metrique])], + refesp$species.code), # ajout des colonnes sélectionnées d'especes + facteurs[is.element(facteurs, colnames(refesp))], drop=FALSE]) + }, + ## Observation table by unitobs, species and size class : + unitSpSz={ + restmp <- cbind(dataMetrique[!is.na(dataMetrique[ , metrique]) , + c(metriques, "size.class"), drop=FALSE], + unitobs[match(dataMetrique$observation.unit[!is.na(dataMetrique[ , metrique])], + unitobs$observation.unit), # ajout des colonnes sélectionnées d'unitobs + facteurs[is.element(facteurs, colnames(unitobs))], drop=FALSE], + refesp[match(dataMetrique$species.code[!is.na(dataMetrique[ , metrique])], + refesp$species.code), # ajout des colonnes sélectionnées d'especes + facteurs[is.element(facteurs, colnames(refesp))], drop=FALSE]) + }, + ## Other cases : + restmp <- cbind(dataMetrique[!is.na(dataMetrique[ , metrique]) , metriques, drop=FALSE], + unitobs[match(dataMetrique$observation.unit[!is.na(dataMetrique[ , metrique])], + unitobs$observation.unit), # ajout des colonnes sélectionnées d'unitobs. + facteurs[is.element(facteurs, colnames(unitobs))], drop=FALSE]) + ) + + selCol <- which(!is.na(selections)) + if (!is.null(exclude)) + { + selCol <- selCol[selCol != exclude] + } + + ## Particular case of size classes : + if (is.element("size.class", colnames(restmp))) + { + if (length(grep("^[[:digit:]]*[-_][[:digit:]]*$", unique(as.character(restmp$size.class)), perl=TRUE)) == + length(unique(as.character(restmp$size.class)))) + { + restmp$size.class <- + factor(as.character(restmp$size.class), + levels=unique(as.character(restmp$size.class))[ + order(as.numeric(sub("^([[:digit:]]*)[-_][[:digit:]]*$", + "\\1", + unique(as.character(restmp$size.class)), + perl=TRUE)), + na.last=FALSE)]) + }else{ + restmp$size.class <- factor(restmp$size.class) + } + }else{} + + ## Biomass and density conversion -> /100m² : + if (any(is.element(colnames(restmp), c("biomass", "density", + "biomass.max", "density.max", + "biomass.sd", "density.sd"))) && ObsType != "fishing") + { + restmp[ , is.element(colnames(restmp), + c("biomass", "density", + "biomass.max", "density.max", + "biomass.sd", "density.sd"))] <- 100 * + restmp[, is.element(colnames(restmp), + c("biomass", "density", + "biomass.max", "density.max", + "biomass.sd", "density.sd"))] + }else{} + + return(restmp) +} + +######################################### end of the function subsetToutesTables.f + + +######################################### start of the function sortiesLM.f called by modeleLineaireWP2.unitobs.f in FunctExeCalcGLMGalaxy.r +sortiesLM.f <- function(objLM, TabSum, #formule, + metrique, factAna, cut, colAna, listFact, lev = NULL, Data, + Log=FALSE, sufixe=NULL, type="espece") +{ + ## Purpose: Form GLM and LM results + ## ---------------------------------------------------------------------- + ## Arguments: objLM : lm object + ## TabSum : output summary table + ## formule : LM formula + ## metrique : Chosen metric + ## factAna : separation factor + ## cut : level of separation factor + ## colAna : colname for separation factor in output summary table + ## listFact : Analysis factors list + ## levels : Levels of analysis factors list + ## Data : Data used for analysis + ## Log : put log on metric ? (boolean) + ## sufixe : sufix for file name + ## type : analysis type + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 25 août 2010, 16:19 modified by Coline ROYAUX 04 june 2020 + + sumLM <- summary(objLM) + if (length(grep("^glmmTMB", objLM$call)) > 0) #if random effects + { + TabSum[TabSum[,colAna]==cut,"AIC"] <- sumLM$AICtab[1] + TabSum[TabSum[,colAna]==cut,"BIC"] <- sumLM$AICtab[2] + TabSum[TabSum[,colAna]==cut,"logLik"] <- sumLM$AICtab[3] + TabSum[TabSum[,colAna]==cut,"deviance"] <- sumLM$AICtab[4] + TabSum[TabSum[,colAna]==cut,"df.resid"] <- sumLM$AICtab[5] + + if (! is.null(lev)) ## if fixed effects + random effects + { + TabCoef <- as.data.frame(sumLM$coefficients$cond) + TabCoef$signif <- lapply(TabCoef[,"Pr(>|z|)"],FUN=function(x){if(!is.na(x) && x < 0.05){"yes"}else{"no"}}) + + TabSum[TabSum[,colAna]==cut,grepl("Intercept.*Zvalue",colnames(TabSum))] <- TabCoef[grepl("Intercept",rownames(TabCoef)),"z value"] + TabSum[TabSum[,colAna]==cut,grepl("Intercept.*Pvalue",colnames(TabSum))] <- TabCoef[grepl("Intercept",rownames(TabCoef)),"Pr(>|z|)"] + + TabSum[TabSum[,colAna]==cut,grepl(paste(lev,"Zvalue",collapse="|"),colnames(TabSum))] <- unlist(lapply(lev,FUN=function(x){if (length(grep(x,rownames(TabCoef))) > 0) {TabCoef[grepl(x,rownames(TabCoef)),"z value"]}else{NA}})) + TabSum[TabSum[,colAna]==cut,grepl(paste(lev,"Pvalue",collapse="|"),colnames(TabSum))] <- unlist(lapply(lev,FUN=function(x){if (length(grep(x,rownames(TabCoef))) > 0) {TabCoef[grepl(x,rownames(TabCoef)),"Pr(>|z|)"]}else{NA}})) + }else{} + + switch(as.character(length(sumLM$varcor$cond)), + "1"={StdD <- c(sumLM$varcor$cond[[1]])}, + "2"={StdD <- c(sumLM$varcor$cond[[1]],sumLM$varcor$cond[[2]])}, + StdD <- NULL) + TabSum[TabSum[,colAna]==cut,grepl(paste(listRand,"Std.Dev",collapse="|"),colnames(TabSum))] <- StdD + TabSum[TabSum[,colAna]==cut,grepl(paste(listRand,"NbObservation",collapse="|"),colnames(TabSum))] <- sumLM$nobs + TabSum[TabSum[,colAna]==cut,grepl(paste(listRand,"NbLevels",collapse="|"),colnames(TabSum))] <- unlist(lapply(listRand,FUN=function(x){nlevels(Data[,x])})) + + }else{ ## if fixed effects only + + TabSum[TabSum[,colAna]==cut,"AIC"] <- sumLM$aic + TabSum[TabSum[,colAna]==cut,"Resid.deviance"] <- sumLM$deviance + TabSum[TabSum[,colAna]==cut,"df.resid"] <- sumLM$df.residual + TabSum[TabSum[,colAna]==cut,"Null.deviance"] <- sumLM$null.deviance + TabSum[TabSum[,colAna]==cut,"df.null"] <- sumLM$df.null + TabCoef <- as.data.frame(sumLM$coefficients) + + if (sumLM$family[1] == "gaussian" || sumLM$family[1] == "quasipoisson") + { + + TabCoef$signif <- lapply(TabCoef[,"Pr(>|t|)"],FUN=function(x){if(!is.na(x) && x < 0.05){"yes"}else{"no"}}) + TabSum[TabSum[,colAna]==cut,grepl("Intercept.*Tvalue",colnames(TabSum))] <- TabCoef[grepl("Intercept",rownames(TabCoef)),"t value"] + TabSum[TabSum[,colAna]==cut,grepl("Intercept.*Pvalue",colnames(TabSum))] <- TabCoef[grepl("Intercept",rownames(TabCoef)),"Pr(>|t|)"] + + TabSum[TabSum[,colAna]==cut,grepl(paste(lev,"Tvalue",collapse="|"),colnames(TabSum))] <- unlist(lapply(lev,FUN=function(x){if (length(grep(x,rownames(TabCoef))) > 0) {TabCoef[grepl(x,rownames(TabCoef)),"t value"]}else{NA}})) + + TabSum[TabSum[,colAna]==cut,grepl(paste(lev,"Pvalue",collapse="|"),colnames(TabSum))] <- unlist(lapply(lev,FUN=function(x){if (length(grep(x,rownames(TabCoef))) > 0) {TabCoef[grepl(x,rownames(TabCoef)),"Pr(>|t|)"]}else{NA}})) + }else{ + TabCoef$signif <- lapply(TabCoef[,"Pr(>|z|)"],FUN=function(x){if(!is.na(x) && x < 0.05){"yes"}else{"no"}}) + + TabSum[TabSum[,colAna]==cut,grepl("Intercept.*Zvalue",colnames(TabSum))] <- TabCoef[grepl("Intercept",rownames(TabCoef)),"z value"] + TabSum[TabSum[,colAna]==cut,grepl("Intercept.*Pvalue",colnames(TabSum))] <- TabCoef[grepl("Intercept",rownames(TabCoef)),"Pr(>|z|)"] + + TabSum[TabSum[,colAna]==cut,grepl(paste(lev,"Zvalue",collapse="|"),colnames(TabSum))] <- unlist(lapply(lev,FUN=function(x){if (length(grep(x,rownames(TabCoef))) > 0) {TabCoef[grepl(x,rownames(TabCoef)),"z value"]}else{NA}})) + TabSum[TabSum[,colAna]==cut,grepl(paste(lev,"Pvalue",collapse="|"),colnames(TabSum))] <- unlist(lapply(lev,FUN=function(x){if (length(grep(x,rownames(TabCoef))) > 0) {TabCoef[grepl(x,rownames(TabCoef)),"Pr(>|z|)"]}else{NA}})) + } + } + + if (! is.null(lev)) ## if fixed effects + { + TabSum[TabSum[,colAna]==cut,grepl("Intercept.*Estimate",colnames(TabSum))] <- TabCoef[grepl("Intercept",rownames(TabCoef)),"Estimate"] + TabSum[TabSum[,colAna]==cut,grepl("Intercept.*Std.Err",colnames(TabSum))] <- TabCoef[grepl("Intercept",rownames(TabCoef)),"Std. Error"] + TabSum[TabSum[,colAna]==cut,grepl("Intercept.*signif",colnames(TabSum))] <- TabCoef[grepl("Intercept",rownames(TabCoef)),"signif"] + + TabSum[TabSum[,colAna]==cut,grepl(paste(lev,"Estimate",collapse="|"),colnames(TabSum))] <- unlist(lapply(lev,FUN=function(x){if (length(grep(x,rownames(TabCoef))) > 0) {TabCoef[grepl(x,rownames(TabCoef)),"Estimate"]}else{NA}})) + + TabSum[TabSum[,colAna]==cut,grepl(paste(lev,"Std.Err",collapse="|"),colnames(TabSum))] <- unlist(lapply(lev,FUN=function(x){if (length(grep(x,rownames(TabCoef))) > 0) {TabCoef[grepl(x,rownames(TabCoef)),"Std. Error"]}else{NA}})) + TabSum[TabSum[,colAna]==cut,grepl(paste(lev,"signif",collapse="|"),colnames(TabSum))] <- unlist(lapply(lev,FUN=function(x){if (length(grep(x,rownames(TabCoef))) > 0) {TabCoef[grepl(x,rownames(TabCoef)),"signif"]}else{NA}})) + }else{} + + return(TabSum) + +} + + +######################################### end of the function sortiesLM.f + +######################################### start of the function graphTitle.f called by sortiesLM.f + +graphTitle.f <- function(metrique, modGraphSel, factGraph, listFact, model=NULL, type="espece", + lang = getOption("P.lang")) +{ + ## Purpose: Automatically write a name for a graph + ## ---------------------------------------------------------------------- + ## Arguments: + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 14 oct. 2010, 15:44 modified by Coline ROYAUX 04 june 2020 + return(paste(ifelse(is.null(model), + "Values of ", + paste(model, + " for", + sep="")), + metrique, + ifelse(is.element(type, c("espece", "unitobs", "CL_espece", "unitobs(CL)")), + paste("aggregated"), + ""), + switch(type, + "espece"=" per species and station", + "CL_espece"=" per size class, species and station", + "unitobs"=" per station", + "unitobs(CL)"=" per station", + "CL_unitobs"=" per size class and station", + "biodiv"=" per station", + ""), + switch(type, + "espece"={ + ifelse(modGraphSel == "", # Only separation factor if defined + "", + paste("\nfor the field", + " '", factGraph, "' = ", modGraphSel, sep="")) + }, + "CL_espece"={ + ifelse(modGraphSel == "", # Only separation factor if defined + "", + paste("\nfor the field", + " '", factGraph, "' = ", modGraphSel, sep="")) + }, + "unitobs"={ + ifelse(modGraphSel[1] == "", # Only separation factor if defined + "\nfor all species", + paste("\nfor all species matching", + " '", factGraph, "' = (", + paste(modGraphSel, collapse=", "), ")", sep="")) + }, + "unitobs(CL)"={ + ifelse(modGraphSel[1] == "", # Only separation factor if defined + "\nfor all size classes", + paste("\nfor size classes matching", + " '", factGraph, "' = (", + paste(modGraphSel, collapse=", "), ")", sep="")) + }, + "CL_unitobs"={ + ifelse(modGraphSel[1] == "", # Only separation factor if defined + "\nfor all species", + paste("\nfor all species matching", + " '", factGraph, "' = (", + paste(modGraphSel, collapse=", "), ")", sep="")) + }, + "biodiv"={ + ifelse(modGraphSel[1] == "", # Only separation factor if defined + "", + paste("\nfor stations matching", + " '", factGraph, "' = (", + paste(modGraphSel, collapse=", "), ")", sep="")) + }, + ""), + "\n by ", + paste(sapply(listFact[length(listFact):1], + function(x)paste(c(## varNames.f(x, "article"), + "", + x, collapse="")), + collapse=" and"), + "\n", sep=""))) +} + +######################################### end of the function graphTitle.f + +######################################### start of the function noteGLM.f called by modeleLineaireWP2.species.f and modeleLineaireWP2.unitobs.f + +noteGLM.f <- function(data, objLM, metric, listFact, details = FALSE) +{ + ## Purpose: Note your GLM analysis + ## ---------------------------------------------------------------------- + ## Arguments: data : Dataframe used for analysis + ## objLM : GLM assessed + ## metric : selected metric + ## listFact : Analysis factors list + ## ---------------------------------------------------------------------- + ## Author: Coline ROYAUX, 26 june 2020 + + rate <- 0 + detres <- list(complete_plan=NA, balanced_plan=NA, NA_proportion_OK=NA, no_residual_dispersion=NA, uniform_residuals=NA, outliers_proportion_OK=NA, no_zero_inflation=NA, observation_factor_ratio_OK=NA, enough_levels_random_effect=NA, rate=NA) + + #### Data criterions #### + + ## Plan + + plan <- as.data.frame(table(data[,listFact])) + + if (nrow(plan[plan$Freq==0,]) < nrow(plan)*0.1) # +0.5 if less than 10% of possible factor's level combinations aren't represented in the sampling scheme + { + rate <- rate + 0.5 + detres$complete_plan <- TRUE + + if (summary(as.factor(plan$Freq))[1] > nrow(plan)*0.9) # +0.5 if the frequency of the most represented frequency of possible factor's levels combinations is superior to 90% of the total number of possible factor's levels combinations + { + rate <- rate + 0.5 + detres$balanced_plan <- TRUE + }else{} + + }else{ + detres$complete_plan <- FALSE + detres$balanced_plan <- FALSE + } + + if (nrow(data) - nrow(na.omit(data)) < nrow(data)*0.1) # +1 if less than 10% of the lines in the dataframe bares a NA + { + rate <- rate + 1 + detres$NA_proportion_OK <- TRUE + }else{ + detres$NA_proportion_OK <- FALSE + } + + #### Model criterions #### + + if (length(grep("quasi",objLM$family)) == 0) #DHARMa doesn't work with quasi distributions + { + + Residuals <- simulateResiduals(objLM) + + capture.output(testRes <- testResiduals(Residuals)) + testZero <- testZeroInflation(Residuals) + + ## dispersion of residuals + + if (testRes$dispersion$p.value > 0.05) # +1.5 if dispersion tests not significative + { + rate <- rate + 1.5 + detres$no_residual_dispersion <- TRUE + }else{ + detres$no_residual_dispersion <- FALSE + } + + ## uniformity of residuals + + if (testRes$uniformity$p.value > 0.05) # +1 if uniformity tests not significative + { + rate <- rate + 1.5 + detres$uniform_residuals <- TRUE + }else{ + detres$uniform_residuals <- FALSE + } + + ## residuals outliers + + if (testRes$outliers$p.value > 0.05) # +0.5 if outliers tests not significative + { + rate <- rate + 0.5 + detres$outliers_proportion_OK <- TRUE + }else{ + detres$outliers_proportion_OK <- FALSE + } + + ## Zero inflation test + + if (testZero$p.value > 0.05) # +1 if zero inflation tests not significative + { + rate <- rate + 1.5 + detres$no_zero_inflation <- TRUE + }else{ + detres$no_zero_inflation <- FALSE + } + + ## Factors/observations ratio + + if (length(listFact)/nrow(na.omit(data)) < 0.1) # +1 if quantity of factors is less than 10% of the quantity of observations + { + rate <- rate + 1 + detres$observation_factor_ratio_OK <- TRUE + }else{ + detres$observation_factor_ratio_OK <- FALSE + } + + ## less than 10 factors' level on random effect + + if (length(grep("^glmmTMB", objLM$call)) > 0) + { + nlevRand <- c() + for(fact in names(summary(objLM)$varcor$cond)) + { + nlevRand <- c(nlevRand,length(unlist(unique(data[,fact])))) + } + + if (all(nlevRand > 10)) # +1 if more than 10 levels in one random effect + { + rate <- rate + 1 + detres$enough_levels_random_effect <- TRUE + }else{ + detres$enough_levels_random_effect <- FALSE + } + }else{} + + detres$rate <- rate + + if (details) + { + return(detres) + }else{ + return(rate) + } + + }else{ + return(NA) + cat("Models with quasi distributions can't be rated for now") + } +} + +######################################### end of the function noteGLM.f + +######################################### start of the function noteGLMs.f called by modeleLineaireWP2.species.f and modeleLineaireWP2.unitobs.f + +noteGLMs.f <- function(tabRate, exprML, objLM, file_out=FALSE) +{ + ## Purpose: Note your GLM analysis + ## ---------------------------------------------------------------------- + ## Arguments: data : rates table from noteGLM.f + ## objLM : GLM assessed + ## metric : selected metric + ## listFact : Analysis factors list + ## ---------------------------------------------------------------------- + ## Author: Coline ROYAUX, 26 june 2020 + + RateM <- mean(na.omit(tabRate[,"rate"])) + sum <- summary(objLM) + + if (length(grep("^glmmTMB", objLM$call)) > 0) + { + if (median(na.omit(tabRate[,"rate"])) >= 6) # if 50% has a rate superior or equal to 6 +1 + { + RateM <- RateM + 1 + } + + if (quantile(na.omit(tabRate[,"rate"]), probs=0.9) >= 6) # if 90% has a rate superior or equal to 6 +1 + { + RateM <- RateM + 1 + } + }else{ + if (median(na.omit(tabRate[,"rate"])) >= 5) # if 50% has a rate superior or equal to 5 +1 + { + RateM <- RateM + 1 + } + + if (quantile(na.omit(tabRate[,"rate"]), probs=0.9) >= 5) # if 90% has a rate superior or equal to 5 +1 + { + RateM <- RateM + 1 + } + } + + if (file_out) + { + namefile <- "RatingGLM.txt" + + cat("###########################################################################", + "\n########################### Analysis evaluation ###########################", + "\n###########################################################################", file=namefile, fill=1,append=TRUE) + + ## Informations on model : + cat("\n\n######################################### \nFitted model:", file=namefile, fill=1,append=TRUE) + cat("\t", deparse(exprML), "\n\n", file=namefile, sep="",append=TRUE) + cat("Family: ", sum$family[[1]], + file=namefile,append=TRUE) + cat("\n\nNumber of analysis: ", nrow(tabRate), file=namefile, append=TRUE) + + ## Global rate : + cat("\n\n######################################### \nGlobal rate for all analysis:", + "\n\n", RateM, "out of 10", file=namefile, append=TRUE) + + ## details on every GLM : +#NA_proportion_OK=NA, no_residual_dispersion=NA, uniform_residuals=NA, outliers_proportion_OK=NA, no_zero_inflation=NA, observation_factor_ratio_OK=NA, enough_levels_random_effect=NA, rate=NA + cat("\n\n######################################### \nDetails on every analysis:\n\n", file=namefile, append=TRUE) + cat("Analysis\tC1\tC2\tC3\tC4\tC5\tC6\tC7\tC8\tC9\tFinal rate", file=namefile, append=TRUE) + apply(tabRate, 1, FUN=function(x) + { + + if (!is.na(x["complete_plan"]) && x["complete_plan"]==TRUE) + { + cat("\n",x[1],"\tyes", file=namefile, append=TRUE) + }else{ + cat("\n",x[1],"\tno", file=namefile, append=TRUE) + } + + for (i in c("balanced_plan","NA_proportion_OK", "no_residual_dispersion", "uniform_residuals", "outliers_proportion_OK", "no_zero_inflation", "observation_factor_ratio_OK", "enough_levels_random_effect")) + { + if (!is.na(x[i]) && x[i]==TRUE) + { + cat("\tyes", file=namefile, append=TRUE) + }else{ + cat("\tno", file=namefile, append=TRUE) + } + } + + cat("\t",x["rate"], "/ 8", file=namefile, append=TRUE) + + + }) + cat("\n\nC1: Complete plan?\nC2: Balanced plan?\nC3: Few NA?\nC4: Regular dispersion?\nC5: Uniform residuals?\nC6: Regular outliers proportion?\nC7: No zero-inflation?\nC8: Enough observations for the amount of factors?\nC9: Enough levels on random effect?", file=namefile, append=TRUE) + + ## Red flags - advice : + cat("\n\n######################################### \nRed flags - advice:\n\n", file=namefile, append=TRUE) + if (all(na.omit(tabRate["NA_proportion_OK"]) == FALSE)) + { + cat("\n","\t- More than 10% of your dataset bares NAs", file=namefile, append=TRUE) + }else{} + + if (length(grep("FALSE",tabRate["no_residual_dispersion"])) / length(na.omit(tabRate["no_residual_dispersion"])) > 0.5) + { + cat("\n","\t- More than 50% of your analyses are over- or under- dispersed : Try with another distribution family", file=namefile, append=TRUE) + }else{} + + if (length(grep("FALSE",tabRate["uniform_residuals"])) / length(na.omit(tabRate["uniform_residuals"])) > 0.5) + { + cat("\n","\t- More than 50% of your analyses haven't an uniform distribution of residuals : Try with another distribution family", file=namefile, append=TRUE) + }else{} + + if (length(grep("FALSE",tabRate["outliers_proportion_OK"])) / length(na.omit(tabRate["outliers_proportion_OK"])) > 0.5) + { + cat("\n","\t- More than 50% of your analyses have too much outliers : Try with another distribution family or try to select your data", file=namefile, append=TRUE) + }else{} + + if (length(grep("FALSE",tabRate["no_zero_inflation"])) / length(na.omit(tabRate["no_zero_inflation"])) > 0.5) + { + cat("\n","\t- More than 50% of your analyses have zero inflation : Try to select your data", file=namefile, append=TRUE) + }else{} + + if (length(grep("FALSE",tabRate["observation_factor_ratio_OK"])) / length(na.omit(tabRate["observation_factor_ratio_OK"])) > 0.5) + { + cat("\n","\t- More than 50% of your analyses have not enough observations for the amount of factors : Try to use less factors in your analysis or try to use another separation factor", file=namefile, append=TRUE) + }else{} + + if (any(tabRate["enough_levels_random_effect"] == FALSE, na.rm=TRUE) && length(grep("^glmmTMB", objLM$call)) > 0) + { + cat("\n","\t- Random effect hasn't enough levels to be robust : If it has less than ten levels remove the random effect", file=namefile, append=TRUE) + }else{} + }else{ + + return(RateM) + + } +} + +######################################### end of the function noteGLM.f + +######################################### start of the function infoStats.f called by modeleLineaireWP2.species.f and modeleLineaireWP2.unitobs.f + +infoStats.f <- function(filename, Data, agregLevel=c("species", "unitobs"), type=c("graph", "stat"), + metrique, factGraph, factGraphSel, listFact, listFactSel) +{ + ## Purpose: Écrire les infos et statistic sur les données associées à + ## un graphique ou analyse. + ## ---------------------------------------------------------------------- + ## Arguments: filename : chemin du fichier de résultats. + ## Data : données du graphique/de l'analyse. + ## agregLevel : niveau d'agrégation de la fonction appelante. + ## type : type de fonction appelante (grapique ou analyse). + ## metrique : la métrique choisie. + ## factGraph : le facteur sélection des espèces. + ## factGraphSel : la sélection de modalités pour ce dernier + ## listFact : liste du (des) facteur(s) de regroupement + ## listFactSel : liste des modalités sélectionnées pour ce(s) + ## dernier(s) + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 10 sept. 2012, 15:26 modified by Coline ROYAUX 04 june 2020 + + ## Open file : + File <- file(description=filename, + open="w", encoding="latin1") + + ## if error : + on.exit(if (exists("filename") && + tryCatch(isOpen(File), + error=function(e)return(FALSE))) close(File)) + + ## Metrics and factors infos : + printSelectionInfo.f(metrique=metrique, #factGraph=factGraph, factGraphSel=factGraphSel, + listFact=listFact, #listFactSel=listFactSel, + File=File, + agregLevel=agregLevel, type=type) + + ## statistics : + if (class(Data) == "list") + { + cat("\n###################################################", + "\nStatistics per level of splitting factor:\n", + sep="", file=File,append=TRUE) + + invisible(sapply(1:length(Data), + function(i) + { + printStats.f(Data=Data[[i]], metrique=metrique, listFact=listFact, File=File, + headline=factGraphSel[i]) + })) + }else{ + printStats.f(Data=Data, metrique=metrique, listFact=listFact, File=File, + headline=NULL) + } + + ## Close file : + close(File) + +} + +######################################### end of the function infoStats.f + + +######################################### start of the function printSelectionInfo.f called by infoStats.f + +printSelectionInfo.f <- function(metrique, listFact, + File, + agregLevel=c("species", "unitobs"), type=c("graph", "stat")) +{ + ## Purpose: Write data informations + ## ---------------------------------------------------------------------- + ## Arguments: metrique : chosen metric + ## listFact : factor's list + ## File : Results file name + ## agregLevel : aggregation level + ## type : function type + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 11 sept. 2012, 10:41 modified by Coline ROYAUX 04 june 2020 + + cat("\n##################################################\n", + "Metrics and factors (and possible units/selections):\n", + sep="", file=File,append=TRUE) + + ## metric info : + cat("\n Metrics:", metrique, + "\n", file=File,append=TRUE) + + ## aggregation level : + cat(" aggregated per ", + switch(agregLevel, + "CL_espece"=,"CL_unitobs"=,"spCL_unitobs"=,"spCL_espece"={ + "size class / " + }), + switch(agregLevel, + "CL_espece"=,"spCL_espece"=,"species"=,"spSpecies"=,"spEspece"={ + "species / " + }), + switch(agregLevel, + "spUnitobs"=,"spCL_unitobs"=,"spCL_espece"=,"spUnitobs(CL)"=,"spSpecies"=,"spEspece"={ + paste(listFact, " (mean over ", sep="") + }), + "observation units", + switch(agregLevel, + "spUnitobs"=,"spCL_unitobs"=,"spCL_espece"=,"spUnitobs(CL)"=,"spSpecies"=,"spEspece"={ + ")" + }), + ".\n", + sep="", file=File,append=TRUE) + + ## Separation factors : +# switch(agregLevel, + # "species"=,"CL_espece"=,"espece"={ # Adapté également pour les LMs. + # cat("\n", + # switch(type, + # "graph"="Graphics separation factor", + # "stat"="Analyses separation factor"), + # " : ", + # ifelse(factGraph == "", "printSelectionInfo.f.11", + # ifelse(is.na(factGraphSel[1]), + # paste(varNames.f(factGraph, "nom"), "none!"), + # paste(varNames.f(factGraph, "nom"), " (", + # paste(factGraphSel, collapse=", "), ")", sep=""))), "\n", + # sep="", file=File,append=TRUE) +# }, + # "unitobs"=,"CL_unitobs"=,"unitobs(CL)"=,"spUnitobs"={ + # cat("(warning: no selection!!!)", + # ifelse(factGraph == "", "\nSelection factor for aggregation of observations: ", + # ifelse(is.na(factGraphSel[1]), + # paste(varNames.f(factGraph, "nom"), "none (all species/size classes)!"), + # paste(varNames.f(factGraph, "nom"), " (", + # paste(factGraphSel, collapse=", "), ")", sep=""))), "\n", + # sep="", file=File,append=TRUE) + # }) + + ## Clustering factors : + if (is.element(agregLevel, c("spCL_unitobs", "spCL_espece", "spSpecies", "spEspece", + "spUnitobs", "spUnitobs(CL)"))) {type <- "spatialGraph"} + + cat(switch(type, + "graph"="\nGrouping factor(s): \n * ", + "stat"="\nAnalyses factor(s): \n * ", + "spatialGraph"="\nSpatial aggregation factor(s): \n * "), + paste(listFact,collaspe="\n * "),"\n",file=File,append=TRUE) + +# invisible(sapply(1:length(listFact), + # function(i) + # { + # cat("\n * ", + # ifelse(is.na(listFactSel[[i]][1]), + # paste(varNames.f(listFact[i], "nom"), "(no selection)"), + # paste(varNames.f(listFact[i], "nom"), " (", + # paste(listFactSel[[i]], collapse=", "), ")", sep="")), "\n", + # sep="", file=File,append=TRUE) + # })) +} + +######################################### end of the function printSelectionInfo.f + + +######################################### start of the function printStats.f called by infoStats.f + +printStats.f <- function(Data, metrique, listFact, File, headline=NULL) +{ + ## Purpose: Write general statistics table + ## ---------------------------------------------------------------------- + ## Arguments: Data : Analysis data + ## metrique : metric's name + ## listFact : Factor's list + ## File : Simple statistics file name + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 11 sept. 2012, 10:09 modified by Coline ROYAUX 04 june 2020 + + ## Header : + if ( ! is.null(headline)) + { + cat("\n", rep("#", nchar(headline) + 3), "\n", + "## ", headline, "\n", + sep="", file=File,append=TRUE) + }else{} + + cat("\n########################\nBase statistics:\n\n", file=File,append=TRUE) + + capture.output(print(summary.fr(Data[ , metrique])), file=File, append=TRUE) + + if ( ! is.null(listFact)) + { + cat("\n#########################################", + "\nStatistics per combination of factor levels:\n\n", file=File, sep="",append=TRUE) + + ## Compute summary for each existing factor's cross : + res <- with(Data, + tapply(eval(parse(text=metrique)), + INDEX=do.call(paste, + c(lapply(listFact, + function(y)eval(parse(text=y))), + sep=".")), + FUN=summary.fr)) + + ## results in table + capture.output(print(do.call(rbind, res)), + file=File, append=TRUE) + }else{} + + ## empty line : + cat("\n", file=File,append=TRUE) +} + +######################################### end of the function printStats.f + + +######################################### start of the function summary.fr called by printStats.f +summary.fr <- function(object, digits = max(3, getOption("digits") - 3),...) +{ + ## Purpose: Adding SD and N to summary + ## ---------------------------------------------------------------------- + ## Arguments: object : Object to summarise + ## ---------------------------------------------------------------------- + ## Author: Yves Reecht, Date: 13 sept. 2012, 15:47 modified by Coline ROYAUX 04 june 2020 + + if ( ! is.numeric(object)) stop("Programming error") + + ## Compute summary : + res <- c(summary(object=object, digits, ...), "sd"=signif(sd(x=object), digits=digits), "N"=length(object)) + + return(res) +} + +######################################### start of the function summary.fr + +######################################### Package DHARMa + +################ simulateResiduals.R + +#' Create simulated residuals +#' +#' The function creates scaled residuals by simulating from the fitted model. Residuals can be extracted with \code{\link{residuals.DHARMa}}. See \code{\link{testResiduals}} for an overview of residual tests, \code{\link{plot.DHARMa}} for an overview of available plots. +#' +#' @param fittedModel a fitted model of a class supported by DHARMa +#' @param n number of simulations. Default is 100. A more save value would be 250 or even 1000. The smaller the number, the higher the stochastic error on the residuals. Also, for very small n, discretization artefacts can influence the tests. +#' @param refit if FALSE, new data will be simulated and scaled residuals will be created by comparing observed data with new data. If TRUE, the model will be refit on the simulated data (parametric bootstrap), and scaled residuals will be created by comparing observed with refitted residuals. +#' @param integerResponse if TRUE, noise will be added at to the residuals to maintain a uniform expectations for integer responses (such as Poisson or Binomial). Usually, the model will automatically detect the appropriate setting, so there is no need to adjust this setting. +#' @param plot if TRUE, \code{\link{plotResiduals}} will be directly run after the residuals have been calculated +#' @param ... parameters to pass to the simulate function of the model object. An important use of this is to specify whether simulations should be conditional on the current random effect estimates, e.g. via re.form. Note that not all models support syntax to specify conditionao or unconditional simulations. See also details +#' @param seed the random seed to be used within DHARMa. The default setting, recommended for most users, is keep the random seed on a fixed value 123. This means that you will always get the same randomization and thus teh same result when running the same code. NULL = no new seed is set, but previous random state will be restored after simulation. FALSE = no seed is set, and random state will not be restored. The latter two options are only recommended for simulation experiments. See vignette for details. +#' @param method the quantile randomization method used. The two options implemented at the moment are probability integral transform (PIT-) residuals (current default), and the "traditional" randomization procedure, that was used in DHARMa until version 0.3.0. For details, see \code{\link{getQuantile}} +#' @return An S3 class of type "DHARMa", essentially a list with various elements. Implemented S3 functions include plot, print and \code{\link{residuals.DHARMa}}. Residuals returns the calculated scaled residuals. +#' +#' @details There are a number of important considerations when simulating from a more complex (hierarchical) model: +#' +#' \strong{Re-simulating random effects / hierarchical structure}: in a hierarchical model, we have several stochastic processes aligned on top of each other. Specifically, in a GLMM, we have a lower level stochastic process (random effect), whose result enters into a higher level (e.g. Poisson distribution). For other hierarchical models such as state-space models, similar considerations apply. +#' +#' In such a situation, we have to decide if we want to re-simulate all stochastic levels, or only a subset of those. For example, in a GLMM, it is common to only simulate the last stochastic level (e.g. Poisson) conditional on the fitted random effects. This is often referred to as a conditional simuation. For controlling how many levels should be re-simulated, the simulateResidual function allows to pass on parameters to the simulate function of the fitted model object. Please refer to the help of the different simulate functions (e.g. ?simulate.merMod) for details. For merMod (lme4) model objects, the relevant parameters are parameters are use.u and re.form +#' +#' If the model is correctly specified, the simulated residuals should be flat regardless how many hierarchical levels we re-simulate. The most thorough procedure would therefore be to test all possible options. If testing only one option, I would recommend to re-simulate all levels, because this essentially tests the model structure as a whole. This is the default setting in the DHARMa package. A potential drawback is that re-simulating the lower-level random effects creates more variability, which may reduce power for detecting problems in the upper-level stochastic processes. In particular dispersion tests may produce different results when switching from conditional to unconditional simulations, and often the conditional simulation is more sensitive. +#' +#' \strong{Integer responses}: a second complication is the treatment of inter responses. Imaging we have observed a 0, and we predict 30\% zeros - what is the quantile that we should display for the residual? To deal with this problem and maintain a uniform response, the option integerResponse adds a uniform noise from -0.5 to 0.5 on the simulated and observed response, which creates a uniform distribution - you can see this via hist(ecdf(runif(10000))(runif(10000))). +#' +#' DHARMa will try to automatically if the fitted model has an integer or discrete distribution via the family argument. However, in some cases the family does not allow to uniquely identify the distribution type. For example, a tweedie distribution can be inter or continuous. Therefore, DHARMa will additionally check the simulation results for repeated values, and will change the distribution type if repeated values are found (a message is displayed in this case). +#' +#' \strong{Refitting or not}: a third issue is how residuals are calculated. simulateResiduals has two options that are controlled by the refit parameter: +#' +#' 1. if refit = FALSE (default), new data is simulated from the fitted model, and residuals are calculated by comparing the observed data to the new data +#' +#' 2. if refit = TRUE, a parametric bootstrap is performed, meaning that the model is refit on the new data, and residuals are created by comparing observed residuals against refitted residuals. I advise against using this method per default (see more comments in the vignette), unless you are really sure that you need it. +#' +#' \strong{Residuals per group}: In many situations, it can be useful to look at residuals per group, e.g. to see how much the model over / underpredicts per plot, year or subject. To do this, use \code{\link{recalculateResiduals}}, together with a grouping variable (see also help) +#' +#' \strong{Transformation to other distributions}: DHARMa calculates residuals for which the theoretical expectation (assuming a correctly specified model) is uniform. To transfor this residuals to another distribution (e.g. so that a correctly specified model will have normal residuals) see \code{\link{residuals.DHARMa}}. +#' +#' @seealso \code{\link{testResiduals}}, \code{\link{plot.DHARMa}}, \code{\link{plotResiduals}}, \code{\link{print.DHARMa}}, \code{\link{residuals.DHARMa}}, \code{\link{recalculateResiduals}} +#' +#' +#' @example inst/examples/simulateResidualsHelp.R +#' @import stats +#' @export +simulateResiduals <- function(fittedModel, n = 250, refit = F, integerResponse = NULL, plot = F, seed = 123, method = c("PIT", "traditional"), ...){ + + ######## general assertions and startup calculations ########## + + if (n < 2) stop("error in DHARMa::simulateResiduals: n > 1 is required to calculate scaled residuals") + checkModel(fittedModel) + match.arg(method) + randomState <-getRandomState(seed) + on.exit({randomState$restoreCurrent()}) + ptm <- proc.time() + + ####### extract model info ############ + + out = list() + + family = family(fittedModel) + out$fittedModel = fittedModel + out$modelClass = class(fittedModel)[1] + + out$nObs = nobs(fittedModel) + out$nSim = n + out$refit = refit + out$observedResponse = getObservedResponse(fittedModel) + + if(is.null(integerResponse)){ + if (family$family %in% c("binomial", "poisson", "quasibinomial", "quasipoisson", "Negative Binom", "nbinom2", "nbinom1", "genpois", "compois", "truncated_poisson", "truncated_nbinom2", "truncated_nbinom1", "betabinomial", "Poisson", "Tpoisson", "COMPoisson", "negbin", "Tnegbin") | grepl("Negative Binomial",family$family) ) integerResponse = TRUE + else integerResponse = FALSE + } + out$integerResponse = integerResponse + + out$problems = list() + + # re-form should be set to ~0 to avoid spurious residual patterns, see https://github.com/florianhartig/DHARMa/issues/43 + + if(out$modelClass %in% c("HLfit")){ + out$fittedPredictedResponse = predict(fittedModel, type = "response", re.form = ~0)[,1L] + }else{ + out$fittedPredictedResponse = predict(fittedModel, type = "response", re.form = ~0) + } + + out$fittedFixedEffects = getFixedEffects(fittedModel) + out$fittedResiduals = residuals(fittedModel, type = "response") + + ######## refit = F ################## + + if (refit == FALSE){ + + out$simulatedResponse = getSimulations(fittedModel, nsim = n, type = "normal", ...) + + checkSimulations(out$simulatedResponse, out$nObs, out$nSim) + + out$scaledResiduals = getQuantile(simulations = out$simulatedResponse , observed = out$observedResponse , integerResponse = integerResponse, method = method) + + ######## refit = T ################## + } else { + + # Adding new outputs + + out$refittedPredictedResponse <- matrix(nrow = out$nObs, ncol = n ) + out$refittedFixedEffects <- matrix(nrow = length(out$fittedFixedEffects), ncol = n ) + #out$refittedRandomEffects <- matrix(nrow = length(out$fittedRandomEffects), ncol = n ) + out$refittedResiduals = matrix(nrow = out$nObs, ncol = n) + out$refittedPearsonResiduals = matrix(nrow = out$nObs, ncol = n) + + out$simulatedResponse = getSimulations(fittedModel, nsim = n, type = "refit", ...) + + for (i in 1:n){ + + simObserved = out$simulatedResponse[[i]] + + try({ + + # for testing + # if (i==3) stop("x") + # Note: also set silent = T for production + + refittedModel = getRefit(fittedModel, simObserved) + + out$refittedPredictedResponse[,i] = predict(refittedModel, type = "response") + out$refittedFixedEffects[,i] = getFixedEffects(refittedModel) + out$refittedResiduals[,i] = residuals(refittedModel, type = "response") + out$refittedPearsonResiduals[,i] = residuals(refittedModel, type = "pearson") + #out$refittedRandomEffects[,i] = ranef(refittedModel) + }, silent = TRUE) + } + + ######### residual checks ########### + + if(anyNA(out$refittedResiduals)) warning("DHARMa::simulateResiduals warning: on refit = TRUE, at least one of the refitted models produced an error. Inspect the refitted model values. Results may not be reliable.") + + ## check for convergence problems + + dup = sum(duplicated(out$refittedFixedEffects, MARGIN = 2)) + if (dup > 0){ + if (dup < n/3){ + warning(paste("There were", dup, "of", n ,"duplicate parameter estimates in the refitted models. This may hint towards a problem with optimizer convergence in the fitted models. Results may not be reliable. The suggested action is to not use the refitting procedure, and diagnose with tools available for the normal (not refitted) simulated residuals. If you absolutely require the refitting procedure, try changing tolerance / iterations in the optimizer settings.")) + } else { + warning(paste("There were", dup, "of", n ,"duplicate parameter estimates in the refitted models. This may hint towards a problem with optimizer convergence in the fitted models. Results are likely not reliable. The suggested action is to not use the refitting procedure, and diagnose with tools available for the normal (not refitted) simulated residuals. If you absolutely require the refitting procedure, try changing tolerance / iterations in the optimizer settings.")) + out$problems[[length(out$problems)+ 1]] = "error in refit" + } + } + + ######### residual calculations ########### + + out$scaledResiduals = getQuantile(simulations = out$refittedResiduals, observed = out$fittedResiduals, integerResponse = integerResponse, method = method) + } + + ########### Wrapup ############ + + out$time = proc.time() - ptm + out$randomState = randomState + + class(out) = "DHARMa" + + if(plot == TRUE) plot(out) + + return(out) +} + +getPossibleModels<-function()c("lm", "glm", "negbin", "lmerMod", "glmerMod", "gam", "bam", "glmmTMB", "HLfit") + + + +#' Check if the fitted model is supported by DHARMa +#' +#' The function checks if the fitted model is supported by DHARMa, and if there are other issues that could create problems +#' +#' @param fittedModel a fitted model +#' @param stop whether to throw an error if the model is not supported by DHARMa +#' +#' @details The main purpose of this function os to check if the fitted model class is supported by DHARMa. The function additionally checks for properties of the fitted model that could create problems for calculating residuals or working with the resuls in DHARMa. +#' +#' +#' @keywords internal +checkModel <- function(fittedModel, stop = F){ + + out = T + + if(!(class(fittedModel)[1] %in% getPossibleModels())){ + if(stop == FALSE) warning("DHARMa: fittedModel not in class of supported models. Absolutely no guarantee that this will work!") + else stop("DHARMa: fittedModel not in class of supported models") + } + + # if(hasNA(fittedModel)) message("It seems there were NA values in the data used for fitting the model. This can create problems if you supply additional data to DHARMa functions. See ?checkModel for details") + + # TODO: check as implemented does not work reliably, check if there is any other option to check for NA + # #' @example inst/examples/checkModelHelp.R + + # NA values in the data: checkModel will detect if there were NA values in the data frame. For NA values, most regression models will remove the entire observation from the data. This is not a problem for DHARMa - residuals are then only calculated for non-NA rows in the data. However, if you provide additional predictors to DHARMa, for example to plot residuals against a predictor, you will have to remove all NA rows that were also removed in the model. For most models, you can get the rows of the data that were actually used in the fit via rownames(model.frame(fittedModel)) + + + if (class(fittedModel)[1] == "gam" ) if (class(fittedModel$family)[1] == "extended.family") stop("It seems you are trying to fit a model from mgcv that was fit with an extended.family. Simulation functions for these families are not yet implemented in DHARMa. See issue https://github.com/florianhartig/DHARMa/issues/11 for updates about this") + +} + + + +#' Check simulated data +#' +#' The function checks if the simulated data seems fine +#' +#' @param simulatedResponse the simulated response +#' @param nObs number of observations +#' @param nSim number of simulations +#' +#' @keywords internal +checkSimulations <- function(simulatedResponse, nObs, nSim){ + + if(!inherits(simulatedResponse, "matrix")) securityAssertion("Simulation from the model produced wrong class", stop = T) + + if(any(dim(simulatedResponse) != c(nObs, nSim) )) securityAssertion("Simulation from the model produced wrong dimension", stop = T) + + if(any(!is.finite(simulatedResponse))) message("Simulations from your fitted model produce infinite values. Consider if this is sensible") + + if(any(is.nan(simulatedResponse))) securityAssertion("Simulations from your fitted model produce NaN values. DHARMa cannot calculated residuals for this. This is nearly certainly an error of the regression package you are using", stop = T) + if(any(is.na(simulatedResponse))) securityAssertion("Simulations from your fitted model produce NA values. DHARMa cannot calculated residuals for this. This is nearly certainly an error of the regression package you are using", stop = T) + +} + + + + +#' Recalculate residuals with grouping +#' +#' The purpose of this function is to recalculate scaled residuals per group, based on the simulations done by \code{\link{simulateResiduals}} +#' +#' @param simulationOutput an object with simulated residuals created by \code{\link{simulateResiduals}} +#' @param group group of each data point +#' @param aggregateBy function for the aggregation. Default is sum. This should only be changed if you know what you are doing. Note in particular that the expected residual distribution might not be flat any more if you choose general functions, such as sd etc. +#' @param seed the random seed to be used within DHARMa. The default setting, recommended for most users, is keep the random seed on a fixed value 123. This means that you will always get the same randomization and thus teh same result when running the same code. NULL = no new seed is set, but previous random state will be restored after simulation. FALSE = no seed is set, and random state will not be restored. The latter two options are only recommended for simulation experiments. See vignette for details. +#' @param method the quantile randomization method used. The two options implemented at the moment are probability integral transform (PIT-) residuals (current default), and the "traditional" randomization procedure, that was used in DHARMa until version 0.3.0. For details, see \code{\link{getQuantile}} +#' @return an object of class DHARMa, similar to what is returned by \code{\link{simulateResiduals}}, but with additional outputs for the new grouped calculations. Note that the relevant outputs are 2x in the object, the first is the grouped calculations (which is returned by $name access), and later another time, under identical name, the original output. Moreover, there is a function 'aggregateByGroup', which can be used to aggregate predictor variables in the same way as the variables calculated here +#' +#' @example inst/examples/simulateResidualsHelp.R +#' @export +recalculateResiduals <- function(simulationOutput, group = NULL, aggregateBy = sum, seed = 123, method = c("PIT", "traditional")){ + + randomState <-getRandomState(seed) + on.exit({randomState$restoreCurrent()}) + match.arg(method) + + if(!is.null(simulationOutput$original)) simulationOutput = simulationOutput$original + + out = list() + out$original = simulationOutput + + if(is.null(group)) return(simulationOutput) + else group =as.factor(group) + out$nGroups = nlevels(group) + + aggregateByGroup <- function(x) aggregate(x, by=list(group), FUN=aggregateBy)[,2] + + out$observedResponse = aggregateByGroup(simulationOutput$observedResponse) + out$fittedPredictedResponse = aggregateByGroup(simulationOutput$fittedPredictedResponse) + + if (simulationOutput$refit == F){ + + out$simulatedResponse = apply(simulationOutput$simulatedResponse, 2, aggregateByGroup) + out$scaledResiduals = getQuantile(simulations = out$simulatedResponse , observed = out$observedResponse , integerResponse = simulationOutput$integerResponse, method = method) + + ######## refit = T ################## + } else { + + out$refittedPredictedResponse <- apply(simulationOutput$refittedPredictedResponse, 2, aggregateByGroup) + out$fittedResiduals = aggregateByGroup(simulationOutput$fittedResiduals) + out$refittedResiduals = apply(simulationOutput$refittedResiduals, 2, aggregateByGroup) + out$refittedPearsonResiduals = apply(simulationOutput$refittedPearsonResiduals, 2, aggregateByGroup) + + out$scaledResiduals = getQuantile(simulations = out$refittedResiduals , observed = out$fittedResiduals , integerResponse = simulationOutput$integerResponse, method = method) + + } + + # hack - the c here will result in both old and new outputs to be present resulting output, but a named access should refer to the new, grouped calculations + # question to myself - what's the use of that, why not erase the old outputs? they are anyway saved in the old object + + out$aggregateByGroup = aggregateByGroup + out = c(out, simulationOutput) + out$randomState = randomState + class(out) = "DHARMa" + return(out) +} + +################ simulateResiduals.R + +################ DHARMa.R + +#' @title DHARMa - Residual Diagnostics for HierArchical (Multi-level / Mixed) Regression Models +#' @name DHARMa +#' @docType package +#' @description The 'DHARMa' package uses a simulation-based approach to create readily interpretable scaled (quantile) residuals for fitted (generalized) linear mixed models. Currently supported are linear and generalized linear (mixed) models from 'lme4' (classes 'lmerMod', 'glmerMod'), 'glmmTMB' and 'spaMM', generalized additive models ('gam' from 'mgcv'), 'glm' (including 'negbin' from 'MASS', but excluding quasi-distributions) and 'lm' model classes. Moreover, externally created simulations, e.g. posterior predictive simulations from Bayesian software such as 'JAGS', 'STAN', or 'BUGS' can be processed as well. The resulting residuals are standardized to values between 0 and 1 and can be interpreted as intuitively as residuals from a linear regression. The package also provides a number of plot and test functions for typical model misspecification problems, such as over/underdispersion, zero-inflation, and residual spatial and temporal autocorrelation. +#' @details See index / vignette for details +#' @seealso \code{\link{simulateResiduals}} +#' @examples +#' vignette("DHARMa", package="DHARMa") +NULL + + +#' Print simulated residuals +#' +#' @param x an object with simulated residuals created by \code{\link{simulateResiduals}} +#' @param ... optional arguments for compatibility with the generic function, no function implemented +#' @export +print.DHARMa <- function(x, ...){ + cat(paste("Object of Class DHARMa with simulated residuals based on", x$nSim, "simulations with refit =", x$refit , ". See ?DHARMa::simulateResiduals for help."), "\n", "\n") + if (length(x$scaledResiduals) < 20) cat("Scaled residual values:", x$scaledResiduals) + else { + cat("Scaled residual values:", x$scaledResiduals[1:20], "...") + } +} + +#' Return residuals of a DHARMa simulation +#' +#' @param object an object with simulated residuals created by \code{\link{simulateResiduals}} +#' @param quantileFunction optional - a quantile function to transform the uniform 0/1 scaling of DHARMa to another distribution +#' @param outlierValues if a quantile function with infinite support (such as dnorm) is used, residuals that are 0/1 are mapped to -Inf / Inf. outlierValues allows to convert -Inf / Inf values to an optional min / max value. +#' @param ... optional arguments for compatibility with the generic function, no function implemented +#' @details the function accesses the slot $scaledResiduals in a fitted DHARMa object, and optionally transforms the standard DHARMa quantile residuals (which have a uniform distribution) to a particular pdf. +#' +#' @note some of the papers on simulated quantile residuals transforming the residuals (which are natively uniform) back to a normal distribution. I presume this is because of the larger familiarity of most users with normal residuals. Personally, I never considered this desirable, for the reasons explained in https://github.com/florianhartig/DHARMa/issues/39, but with this function, I wanted to give users the option to plot normal residuals if they so wish. +#' +#' @export +#' @example inst/examples/simulateResidualsHelp.R +#' +residuals.DHARMa <- function(object, quantileFunction = NULL, outlierValues = NULL, ...){ + + if(is.null(quantileFunction)){ + return(object$scaledResiduals) + } else { + res = quantileFunction(object$scaledResiduals) + if(!is.null(outlierValues)){ + res = ifelse(res == -Inf, outlierValues[1], res) + res = ifelse(res == Inf, outlierValues[2], res) + } + return(res) + } +} + + + +#' Return outliers +#' +#' Returns the outliers of a DHARMa object +#' +#' @param object an object with simulated residuals created by \code{\link{simulateResiduals}} +#' @param lowerQuantile lower threshold for outliers. Default is zero = outside simulation envelope +#' @param upperQuantile upper threshold for outliers. Default is 1 = outside simulation envelope +#' @param return wheter to return an indices of outliers or a logical vector +#' +#' @details First of all, note that the standard definition of outlier in the DHARMa plots and outlier tests is an observation that is outside the simulation envelope. How far outside that is depends a lot on how many simulations you do. If you have 100 data points and to 100 simulations, you would expect to have one "outlier" on average, even with a perfectly fitting model. This is in fact what the outlier test tests. +#' +#' Thus, keep in mind that for a small number of simulations, outliers are mostly a technical term: these are points that are outside our simulations, but we don't know how far away they are. +#' +#' If you are seriously interested in HOW FAR outside the expected distribution a data point is, you should increase the number of simulations in \code{\link{simulateResiduals}} to be sure to get the tail of the data distribution correctly. In this case, it may make sense to adjust lowerQuantile and upperQuantile, e.g. to 0.025, 0.975, which would define outliers as values outside the central 95% of the distribution. +#' +#' Also, note that outliers are particularly concerning if they have a strong influence on the model fit. One could test the influence, for example, by removing them from the data, or by some meausures of leverage, e.g. generalisations for Cook's distance as in Pinho, L. G. B., Nobre, J. S., & Singer, J. M. (2015). Cook’s distance for generalized linear mixed models. Computational Statistics & Data Analysis, 82, 126–136. doi:10.1016/j.csda.2014.08.008. At the moment, however, no such function is provided in DHARMa. +#' +#' @export +#' +outliers <- function(object, lowerQuantile = 0, upperQuantile = 1, return = c("index", "logical")){ + + return = match.arg(return) + + out = residuals(object) >= upperQuantile | residuals(object) <= lowerQuantile + + if(return == "logical") return(out) + else(return(which(out))) +} + + + +#' Create a DHARMa object from hand-coded simulations or Bayesian posterior predictive simulations +#' +#' @param simulatedResponse matrix of observations simulated from the fitted model - row index for observations and colum index for simulations +#' @param observedResponse true observations +#' @param fittedPredictedResponse optional fitted predicted response. For Bayesian posterior predictive simulations, using the median posterior prediction as fittedPredictedResponse is recommended. If not provided, the mean simulatedResponse will be used. +#' @param integerResponse if T, noise will be added at to the residuals to maintain a uniform expectations for integer responses (such as Poisson or Binomial). Unlike in \code{\link{simulateResiduals}}, the nature of the data is not automatically detected, so this MUST be set by the user appropriately +#' @param seed the random seed to be used within DHARMa. The default setting, recommended for most users, is keep the random seed on a fixed value 123. This means that you will always get the same randomization and thus teh same result when running the same code. NULL = no new seed is set, but previous random state will be restored after simulation. FALSE = no seed is set, and random state will not be restored. The latter two options are only recommended for simulation experiments. See vignette for details. +#' @param method the quantile randomization method used. The two options implemented at the moment are probability integral transform (PIT-) residuals (current default), and the "traditional" randomization procedure, that was used in DHARMa until version 0.3.0. For details, see \code{\link{getQuantile}} +#' @details The use of this function is to convert simulated residuals (e.g. from a point estimate, or Bayesian p-values) to a DHARMa object, to make use of the plotting / test functions in DHARMa +#' @note Either scaled residuals or (simulatedResponse AND observed response) have to be provided +#' @example inst/examples/createDharmaHelp.R +#' @export +createDHARMa <- function(simulatedResponse , observedResponse , fittedPredictedResponse = NULL, integerResponse = F, seed = 123, method = c("PIT", "traditional")){ + + randomState <-getRandomState(seed) + on.exit({randomState$restoreCurrent()}) + match.arg(method) + + out = list() + out$simulatedResponse = simulatedResponse + out$refit = F + out$integerResponse = integerResponse + out$observedResponse = observedResponse + + if(!is.matrix(simulatedResponse) & !is.null(observedResponse)) stop("either scaled residuals or simulations and observations have to be provided") + if(ncol(simulatedResponse) < 2) stop("simulatedResponse with less than 2 simulations provided - cannot calculate residuals on that.") + + if(ncol(simulatedResponse) < 10) warning("simulatedResponse with less than 10 simulations provided. This rarely makes sense") + + out$nObs = length(observedResponse) + + if (out$nObs < 3) stop("warning - number of observations < 3 ... this rarely makes sense") + + if(! (out$nObs == nrow(simulatedResponse))) stop("dimensions of observedResponse and simulatedResponse do not match") + + out$nSim = ncol(simulatedResponse) + + out$scaledResiduals = getQuantile(simulations = simulatedResponse , observed = observedResponse , integerResponse = integerResponse, method = method) + + + # makes sure that DHARM plots that rely on this vector won't crash + if(is.null(fittedPredictedResponse)){ + message("No fitted predicted response provided, using the mean of the simulations") + fittedPredictedResponse = apply(simulatedResponse, 1, mean) + } + out$fittedPredictedResponse = fittedPredictedResponse + out$randomState = randomState + class(out) = "DHARMa" + return(out) +} + + +#' Ensures that an object is of class DHARMa +#' +#' @param simulationOutput a DHARMa simulation output or an object that can be converted into a DHARMa simulation output +#' @param convert if TRUE, attempts to convert model + numeric to DHARMa, if "Model", converts only supported models to DHARMa +#' @details The +#' @return an object of class DHARMa +#' @keywords internal +ensureDHARMa <- function(simulationOutput, + convert = F){ + + if(inherits(simulationOutput, "DHARMa")){ + return(simulationOutput) + } else { + + if(convert == FALSE) stop("wrong argument to function, simulationOutput must be a DHARMa object!") + else { + + if (class(simulationOutput)[1] %in% getPossibleModels()){ + if (convert == "Model" | convert == T) return(simulateResiduals(simulationOutput)) + } else if(is.vector(simulationOutput, mode = "numeric") & convert == T) { + out = list() + out$scaledResiduals = simulationOutput + out$nObs = length(out$scaledResiduals) + class(out) = "DHARMa" + return(out) + } + } + } + stop("wrong argument to function, simulationOutput must be a DHARMa object or a numeric vector of quantile residuals!") +} + +####################### DHARMa.R + +####################### tests.R + +#' DHARMa general residual test +#' +#' Calls both uniformity and dispersion test +#' +#' This function is a wrapper for the various test functions implemented in DHARMa. Currently, this function calls the \code{\link{testUniformity}} and the \code{\link{testDispersion}} functions. All other tests (see list below) have to be called by hand. +#' +#' @param simulationOutput an object of class DHARMa with simulated quantile residuals, either created via \code{\link{simulateResiduals}} or by \code{\link{createDHARMa}} for simulations created outside DHARMa +#' @param plot if T, plots functions of the tests are called +#' @author Florian Hartig +#' @seealso \code{\link{testUniformity}}, \code{\link{testOutliers}}, \code{\link{testDispersion}}, \code{\link{testZeroInflation}}, \code{\link{testGeneric}}, \code{\link{testTemporalAutocorrelation}}, \code{\link{testSpatialAutocorrelation}}, \code{\link{testQuantiles}} +#' @example inst/examples/testsHelp.R +#' @export +testResiduals <- function(simulationOutput, plot = T){ + + opar = par(mfrow = c(1,3)) + on.exit(par(opar)) + out = list() + out$uniformity = testUniformity(simulationOutput, plot = plot) + out$dispersion = testDispersion(simulationOutput, plot = plot) + out$outliers = testOutliers(simulationOutput, plot = plot) + + print(out) + return(out) +} + +#' Residual tests +#' +#' @details Deprecated, switch your code to using the \code{\link{testResiduals}} function +#' +#' @param simulationOutput an object of class DHARMa with simulated quantile residuals, either created via \code{\link{simulateResiduals}} or by \code{\link{createDHARMa}} for simulations created outside DHARMa +#' @author Florian Hartig +#' @export +testSimulatedResiduals <- function(simulationOutput){ + message("testSimulatedResiduals is deprecated, switch your code to using the testResiduals function") + testResiduals(simulationOutput) +} + + +#' Test for overall uniformity +#' +#' This function tests the overall uniformity of the simulated residuals in a DHARMa object +#' +#' @param simulationOutput an object of class DHARMa with simulated quantile residuals, either created via \code{\link{simulateResiduals}} or by \code{\link{createDHARMa}} for simulations created outside DHARMa +#' @param alternative a character string specifying whether the test should test if observations are "greater", "less" or "two.sided" compared to the simulated null hypothesis. See \code{\link[stats]{ks.test}} for details +#' @param plot if T, plots calls \code{\link{plotQQunif}} as well +#' @details The function applies a \code{\link[stats]{ks.test}} for uniformity on the simulated residuals. +#' @author Florian Hartig +#' @seealso \code{\link{testResiduals}}, \code{\link{testOutliers}}, \code{\link{testDispersion}}, \code{\link{testZeroInflation}}, \code{\link{testGeneric}}, \code{\link{testTemporalAutocorrelation}}, \code{\link{testSpatialAutocorrelation}}, \code{\link{testQuantiles}} +#' @example inst/examples/testsHelp.R +#' @export +testUniformity<- function(simulationOutput, alternative = c("two.sided", "less", "greater"), plot = T){ + + simulationOutput = ensureDHARMa(simulationOutput, convert = T) + + out <- suppressWarnings(ks.test(simulationOutput$scaledResiduals, 'punif', alternative = alternative)) + if(plot == T) plotQQunif(simulationOutput = simulationOutput) + return(out) +} + + +# Experimental +testBivariateUniformity<- function(simulationOutput, alternative = c("two.sided", "less", "greater"), plot = T){ + + simulationOutput = ensureDHARMa(simulationOutput, convert = T) + + #out <- suppressWarnings(ks.test(simulationOutput$scaledResiduals, 'punif', alternative = alternative)) + #if(plot == T) plotQQunif(simulationOutput = simulationOutput) + out = NULL + return(out) +} + + + +#' Test for quantiles +#' +#' This function tests +#' +#' @param simulationOutput an object of class DHARMa with simulated quantile residuals, either created via \code{\link{simulateResiduals}} or by \code{\link{createDHARMa}} for simulations created outside DHARMa +#' @param predictor an optional predictor variable to be used, instead of the predicted response (default) +#' @param quantiles the quantiles to be tested +#' @param plot if T, the function will create an additional plot +#' @details The function fits quantile regressions (via package qgam) on the residuals, and compares their location to the expected location (because of the uniform distributionm, the expected location is 0.5 for the 0.5 quantile). +#' +#' A significant p-value for the splines means the fitted spline deviates from a flat line at the expected location (p-values of intercept and spline are combined via Benjamini & Hochberg adjustment to control the FDR) +#' +#' The p-values of the splines are combined into a total p-value via Benjamini & Hochberg adjustment to control the FDR. +#' +#' @author Florian Hartig +#' @example inst/examples/testQuantilesHelp.R +#' @seealso \code{\link{testResiduals}}, \code{\link{testUniformity}}, \code{\link{testDispersion}}, \code{\link{testZeroInflation}}, \code{\link{testGeneric}}, \code{\link{testTemporalAutocorrelation}}, \code{\link{testSpatialAutocorrelation}}, \code{\link{testOutliers}} +#' @export +testQuantiles <- function(simulationOutput, predictor = NULL, quantiles = c(0.25,0.5,0.75), plot = T){ + + if(plot == F){ + + out = list() + out$data.name = deparse(substitute(simulationOutput)) + + simulationOutput = ensureDHARMa(simulationOutput, convert = T) + res = simulationOutput$scaledResiduals + pred = ensurePredictor(simulationOutput, predictor) + + dat=data.frame(res = simulationOutput$scaledResiduals , pred = pred) + + quantileFits <- list() + pval = rep(NA, length(quantiles)) + predictions = data.frame(pred = sort(dat$pred)) + predictions = cbind(predictions, matrix(ncol = 2 * length(quantiles), nrow = nrow(dat))) + for(i in 1:length(quantiles)){ + datTemp = dat + datTemp$res = datTemp$res - quantiles[i] + + # settings for k = the dimension of the basis used to represent the smooth term. + # see https://github.com/mfasiolo/qgam/issues/37 + dimSmooth = min(length(unique(datTemp$pred)), 10) + quantResult = try(capture.output(quantileFits[[i]] <- qgam::qgam(res ~ s(pred, k = dimSmooth) , data =datTemp, qu = quantiles[i])), silent = T) + if(inherits(quantResult, "try-error")){ + message("Unable to calculate quantile regression for quantile ", quantiles[i], ". Possibly to few (unique) data points / predictions. Will be ommited in plots and significance calculations.") + } else { + x = summary(quantileFits[[i]]) + pval[i] = min(p.adjust(c(x$p.table[1,4], x$s.table[1,4]), method = "BH")) # correction for test on slope and intercept + quantPre = predict(quantileFits[[i]], newdata = predictions, se = T) + predictions[, 2*i] = quantPre$fit + quantiles[i] + predictions[, 2*i + 1] = quantPre$se.fit + } + } + + out$method = "Test for location of quantiles via qgam" + out$alternative = "both" + out$pvals = pval + out$p.value = min(p.adjust(pval, method = "BH")) # correction for multiple quantile tests + out$predictions = predictions + out$qgamFits = quantileFits + + class(out) = "htest" + + } else if(plot == T) { + out <- plotResiduals(simulationOutput = simulationOutput, predictor = predictor, quantiles = quantiles) + } + return(out) +} + + +#unif.2017YMi(X, type = c("Q1", "Q2", "Q3"), lower = rep(0, ncol(X)),upper = rep(1, ncol(X))) + +#' Test for outliers +#' +#' This function tests if the number of observations outside the simulatio envelope are larger or smaller than expected +#' +#' @param simulationOutput an object of class DHARMa with simulated quantile residuals, either created via \code{\link{simulateResiduals}} or by \code{\link{createDHARMa}} for simulations created outside DHARMa +#' @param alternative a character string specifying whether the test should test if observations are "greater", "less" or "two.sided" (default) compared to the simulated null hypothesis +#' @param margin whether to test for outliers only at the lower, only at the upper, or both sides (default) of the simulated data distribution +#' @param plot if T, the function will create an additional plot +#' @details DHARMa residuals are created by simulating from the fitted model, and comparing the simulated values to the observed data. It can occur that all simulated values are higher or smaller than the observed data, in which case they get the residual value of 0 and 1, respectively. I refer to these values as simulation outliers, or simply outliers. +#' +#' Because no data was simulated in the range of the observed value, we don't know "how strongly" these values deviate from the model expectation, so the term "outlier" should be used with a grain of salt - it's not a judgment about the magnitude of a deviation from an expectation, but simply that we are outside the simulated range, and thus cannot say anything more about the location of the residual. +#' +#' Note also that the number of outliers will decrease as we increase the number of simulations. Under the null hypothesis that the model is correct, we expect nData /(nSim +1) outliers at each margin of the distribution. For a reason, consider that if the data and the model distribution are identical, the probability that a given observation is higher than all simulations is 1/(nSim +1). +#' +#' Based on this null expectation, we can test for an excess or lack of outliers. Per default, testOutliers() looks for both, so if you get a significant p-value, you have to check if you have to many or too few outliers. An excess of outliers is to be interpreted as too many values outside the simulation envelope. This could be caused by overdispersion, or by what we classically call outliers. A lack of outliers would be caused, for example, by underdispersion. +#' +#' +#' @author Florian Hartig +#' @seealso \code{\link{testResiduals}}, \code{\link{testUniformity}}, \code{\link{testDispersion}}, \code{\link{testZeroInflation}}, \code{\link{testGeneric}}, \code{\link{testTemporalAutocorrelation}}, \code{\link{testSpatialAutocorrelation}}, \code{\link{testQuantiles}} +#' @example inst/examples/testOutliersHelp.R +#' @export +testOutliers <- function(simulationOutput, alternative = c("two.sided", "greater", "less"), margin = c("both", "upper", "lower"), plot = T){ + + # check inputs + alternative = match.arg(alternative) + margin = match.arg(margin) + data.name = deparse(substitute(simulationOutput)) # remember: needs to be called before ensureDHARMa + simulationOutput = ensureDHARMa(simulationOutput, convert = "Model") + + # calculation of outliers + if(margin == "both") outliers = sum(simulationOutput$scaledResiduals %in% c(0, 1)) + if(margin == "upper") outliers = sum(simulationOutput$scaledResiduals == 1) + if(margin == "lower") outliers = sum(simulationOutput$scaledResiduals == 0) + + # calculations of trials and H0 + outFreqH0 = 1/(simulationOutput$nSim +1) * ifelse(margin == "both", 2, 1) + trials = simulationOutput$nObs + + out = binom.test(outliers, trials, p = outFreqH0, alternative = alternative) + + # overwrite information in binom.test + + out$data.name = data.name + out$margin = margin + out$method = "DHARMa outlier test based on exact binomial test" + + names(out$statistic) = paste("outliers at", margin, "margin(s)") + names(out$parameter) = "simulations" + names(out$estimate) = paste("frequency of outliers (expected:", out$null.value,")") + + out$interval = "tst" + + out$interval = + + if(plot == T) { + + hist(simulationOutput, main = "") + + main = ifelse(out$p.value <= 0.05, + "Outlier test significant", + "Outlier test n.s.") + + title(main = main, cex.main = 1, + col.main = ifelse(out$p.value <= 0.05, "red", "black")) + + # legend("center", c(paste("p=", round(out$p.value, digits = 5)), paste("Deviation ", ifelse(out$p.value < 0.05, "significant", "n.s."))), text.col = ifelse(out$p.value < 0.05, "red", "black" )) + + } + return(out) +} + + +#' DHARMa dispersion tests +#' +#' This function performs a simulation-based test for over/underdispersion +#' +#' @param simulationOutput an object of class DHARMa with simulated quantile residuals, either created via \code{\link{simulateResiduals}} or by \code{\link{createDHARMa}} for simulations created outside DHARMa +#' @param plot whether to plot output +#' @param alternative a character string specifying whether the test should test if observations are "greater", "less" or "two.sided" compared to the simulated null hypothesis. Greater corresponds to overdispersion. +#' @param ... arguments to pass on to \code{\link{testGeneric}} +#' @details The function implements two tests, depending on whether it is applied on a simulation with refit = F, or refit = T. +#' +#' If refit = F, the function tests the sd of the data against the sd of the simulated data. +#' +#' If refit = T, the function compares the approximate deviance (via squared pearson residuals) with the same quantity from the models refitted with simulated data. Applying this is much slower than the previous alternative. Given the computational cost, I would suggest that most users will be satisfied with the standard dispersion test. +#' +#' @note The results of the dispersion test can can differ depending on whether it is evaluated on conditional (= conditional on fitted random effects) or unconditional (= REs are re-simulated) simulations. You can change between conditional or unconditional simulations in \code{\link{simulateResiduals}} if this is supported by the regression package that you use. The default in DHARMa is to use unconditional simulations, but I have often found that conditional simulations are more sensitive to dispersion problems. I recommend trying both, as neither test should be positive if the dispersion is correct. +#' +#' @author Florian Hartig +#' @seealso \code{\link{testResiduals}}, \code{\link{testUniformity}}, \code{\link{testOutliers}}, \code{\link{testZeroInflation}}, \code{\link{testGeneric}}, \code{\link{testTemporalAutocorrelation}}, \code{\link{testSpatialAutocorrelation}}, \code{\link{testQuantiles}} +#' @example inst/examples/testsHelp.R +#' @export +testDispersion <- function(simulationOutput, alternative = c("two.sided", "greater", "less"), plot = T, ...){ + + out = list() + out$data.name = deparse(substitute(simulationOutput)) + + alternative <- match.arg(alternative) + + simulationOutput = ensureDHARMa(simulationOutput, convert = "Model") + + if(simulationOutput$refit == F){ + + spread <- function(x) sd(x - simulationOutput$fittedPredictedResponse) + out = testGeneric(simulationOutput, summary = spread, alternative = alternative, methodName = "DHARMa nonparametric dispersion test via sd of residuals fitted vs. simulated", plot = plot, ...) + } else { + + observed = tryCatch(sum(residuals(simulationOutput$fittedModel, type = "pearson")^2), error = function(e) { + message(paste("DHARMa: the requested tests requires pearson residuals, but your model does not implement these calculations. Test will return NA. Error message:", e)) + return(NA) + }) + if(is.na(observed)) return(NA) + expected = apply(simulationOutput$refittedPearsonResiduals^2 , 2, sum) + out$statistic = c(dispersion = observed / mean(expected)) + out$method = "DHARMa nonparametric dispersion test via mean deviance residual fitted vs. simulated-refitted" + + p = getP(simulated = expected, observed = observed, alternative = alternative) + + out$alternative = alternative + out$p.value = p + class(out) = "htest" + + if(plot == T) { + #plotTitle = gsub('(.{1,50})(\\s|$)', '\\1\n', out$method) + xLabel = paste("Simulated values, red line = fitted model. p-value (",out$alternative, ") = ", out$p.value, sep ="") + + hist(expected, xlim = range(expected, observed, na.rm=T ), col = "lightgrey", main = "", xlab = xLabel, breaks = 20, cex.main = 1) + abline(v = observed, lwd= 2, col = "red") + + main = ifelse(out$p.value <= 0.05, + "Dispersion test significant", + "Dispersion test n.s.") + + title(main = main, cex.main = 1, + col.main = ifelse(out$p.value <= 0.05, "red", "black")) + } + } + + return(out) +} + +#' Simulated overdisperstion tests +#' +#' @details Deprecated, switch your code to using the \code{\link{testDispersion}} function +#' +#' @param simulationOutput an object of class DHARMa with simulated quantile residuals, either created via \code{\link{simulateResiduals}} or by \code{\link{createDHARMa}} for simulations created outside DHARMa +#' @param ... additional arguments to \code{\link{testDispersion}} +#' @export +testOverdispersion <- function(simulationOutput, ...){ + message("testOverdispersion is deprecated, switch your code to using the testDispersion function") + testDispersion(simulationOutput, ...) +} + +#' Parametric overdisperstion tests +#' +#' @details Deprecated, switch your code to using the \code{\link{testDispersion}} function. The function will do nothing, arguments will be ignored, the parametric tests is no longer recommend +#' +#' @param ... arguments will be ignored, the parametric tests is no longer recommend +#' @export +testOverdispersionParametric <- function(...){ + message("testOverdispersionParametric is deprecated and no longer recommended, see release notes in DHARMA 0.2.0 - switch your code to using the testDispersion function") + return(0) +} + + +#' Tests for zero-inflation +#' +#' This function compares the observed number of zeros with the zeros expected from simulations. +#' +#' @param simulationOutput an object of class DHARMa with simulated quantile residuals, either created via \code{\link{simulateResiduals}} or by \code{\link{createDHARMa}} for simulations created outside DHARMa +#' @param ... further arguments to \code{\link{testGeneric}} +#' @details The plot shows the expected distribution of zeros against the observed values, the ratioObsSim shows observed vs. simulated zeros. A value < 1 means that the observed data has less zeros than expected, a value > 1 means that it has more zeros than expected (aka zero-inflation). Per default, the function tests both sides. +#' +#' Some notes about common problems / questions: +#' +#' * Zero-inflation tests after fitting the model are crucial to see if you have zero-inflation. Just because there are a lot of zeros doesn't mean you have zero-inflation, see Warton, D. I. (2005). Many zeros does not mean zero inflation: comparing the goodness-of-fit of parametric models to multivariate abundance data. Environmetrics 16(3), 275-289. +#' +#' * That being said, zero-inflation tests are often not a reliable guide to decide wheter to add a zi term or not. In general, model structures should be decided on ideally a priori, if that is not possible via model selection techniques (AIC, BIC, WAIC, Bayes Factor). A zero-inflation test should only be run after that decision, and to validate the decision that was taken. +#' +#' @note This function is a wrapper for \code{\link{testGeneric}}, where the summary argument is set to function(x) sum(x == 0) +#' @author Florian Hartig +#' @example inst/examples/testsHelp.R +#' @seealso \code{\link{testResiduals}}, \code{\link{testUniformity}}, \code{\link{testOutliers}}, \code{\link{testDispersion}}, \code{\link{testGeneric}}, \code{\link{testTemporalAutocorrelation}}, \code{\link{testSpatialAutocorrelation}}, \code{\link{testQuantiles}} +#' @export +testZeroInflation <- function(simulationOutput, ...){ + countZeros <- function(x) sum( x == 0) + testGeneric(simulationOutput = simulationOutput, summary = countZeros, methodName = "DHARMa zero-inflation test via comparison to expected zeros with simulation under H0 = fitted model", ... ) +} + + +#' Generic simulation test of a summary statistic +#' +#' This function tests if a user-defined summary differs when applied to simulated / observed data. +#' +#' @param simulationOutput an object of class DHARMa with simulated quantile residuals, either created via \code{\link{simulateResiduals}} or by \code{\link{createDHARMa}} for simulations created outside DHARMa +#' @param summary a function that can be applied to simulated / observed data. See examples below +#' @param alternative a character string specifying whether the test should test if observations are "greater", "less" or "two.sided" compared to the simulated null hypothesis +#' @param plot whether to plot the simulated summary +#' @param methodName name of the test (will be used in plot) +#' +#' @details This function tests if a user-defined summary differs when applied to simulated / observed data. the function can easily be remodeled to apply summaries on the residuals, by simply defining f = function(x) summary (x - predictions), as done in \code{\link{testDispersion}} +#' +#' @note The function that you supply is applied on the data as it is represented in your fitted model, which may not always correspond to how you think. This is important in particular when you use k/n binomial data, and want to test for 1-inflation. As an example, if have k/20 observations, and you provide your data via cbind (y, y-20), you have to test for 20-inflation (because this is how the data is represented in the model). However, if you provide data via y/20, and weights = 20, you should test for 1-inflation. In doubt, check how the data is internally represented in model.frame(model), or via simulate(model) +#' +#' @export +#' @author Florian Hartig +#' @example inst/examples/testsHelp.R +#' @seealso \code{\link{testResiduals}}, \code{\link{testUniformity}}, \code{\link{testOutliers}}, \code{\link{testDispersion}}, \code{\link{testZeroInflation}}, \code{\link{testTemporalAutocorrelation}}, \code{\link{testSpatialAutocorrelation}}, \code{\link{testQuantiles}} +testGeneric <- function(simulationOutput, summary, alternative = c("two.sided", "greater", "less"), plot = T, methodName = "DHARMa generic simulation test"){ + + out = list() + out$data.name = deparse(substitute(simulationOutput)) + + simulationOutput = ensureDHARMa(simulationOutput, convert = "Model") + + alternative <- match.arg(alternative) + + observed = summary(simulationOutput$observedResponse) + + simulated = apply(simulationOutput$simulatedResponse, 2, summary) + + p = getP(simulated = simulated, observed = observed, alternative = alternative) + + out$statistic = c(ratioObsSim = observed / mean(simulated)) + out$method = methodName + out$alternative = alternative + out$p.value = p + + + class(out) = "htest" + + if(plot == T) { + plotTitle = gsub('(.{1,50})(\\s|$)', '\\1\n', methodName) + xLabel = paste("Simulated values, red line = fitted model. p-value (",out$alternative, ") = ", out$p.value, sep ="") + hist(simulated, xlim = range(simulated, observed, na.rm=T ), col = "lightgrey", main = plotTitle, xlab = xLabel, breaks = max(round(simulationOutput$nSim / 5), 20), cex.main = 0.8) + abline(v = observed, lwd= 2, col = "red") + } + return(out) +} + + +#' Test for temporal autocorrelation +#' +#' This function performs a standard test for temporal autocorrelation on the simulated residuals +#' +#' @param simulationOutput an object with simulated residuals created by \code{\link{simulateResiduals}} +#' @param time the time, in the same order as the data points. If not provided, random values will be created +#' @param alternative a character string specifying whether the test should test if observations are "greater", "less" or "two.sided" compared to the simulated null hypothesis +#' @param plot whether to plot output +#' @details The function performs a Durbin-Watson test on the uniformly scaled residuals, and plots the residuals against time. The DB test was originally be designed for normal residuals. In simulations, I didn't see a problem with this setting though. The alternative is to transform the uniform residuals to normal residuals and perform the DB test on those. +#' +#' If no time values are provided, random values will be created. The sense of being able to run the test with time = NULL (random values) is to test the rate of false positives under the current residual structure (random time corresponds to H0: no spatial autocorrelation), e.g. to check if the test has noninal error rates for particular residual structures (note that Durbin-Watson originally assumes normal residuals, error rates seem correct for uniform residuals, but may not be correct if there are still other residual problems). +#' +#' Testing for temporal autocorrelation requires unique time values - if you have several observations per time value, either use the recalculateResiduals function to aggregate residuals per time step, or extract the residuals from the fitted object, and plot / test each of them independently for temporally repeated subgroups (typical choices would be location / subject etc.). Note that the latter must be done by hand, outside testSpatialAutocorrelation. +#' +#' @note Important to note for all autocorrelation tests (spatial / temporal): the autocorrelation tests are valid to check for residual autocorrelation in models that don't assume such a correlation (in this case, you can use conditional or unconditional simulations), or if there is remaining residual autocorrelation after accounting for it in a spatial/temporal model (in that case, you have to use conditional simulations), but if checking unconditional simulations from a model with an autocorrelation structure on data that corresponds to this model, they will be significant, even if the model fully accounts for this structure. +#' +#' This behavior is not really a bug, but rather originates from the definition of the quantile residuals: quantile residuals are calculated independently per data point, i.e. without consideratin of any correlation structure between data points that may exist in the simulations. As a result, the simulated distributions from a unconditional simulaton will typically not reflect the correlation structure that is present in each single simulation, and the same is true for the subsequently calculated quantile residuals. +#' +#' The bottomline here is that spatial / temporal / other autoregressive models should either be tested based on conditional simulations, or (ideally) custom tests should be used that are not based on quantile residuals, but rather compare the correlation structure in the simulated data with the correlation structure in the observed data. +#' +#' @author Florian Hartig +#' @seealso \code{\link{testResiduals}}, \code{\link{testUniformity}}, \code{\link{testOutliers}}, \code{\link{testDispersion}}, \code{\link{testZeroInflation}}, \code{\link{testGeneric}}, \code{\link{testSpatialAutocorrelation}}, \code{\link{testQuantiles}} +#' @example inst/examples/testTemporalAutocorrelationHelp.R +#' @export +testTemporalAutocorrelation <- function(simulationOutput, time = NULL , alternative = c("two.sided", "greater", "less"), plot = T){ + + simulationOutput = ensureDHARMa(simulationOutput, convert = T) + + # actually not sure if this is neccessary for dwtest, but seems better to aggregate + if(any(duplicated(time))) stop("testing for temporal autocorrelation requires unique time values - if you have several observations per time value, either use the recalculateResiduals function to aggregate residuals per time step, or extract the residuals from the fitted object, and plot / test each of them independently for temporally repeated subgroups (typical choices would be location / subject etc.). Note that the latter must be done by hand, outside testSpatialAutocorrelation.") + + alternative <- match.arg(alternative) + + if(is.null(time)){ + time = sample.int(simulationOutput$nObs, simulationOutput$nObs) + message("DHARMa::testTemporalAutocorrelation - no time argument provided, using random times for each data point") + } + + out = lmtest::dwtest(simulationOutput$scaledResiduals ~ 1, order.by = time, alternative = alternative) + + if(plot == T) { + oldpar <- par(mfrow = c(1,2)) + on.exit(par(oldpar)) + + plot(simulationOutput$scaledResiduals[order(time)] ~ time[order(time)], + type = "l", ylab = "Scaled residuals", xlab = "Time", main = "Residuals vs. time") + acf(simulationOutput$scaledResiduals[order(time)], main = "Autocorrelation") + legend("topright", + c(paste(out$method, " p=", round(out$p.value, digits = 5)), + paste("Deviation ", ifelse(out$p.value < 0.05, "significant", "n.s."))), + text.col = ifelse(out$p.value < 0.05, "red", "black" ), bty="n") + + } + + return(out) +} + + +#' Test for spatial autocorrelation +#' +#' This function performs a standard test for spatial autocorrelation on the simulated residuals +#' +#' @param simulationOutput an object of class DHARMa with simulated quantile residuals, either created via \code{\link{simulateResiduals}} or by \code{\link{createDHARMa}} for simulations created outside DHARMa +#' @param x the x coordinate, in the same order as the data points. If not provided, random values will be created +#' @param y the y coordinate, in the same order as the data points. If not provided, random values will be created +#' @param distMat optional distance matrix. If not provided, a distance matrix will be calculated based on x and y. See details for explanation +#' @param alternative a character string specifying whether the test should test if observations are "greater", "less" or "two.sided" compared to the simulated null hypothesis +#' @param plot whether to plot output +#' @details The function performs Moran.I test from the package ape, based on the provided distance matrix of the data points. +#' +#' There are several ways to specify this distance. If a distance matrix (distMat) is provided, calculations will be based on this distance matrix, and x,y coordinates will only used for the plotting (if provided) +#' If distMat is not provided, the function will calculate the euclidian distances between x,y coordinates, and test Moran.I based on these distances. +#' +#' If no x/y values are provided, random values will be created. The sense of being able to run the test with x/y = NULL (random values) is to test the rate of false positives under the current residual structure (random x/y corresponds to H0: no spatial autocorrelation), e.g. to check if the test has nominal error rates for particular residual structures. +#' +#' Testing for spatial autocorrelation requires unique x,y values - if you have several observations per location, either use the recalculateResiduals function to aggregate residuals per location, or extract the residuals from the fitted object, and plot / test each of them independently for spatially repeated subgroups (a typical scenario would repeated spatial observation, in which case one could plot / test each time step separately for temporal autocorrelation). Note that the latter must be done by hand, outside testSpatialAutocorrelation. +#' +#' @note Important to note for all autocorrelation tests (spatial / temporal): the autocorrelation tests are valid to check for residual autocorrelation in models that don't assume such a correlation (in this case, you can use conditional or unconditional simulations), or if there is remaining residual autocorrelation after accounting for it in a spatial/temporal model (in that case, you have to use conditional simulations), but if checking unconditional simulations from a model with an autocorrelation structure on data that corresponds to this model, they will be significant, even if the model fully accounts for this structure. +#' +#' This behavior is not really a bug, but rather originates from the definition of the quantile residuals: quantile residuals are calculated independently per data point, i.e. without consideratin of any correlation structure between data points that may exist in the simulations. As a result, the simulated distributions from a unconditional simulaton will typically not reflect the correlation structure that is present in each single simulation, and the same is true for the subsequently calculated quantile residuals. +#' +#' The bottomline here is that spatial / temporal / other autoregressive models should either be tested based on conditional simulations, or (ideally) custom tests should be used that are not based on quantile residuals, but rather compare the correlation structure in the simulated data with the correlation structure in the observed data. +#' +#' @author Florian Hartig +#' @seealso \code{\link{testResiduals}}, \code{\link{testUniformity}}, \code{\link{testOutliers}}, \code{\link{testDispersion}}, \code{\link{testZeroInflation}}, \code{\link{testGeneric}}, \code{\link{testTemporalAutocorrelation}}, \code{\link{testQuantiles}} +#' @import grDevices +#' @example inst/examples/testSpatialAutocorrelationHelp.R +#' @export +testSpatialAutocorrelation <- function(simulationOutput, x = NULL, y = NULL, distMat = NULL, alternative = c("two.sided", "greater", "less"), plot = T){ + + alternative <- match.arg(alternative) + data.name = deparse(substitute(simulationOutput)) # needs to be before ensureDHARMa + simulationOutput = ensureDHARMa(simulationOutput, convert = T) + + if(any(duplicated(cbind(x,y)))) stop("testing for spatial autocorrelation requires unique x,y values - if you have several observations per location, either use the recalculateResiduals function to aggregate residuals per location, or extract the residuals from the fitted object, and plot / test each of them independently for spatially repeated subgroups (a typical scenario would repeated spatial observation, in which case one could plot / test each time step separately for temporal autocorrelation). Note that the latter must be done by hand, outside testSpatialAutocorrelation.") + + if( (!is.null(x) | !is.null(y)) & !is.null(distMat) ) message("both coordinates and distMat provided, calculations will be done based on the distance matrix, coordinates will only be used for plotting") + # if not provided, fill x and y with random numbers (Null model) + if(is.null(x)){ + x = runif(simulationOutput$nObs, -1,1) + message("DHARMa::testSpatialAutocorrelation - no x coordinates provided, using random values for each data point") + } + + if(is.null(y)){ + y = runif(simulationOutput$nObs, -1,1) + message("DHARMa::testSpatialAutocorrelation - no x coordinates provided, using random values for each data point") + } + + # if not provided, create distance matrix based on x and y + if(is.null(distMat)) distMat <- as.matrix(dist(cbind(x, y))) + + invDistMat <- 1/distMat + diag(invDistMat) <- 0 + + MI = ape::Moran.I(simulationOutput$scaledResiduals, weight = invDistMat, alternative = alternative) + + out = list() + out$statistic = c(observed = MI$observed, expected = MI$expected, sd = MI$sd) + out$method = "DHARMa Moran's I test for spatial autocorrelation" + out$alternative = "Spatial autocorrelation" + out$p.value = MI$p.value + out$data.name = data.name + + class(out) = "htest" + + + + if(plot == T) { + opar <- par(mfrow = c(1,1)) + on.exit(par(opar)) + + col = colorRamp(c("red", "white", "blue"))(simulationOutput$scaledResiduals) + plot(x,y, col = rgb(col, maxColorValue = 255), main = out$method, cex.main = 0.8 ) + + # TODO implement correlogram + } + + if(plot == T) { + + + } + return(out) +} + + +getP <- function(simulated, observed, alternative){ + + if(alternative == "greater") p = mean(simulated >= observed) + if(alternative == "less") p = mean(simulated <= observed) + if(alternative == "two.sided") p = min(min(mean(simulated <= observed), mean(simulated >= observed) ) * 2,1) + + return(p) +} + + + +####################### tests.R + +####################### compatibility.R + + +# New S3 methods + +#' Get model response +#' +#' Extract the response of a fitted model +#' +#' The purpose of this function is to savely extract the response (dependent variable) of the fitted model classes +#' +#' @param object a fitted model +#' @param ... additional parameters +#' +#' @example inst/examples/wrappersHelp.R +#' +#' @seealso \code{\link{getRefit}}, \code{\link{getSimulations}}, \code{\link{getFixedEffects}}, \code{\link{getFitted}} +#' @author Florian Hartig +#' @export +getObservedResponse <- function (object, ...) { + UseMethod("getObservedResponse", object) +} + +#' @rdname getObservedResponse +#' @export +getObservedResponse.default <- function (object, ...){ + out = model.frame(object)[,1] + + # check for weights in k/n case + if(family(object)$family %in% c("binomial", "betabinomial") & "(weights)" %in% colnames(model.frame(object))){ + x = model.frame(object) + out = out * x$`(weights)` + } + + # check for k/n binomial + if(is.matrix(out)){ + if(!(ncol(out) == 2)) securityAssertion("nKcase - wrong dimensions of response") + if(!(family(object)$family %in% c("binomial", "betabinomial"))) securityAssertion("nKcase - wrong family") + + out = out[,1] + } + + # observation is factor - unlike lme4 and older, glmmTMB simulates nevertheless as numeric + if(is.factor(out)) out = as.numeric(out) - 1 + + return(out) +} + +weightsWarning = "Model was fit with prior weights. These will be ignored in the simulation. See ?getSimulations for details" + +#' Get model simulations +#' +#' Wrapper to simulate from a fitted model +#' +#' The purpose of this wrapper for for the simulate function is to return the simulations from a model in a standardized way +#' +#' @param object a fitted model +#' @param nsim number of simulations +#' @param type if simulations should be prepared for getQuantile or for refit +#' @param ... additional parameters to be passed on, usually to the simulate function of the respective model class +#' +#' @return a matrix with simulations +#' @example inst/examples/wrappersHelp.R +#' +#' @seealso \code{\link{getObservedResponse}}, \code{\link{getRefit}}, \code{\link{getFixedEffects}}, \code{\link{getFitted}} +#' +#' @details The function is a wrapper for for the simulate function is to return the simulations from a model in a standardized way. +#' +#' Note: if the model was fit with weights, the function will throw a warning if used with a model class whose simulate function does not include the weightsi in the simulations. Note that the results may or may not be appropriate in this case, depending on how you use the weights. +#' +#' +#' @author Florian Hartig +#' @export +getSimulations <- function (object, nsim = 1 , type = c("normal", "refit"), ...) { + UseMethod("getSimulations", object) +} + +#' @rdname getSimulations +#' @export +getSimulations.default <- function (object, nsim = 1, type = c("normal", "refit"), ...){ + + type <- match.arg(type) + + out = simulate(object, nsim = nsim , ...) + + if (type == "normal"){ + if(family(object)$family %in% c("binomial", "betabinomial")){ + if("(weights)" %in% colnames(model.frame(object))){ + x = model.frame(object) + out = out * x$`(weights)` + } else if (is.matrix(out[[1]])){ + # this is for the k/n binomial case + out = as.matrix(out)[,seq(1, (2*nsim), by = 2)] + } else if(is.factor(out[[1]])){ + if(nlevels(out[[1]]) != 2){ + warning("The fitted model has a factorial response with number of levels not equal to 2 - there is currently no sensible application in DHARMa that would lead to this situation. Likely, you are trying something that doesn't work.") + } + else{ + out = data.matrix(out) - 1 + } + } + } + + if(!is.matrix(out)) out = data.matrix(out) + } else{ + if(family(object)$family %in% c("binomial", "betabinomial")){ + if (!is.matrix(out[[1]]) & !is.numeric(out)) data.frame(data.matrix(out)-1) + } + } + + return(out) +} + + +#' Extract fixed effects of a supported model +#' +#' A wrapper to extract fixed effects of a supported model +#' +#' @param fittedModel a fitted model +#' +#' @example inst/examples/wrappersHelp.R +#' +#' @importFrom lme4 fixef +#' +#' @seealso \code{\link{getObservedResponse}}, \code{\link{getSimulations}}, \code{\link{getRefit}}, \code{\link{getFitted}} +#' @export +getFixedEffects <- function(fittedModel){ + + if(class(fittedModel)[1] %in% c("glm", "lm", "gam", "bam", "negbin") ){ + out = coef(fittedModel) + } else if(class(fittedModel)[1] %in% c("glmerMod", "lmerMod", "HLfit")){ + out = fixef(fittedModel) + } else if(class(fittedModel)[1] %in% c("glmmTMB")){ + out = glmmTMB::fixef(fittedModel) + out = out$cond + } else { + out = coef(fittedModel) + if(is.null(out)) out = fixef(fittedModel) + } + return(out) +} + +#' Get model refit +#' +#' Wrapper to refit a fitted model +#' +#' @param object a fitted model +#' @param newresp the new response that should be used to refit the model +#' @param ... additional parameters to be passed on to the refit or update class that is used to refit the model +#' +#' @details The purpose of this wrapper is to standardize the refit of a model. The behavior of this function depends on the supplied model. When available, it uses the refit method, otherwise it will use update. For glmmTMB: since version 1.0, glmmTMB has a refit function, but this didn't work, so I switched back to this implementation, which is a hack based on the update function. +#' +#' @example inst/examples/wrappersHelp.R +#' +#' @seealso \code{\link{getObservedResponse}}, \code{\link{getSimulations}}, \code{\link{getFixedEffects}} +#' @author Florian Hartig +#' @export +getRefit <- function (object, newresp, ...) { + UseMethod("getRefit", object) +} + +#' @rdname getRefit +#' +#' @importFrom lme4 refit +#' +#' @export +getRefit.default <- function (object, newresp, ...){ + refit(object, newresp, ...) +} + +#' Get model fitted +#' +#' Wrapper to get the fitted value a fitted model +#' +#' The purpose of this wrapper is to standardize extract the fitted values +#' +#' @param object a fitted model +#' @param ... additional parameters to be passed on, usually to the simulate function of the respective model class +#' +#' @example inst/examples/wrappersHelp.R +#' +#' @seealso \code{\link{getObservedResponse}}, \code{\link{getSimulations}}, \code{\link{getRefit}}, \code{\link{getFixedEffects}} +#' +#' @author Florian Hartig +#' @export +getFitted <- function (object, ...) { + UseMethod("getFitted", object) +} + +#' @rdname getFitted +#' @export +getFitted.default <- function (object,...){ + fitted(object, ...) +} + +#' has NA +#' +#' checks if the fitted model excluded NA values +#' +#' @param object a fitted model +#' +#' @details Checks if the fitted model excluded NA values +#' +#' @export + + +# hasNA <- function(object){ +# x = rownames(model.frame(object)) +# if(length(x) < as.numeric(x[length(x) ])) return(TRUE) +# else return(FALSE) +# } + +######### LM ############# + +#' @rdname getRefit +#' @export +getRefit.lm <- function(object, newresp, ...){ + + newData <-model.frame(object) + + if(is.vector(newresp)){ + newData[,1] = newresp + } else if (is.factor(newresp)){ + # Hack to make the factor binomial case work + newData[,1] = as.numeric(newresp) - 1 + } else { + # Hack to make the binomial n/k case work + newData[[1]] = NULL + newData = cbind(newresp, newData) + } + + refittedModel = update(object, data = newData) + return(refittedModel) +} + + +hasWeigths.lm <- function(object, ...){ + if(length(unique(object$prior.weights)) != 1) return(TRUE) + else return(FALSE) +} + + +######### GLM ############# + +#' @rdname getSimulations +#' @export +getSimulations.negbin<- function (object, nsim = 1, type = c("normal", "refit"), ...){ + if("(weights)" %in% colnames(model.frame(object))) warning(weightsWarning) + getSimulations.default(object = object, nsim = nsim, type = type, ...) +} + + +######## MGCV ############ + +# This function overwrites the standard fitted function for GAM + +#' @rdname getFitted +#' @export +getFitted.gam <- function(object, ...){ + class(object) = "glm" + out = stats::fitted(object, ...) + names(out) = as.character(1:length(out)) + out +} + +# Check that this works +# plot(fitted(fittedModelGAM), predict(fittedModelGAM, type = "response")) + + +######## lme4 ############ + + +#' @rdname getSimulations +#' @export +getSimulations.lmerMod <- function (object, nsim = 1, type = c("normal", "refit"), ...){ + + if("(weights)" %in% colnames(model.frame(object))) warning(weightsWarning) + getSimulations.default(object = object, nsim = nsim, type = type, ...) +} + + +######## glmmTMB ###### + +#' @rdname getRefit +#' @export +getRefit.glmmTMB <- function(object, newresp, ...){ + newData <-model.frame(object) + + # hack to make update work - for some reason, glmmTMB wants the matrix embedded in the df for update to work ... should be solved ideally, see https://github.com/glmmTMB/glmmTMB/issues/549 + if(is.matrix(newresp)){ + tmp = colnames(newData[[1]]) + newData[[1]] = NULL + newData = cbind(newresp, newData) + colnames(newData)[1:2] = tmp + } else { + newData[[1]] = newresp + } + refittedModel = update(object, data = newData) + return(refittedModel) +} + + +# glmmTMB simulates normal counts (and not proportions in any case, so the check for the other models is not needed), see #158 +# note that if observation is factor - unlike lme4 and older, glmmTMB simulates nevertheless as numeric + +#' @rdname getSimulations +#' @export +getSimulations.glmmTMB <- function (object, nsim = 1, type = c("normal", "refit"), ...){ + + if("(weights)" %in% colnames(model.frame(object)) & ! family(object)$family %in% c("binomial", "betabinomial")) warning(weightsWarning) + + type <- match.arg(type) + + out = simulate(object, nsim = nsim, ...) + + if (type == "normal"){ + if (is.matrix(out[[1]])){ + # this is for the k/n binomial case + out = as.matrix(out)[,seq(1, (2*nsim), by = 2)] + } + if(!is.matrix(out)) out = data.matrix(out) + }else{ + + # check for weights in k/n case + if(family(object)$family %in% c("binomial", "betabinomial")){ + if("(weights)" %in% colnames(model.frame(object))){ + w = model.frame(object) + w = w$`(weights)` + tmp <- function(x)x/w + out = apply(out, 2, tmp) + out = as.data.frame(out) + } + else if(is.matrix(out[[1]]) & !is.matrix(model.frame(object)[[1]])){ + out = as.data.frame(as.matrix(out)[,seq(1, (2*nsim), by = 2)]) + } + } + + + + + + + # matrixResp = + # + # if(matrixResp & !is.null(ncol(newresp))){ + # # Hack to make the factor binomial case work + # tmp = colnames(newData[[1]]) + # newData[[1]] = NULL + # newData = cbind(newresp, newData) + # colnames(newData)[1:2] = tmp + # } else if(!is.null(ncol(newresp))){ + # newData[[1]] = newresp[,1] + # } else { + # newData[[1]] = newresp + # } + + + # if (out$modelClass == "glmmTMB" & ncol(simulations) == 2*n) simObserved = simulations[,(1+(2*(i-1))):(2+(2*(i-1)))] + } + + # else securityAssertion("Simulation results produced unsupported data structure", stop = TRUE) + + return(out) +} + +####### spaMM ######### + +#' @rdname getObservedResponse +#' @export +getObservedResponse.HLfit <- function(object, ...){ + out = spaMM::response(object, ...) + + nKcase = is.matrix(out) + if(nKcase){ + if(! (family(object) %in% c("binomial", "betabinomial"))) securityAssertion("nKcase - wrong family") + if(! (ncol(out)==2)) securityAssertion("nKcase - wrong dimensions of response") + out = out[,1] + } + + if(!is.numeric(out)) out = as.numeric(out) + + return(out) + +} + +#' @rdname getSimulations +#' @export +getSimulations.HLfit <- function(object, nsim = 1, type = c("normal", "refit"), ...){ + + type <- match.arg(type) + + capture.output({out = simulate(object, nsim = nsim, ...)}) + + if(type == "normal"){ + if(!is.matrix(out)) out = data.matrix(out) + }else{ + out = as.data.frame(out) + } + return(out) +} + +#' @rdname getRefit +#' @export +getRefit.HLfit <- function(object, newresp, ...) { + spaMM::update_resp(object, newresp, evaluate = TRUE) +} + +####################### compatibility.R + +####################### helper.R + +#' Modified ECDF function +#' +#' @details ensures symmetric ECDF (standard ECDF is <), and that 0 / 1 values are only produced if the data is strictly < > than the observed data +#' +#' @keywords internal +DHARMa.ecdf <- function (x) +{ + x <- sort(x) + n <- length(x) + if (n < 1) + stop(paste("DHARMa.ecdf - length vector < 1", x)) + vals <- unique(x) + rval <- approxfun(vals, cumsum(tabulate(match(x, vals)))/ (n +1), + method = "linear", yleft = 0, yright = 1, ties = "ordered") + class(rval) <- c("ecdf", "stepfun", class(rval)) + assign("nobs", n, envir = environment(rval)) + attr(rval, "call") <- sys.call() + rval +} + + + +#' calculate quantiles +#' +#' calculates residual quantiles from a given simulation +#' +#' @param simulations a matrix with simulations from a fitted model. Rows = observations, columns = replicate simulations +#' @param observed a vector with the observed data +#' @param integerResponse is the response integer-valued. Only has an effect for method = "traditional" +#' @param method the quantile randomization method used. See details +#' +#' @details The function calculates residual quantiles from the simulated data. For continous distributions, this will simply the the value of the ecdf. +#' +#' For discrete data, there are two options implemented. +#' +#' The current default (available since DHARMa 0.3.1) are probability integral transform (PIT-) residuals (Smith, 1985; Dunn & Smyth, 1996; see also see also Warton, et al., 2017). +#' +#' Before DHARMa 0.3.1, a different randomization procedure was used, in which the a U(-0.5, 0.5) distribution was added on observations and simualtions for discrete distributions. For a completely discrete distribution, the two procedures should deliver equivalent results, but the second method has the disadvantage that a) one has to know if the distribution is discrete (DHARMa tries to recognize this automatically), and b) that it leads to inefficiencies for some distributions such as the the Tweedie, which are partly continous, partly discrte (see e.g. https://github.com/florianhartig/DHARMa/issues/168). +#' +#' @references +#' +#' Smith, J. Q. "Diagnostic checks of non-standard time series models." Journal of Forecasting 4.3 (1985): 283-291. +#' +#' Dunn, P.K., & Smyth, G.K. (1996). Randomized quantile residuals. Journal of Computational and Graphical Statistics 5, 236-244. +#' +#' Warton, David I., Loïc Thibaut, and Yi Alice Wang. "The PIT-trap—A “model-free” bootstrap procedure for inference about regression models with discrete, multivariate responses." PloS one 12.7 (2017) +#' +#' @export +getQuantile <- function(simulations, observed, integerResponse, method = c("PIT", "traditional")){ + + method = match.arg(method) + + n = length(observed) + if (nrow(simulations) != n) stop("DHARMa::getquantile: wrong dimension of simulations") + nSim = ncol(simulations) + + + if(method == "traditional"){ + + if(integerResponse == F){ + + if(any(duplicated(observed))) message("Model family was recognized or set as continuous, but duplicate values were detected in the response. Consider if you are fitting an appropriate model.") + + values = as.vector(simulations)[duplicated(as.vector(simulations))] + if(length(values) > 0){ + if (all(values%%1==0)){ + integerResponse = T + message("Model family was recognized or set as continuous, but duplicate values were detected in the simulation - changing to integer residuals (see ?simulateResiduals for details)") + } else { + message("Duplicate non-integer values found in the simulation. If this is because you are fitting a non-inter valued discrete response model, note that DHARMa does not perform appropriate randomization for such cases.") + } + + } + } + + scaledResiduals = rep(NA, n) + for (i in 1:n){ + if(integerResponse == T){ + scaledResiduals[i] <- DHARMa.ecdf(simulations[i,] + runif(nSim, -0.5, 0.5))(observed[i] + runif(1, -0.5, 0.5)) + }else{ + scaledResiduals[i] <- DHARMa.ecdf(simulations[i,])(observed[i]) + } + } + + } else { + + + scaledResiduals = rep(NA, n) + for (i in 1:n){ + min <- sum(simulations[i,] < observed[i]) / length(simulations[i,]) + max <- sum(simulations[i,] <= observed[i]) / length(simulations[i,]) + if (min == max) scaledResiduals[i] = DHARMa.ecdf(simulations[i,])(observed[i]) + else{ + scaledResiduals[i] = runif(1, min, max) + } + } + } + + return(scaledResiduals) +} + +# +# +# testData = createData(sampleSize = 200, family = gaussian(), +# randomEffectVariance = 0, numGroups = 5) +# fittedModel <- glmmTMB(observedResponse ~ Environment1, +# data = testData) +# simulationOutput <- simulateResiduals(fittedModel = fittedModel) +# +# sims = simulationOutput$simulatedResponse +# sims[1, c(1,6,8)] = 0 +# any(apply(sims, 1, anyDuplicated)) +# getQuantile(simulations = sims, observed = testData$observedResponse, n = 200, integerResponse = F, nSim = 250) +# +# +# + + + +#' Check dot operator +#' +#' @param name variable name +#' @param default variable default +#' +#' @details modified from https://github.com/lcolladotor/dots +#' +#' @keywords internal +checkDots <- function(name, default, ...) { + args <- list(...) + if(!name %in% names(args)) { + ## Default value + return(default) + } else { + ## If the argument was defined in the ... part, return it + return(args[[name]]) + } +} + + +securityAssertion <- function(context = "Not provided", stop = F){ + generalMessage = "Message from DHARMa: During the execution of a DHARMa function, some unexpected conditions occurred. Even if you didn't get an error, your results may not be reliable. Please check with the help if you use the functions as intended. If you think that the error is not on your side, I would be grateful if you could report the problem at https://github.com/florianhartig/DHARMa/issues \n\n Context:" + if (stop == F) warning(paste(generalMessage, context)) + else stop(paste(generalMessage, context)) +} + +####################### helper.R + +####################### plot.R + +#' DHARMa standard residual plots +#' +#' This function creates standard plots for the simulated residuals +#' @param x an object with simulated residuals created by \code{\link{simulateResiduals}} +#' @param rank if T (default), the values of pred will be rank transformed. This will usually make patterns easier to spot visually, especially if the distribution of the predictor is skewed. +#' @param ... further options for \code{\link{plotResiduals}}. Consider in particular parameters quantreg, rank and asFactor. xlab, ylab and main cannot be changed when using plotSimulatedResiduals, but can be changed when using plotResiduals. +#' @details The function creates two plots. To the left, a qq-uniform plot to detect deviations from overall uniformity of the residuals (calling \code{\link{plotQQunif}}), and to the right, a plot of residuals against predicted values (calling \code{\link{plotResiduals}}). Outliers are highlighted in red (for more on outliers, see \code{\link{testOutliers}}). For a correctly specified model, we would expect +#' +#' a) a straight 1-1 line in the uniform qq-plot -> evidence for an overall uniform (flat) distribution of the residuals +#' +#' b) uniformity of residuals in the vertical direction in the res against predictor plot +#' +#' Deviations of this can be interpreted as for a linear regression. See the vignette for detailed examples. +#' +#' To provide a visual aid in detecting deviations from uniformity in y-direction, the plot of the residuals against the predicted values also performs an (optional) quantile regression, which provides 0.25, 0.5 and 0.75 quantile lines across the plots. These lines should be straight, horizontal, and at y-values of 0.25, 0.5 and 0.75. Note, however, that some deviations from this are to be expected by chance, even for a perfect model, especially if the sample size is small. See further comments on this plot, its interpretation and options, in \code{\link{plotResiduals}} +#' +#' The quantile regression can take some time to calculate, especially for larger datasets. For that reason, quantreg = F can be set to produce a smooth spline instead. This is default for n > 2000. +#' +#' @seealso \code{\link{plotResiduals}}, \code{\link{plotQQunif}} +#' @example inst/examples/plotsHelp.R +#' @import graphics +#' @import utils +#' @export +plot.DHARMa <- function(x, rank = TRUE, ...){ + + oldpar <- par(mfrow = c(1,2), oma = c(0,1,2,1)) + on.exit(par(oldpar)) + + plotQQunif(x) + plotResiduals(x, rank = rank, ...) + + mtext("DHARMa residual diagnostics", outer = T) +} + + +#' Histogram of DHARMa residuals +#' +#' The function produces a histogram from a DHARMa output +#' +#' @param x a DHARMa simulation output (class DHARMa) +#' @param breaks breaks for hist() function +#' @param col col for hist bars +#' @param main plot main +#' @param xlab plot xlab +#' @param cex.main plot cex.main +#' @param ... other arguments to be passed on to hist +#' @seealso \code{\link{plotSimulatedResiduals}}, \code{\link{plotResiduals}} +#' @example inst/examples/plotsHelp.R +#' @export +hist.DHARMa <- function(x, + breaks = seq(-0.02, 1.02, len = 53), + col = c("red",rep("lightgrey",50), "red"), + main = "Hist of DHARMa residuals", + xlab = "Residuals (outliers are marked red)", + cex.main = 1, + ...){ + + x = ensureDHARMa(x, convert = T) + + val = x$scaledResiduals + val[val == 0] = -0.01 + val[val == 1] = 1.01 + + hist(val, breaks = breaks, col = col, main = main, xlab = xlab, cex.main = cex.main, ...) +} + + +#' DHARMa standard residual plots +#' +#' DEPRECATED, use plot() instead +#' +#' @param simulationOutput an object with simulated residuals created by \code{\link{simulateResiduals}} +#' @param ... further options for \code{\link{plotResiduals}}. Consider in particular parameters quantreg, rank and asFactor. xlab, ylab and main cannot be changed when using plotSimulatedResiduals, but can be changed when using plotResiduals. +#' @note This function is deprecated. Use \code{\link{plot.DHARMa}} +#' +#' @seealso \code{\link{plotResiduals}}, \code{\link{plotQQunif}} +#' @export +plotSimulatedResiduals <- function(simulationOutput, ...){ + message("plotSimulatedResiduals is deprecated, please switch your code to simply using the plot() function") + plot(simulationOutput, ...) +} + + +#' Quantile-quantile plot for a uniform distribution +#' +#' The function produces a uniform quantile-quantile plot from a DHARMa output +#' +#' @param simulationOutput a DHARMa simulation output (class DHARMa) +#' @param testUniformity if T, the function \code{\link{testUniformity}} will be called and the result will be added to the plot +#' @param testOutliers if T, the function \code{\link{testOutliers}} will be called and the result will be added to the plot +#' @param testDispersion if T, the function \code{\link{testDispersion}} will be called and the result will be added to the plot +#' @param ... arguments to be passed on to \code{\link[gap]{qqunif}} +#' +#' @details the function calls qqunif from the R package gap to create a quantile-quantile plot for a uniform distribution. +#' @seealso \code{\link{plotSimulatedResiduals}}, \code{\link{plotResiduals}} +#' @example inst/examples/plotsHelp.R +#' @export +plotQQunif <- function(simulationOutput, testUniformity = T, testOutliers = T, testDispersion = T, ...){ + + simulationOutput = ensureDHARMa(simulationOutput, convert = "Model") + + gap::qqunif(simulationOutput$scaledResiduals,pch=2,bty="n", logscale = F, col = "black", cex = 0.6, main = "QQ plot residuals", cex.main = 1, ...) + + if(testUniformity == TRUE){ + temp = testUniformity(simulationOutput, plot = F) + legend("topleft", c(paste("KS test: p=", round(temp$p.value, digits = 5)), paste("Deviation ", ifelse(temp$p.value < 0.05, "significant", "n.s."))), text.col = ifelse(temp$p.value < 0.05, "red", "black" ), bty="n") + } + + if(testOutliers == TRUE){ + temp = testOutliers(simulationOutput, plot = F) + legend("bottomright", c(paste("Outlier test: p=", round(temp$p.value, digits = 5)), paste("Deviation ", ifelse(temp$p.value < 0.05, "significant", "n.s."))), text.col = ifelse(temp$p.value < 0.05, "red", "black" ), bty="n") + } + + if(testDispersion == TRUE){ + temp = testDispersion(simulationOutput, plot = F) + legend("center", c(paste("Dispersion test: p=", round(temp$p.value, digits = 5)), paste("Deviation ", ifelse(temp$p.value < 0.05, "significant", "n.s."))), text.col = ifelse(temp$p.value < 0.05, "red", "black" ), bty="n") + } + +} + + +#' Generic res ~ pred scatter plot with spline or quantile regression on top +#' +#' The function creates a generic residual plot with either spline or quantile regression to highlight patterns in the residuals. Outliers are highlighted in red. +#' +#' @param simulationOutput on object, usually a DHARMa object, from which residual values can be extracted. Alternatively, a vector with residuals or a fitted model can be provided, which will then be transformed into a DHARMa object. +#' @param form optional predictor against which the residuals should be plotted. Default is to used the predicted(simulationOutput) +#' @param quantreg whether to perform a quantile regression on 0.25, 0.5, 0.75 on the residuals. If F, a spline will be created instead. Default NULL chooses T for nObs < 2000, and F otherwise. +#' @param rank if T, the values provided in form will be rank transformed. This will usually make patterns easier to spot visually, especially if the distribution of the predictor is skewed. If form is a factor, this has no effect. +#' @param asFactor should a numeric predictor provided in form be treated as a factor. Default is to choose this for < 10 unique values, as long as enough predictions are available to draw a boxplot. +#' @param smoothScatter if T, a smooth scatter plot will plotted instead of a normal scatter plot. This makes sense when the number of residuals is very large. Default NULL chooses T for nObs < 10000, and F otherwise. +#' @param quantiles for a quantile regression, which quantiles should be plotted +#' @param ... additional arguments to plot / boxplot. +#' @details The function plots residuals against a predictor (by default against the fitted value, extracted from the DHARMa object, or any other predictor). +#' +#' Outliers are highlighted in red (for information on definition and interpretation of outliers, see \code{\link{testOutliers}}). +#' +#' To provide a visual aid in detecting deviations from uniformity in y-direction, the plot function calculates an (optional) quantile regression, which compares the empirical 0.25, 0.5 and 0.75 quantiles (default) in y direction (red solid lines) with the theoretical 0.25, 0.5 and 0.75 quantiles (dashed black line). +#' +#' Asymptotically (i.e. for lots of data / residuals), if the model is correct, theoretical and the empirical quantiles should be identical (i.e. dashed and solid lines should match). A p-value for the deviation is calculated for each quantile line. Significant deviations are highlighted by red color. +#' +#' If form is a factor, a boxplot will be plotted instead of a scatter plot. The distribution for each factor level should be uniformly distributed, so the box should go from 0.25 to 0.75, with the median line at 0.5. Again, chance deviations from this will increases when the sample size is smaller. You can run null simulations to test if the deviations you see exceed what you would expect from random variation. If you want to create box plots for categorical predictors (e.g. because you only have a small number of unique numeric predictor values), you can convert your predictor with as.factor(pred) +#' +#' @return if quantile tests are performed, the function returns them invisibly. +#' +#' @note The quantile regression can take some time to calculate, especially for larger datasets. For that reason, quantreg = F can be set to produce a smooth spline instead. +#' +#' @seealso \code{\link{plotQQunif}} +#' @example inst/examples/plotsHelp.R +#' @export +plotResiduals <- function(simulationOutput, form = NULL, quantreg = NULL, rank = F, asFactor = NULL, smoothScatter = NULL, quantiles = c(0.25, 0.5, 0.75), ...){ + + + ##### Checks ##### + + + a <- list(...) + a$ylab = checkDots("ylab", "Standardized residual", ...) + if(is.null(form)){ + a$xlab = checkDots("xlab", ifelse(rank, "Model predictions (rank transformed)", "Model predictions"), ...) + } + + simulationOutput = ensureDHARMa(simulationOutput, convert = T) + res = simulationOutput$scaledResiduals + if(inherits(form, "DHARMa"))stop("DHARMa::plotResiduals > argument form cannot be of class DHARMa. Note that the syntax of plotResiduals has changed since DHARMa 0.3.0. See ?plotResiduals.") + + pred = ensurePredictor(simulationOutput, form) + + ##### Rank transform and factor conversion##### + + if(!is.factor(pred)){ + + if (rank == T){ + pred = rank(pred, ties.method = "average") + pred = pred / max(pred) + } + + nuniq = length(unique(pred)) + ndata = length(pred) + if(is.null(asFactor)) asFactor = (nuniq == 1) | (nuniq < 10 & ndata / nuniq > 10) + if (asFactor) pred = factor(pred) + } + + ##### Residual scatter plots ##### + + if(is.null(quantreg)) if (length(res) > 2000) quantreg = FALSE else quantreg = TRUE + + switchScatter = 10000 + if(is.null(smoothScatter)) if (length(res) > switchScatter) smoothScatter = TRUE else smoothScatter = FALSE + + blackcol = rgb(0,0,0, alpha = max(0.1, 1 - 3 * length(res) / switchScatter)) + + + # categorical plot + if(is.factor(pred)){ + do.call(plot, append(list(res ~ pred, ylim = c(0,1), axes = FALSE), a)) + } + # smooth scatter + else if (smoothScatter == TRUE) { + defaultCol = ifelse(res == 0 | res == 1, 2,blackcol) + do.call(graphics::smoothScatter, append(list(x = pred, y = res , ylim = c(0,1), axes = FALSE, colramp = colorRampPalette(c("white", "darkgrey"))),a)) + points(pred[defaultCol == 2], res[defaultCol == 2], col = "red", cex = 0.5) + } + # normal plot + else{ + defaultCol = ifelse(res == 0 | res == 1, 2,blackcol) + defaultPch = ifelse(res == 0 | res == 1, 8,1) + a$col = checkDots("col", defaultCol, ...) + a$pch = checkDots("pch", defaultPch, ...) + do.call(plot, append(list(res ~ pred, ylim = c(0,1), axes = FALSE), a)) + } + + axis(1) + axis(2, at=c(0, 0.25, 0.5, 0.75, 1)) + + ##### Quantile regressions ##### + + main = checkDots("main", "Residual vs. predicted", ...) + out = NULL + + if(is.numeric(pred)){ + if(quantreg == F){ + title(main = main, cex.main = 1) + abline(h = c(0.25, 0.5, 0.75), col = "black", lwd = 0.5, lty = 2) + try({ + lines(smooth.spline(pred, res, df = 10), lty = 2, lwd = 2, col = "red") + abline(h = 0.5, col = "red", lwd = 2) + }, silent = T) + }else{ + + out = testQuantiles(simulationOutput, pred, quantiles = quantiles, plot = F) + + + if(any(out$pvals < 0.05, na.rm = TRUE)){ + main = paste(main, "Quantile deviations detected (red curves)", sep ="\n") + if(out$p.value <= 0.05){ + main = paste(main, "Combined adjusted quantile test significant", sep ="\n") + } else { + main = paste(main, "Combined adjusted quantile test n.s.", sep ="\n") + } + maincol = "red" + } else { + main = paste(main, "No significant problems detected", sep ="\n") + maincol = "black" + } + + + title(main = main, cex.main = 0.8, + col.main = maincol) + + for(i in 1:length(quantiles)){ + + lineCol = ifelse(out$pvals[i] <= 0.05 & !(is.na(out$pvals[i])), "red", "black") + filCol = ifelse(out$pvals[i] <= 0.05 & !(is.na(out$pvals[i])), "#FF000040", "#00000020") + + abline(h = quantiles[i], col = lineCol, lwd = 0.5, lty = 2) + polygon(c(out$predictions$pred, rev(out$predictions$pred)), + c(out$predictions[,2*i] - out$predictions[,2*i+1], rev(out$predictions[,2*i] + out$predictions[,2*i+1])), + col = "#00000020", border = F) + lines(out$predictions$pred, out$predictions[,2*i], col = lineCol, lwd = 2) + } + + # legend("bottomright", c(paste("Quantile test: p=", round(out$p.value, digits = 5)), paste("Deviation ", ifelse(out$p.value < 0.05, "significant", "n.s."))), text.col = ifelse(out$p.value < 0.05, "red", "black" ), bty="n") + + } + } + invisible(out) +} + +x = 0.01 +x <= 0.05 & !(is.na(x)) + + +#' Ensures the existence of a valid predictor to plot residuals against +#' +#' @param simulationOutput a DHARMa simulation output or an object that can be converted into a DHARMa simulation output +#' @param predictor an optional predictor. If no predictor is provided, will try to extract the fitted value +#' @keywords internal +ensurePredictor <- function(simulationOutput, + predictor = NULL){ + if(!is.null(predictor)){ + + if(length(predictor) != length(simulationOutput$scaledResiduals)) stop("DHARMa: residuals and predictor do not have the same length. The issue is possibly that you have NAs in your predictor that were removed during the model fit. Remove the NA values from your predictor.") + } else { + + predictor = simulationOutput$fittedPredictedResponse + if(is.null(predictor)) stop("DHARMa: can't extract predictor from simulationOutput, and no predictor provided") + } + return(predictor) +} + + + + +#plot(simulationOutput) + +#plot(simulationOutput$observedResponse, simulationOutput$scaledResiduals, xlab = "predicted", ylab = "Residual", main = "Residual vs. predicted") + +#plot(simulationOutput$observedResponse, simulationOutput$fittedPredictedResponse - simulationOutput$observedResponse) + +#plot(cumsum(sort(simulationOutput$scaledResiduals))) + + +#plotConventionalResiduals(fittedModel) + + +#' Conventional residual plot +#' +#' Convenience function to draw conventional residual plots +#' +#' @param fittedModel a fitted model object +#' @export +plotConventionalResiduals <- function(fittedModel){ + opar <- par(mfrow = c(1,3), oma = c(0,1,2,1)) + on.exit(par(opar)) + plot(predict(fittedModel), resid(fittedModel, type = "deviance"), main = "Deviance" , ylab = "Residual", xlab = "Predicted") + plot(predict(fittedModel), resid(fittedModel, type = "pearson") , main = "Pearson", ylab = "Residual", xlab = "Predicted") + plot(predict(fittedModel), resid(fittedModel, type = "response") , main = "Raw residuals" , ylab = "Residual", xlab = "Predicted") + mtext("Conventional residual plots", outer = T) +} + + + + +# +# +# if(quantreg == F){ +# +# lines(smooth.spline(simulationOutput$fittedPredictedResponse, simulationOutput$scaledResiduals, df = 10), lty = 2, lwd = 2, col = "red") +# +# abline(h = 0.5, col = "red", lwd = 2) +# +# }else{ +# +# #library(gamlss) +# +# # qrnn +# +# # http://r.789695.n4.nabble.com/Quantile-GAM-td894280.html +# +# #require(quantreg) +# #dat <- plyr::arrange(dat,pred) +# #fit<-quantreg::rqss(resid~qss(pred,constraint="N"),tau=0.5,data = dat) +# +# probs = c(0.25, 0.50, 0.75) +# +# w <- p <- list() +# for(i in seq_along(probs)){ +# capture.output(w[[i]] <- qrnn::qrnn.fit(x = as.matrix(simulationOutput$fittedPredictedResponse), y = as.matrix(simulationOutput$scaledResiduals), n.hidden = 4, tau = probs[i], iter.max = 1000, n.trials = 1, penalty = 1)) +# p[[i]] <- qrnn::qrnn.predict(as.matrix(sort(simulationOutput$fittedPredictedResponse)), w[[i]]) +# } +# +# +# +# #plot(simulationOutput$fittedPredictedResponse, simulationOutput$scaledResiduals, xlab = "Predicted", ylab = "Residual", main = "Residual vs. predicted\n lines should match", cex.main = 1) +# +# #lines(sort(simulationOutput$fittedPredictedResponse), as.vector(p[[1]]), col = "red") +# +# matlines(sort(simulationOutput$fittedPredictedResponse), matrix(unlist(p), nrow = length(simulationOutput$fittedPredictedResponse), ncol = length(p)), col = "red", lty = 1) +# +# # as.vector(p[[1]]) +# # +# # +# # lines(simulationOutput$fittedPredictedResponse,p[[1]], col = "red", lwd = 2) +# # abline(h = 0.5, col = "red", lwd = 2) +# # +# # fit<-quantreg::rqss(resid~qss(pred,constraint="N"),tau=0.25,data = dat) +# # lines(unique(dat$pred)[-1],fit$coef[1] + fit$coef[-1], col = "green", lwd = 2, lty =2) +# # abline(h = 0.25, col = "green", lwd = 2, lty =2) +# # +# # fit<-quantreg::rqss(resid~qss(pred,constraint="N"),tau=0.75,data = dat) +# # lines(unique(dat$pred)[-1],fit$coef[1] + fit$coef[-1], col = "blue", lwd = 2, lty = 2) +# # abline(h = 0.75, col = "blue", lwd = 2, lty =2) +# } + +####################### plot.R + +####################### random.R + +#' Record and restore a random state +#' +#' The aim of this function is to record, manipualate and restor a random state +#' +#' @details This function is intended for two (not mutually exclusive tasks) +#' +#' a) record the current random state +#' +#' b) change the current random state in a way that the previous state can be restored +#' +#' @return a list with various infos about the random state that after function execution, as well as a function to restore the previous state before the function execution +#' +#' @param seed seed argument to set.seed(). NULL = no seed, but random state will be restored. F = random state will not be restored +#' @export +#' @example inst/examples/getRandomStateHelp.R +#' @author Florian Hartig +#' +getRandomState <- function(seed = NULL){ + + # better to explicitly access the global RS? + # current = get(".Random.seed", .GlobalEnv, ifnotfound = NULL) + + current = mget(".Random.seed", envir = .GlobalEnv, ifnotfound = list(NULL))[[1]] + + if(is.logical(seed) & seed == F){ + restoreCurrent <- function(){} + }else{ + restoreCurrent <- function(){ + if(is.null(current)) rm(".Random.seed", envir = .GlobalEnv) else assign(".Random.seed", current , envir = .GlobalEnv) + } + } + + # setting seed + if(is.numeric(seed)) set.seed(seed) + + # ensuring that RNG has been initialized + if (is.null(current))runif(1) + + randomState = list(seed, state = get(".Random.seed", globalenv()), kind = RNGkind(), restoreCurrent = restoreCurrent) + return(randomState) +} + +####################### random.R + +######################################### Package DHARMa
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/pampa_macros.xml Tue Jul 21 06:00:10 2020 -0400 @@ -0,0 +1,82 @@ +<macros> + <token name="@VERSION@">0.0.1</token> + <xml name="Pampa_requirements"> + <requirements> + <requirement type="package" version="1.0.2">r-tidyr</requirement> + </requirements> + </xml> + <xml name="GLM_requirements"> + <requirements> + <requirement type="package" version="1.2.2">r-gap</requirement> + <requirement type="package" version="1.0.1">r-glmmtmb</requirement> + <requirement type="package" version="1.4_13">r-multcomp</requirement> + </requirements> + </xml> + <xml name="Plot_requirements"> + <requirements> + <requirement type="package" version="3.1.1">r-ggplot2</requirement> + </requirements> + </xml> + <xml name="pampa_input_calculate"> + <param name="input" type="data" format="tabular" label="Input file" help="Observation data file, with location, year, species and abundance."/> + </xml> + <xml name="pampa_advanced_params_select"> + <param name="advanced" type="select" label="Specify advanced parameters"> + <option value="simple" selected="true">No, use program defaults.</option> + <option value="advanced">Yes, see full parameter list.</option> + </param> + <when value="simple"> + </when> + </xml> + <xml name="pampa_advanced_params_select_GLM"> + <param name="advanced" type="select" label="Specify advanced parameters"> + <option value="simple" selected="true">No, use program defaults.</option> + <option value="advanced">Yes, see full parameter list.</option> + </param> + <when value="simple"> + </when> + <when value="advanced"> + <param name="distrib" type="select" label="Distribution for model"> + <option selected="true" value="None">Auto</option> + <option value="gaussian">Gaussian</option> + <option value="inverse.gaussian">Inverse Gaussian</option> + <option value="poisson">Poisson</option> + <option value="quasipoisson">Quasi-Poisson</option> + <option value="binomial">Binomial</option> + <option value="quasibinomial">Quasi-Binomial</option> + <option value="Gamma">Gamma</option> + </param> + </when> + </xml> + <xml name="pampa_input_GLM"> + <param name="input_metric" type="data" format="tabular" label="Input metrics file" help="Metrics data file, with location, year, and metrics informations that can be used as interest variable."/> + <param name="input_unitobs" type="data" format="tabular" label="Unitobs informations file" help="Unitobs file, with all informations available about unitobs."/> + <param name="varint" type="data_column" data_ref="input_metric" label="Interest variable from metrics file" help= "Choose the field of the interest variable."/> + </xml> + <xml name="pampa_var_GLM"> + <param name="varrep" type="select" label="Response variables" help= "Choose the response variables you want to include in your analysis." multiple="true"> + <option selected="true" value="year">Year</option> + <option selected="true" value="site">Site</option> + <option selected="true" value="habitat">Habitat</option> + </param> + <param name="varrand" type="select" label="Random effect ?" help="Allocate a random effect on site or year makes your model more reliable as random events on a peculiar site or year can affect populations, it takes account of pseudoreplication. However, avoid applying it on a less than 10 levels variable (less than 10 different sites and/or year)." multiple="true"> + <option value="year">Year</option> + <option selected="true" value="site">Site</option> + </param> + </xml> + <xml name="pampa_output_GLM"> + <data name="output_recap" from_work_dir="GLMSummaryFull.txt" format="txt" label="Simple statistics on chosen variables on ${on_string}"/> + <data name="output_rate" from_work_dir="RatingGLM.txt" format="txt" label="Your analysis rating file on ${on_string}"/> + </xml> + <xml name="pampa_bibref"> + <citations> + <citation type="bibtex"> + @unpublished{pampayves, + title={ PAMPA "ressources et biodiversité" scripts }, + author={Yves Reecht}, + url={https://wwz.ifremer.fr/pampa/Meth.-Outils/Outils} + } + </citation> + </citations> + </xml> +</macros>
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/test-data/Community_metrics_cropped.tabular Tue Jul 21 06:00:10 2020 -0400 @@ -0,0 +1,712 @@ +"point" "year" "number" "species.richness" "simpson" "simpson.l" "shannon" "pielou" "hill" "observation.unit" +"AB_0008" "08" 2.66666666666667 1 1 0 0 NA 0 "AB080008" +"AB_0015" "08" 3 1 1 0 0 NA 0 "AB080015" +"AB_0027" "08" 1.33333333333333 1 1 0 0 NA 0 "AB080027" +"AB_0031" "08" 1.33333333333333 1 1 0 0 NA 0 "AB080031" +"AB_0037" "08" 1 1 1 0 0 NA 0 "AB080037" +"AB_0042" "08" 1 1 1 0 0 NA 0 "AB080042" +"AB_0057" "08" 1 1 1 0 0 NA 0 "AB080057" +"AB_0076" "09" 1 1 1 0 0 NA 0 "AB090076" +"AB_0081" "09" 1 1 1 0 0 NA 0 "AB090081" +"AB_0095" "09" 2.33333333333333 1 1 0 0 NA 0 "AB090095" +"AB_0097" "09" 1 1 1 0 0 NA 0 "AB090097" +"AB_0098" "09" 1 1 1 0 0 NA 0 "AB090098" +"AB_0104" "09" 1.2 1 1 0 0 NA 0 "AB090104" +"AB_0105" "09" 1.33333333333333 1 1 0 0 NA 0 "AB090105" +"AB_0106" "09" 2 1 1 0 0 NA 0 "AB090106" +"AB_0120" "09" 1 1 1 0 0 NA 0 "AB090120" +"AB_0121" "09" 2.33333333333333 1 1 0 0 NA 0 "AB090121" +"AB_0122" "09" 1 1 1 0 0 NA 0 "AB090122" +"AB_0123" "09" 1.5 1 1 0 0 NA 0 "AB090123" +"AB_0124" "09" 1 1 1 0 0 NA 0 "AB090124" +"AB_0125" "09" 3.33333333333333 1 1 0 0 NA 0 "AB090125" +"AB_0126" "09" 4.33333333333333 1 1 0 0 NA 0 "AB090126" +"AB_0127" "09" 1.66666666666667 1 1 0 0 NA 0 "AB090127" +"AB_0132" "09" 1.5 1 1 0 0 NA 0 "AB090132" +"AB_0133" "09" 2 1 1 0 0 NA 0 "AB090133" +"AB_0134" "09" 2 1 1 0 0 NA 0 "AB090134" +"AB_0135" "09" 1 1 1 0 0 NA 0 "AB090135" +"AB_0143" "09" 1 1 1 0 0 NA 0 "AB090143" +"AB_0148" "09" 1 1 1 0 0 NA 0 "AB090148" +"AB_0149" "09" 3 1 1 0 0 NA 0 "AB090149" +"AB_0151" "09" 1.33333333333333 1 1 0 0 NA 0 "AB090151" +"AB_0601" "09" 1.66666666666667 1 1 0 0 NA 0 "AB090601" +"AB_0602" "09" 4.66666666666667 2 0.86734693877551 0.13265306122449 0.257318640543832 0.371232326640876 0.10255697699183 "AB090602" +"AB_0603" "09" 1 1 1 0 0 NA 0 "AB090603" +"AB_0001" "10" 2 1 1 0 0 NA 0 "AB100001" +"AB_0002" "10" 4.33333333333333 1 1 0 0 NA 0 "AB100002" +"AB_0006" "10" 2.33333333333333 1 1 0 0 NA 0 "AB100006" +"AB_0008" "10" 3.33333333333333 1 1 0 0 NA 0 "AB100008" +"AB_0009" "10" 1.5 1 1 0 0 NA 0 "AB100009" +"AB_0010" "10" 1.33333333333333 1 1 0 0 NA 0 "AB100010" +"AB_0011" "10" 1.66666666666667 1 1 0 0 NA 0 "AB100011" +"AB_0015" "10" 1 1 1 0 0 NA 0 "AB100015" +"AB_0017" "10" 3.33333333333333 1 1 0 0 NA 0 "AB100017" +"AB_0019" "10" 1.5 1 1 0 0 NA 0 "AB100019" +"AB_0020" "10" 2 1 1 0 0 NA 0 "AB100020" +"AB_0021" "10" 3 1 1 0 0 NA 0 "AB100021" +"AB_0023" "10" 5.33333333333333 1 1 0 0 NA 0 "AB100023" +"AB_0024" "10" 1.33333333333333 1 1 0 0 NA 0 "AB100024" +"AB_0025" "10" 1 1 1 0 0 NA 0 "AB100025" +"AB_0028" "10" 3.33333333333333 1 1 0 0 NA 0 "AB100028" +"AB_0029" "10" 7 2 0.909297052154195 0.0907029478458048 0.191444081957717 0.276195427647939 0.0748993922015743 "AB100029" +"AB_0031" "10" 1 1 1 0 0 NA 0 "AB100031" +"AB_0035" "10" 1 1 1 0 0 NA 0 "AB100035" +"AB_0036" "10" 2.66666666666667 1 1 0 0 NA 0 "AB100036" +"AB_0038" "10" 3 1 1 0 0 NA 0 "AB100038" +"AB_0042" "10" 1 1 1 0 0 NA 0 "AB100042" +"AB_0046" "10" 4 1 1 0 0 NA 0 "AB100046" +"AB_0047" "10" 2 1 1 0 0 NA 0 "AB100047" +"AB_0048" "10" 2.66666666666667 1 1 0 0 NA 0 "AB100048" +"AB_0049" "10" 1.66666666666667 1 1 0 0 NA 0 "AB100049" +"AB_0052" "10" 1 1 1 0 0 NA 0 "AB100052" +"AB_0055" "10" 1 1 1 0 0 NA 0 "AB100055" +"AB_0060" "10" 4.33333333333333 1 1 0 0 NA 0 "AB100060" +"AB_0061" "10" 2.66666666666667 1 1 0 0 NA 0 "AB100061" +"AB_0062" "10" 3.66666666666667 2 0.702479338842975 0.297520661157025 0.474139313057837 0.684038435639042 0.185182969156178 "AB100062" +"AB_0072" "10" 1 1 1 0 0 NA 0 "AB100072" +"AB_0077" "10" 1 1 1 0 0 NA 0 "AB100077" +"AB_0078" "10" 1 1 1 0 0 NA 0 "AB100078" +"AB_0079" "10" 1 1 1 0 0 NA 0 "AB100079" +"AB_0081" "10" 1 1 1 0 0 NA 0 "AB100081" +"AB_0082" "10" 2 1 1 0 0 NA 0 "AB100082" +"AB_0085" "10" 2 1 1 0 0 NA 0 "AB100085" +"AB_0086" "10" 3.33333333333333 1 1 0 0 NA 0 "AB100086" +"AB_0087" "10" 1.66666666666667 1 1 0 0 NA 0 "AB100087" +"AB_0088" "10" 2.33333333333333 1 1 0 0 NA 0 "AB100088" +"AB_0089" "10" 3 1 1 0 0 NA 0 "AB100089" +"AB_0090" "10" 1 1 1 0 0 NA 0 "AB100090" +"AB_0091" "10" 1 1 1 0 0 NA 0 "AB100091" +"AB_0092" "10" 2.66666666666667 1 1 0 0 NA 0 "AB100092" +"AB_0093" "10" 1.66666666666667 1 1 0 0 NA 0 "AB100093" +"AB_0094" "10" 3 1 1 0 0 NA 0 "AB100094" +"AB_0095" "10" 2 2 0.5 0.5 0.693147180559945 1 0.25 "AB100095" +"AB_0096" "10" 2.66666666666667 1 1 0 0 NA 0 "AB100096" +"AB_0097" "10" 1 1 1 0 0 NA 0 "AB100097" +"AB_0098" "10" 1 1 1 0 0 NA 0 "AB100098" +"AB_0099" "10" 1 1 1 0 0 NA 0 "AB100099" +"AB_0111" "10" 1.66666666666667 1 1 0 0 NA 0 "AB100111" +"AB_0112" "10" 3 1 1 0 0 NA 0 "AB100112" +"AB_0119" "10" 1 1 1 0 0 NA 0 "AB100119" +"AB_0124" "10" 4.33333333333333 1 1 0 0 NA 0 "AB100124" +"AB_0131" "10" 3.5 1 1 0 0 NA 0 "AB100131" +"AB_0132" "10" 5 2 0.768888888888889 0.231111111111111 0.392674467227552 0.566509506552905 0.156057437428911 "AB100132" +"AS_0048" "14" 5.66666666666667 1 1 0 0 NA 0 "AS140048" +"AS_0054" "14" 2.5 1 1 0 0 NA 0 "AS140054" +"AS_0059" "14" 7 1 1 0 0 NA 0 "AS140059" +"AS_0060" "14" 2 1 1 0 0 NA 0 "AS140060" +"AS_0061" "14" 27.3333333333333 1 1 0 0 NA 0 "AS140061" +"AS_0070" "14" 2 1 1 0 0 NA 0 "AS140070" +"AS_0079" "14" 9 2 0.802469135802469 0.197530864197531 0.348832095843032 0.503258334775646 0.139360311832599 "AS140079" +"AS_0081" "14" 2 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "AS140081" +"AS_0087" "14" 17 1 1 0 0 NA 0 "AS140087" +"AS_0088" "14" 9 1 1 0 0 NA 0 "AS140088" +"AS_0092" "14" 22 2 0.941230486685032 0.0587695133149679 0.135793958751594 0.195909270873605 0.0513071070033011 "AS140092" +"AS_0094" "14" 2 1 1 0 0 NA 0 "AS140094" +"AS_0097" "14" 3 1 1 0 0 NA 0 "AS140097" +"AS_0155" "14" 2 1 1 0 0 NA 0 "AS140155" +"AS_0156" "14" 2 1 1 0 0 NA 0 "AS140156" +"AS_0157" "14" 2 1 1 0 0 NA 0 "AS140157" +"AS_0159" "14" 2 1 1 0 0 NA 0 "AS140159" +"BE_S032" "13" 1 1 1 0 0 NA 0 "BE13S032" +"BE_S050" "13" 5.33333333333333 1 1 0 0 NA 0 "BE13S050" +"BE_S072" "13" 1 1 1 0 0 NA 0 "BE13S072" +"BL_0001" "12" 1 1 1 0 0 NA 0 "BL120001" +"BL_0005" "12" 1 1 1 0 0 NA 0 "BL120005" +"BL_0009" "12" 1 1 1 0 0 NA 0 "BL120009" +"BL_0011" "12" 3 1 1 0 0 NA 0 "BL120011" +"BL_0014" "12" 1.5 1 1 0 0 NA 0 "BL120014" +"BL_0016" "12" 1 1 1 0 0 NA 0 "BL120016" +"BL_0021" "12" 1 1 1 0 0 NA 0 "BL120021" +"BL_0022" "12" 1 1 1 0 0 NA 0 "BL120022" +"BL_0024" "12" 1 1 1 0 0 NA 0 "BL120024" +"BL_0027" "12" 4.33333333333333 1 1 0 0 NA 0 "BL120027" +"BL_0028" "12" 1 1 1 0 0 NA 0 "BL120028" +"BL_0033" "12" 3 1 1 0 0 NA 0 "BL120033" +"BL_0039" "12" 1 1 1 0 0 NA 0 "BL120039" +"BL_0040" "12" 1.66666666666667 1 1 0 0 NA 0 "BL120040" +"BL_0041" "12" 1 1 1 0 0 NA 0 "BL120041" +"BL_0051" "12" 1.33333333333333 1 1 0 0 NA 0 "BL120051" +"BL_0062" "12" 2.5 1 1 0 0 NA 0 "BL120062" +"BL_0068" "12" 2 2 0.625 0.375 0.562335144618808 0.811278124459133 0.21370378658951 "BL120068" +"BL_0075" "12" 3 1 1 0 0 NA 0 "BL120075" +"BL_0076" "12" 4 2 0.847222222222222 0.152777777777778 0.286835983056161 0.413816850303634 0.11468032210138 "BL120076" +"BL_0082" "12" 5.33333333333333 1 1 0 0 NA 0 "BL120082" +"BL_0085" "12" 3.66666666666667 1 1 0 0 NA 0 "BL120085" +"BL_0090" "12" 1.33333333333333 1 1 0 0 NA 0 "BL120090" +"BL_0091" "12" 1 1 1 0 0 NA 0 "BL120091" +"BL_0093" "12" 1 1 1 0 0 NA 0 "BL120093" +"BL_0094" "12" 2.66666666666667 1 1 0 0 NA 0 "BL120094" +"BL_0097" "12" 1 1 1 0 0 NA 0 "BL120097" +"BL_0106" "12" 2 1 1 0 0 NA 0 "BL120106" +"BL_0128" "12" 1 1 1 0 0 NA 0 "BL120128" +"BL_0131" "12" 1.33333333333333 1 1 0 0 NA 0 "BL120131" +"BL_0133" "12" 1 1 1 0 0 NA 0 "BL120133" +"BL_0136" "12" 2 1 1 0 0 NA 0 "BL120136" +"BL_0137" "12" 1 1 1 0 0 NA 0 "BL120137" +"BL_0140" "12" 2 1 1 0 0 NA 0 "BL120140" +"BL_0141" "12" 3 1 1 0 0 NA 0 "BL120141" +"BL_0154" "12" 1 1 1 0 0 NA 0 "BL120154" +"BL_0155" "12" 1 1 1 0 0 NA 0 "BL120155" +"BL_0161" "12" 1 1 1 0 0 NA 0 "BL120161" +"BL_0204" "12" 1.5 1 1 0 0 NA 0 "BL120204" +"BL_P003" "12" 1.66666666666667 1 1 0 0 NA 0 "BL12P003" +"BL_P017" "12" 3.33333333333333 1 1 0 0 NA 0 "BL12P017" +"BL_P077" "12" 1.5 1 1 0 0 NA 0 "BL12P077" +"BL_P078" "12" 4.5 1 1 0 0 NA 0 "BL12P078" +"BL_P087" "12" 2 1 1 0 0 NA 0 "BL12P087" +"BL_P124" "12" 2 1 1 0 0 NA 0 "BL12P124" +"BO_0007" "12" 1 1 1 0 0 NA 0 "BO120007" +"BO_0011" "12" 2.66666666666667 1 1 0 0 NA 0 "BO120011" +"BO_0014" "12" 2 1 1 0 0 NA 0 "BO120014" +"BO_0026" "12" 1 1 1 0 0 NA 0 "BO120026" +"BO_0028" "12" 4.33333333333333 1 1 0 0 NA 0 "BO120028" +"BO_0029" "12" 1 1 1 0 0 NA 0 "BO120029" +"BO_0032" "12" 2.5 1 1 0 0 NA 0 "BO120032" +"BO_0043" "12" 1 1 1 0 0 NA 0 "BO120043" +"BO_0045" "12" 2 1 1 0 0 NA 0 "BO120045" +"BO_0054" "12" 1.66666666666667 1 1 0 0 NA 0 "BO120054" +"BO_0055" "12" 1 1 1 0 0 NA 0 "BO120055" +"BO_0056" "12" 1.66666666666667 1 1 0 0 NA 0 "BO120056" +"BO_0095" "12" 2 1 1 0 0 NA 0 "BO120095" +"BO_0099" "12" 1.33333333333333 1 1 0 0 NA 0 "BO120099" +"BO_0206" "12" 1 1 1 0 0 NA 0 "BO120206" +"BO_0207" "12" 1 1 1 0 0 NA 0 "BO120207" +"BO_0209" "12" 1.66666666666667 1 1 0 0 NA 0 "BO120209" +"BO_0212" "12" 1.66666666666667 1 1 0 0 NA 0 "BO120212" +"BO_0213" "12" 2 1 1 0 0 NA 0 "BO120213" +"BO_0214" "12" 1 1 1 0 0 NA 0 "BO120214" +"BO_0215" "12" 4.66666666666667 1 1 0 0 NA 0 "BO120215" +"BO_0216" "12" 1 1 1 0 0 NA 0 "BO120216" +"BO_095B" "12" 4.66666666666667 1 1 0 0 NA 0 "BO12095B" +"CH_P032" "13" 1 1 1 0 0 NA 0 "CH13P032" +"CH_P033" "13" 1.5 1 1 0 0 NA 0 "CH13P033" +"CH_P034" "13" 1 1 1 0 0 NA 0 "CH13P034" +"CH_P037" "13" 1.66666666666667 2 0.68 0.32 0.500402423538188 0.721928094887362 0.194011720513331 "CH13P037" +"CH_P040" "13" 2 1 1 0 0 NA 0 "CH13P040" +"CH_P041" "13" 3 1 1 0 0 NA 0 "CH13P041" +"CH_P055" "13" 4.33333333333333 1 1 0 0 NA 0 "CH13P055" +"CH_P056" "13" 1 1 1 0 0 NA 0 "CH13P056" +"CH_P057" "13" 1 1 1 0 0 NA 0 "CH13P057" +"CH_P059" "13" 2.66666666666667 2 0.625 0.375 0.562335144618808 0.811278124459133 0.21370378658951 "CH13P059" +"CH_P061" "13" 5.66666666666667 1 1 0 0 NA 0 "CH13P061" +"CH_P063" "13" 1.5 1 1 0 0 NA 0 "CH13P063" +"CH_P066" "13" 23.6666666666667 2 0.869073596508629 0.130926403491371 0.254730545549561 0.367498494827291 0.101484371815967 "CH13P066" +"CH_P068" "13" 8.66666666666667 1 1 0 0 NA 0 "CH13P068" +"CH_P071" "13" 1.66666666666667 1 1 0 0 NA 0 "CH13P071" +"CH_S095" "13" 1 1 1 0 0 NA 0 "CH13S095" +"CH_S099" "13" 1 1 1 0 0 NA 0 "CH13S099" +"CH_S131" "13" 1 1 1 0 0 NA 0 "CH13S131" +"CH_S148" "13" 1 1 1 0 0 NA 0 "CH13S148" +"CH_S149" "13" 1 1 1 0 0 NA 0 "CH13S149" +"CH_S151" "13" 1 1 1 0 0 NA 0 "CH13S151" +"CH_S153" "13" 1 1 1 0 0 NA 0 "CH13S153" +"CH_S156" "13" 2.5 1 1 0 0 NA 0 "CH13S156" +"CH_S160" "13" 1.66666666666667 1 1 0 0 NA 0 "CH13S160" +"CH_S192" "13" 6.66666666666667 1 1 0 0 NA 0 "CH13S192" +"CS_0007" "13" 1.5 1 1 0 0 NA 0 "CS130007" +"CS_0011" "13" 11 2 0.88613406795225 0.11386593204775 0.228631873582861 0.329846070207146 0.0905941687206982 "CS130011" +"CS_0015" "13" 1 1 1 0 0 NA 0 "CS130015" +"CS_0018" "13" 2 1 1 0 0 NA 0 "CS130018" +"CS_0019" "13" 1 1 1 0 0 NA 0 "CS130019" +"CS_0021" "13" 2 1 1 0 0 NA 0 "CS130021" +"CS_0023" "13" 2 1 1 0 0 NA 0 "CS130023" +"CS_0025" "13" 1.5 1 1 0 0 NA 0 "CS130025" +"CS_0027" "13" 9.33333333333333 1 1 0 0 NA 0 "CS130027" +"CS_0031" "13" 1 1 1 0 0 NA 0 "CS130031" +"CS_0033" "13" 1 1 1 0 0 NA 0 "CS130033" +"CS_0035" "13" 1.66666666666667 1 1 0 0 NA 0 "CS130035" +"CS_0037" "13" 1.33333333333333 2 0.5 0.5 0.693147180559945 1 0.25 "CS130037" +"CS_0039" "13" 1 1 1 0 0 NA 0 "CS130039" +"CS_0042" "13" 1 1 1 0 0 NA 0 "CS130042" +"CS_0043" "13" 2.5 1 1 0 0 NA 0 "CS130043" +"CS_0044" "13" 3 2 0.802469135802469 0.197530864197531 0.348832095843032 0.503258334775646 0.139360311832599 "CS130044" +"CS_0045" "13" 1.5 1 1 0 0 NA 0 "CS130045" +"CS_0047" "13" 3 1 1 0 0 NA 0 "CS130047" +"CS_0054" "13" 1 1 1 0 0 NA 0 "CS130054" +"CS_0060" "13" 1 1 1 0 0 NA 0 "CS130060" +"CS_0064" "13" 2 1 1 0 0 NA 0 "CS130064" +"CS_0065" "13" 1 1 1 0 0 NA 0 "CS130065" +"CS_0069" "13" 2 1 1 0 0 NA 0 "CS130069" +"CS_0070" "13" 3 1 1 0 0 NA 0 "CS130070" +"CS_0071" "13" 1.33333333333333 1 1 0 0 NA 0 "CS130071" +"CS_0075" "13" 8.33333333333333 2 0.9232 0.0768 0.167944147734173 0.242292189082415 0.0649268007114475 "CS130075" +"CS_0077" "13" 1 1 1 0 0 NA 0 "CS130077" +"CS_0079" "13" 2.66666666666667 1 1 0 0 NA 0 "CS130079" +"CS_0081" "13" 2.66666666666667 1 1 0 0 NA 0 "CS130081" +"CS_0082" "13" 2 1 1 0 0 NA 0 "CS130082" +"CS_0083" "13" 1 1 1 0 0 NA 0 "CS130083" +"CS_0085" "13" 1 1 1 0 0 NA 0 "CS130085" +"CS_0092" "13" 1.33333333333333 2 0.625 0.375 0.562335144618808 0.811278124459133 0.21370378658951 "CS130092" +"CS_0094" "13" 1 1 1 0 0 NA 0 "CS130094" +"CS_0095" "13" 1 1 1 0 0 NA 0 "CS130095" +"CS_0098" "13" 5 1 1 0 0 NA 0 "CS130098" +"CS_0100" "13" 2 2 0.722222222222222 0.277777777777778 0.450561208866305 0.650022421648354 0.177019558178641 "CS130100" +"CS_0101" "13" 1 1 1 0 0 NA 0 "CS130101" +"CS_0104" "13" 1 1 1 0 0 NA 0 "CS130104" +"CS_0108" "13" 5 2 0.68 0.32 0.500402423538188 0.721928094887362 0.194011720513331 "CS130108" +"CS_0109" "13" 2.4 1 1 0 0 NA 0 "CS130109" +"CS_0115" "13" 1.33333333333333 1 1 0 0 NA 0 "CS130115" +"CS_0116" "13" 2.33333333333333 1 1 0 0 NA 0 "CS130116" +"CS_0125" "13" 3 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "CS130125" +"CS_0126" "13" 4 2 0.625 0.375 0.562335144618808 0.811278124459133 0.21370378658951 "CS130126" +"CS_0129" "13" 2 1 1 0 0 NA 0 "CS130129" +"CS_0130" "13" 5.66666666666667 2 0.889273356401384 0.110726643598616 0.223718076065834 0.322756958897398 0.0885304373375661 "CS130130" +"CS_0131" "13" 2.66666666666667 1 1 0 0 NA 0 "CS130131" +"CS_0133" "13" 1.66666666666667 1 1 0 0 NA 0 "CS130133" +"CS_0135" "13" 1 1 1 0 0 NA 0 "CS130135" +"CS_0137" "13" 2.66666666666667 1 1 0 0 NA 0 "CS130137" +"CS_0140" "13" 3.66666666666667 1 1 0 0 NA 0 "CS130140" +"CS_0141" "13" 8 1 1 0 0 NA 0 "CS130141" +"CS_0142" "13" 2 1 1 0 0 NA 0 "CS130142" +"CS_0143" "13" 5.33333333333333 1 1 0 0 NA 0 "CS130143" +"CS_0144" "13" 1 1 1 0 0 NA 0 "CS130144" +"CS_0145" "13" 1 1 1 0 0 NA 0 "CS130145" +"CS_0146" "13" 1 1 1 0 0 NA 0 "CS130146" +"CS_0304" "13" 1 1 1 0 0 NA 0 "CS130304" +"CS_0305" "13" 1 1 1 0 0 NA 0 "CS130305" +"CS_0307" "13" 1 1 1 0 0 NA 0 "CS130307" +"CS_0308" "13" 2 1 1 0 0 NA 0 "CS130308" +"CS_0309" "13" 1 1 1 0 0 NA 0 "CS130309" +"CS_0310" "13" 1 1 1 0 0 NA 0 "CS130310" +"CS_0314" "13" 2.66666666666667 1 1 0 0 NA 0 "CS130314" +"CS_0315" "13" 1 1 1 0 0 NA 0 "CS130315" +"CS_0316" "13" 2.5 1 1 0 0 NA 0 "CS130316" +"CS_0317" "13" 3.5 1 1 0 0 NA 0 "CS130317" +"CS_0318" "13" 5.33333333333333 1 1 0 0 NA 0 "CS130318" +"CS_0403" "13" 4.33333333333333 1 1 0 0 NA 0 "CS130403" +"CS_0404" "13" 3 1 1 0 0 NA 0 "CS130404" +"CS_0405" "13" 1 1 1 0 0 NA 0 "CS130405" +"CS_0407" "13" 1.33333333333333 1 1 0 0 NA 0 "CS130407" +"CS_0900" "13" 1 1 1 0 0 NA 0 "CS130900" +"CS_0904" "13" 2 1 1 0 0 NA 0 "CS130904" +"CS_0920" "13" 1 1 1 0 0 NA 0 "CS130920" +"CS_0921" "13" 1 1 1 0 0 NA 0 "CS130921" +"CS_0922" "13" 1.66666666666667 1 1 0 0 NA 0 "CS130922" +"CS_0924" "13" 1 1 1 0 0 NA 0 "CS130924" +"CS_0926" "13" 4 1 1 0 0 NA 0 "CS130926" +"CS_0950" "13" 14.6666666666667 1 1 0 0 NA 0 "CS130950" +"CS_0951" "13" 1.66666666666667 1 1 0 0 NA 0 "CS130951" +"CS_0952" "13" 1 1 1 0 0 NA 0 "CS130952" +"CS_0953" "13" 1.33333333333333 1 1 0 0 NA 0 "CS130953" +"CS_Z104" "13" 13 1 1 0 0 NA 0 "CS13Z104" +"CS_Z106" "13" 2 1 1 0 0 NA 0 "CS13Z106" +"EN_0001" "15" 1.5 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "EN150001" +"EN_0011" "15" 3 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "EN150011" +"EN_0012" "15" 3 2 0.506172839506173 0.493827160493827 0.686961576597323 0.991076059838222 0.24844562328819 "EN150012" +"EN_0023" "15" 1 1 1 0 0 NA 0 "EN150023" +"EN_0027" "15" 1 1 1 0 0 NA 0 "EN150027" +"EN_0028" "15" 1 1 1 0 0 NA 0 "EN150028" +"EN_0030" "15" 1 1 1 0 0 NA 0 "EN150030" +"EN_0032" "15" 2.5 2 0.52 0.48 0.673011667009257 0.970950594454669 0.244881504120152 "EN150032" +"EN_0045" "15" 3.33333333333333 1 1 0 0 NA 0 "EN150045" +"EN_0060" "15" 3.33333333333333 2 0.68 0.32 0.500402423538188 0.721928094887362 0.194011720513331 "EN150060" +"EN_0061" "15" 1.5 1 1 0 0 NA 0 "EN150061" +"EN_0066" "15" 1 1 1 0 0 NA 0 "EN150066" +"EN_0087" "15" 1 1 1 0 0 NA 0 "EN150087" +"EN_0090" "15" 1 1 1 0 0 NA 0 "EN150090" +"EN_0094" "15" 1.5 1 1 0 0 NA 0 "EN150094" +"EN_0105" "15" 2.33333333333333 1 1 0 0 NA 0 "EN150105" +"EN_0108" "15" 2 1 1 0 0 NA 0 "EN150108" +"EN_0115" "15" 1 1 1 0 0 NA 0 "EN150115" +"EN_0116" "15" 1 1 1 0 0 NA 0 "EN150116" +"EN_0119" "15" 1 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "EN150119" +"EN_0136" "15" 3.33333333333333 2 0.82 0.18 0.325082973391448 0.468995593589281 0.130044133005157 "EN150136" +"EN_0137" "15" 9.66666666666667 1 1 0 0 NA 0 "EN150137" +"EN_0138" "15" 3 1 1 0 0 NA 0 "EN150138" +"EN_0139" "15" 2 1 1 0 0 NA 0 "EN150139" +"EN_0140" "15" 2.5 1 1 0 0 NA 0 "EN150140" +"EN_0155" "15" 1 1 1 0 0 NA 0 "EN150155" +"EN_0202" "15" 1 1 1 0 0 NA 0 "EN150202" +"EN_0300" "15" 1.5 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "EN150300" +"EN_0301" "15" 4.33333333333333 1 1 0 0 NA 0 "EN150301" +"EN_0302" "15" 1 1 1 0 0 NA 0 "EN150302" +"EN_0305" "15" 1 1 1 0 0 NA 0 "EN150305" +"EN_0307" "15" 3.33333333333333 1 1 0 0 NA 0 "EN150307" +"EN_0309" "15" 1 1 1 0 0 NA 0 "EN150309" +"EN_0311" "15" 1 1 1 0 0 NA 0 "EN150311" +"EN_0313" "15" 1 1 1 0 0 NA 0 "EN150313" +"EN_0350" "15" 2.66666666666667 1 1 0 0 NA 0 "EN150350" +"EN_0351" "15" 1.33333333333333 1 1 0 0 NA 0 "EN150351" +"EN_0352" "15" 3 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "EN150352" +"EN_0400" "15" 1 1 1 0 0 NA 0 "EN150400" +"GN_0007" "13" 8 1 1 0 0 NA 0 "GN130007" +"GN_0018" "13" 8 1 1 0 0 NA 0 "GN130018" +"GN_0030" "13" 18.6666666666667 1 1 0 0 NA 0 "GN130030" +"GN_0035" "13" 8 1 1 0 0 NA 0 "GN130035" +"GN_0047" "13" 8 1 1 0 0 NA 0 "GN130047" +"GN_0058" "13" 8 1 1 0 0 NA 0 "GN130058" +"GN_0060" "13" 8 1 1 0 0 NA 0 "GN130060" +"GN_0066" "13" 7 1 1 0 0 NA 0 "GN130066" +"GN_0069" "13" 8 1 1 0 0 NA 0 "GN130069" +"GN_0091" "13" 10.3333333333333 1 1 0 0 NA 0 "GN130091" +"GN_0092" "13" 8 1 1 0 0 NA 0 "GN130092" +"GN_0095" "13" 8 1 1 0 0 NA 0 "GN130095" +"GN_0105" "13" 8 1 1 0 0 NA 0 "GN130105" +"GN_0108" "13" 8 1 1 0 0 NA 0 "GN130108" +"GN_0114" "13" 7 1 1 0 0 NA 0 "GN130114" +"GN_0121" "13" 8 1 1 0 0 NA 0 "GN130121" +"GN_0131" "13" 8 1 1 0 0 NA 0 "GN130131" +"GN_0132" "13" 11.6666666666667 2 0.500408163265306 0.499591836734694 0.692738961744081 0.999411064738755 0.249897910577504 "GN130132" +"GN_0135" "13" 8 1 1 0 0 NA 0 "GN130135" +"GN_0139" "13" 8 1 1 0 0 NA 0 "GN130139" +"GN_0142" "13" 7 1 1 0 0 NA 0 "GN130142" +"GN_0148" "13" 25.6666666666667 1 1 0 0 NA 0 "GN130148" +"GN_0152" "13" 46.6666666666667 1 1 0 0 NA 0 "GN130152" +"GN_0163" "13" 35.3333333333333 1 1 0 0 NA 0 "GN130163" +"GN_0164" "13" 8 1 1 0 0 NA 0 "GN130164" +"GN_0179" "13" 10 1 1 0 0 NA 0 "GN130179" +"GN_0181" "13" 28 2 0.847222222222222 0.152777777777778 0.286835983056161 0.413816850303634 0.11468032210138 "GN130181" +"GN_0185" "13" 8 1 1 0 0 NA 0 "GN130185" +"GN_0190" "13" 7 1 1 0 0 NA 0 "GN130190" +"GN_0192" "13" 9 1 1 0 0 NA 0 "GN130192" +"GN_0209" "13" 8 1 1 0 0 NA 0 "GN130209" +"GN_0223" "13" 16.6666666666667 2 0.5392 0.4608 0.653418194793702 0.942683189255492 0.239737821206997 "GN130223" +"GN_0224" "13" 8 1 1 0 0 NA 0 "GN130224" +"GN_0512" "13" 8 1 1 0 0 NA 0 "GN130512" +"GN_0513" "13" 7 1 1 0 0 NA 0 "GN130513" +"HI_0001" "12" 1 1 1 0 0 NA 0 "HI120001" +"HI_0002" "12" 1 1 1 0 0 NA 0 "HI120002" +"HI_0016" "12" 3 1 1 0 0 NA 0 "HI120016" +"HI_0018" "12" 1 1 1 0 0 NA 0 "HI120018" +"HI_0023" "12" 1.5 1 1 0 0 NA 0 "HI120023" +"HI_0024" "12" 3 1 1 0 0 NA 0 "HI120024" +"HI_0025" "12" 1 1 1 0 0 NA 0 "HI120025" +"HI_0026" "12" 1.5 1 1 0 0 NA 0 "HI120026" +"HI_0029" "12" 1 1 1 0 0 NA 0 "HI120029" +"HI_0030" "12" 1.33333333333333 1 1 0 0 NA 0 "HI120030" +"HI_0042" "12" 2 1 1 0 0 NA 0 "HI120042" +"HI_0046" "12" 1.66666666666667 1 1 0 0 NA 0 "HI120046" +"HI_0058" "12" 3 1 1 0 0 NA 0 "HI120058" +"HI_0060" "12" 1 1 1 0 0 NA 0 "HI120060" +"HI_0070" "12" 1 1 1 0 0 NA 0 "HI120070" +"HI_0086" "12" 1 1 1 0 0 NA 0 "HI120086" +"HI_0099" "12" 1.33333333333333 1 1 0 0 NA 0 "HI120099" +"HI_0149" "12" 1 1 1 0 0 NA 0 "HI120149" +"HI_0156" "12" 2.33333333333333 1 1 0 0 NA 0 "HI120156" +"HI_0171" "12" 2 1 1 0 0 NA 0 "HI120171" +"HI_0172" "12" 1 1 1 0 0 NA 0 "HI120172" +"HI_0173" "12" 2.66666666666667 1 1 0 0 NA 0 "HI120173" +"HI_0175" "12" 3 1 1 0 0 NA 0 "HI120175" +"HI_0201" "12" 1 1 1 0 0 NA 0 "HI120201" +"HI_0204" "12" 1 1 1 0 0 NA 0 "HI120204" +"HI_0205" "12" 2 1 1 0 0 NA 0 "HI120205" +"HI_0210" "12" 1 1 1 0 0 NA 0 "HI120210" +"HI_0211" "12" 1 1 1 0 0 NA 0 "HI120211" +"HU_0031" "14" 2 1 1 0 0 NA 0 "HU140031" +"HU_0035" "14" 4 1 1 0 0 NA 0 "HU140035" +"KO_0156" "07" 1.5 1 1 0 0 NA 0 "KO070156" +"KO_0022" "08" 1 1 1 0 0 NA 0 "KO080022" +"KO_0024" "08" 2 1 1 0 0 NA 0 "KO080024" +"KO_0033" "08" 2 1 1 0 0 NA 0 "KO080033" +"KO_0183" "08" 2 1 1 0 0 NA 0 "KO080183" +"KO_0003" "13" 1 1 1 0 0 NA 0 "KO130003" +"KO_0005" "13" 1 1 1 0 0 NA 0 "KO130005" +"KO_0010" "13" 1 1 1 0 0 NA 0 "KO130010" +"KO_0013" "13" 1.66666666666667 1 1 0 0 NA 0 "KO130013" +"KO_0031" "13" 6.33333333333333 1 1 0 0 NA 0 "KO130031" +"KO_0035" "13" 1.66666666666667 1 1 0 0 NA 0 "KO130035" +"KO_0041" "13" 2 1 1 0 0 NA 0 "KO130041" +"KO_0053" "13" 1 1 1 0 0 NA 0 "KO130053" +"KO_0059" "13" 2 1 1 0 0 NA 0 "KO130059" +"KO_0070" "13" 2 2 0.5 0.5 0.693147180559945 1 0.25 "KO130070" +"KO_0071" "13" 1 1 1 0 0 NA 0 "KO130071" +"KO_0089" "13" 1 1 1 0 0 NA 0 "KO130089" +"KO_0097" "13" 1.5 1 1 0 0 NA 0 "KO130097" +"KO_0098" "13" 1.5 1 1 0 0 NA 0 "KO130098" +"KO_0099" "13" 1 1 1 0 0 NA 0 "KO130099" +"KO_0101" "13" 1.5 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "KO130101" +"KO_0108" "13" 3.66666666666667 1 1 0 0 NA 0 "KO130108" +"KO_0110" "13" 2.33333333333333 2 0.755102040816326 0.244897959183674 0.410116318288409 0.591672778582327 0.162507688154577 "KO130110" +"KO_0112" "13" 1.66666666666667 1 1 0 0 NA 0 "KO130112" +"KO_0113" "13" 2 1 1 0 0 NA 0 "KO130113" +"KO_0120" "13" 1 1 1 0 0 NA 0 "KO130120" +"KO_0129" "13" 1 1 1 0 0 NA 0 "KO130129" +"KO_0130" "13" 2 1 1 0 0 NA 0 "KO130130" +"KO_0131" "13" 1.5 1 1 0 0 NA 0 "KO130131" +"KO_0132" "13" 1 1 1 0 0 NA 0 "KO130132" +"KO_0133" "13" 1 2 0.5 0.5 0.693147180559945 1 0.25 "KO130133" +"KO_0138" "13" 5.66666666666667 1 1 0 0 NA 0 "KO130138" +"KO_0139" "13" 1.33333333333333 1 1 0 0 NA 0 "KO130139" +"KO_0147" "13" 2 1 1 0 0 NA 0 "KO130147" +"KO_0148" "13" 1 1 1 0 0 NA 0 "KO130148" +"KO_0154" "13" 1 1 1 0 0 NA 0 "KO130154" +"KO_0160" "13" 1 1 1 0 0 NA 0 "KO130160" +"KO_0165" "13" 1.33333333333333 1 1 0 0 NA 0 "KO130165" +"KO_0174" "13" 1 1 1 0 0 NA 0 "KO130174" +"KO_0176" "13" 2.66666666666667 1 1 0 0 NA 0 "KO130176" +"KO_0177" "13" 1 1 1 0 0 NA 0 "KO130177" +"KO_0202" "13" 1 1 1 0 0 NA 0 "KO130202" +"KO_0203" "13" 1.33333333333333 1 1 0 0 NA 0 "KO130203" +"KO_0204" "13" 1 1 1 0 0 NA 0 "KO130204" +"KO_0205" "13" 5 1 1 0 0 NA 0 "KO130205" +"KO_0208" "13" 2 1 1 0 0 NA 0 "KO130208" +"KO_0209" "13" 1 1 1 0 0 NA 0 "KO130209" +"KO_0301" "13" 1 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "KO130301" +"KO_0302" "13" 1.5 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "KO130302" +"KO_0304" "13" 1 1 1 0 0 NA 0 "KO130304" +"KO_0305" "13" 1.33333333333333 1 1 0 0 NA 0 "KO130305" +"KO_059b" "13" 1 1 1 0 0 NA 0 "KO13059b" +"LA_101B" "08" 2.33333333333333 2 0.755102040816326 0.244897959183674 0.410116318288409 0.591672778582327 0.162507688154577 "LA08101B" +"LA_0012" "10" 2 1 1 0 0 NA 0 "LA100012" +"LA_0028" "10" 1 1 1 0 0 NA 0 "LA100028" +"LA_0039" "10" 1 1 1 0 0 NA 0 "LA100039" +"LI_0021" "14" 1.5 1 1 0 0 NA 0 "LI140021" +"LI_0022" "14" 2.66666666666667 1 1 0 0 NA 0 "LI140022" +"LI_0028" "14" 1 1 1 0 0 NA 0 "LI140028" +"LI_0033" "14" 2 1 1 0 0 NA 0 "LI140033" +"LI_0035" "14" 1 1 1 0 0 NA 0 "LI140035" +"LI_0064" "14" 1 1 1 0 0 NA 0 "LI140064" +"LI_0067" "14" 2.4 2 0.5 0.5 0.693147180559945 1 0.25 "LI140067" +"LI_0073" "14" 1 1 1 0 0 NA 0 "LI140073" +"LI_0077" "14" 2 2 0.5 0.5 0.693147180559945 1 0.25 "LI140077" +"LI_0081" "14" 2.66666666666667 2 0.78125 0.21875 0.376770161256437 0.543564443199596 0.150078631085047 "LI140081" +"LI_0082" "14" 1 1 1 0 0 NA 0 "LI140082" +"LI_0083" "14" 2.66666666666667 1 1 0 0 NA 0 "LI140083" +"LI_0086" "14" 1.33333333333333 1 1 0 0 NA 0 "LI140086" +"LI_0089" "14" 3.33333333333333 1 1 0 0 NA 0 "LI140089" +"LI_0093" "14" 1 1 1 0 0 NA 0 "LI140093" +"LI_0094" "14" 3 1 1 0 0 NA 0 "LI140094" +"LI_0096" "14" 3.33333333333333 2 0.68 0.32 0.500402423538188 0.721928094887362 0.194011720513331 "LI140096" +"LI_0100" "14" 2.5 1 1 0 0 NA 0 "LI140100" +"LI_0102" "14" 4.33333333333333 1 1 0 0 NA 0 "LI140102" +"LI_0103" "14" 4 2 0.722222222222222 0.277777777777778 0.450561208866305 0.650022421648354 0.177019558178641 "LI140103" +"LI_0104" "14" 1.33333333333333 1 1 0 0 NA 0 "LI140104" +"LI_0110" "14" 1 1 1 0 0 NA 0 "LI140110" +"LI_0111" "14" 1.66666666666667 2 0.52 0.48 0.673011667009256 0.970950594454668 0.244881504120152 "LI140111" +"LI_0113" "14" 1.66666666666667 1 1 0 0 NA 0 "LI140113" +"LI_0114" "14" 1 1 1 0 0 NA 0 "LI140114" +"LI_0121" "14" 1.25 1 1 0 0 NA 0 "LI140121" +"LI_0122" "14" 1 1 1 0 0 NA 0 "LI140122" +"LI_0129" "14" 1.33333333333333 2 0.5 0.5 0.693147180559945 1 0.25 "LI140129" +"LI_0149" "14" 1 1 1 0 0 NA 0 "LI140149" +"LI_0150" "14" 2 1 1 0 0 NA 0 "LI140150" +"LI_0151" "14" 1 2 0.5 0.5 0.693147180559945 1 0.25 "LI140151" +"LI_0152" "14" 2.8 2 0.755102040816327 0.244897959183673 0.410116318288409 0.591672778582327 0.162507688154577 "LI140152" +"LI_0305" "14" 2 1 1 0 0 NA 0 "LI140305" +"LI_0307" "14" 1 1 1 0 0 NA 0 "LI140307" +"LI_0401" "14" 4.33333333333333 1 1 0 0 NA 0 "LI140401" +"ME_0004" "13" 2 1 1 0 0 NA 0 "ME130004" +"ME_0018" "13" 3 1 1 0 0 NA 0 "ME130018" +"ME_0022" "13" 2 1 1 0 0 NA 0 "ME130022" +"ME_0034" "13" 4 1 1 0 0 NA 0 "ME130034" +"ME_0036" "13" 2 1 1 0 0 NA 0 "ME130036" +"ME_0046" "13" 3.33333333333333 2 0.82 0.18 0.325082973391448 0.468995593589281 0.130044133005157 "ME130046" +"ME_0049" "13" 3.5 2 0.591836734693878 0.408163265306122 0.598269588585257 0.863120568566631 0.224392705366385 "ME130049" +"ME_0050" "13" 1.5 1 1 0 0 NA 0 "ME130050" +"ME_0053" "13" 2.66666666666667 1 1 0 0 NA 0 "ME130053" +"ME_0054" "13" 1 1 1 0 0 NA 0 "ME130054" +"ME_0063" "13" 1.66666666666667 1 1 0 0 NA 0 "ME130063" +"ME_0066" "13" 2.66666666666667 1 1 0 0 NA 0 "ME130066" +"ME_0071" "13" 2.33333333333333 1 1 0 0 NA 0 "ME130071" +"ME_0073" "13" 1.5 1 1 0 0 NA 0 "ME130073" +"ME_0074" "13" 1.66666666666667 1 1 0 0 NA 0 "ME130074" +"ME_0075" "13" 4.66666666666667 1 1 0 0 NA 0 "ME130075" +"ME_0089" "13" 3 1 1 0 0 NA 0 "ME130089" +"ME_0090" "13" 1.66666666666667 1 1 0 0 NA 0 "ME130090" +"ME_0096" "13" 1 1 1 0 0 NA 0 "ME130096" +"ME_0099" "13" 3.33333333333333 1 1 0 0 NA 0 "ME130099" +"ME_00F1" "13" 1 1 1 0 0 NA 0 "ME1300F1" +"ME_00F3" "13" 1 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "ME1300F3" +"ME_00F4" "13" 1 1 1 0 0 NA 0 "ME1300F4" +"ME_00F5" "13" 1.2 1 1 0 0 NA 0 "ME1300F5" +"ME_0101" "13" 2 2 0.5 0.5 0.693147180559945 1 0.25 "ME130101" +"ME_0105" "13" 3.66666666666667 1 1 0 0 NA 0 "ME130105" +"ME_0106" "13" 1 1 1 0 0 NA 0 "ME130106" +"ME_0107" "13" 1.5 1 1 0 0 NA 0 "ME130107" +"ME_0108" "13" 2.33333333333333 1 1 0 0 NA 0 "ME130108" +"ME_0111" "13" 2 1 1 0 0 NA 0 "ME130111" +"ME_0115" "13" 1 1 1 0 0 NA 0 "ME130115" +"ME_0116" "13" 9 1 1 0 0 NA 0 "ME130116" +"ME_0117" "13" 9.33333333333333 1 1 0 0 NA 0 "ME130117" +"ME_0120" "13" 3 1 1 0 0 NA 0 "ME130120" +"ME_0121" "13" 1 1 1 0 0 NA 0 "ME130121" +"ME_0124" "13" 1.5 1 1 0 0 NA 0 "ME130124" +"ME_0126" "13" 1.66666666666667 1 1 0 0 NA 0 "ME130126" +"ME_0128" "13" 1.5 1 1 0 0 NA 0 "ME130128" +"ME_0129" "13" 2 1 1 0 0 NA 0 "ME130129" +"ME_0135" "13" 1 1 1 0 0 NA 0 "ME130135" +"ME_0137" "13" 2.33333333333333 2 0.591836734693878 0.408163265306122 0.598269588585257 0.863120568566631 0.224392705366385 "ME130137" +"ME_0154" "13" 1 1 1 0 0 NA 0 "ME130154" +"ME_0160" "13" 2.66666666666667 1 1 0 0 NA 0 "ME130160" +"ME_0170" "13" 1.2 1 1 0 0 NA 0 "ME130170" +"ME_0171" "13" 1 1 1 0 0 NA 0 "ME130171" +"ME_0173" "13" 1 1 1 0 0 NA 0 "ME130173" +"ME_0179" "13" 2 1 1 0 0 NA 0 "ME130179" +"ME_0190" "13" 1.33333333333333 1 1 0 0 NA 0 "ME130190" +"ME_0207" "13" 1 1 1 0 0 NA 0 "ME130207" +"ME_0208" "13" 2 1 1 0 0 NA 0 "ME130208" +"ME_0209" "13" 1.66666666666667 2 0.68 0.32 0.500402423538188 0.721928094887362 0.194011720513331 "ME130209" +"ME_0210" "13" 3 1 1 0 0 NA 0 "ME130210" +"ME_0212" "13" 1 1 1 0 0 NA 0 "ME130212" +"ME_0213" "13" 1 1 1 0 0 NA 0 "ME130213" +"ME_0215" "13" 1 1 1 0 0 NA 0 "ME130215" +"ME_0241" "13" 3 1 1 0 0 NA 0 "ME130241" +"ME_0246" "13" 1 1 1 0 0 NA 0 "ME130246" +"ME_0248" "13" 1.2 1 1 0 0 NA 0 "ME130248" +"ME_0252" "13" 2.33333333333333 1 1 0 0 NA 0 "ME130252" +"ME_0260" "13" 3 1 1 0 0 NA 0 "ME130260" +"ME_0262" "13" 1.66666666666667 1 1 0 0 NA 0 "ME130262" +"ME_0265" "13" 1 1 1 0 0 NA 0 "ME130265" +"ME_0266" "13" 5.66666666666667 1 1 0 0 NA 0 "ME130266" +"ME_0267" "13" 1.5 1 1 0 0 NA 0 "ME130267" +"ME_0268" "13" 2.33333333333333 1 1 0 0 NA 0 "ME130268" +"ME_0273" "13" 2 1 1 0 0 NA 0 "ME130273" +"ME_0400" "13" 3 1 1 0 0 NA 0 "ME130400" +"ME_0402" "13" 1 1 1 0 0 NA 0 "ME130402" +"ME_0403" "13" 7.33333333333333 2 0.913223140495868 0.0867768595041321 0.184907399167776 0.266764987803026 0.0721272984117441 "ME130403" +"ME_102PM" "13" 8 2 0.625 0.375 0.562335144618808 0.811278124459133 0.21370378658951 "ME13102PM" +"ME_168PM" "13" 2 2 0.5 0.5 0.693147180559945 1 0.25 "ME13168PM" +"ME_47PM" "13" 3.66666666666667 1 1 0 0 NA 0 "ME1347PM" +"MK_0425" "08" 2.66666666666667 1 1 0 0 NA 0 "MK080425" +"MK_0426" "08" 1 1 1 0 0 NA 0 "MK080426" +"MK_0427" "08" 3 1 1 0 0 NA 0 "MK080427" +"MK_0430" "08" 2 1 1 0 0 NA 0 "MK080430" +"MK_0440" "08" 1.66666666666667 1 1 0 0 NA 0 "MK080440" +"MK_0453" "08" 1 1 1 0 0 NA 0 "MK080453" +"MK_0454" "08" 1.5 1 1 0 0 NA 0 "MK080454" +"MK_0458" "08" 1 1 1 0 0 NA 0 "MK080458" +"MK_0462" "08" 1 1 1 0 0 NA 0 "MK080462" +"MK_0207" "09" 1.33333333333333 1 1 0 0 NA 0 "MK090207" +"MK_0208" "09" 1.33333333333333 1 1 0 0 NA 0 "MK090208" +"MK_0211" "09" 1.66666666666667 1 1 0 0 NA 0 "MK090211" +"MK_0225" "09" 2 1 1 0 0 NA 0 "MK090225" +"MK_0227" "09" 1.66666666666667 1 1 0 0 NA 0 "MK090227" +"MK_0228" "09" 3.5 1 1 0 0 NA 0 "MK090228" +"MK_0231" "09" 1 1 1 0 0 NA 0 "MK090231" +"MK_0234" "09" 1 1 1 0 0 NA 0 "MK090234" +"MK_0248" "09" 2 1 1 0 0 NA 0 "MK090248" +"MK_0249" "09" 1 1 1 0 0 NA 0 "MK090249" +"MK_0250" "09" 1 1 1 0 0 NA 0 "MK090250" +"MK_0200" "10" 3 1 1 0 0 NA 0 "MK100200" +"MK_0205" "10" 1 1 1 0 0 NA 0 "MK100205" +"MK_0206" "10" 2 1 1 0 0 NA 0 "MK100206" +"MK_0210" "10" 1.66666666666667 1 1 0 0 NA 0 "MK100210" +"MK_0213" "10" 2.5 1 1 0 0 NA 0 "MK100213" +"MK_0215" "10" 1 1 1 0 0 NA 0 "MK100215" +"MK_0219" "10" 3.66666666666667 1 1 0 0 NA 0 "MK100219" +"MK_0221" "10" 1 1 1 0 0 NA 0 "MK100221" +"MK_0230" "10" 1 1 1 0 0 NA 0 "MK100230" +"MK_0231" "10" 1.5 1 1 0 0 NA 0 "MK100231" +"MK_0234" "10" 1.5 1 1 0 0 NA 0 "MK100234" +"MK_0240" "10" 1.5 1 1 0 0 NA 0 "MK100240" +"MK_0249" "10" 1 1 1 0 0 NA 0 "MK100249" +"OU_0002" "09" 1 1 1 0 0 NA 0 "OU090002" +"OU_0005" "09" 1 1 1 0 0 NA 0 "OU090005" +"OU_0006" "09" 1 1 1 0 0 NA 0 "OU090006" +"OU_0020" "09" 1 1 1 0 0 NA 0 "OU090020" +"OU_0025" "09" 1 1 1 0 0 NA 0 "OU090025" +"OU_0061" "09" 1 1 1 0 0 NA 0 "OU090061" +"OU_0108" "09" 1 1 1 0 0 NA 0 "OU090108" +"OU_0116" "09" 2 1 1 0 0 NA 0 "OU090116" +"OU_0123" "09" 1.5 1 1 0 0 NA 0 "OU090123" +"OU_0L13" "09" 1.33333333333333 1 1 0 0 NA 0 "OU090L13" +"OU_0L14" "09" 2 1 1 0 0 NA 0 "OU090L14" +"OU_0L22" "09" 1 1 1 0 0 NA 0 "OU090L22" +"OU_0L51" "09" 1 1 1 0 0 NA 0 "OU090L51" +"OU_0L52" "09" 2 1 1 0 0 NA 0 "OU090L52" +"OU_0L82" "09" 1 1 1 0 0 NA 0 "OU090L82" +"OU_106C" "09" 2.33333333333333 1 1 0 0 NA 0 "OU09106C" +"OU_107C" "09" 3.66666666666667 1 1 0 0 NA 0 "OU09107C" +"OU_123B" "09" 1 1 1 0 0 NA 0 "OU09123B" +"OU_129B" "09" 1.66666666666667 2 0.68 0.32 0.500402423538188 0.721928094887362 0.194011720513331 "OU09129B" +"OU_L12R" "09" 2 1 1 0 0 NA 0 "OU09L12R" +"OU_L14R" "09" 1 1 1 0 0 NA 0 "OU09L14R" +"OU_L22R" "09" 2.33333333333333 1 1 0 0 NA 0 "OU09L22R" +"OU_L36R" "09" 3 1 1 0 0 NA 0 "OU09L36R" +"OU_L51R" "09" 1.66666666666667 1 1 0 0 NA 0 "OU09L51R" +"OU_L52R" "09" 1.5 1 1 0 0 NA 0 "OU09L52R" +"PA_0004" "17" 1 1 1 0 0 NA 0 "PA170004" +"PA_0005" "17" 1 1 1 0 0 NA 0 "PA170005" +"PA_0010" "17" 1 1 1 0 0 NA 0 "PA170010" +"PA_0011" "17" 1.33333333333333 1 1 0 0 NA 0 "PA170011" +"PA_0012" "17" 2 1 1 0 0 NA 0 "PA170012" +"PA_0013" "17" 1 1 1 0 0 NA 0 "PA170013" +"PA_0014" "17" 1.66666666666667 2 0.68 0.32 0.500402423538188 0.721928094887362 0.194011720513331 "PA170014" +"PA_0015" "17" 1 1 1 0 0 NA 0 "PA170015" +"PA_0016" "17" 2 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "PA170016" +"PA_0017" "17" 1 1 1 0 0 NA 0 "PA170017" +"PA_0018" "17" 1.5 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "PA170018" +"PA_0020" "17" 3 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "PA170020" +"PA_0022" "17" 1 1 1 0 0 NA 0 "PA170022" +"PA_0025" "17" 1 1 1 0 0 NA 0 "PA170025" +"PA_0027" "17" 1 1 1 0 0 NA 0 "PA170027" +"PA_0030" "17" 2 1 1 0 0 NA 0 "PA170030" +"PA_0039" "17" 1 1 1 0 0 NA 0 "PA170039" +"PA_0041" "17" 3 1 1 0 0 NA 0 "PA170041" +"PA_0042" "17" 1.66666666666667 1 1 0 0 NA 0 "PA170042" +"PA_0043" "17" 1.33333333333333 1 1 0 0 NA 0 "PA170043" +"PA_0044" "17" 1 1 1 0 0 NA 0 "PA170044" +"PA_0050" "17" 2.66666666666667 2 0.53125 0.46875 0.661563238157982 0.954434002924965 0.241895626852958 "PA170050" +"PA_0051" "17" 1 2 0.5 0.5 0.693147180559945 1 0.25 "PA170051" +"PA_0054" "17" 1 1 1 0 0 NA 0 "PA170054" +"PA_0055" "17" 2 2 0.5 0.5 0.693147180559945 1 0.25 "PA170055" +"PA_0056" "17" 4.66666666666667 2 0.755102040816326 0.244897959183674 0.410116318288409 0.591672778582327 0.162507688154577 "PA170056" +"PA_0057" "17" 10 2 0.935555555555555 0.0644444444444447 0.146144746008564 0.210842300318532 0.055682102748663 "PA170057" +"PA_0058" "17" 18 1 1 0 0 NA 0 "PA170058" +"PA_0059" "17" 1 1 1 0 0 NA 0 "PA170059" +"PA_0060" "17" 6 2 0.802469135802469 0.197530864197531 0.348832095843032 0.503258334775646 0.139360311832599 "PA170060" +"PA_0066" "17" 2 1 1 0 0 NA 0 "PA170066" +"PA_0068" "17" 1 1 1 0 0 NA 0 "PA170068" +"PA_0074" "17" 1 1 1 0 0 NA 0 "PA170074" +"PA_0079" "17" 1 1 1 0 0 NA 0 "PA170079" +"PA_0080" "17" 6.66666666666667 2 0.745 0.255 0.422709087805991 0.6098403047164 0.167093653955113 "PA170080" +"PA_0081" "17" 3 2 0.722222222222222 0.277777777777778 0.450561208866305 0.650022421648354 0.177019558178641 "PA170081" +"PA_0083" "17" 1 1 1 0 0 NA 0 "PA170083" +"PA_0084" "17" 2.33333333333333 1 1 0 0 NA 0 "PA170084" +"PA_0088" "17" 1.5 1 1 0 0 NA 0 "PA170088" +"PA_0091" "17" 1.66666666666667 2 0.68 0.32 0.500402423538188 0.721928094887362 0.194011720513331 "PA170091" +"PA_0093" "17" 1.5 2 0.555555555555556 0.444444444444444 0.636514168294813 0.918295834054489 0.235170526217511 "PA170093" +"PA_0094" "17" 3 1 1 0 0 NA 0 "PA170094" +"PA_0100" "17" 1 1 1 0 0 NA 0 "PA170100" +"PE_0007" "14" 1 1 1 0 0 NA 0 "PE140007" +"PE_0025" "14" 1 1 1 0 0 NA 0 "PE140025" +"PE_0029" "14" 1 1 1 0 0 NA 0 "PE140029" +"PE_0031" "14" 1 1 1 0 0 NA 0 "PE140031" +"PE_0033" "14" 1 1 1 0 0 NA 0 "PE140033" +"PE_0035" "14" 2.66666666666667 2 0.78125 0.21875 0.376770161256437 0.543564443199596 0.150078631085047 "PE140035" +"PO_0001" "12" 1 1 1 0 0 NA 0 "PO120001" +"PO_0004" "12" 1.5 1 1 0 0 NA 0 "PO120004" +"PO_0007" "12" 2 1 1 0 0 NA 0 "PO120007" +"PO_0018" "12" 1 1 1 0 0 NA 0 "PO120018" +"PO_0028" "12" 2 1 1 0 0 NA 0 "PO120028" +"PO_0045" "12" 2.33333333333333 1 1 0 0 NA 0 "PO120045" +"PO_0048" "12" 1 1 1 0 0 NA 0 "PO120048" +"PO_0053" "12" 1 1 1 0 0 NA 0 "PO120053" +"PO_0066" "12" 1 1 1 0 0 NA 0 "PO120066" +"PO_0092" "12" 6.16666666666667 1 1 0 0 NA 0 "PO120092" +"PO_0094" "12" 1 1 1 0 0 NA 0 "PO120094" +"PO_0096" "12" 2 1 1 0 0 NA 0 "PO120096" +"PO_0121" "12" 5 1 1 0 0 NA 0 "PO120121" +"PO_0134" "12" 1 1 1 0 0 NA 0 "PO120134" +"PO_0136" "12" 1 1 1 0 0 NA 0 "PO120136" +"PO_0200" "12" 2 1 1 0 0 NA 0 "PO120200" +"PO_0203" "12" 3.6 1 1 0 0 NA 0 "PO120203" +"PO_0205" "12" 1 1 1 0 0 NA 0 "PO120205" +"PO_0206" "12" 1.33333333333333 1 1 0 0 NA 0 "PO120206" +"PO_0233" "12" 2 1 1 0 0 NA 0 "PO120233" +"RD_0219" "07" 1 1 1 0 0 NA 0 "RD070219" +"RD_0230" "07" 1 1 1 0 0 NA 0 "RD070230" +"RD_0031" "08" 2 1 1 0 0 NA 0 "RD080031" +"RD_0103" "09" 1 1 1 0 0 NA 0 "RD090103" +"RD_0105" "09" 1 1 1 0 0 NA 0 "RD090105" +"RD_0108" "09" 1 1 1 0 0 NA 0 "RD090108" +"RD_0109" "09" 1 1 1 0 0 NA 0 "RD090109" +"RD_0107" "10" 1 1 1 0 0 NA 0 "RD100107" +"RL_0250" "07" 1 1 1 0 0 NA 0 "RL070250" +"RL_0145" "08" 1 1 1 0 0 NA 0 "RL080145" +"RL_0078" "09" 1.33333333333333 1 1 0 0 NA 0 "RL090078" +"RL_0089" "09" 2 1 1 0 0 NA 0 "RL090089" +"RL_0093" "09" 1 1 1 0 0 NA 0 "RL090093" +"RL_0066" "10" 1 1 1 0 0 NA 0 "RL100066" +"RL_0076" "10" 1.33333333333333 1 1 0 0 NA 0 "RL100076" +"RS_0169" "07" 2.33333333333333 1 1 0 0 NA 0 "RS070169" +"RS_0189" "07" 1 1 1 0 0 NA 0 "RS070189" +"SI_0078" "07" 1 1 1 0 0 NA 0 "SI070078" +"SI_0079" "07" 8.33333333333333 1 1 0 0 NA 0 "SI070079" +"SI_0080" "07" 2 1 1 0 0 NA 0 "SI070080" +"SI_0082" "07" 1 1 1 0 0 NA 0 "SI070082" +"SI_0197" "07" 1 1 1 0 0 NA 0 "SI070197" +"SI_0222" "07" 1 1 1 0 0 NA 0 "SI070222" +"SI_0194" "08" 1 1 1 0 0 NA 0 "SI080194" +"WA_0002" "14" 1 1 1 0 0 NA 0 "WA140002"
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/test-data/ObservationsSansszcl_cropped.tabular Tue Jul 21 06:00:10 2020 -0400 @@ -0,0 +1,2612 @@ +"observation.unit" "rotation" "species.code" "sexe" "taille" "size.class" "poids" "number" "min.distance" "Dmax" +"AS140155" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AS140081" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AS140087" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AS140092" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AS140097" 2 "Hemifasc" -999 -999 NA -999 2 5 -999 +"AS140155" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AS140156" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AS140156" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AS140159" 1 "Hemifasc" -999 -999 NA -999 2 5 -999 +"AS140159" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AS140088" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AS140088" 2 "Zebrscop" -999 -999 NA -999 23 5 -999 +"AS140088" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AS140048" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AS140048" 2 "Zebrscop" -999 -999 NA -999 13 5 -999 +"AS140048" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AS140060" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AS140060" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AS140061" 1 "Zebrscop" -999 -999 NA -999 26 5 -999 +"AS140061" 2 "Zebrscop" -999 -999 NA -999 26 5 -999 +"AS140061" 3 "Zebrscop" -999 -999 NA -999 28 5 -999 +"AS140054" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AS140054" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AS140059" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AS140059" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AS140059" 3 "Zebrscop" -999 -999 NA -999 13 5 -999 +"AS140070" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AS140081" 1 "Hemifasc" -999 -999 NA -999 2 5 -999 +"AS140081" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AS140081" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AS140087" 1 "Zebrscop" -999 -999 NA -999 13 5 -999 +"AS140087" 2 "Zebrscop" -999 -999 NA -999 23 5 -999 +"AS140087" 3 "Zebrscop" -999 -999 NA -999 13 5 -999 +"AS140092" 1 "Zebrscop" -999 -999 NA -999 23 5 -999 +"AS140092" 2 "Zebrscop" -999 -999 NA -999 13 5 -999 +"AS140092" 3 "Zebrscop" -999 -999 NA -999 26 5 -999 +"AS140092" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AS140094" 1 "Hemifasc" -999 -999 NA -999 2 5 -999 +"AS140097" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AS140157" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AS140157" 3 "Hemifasc" -999 -999 NA -999 2 5 -999 +"AS140079" 1 "Hemifasc" -999 -999 NA -999 2 5 -999 +"AS140079" 1 "Zebrscop" -999 -999 NA -999 13 5 -999 +"AS140079" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AS140060" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AS140060" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AS140061" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AS140061" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AS140059" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AS140156" 2 "Hemifasc" -999 -999 NA -999 1 8 -999 +"AS140156" 3 "Hemifasc" -999 -999 NA -999 1 8 -999 +"AS140159" 2 "Hemifasc" -999 -999 NA -999 1 9 -999 +"AS140048" 3 "Zebrscop" -999 -999 NA -999 1 8 -999 +"AS140054" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AS140059" 2 "Zebrscop" -999 -999 NA -999 1 8 -999 +"AS140059" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AS140081" 3 "Hemifasc" -999 -999 NA -999 1 8 -999 +"AS140087" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AS140092" 1 "Zebrscop" -999 -999 NA -999 1 8 -999 +"AS140092" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AS140157" 2 "Hemifasc" -999 -999 NA -999 1 6 -999 +"AS140079" 3 "Zebrscop" -999 -999 NA -999 2 6 -999 +"BE13S032" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BE13S032" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BE13S032" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BE13S050" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"BE13S050" 2 "Zebrscop" -999 -999 NA -999 4 5 -999 +"BE13S050" 3 "Zebrscop" -999 -999 NA -999 4 5 -999 +"BE13S050" 3 "Zebrscop" -999 -999 NA -999 4 5 -999 +"BE13S072" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P017" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120155" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120076" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120094" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120040" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120040" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120027" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120001" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120001" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P003" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P003" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P003" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL12P087" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P087" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120140" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BL120140" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120204" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120204" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120131" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120131" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120131" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120028" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120062" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120062" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120097" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120039" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P017" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL12P017" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P017" 3 "Zebrscop" -999 -999 NA -999 4 5 -999 +"BL120022" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120005" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120021" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120021" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120154" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120155" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120033" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120033" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BL120033" 3 "Zebrscop" -999 -999 NA -999 5 5 -999 +"BL120141" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BL120141" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BL120041" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120128" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120128" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120014" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120068" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"BL120068" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120068" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120091" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120161" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120024" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120137" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120137" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120137" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120090" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120090" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120085" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120085" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120076" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120076" 2 "Zebrscop" -999 -999 NA -999 6 5 -999 +"BL120076" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120076" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"BL120075" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120075" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BL120075" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BL120082" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"BL120082" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BL120093" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120011" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120011" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120094" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120094" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BL120094" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120040" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120040" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120051" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120051" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120027" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"BL120027" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120027" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P003" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P087" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P078" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P078" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BL12P077" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL12P077" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120062" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120016" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"BL12P017" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120022" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120133" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120014" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120091" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120136" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120136" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120009" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120090" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120085" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120085" 2 "Zebrscop" -999 -999 NA -999 4 5 -999 +"BL120085" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BL120075" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120082" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"BL120082" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120082" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL120011" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P124" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL12P124" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL120051" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BL12P078" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BL12P078" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BL12P017" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"BL120076" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"BL120075" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"BL120082" 1 "Zebrscop" -999 -999 NA -999 1 8 -999 +"BL120082" 3 "Zebrscop" -999 -999 NA -999 2 7 -999 +"BL120011" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"BL120011" 3 "Zebrscop" -999 -999 NA -999 4 6 -999 +"BL120040" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"BL120106" 1 "Zebrscop" -999 -999 NA -999 2 7 -999 +"BL120027" 2 "Zebrscop" -999 -999 NA -999 2 8 -999 +"BL120027" 3 "Zebrscop" -999 -999 NA -999 2 8 -999 +"BO120032" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120032" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120206" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120206" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120207" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120209" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120209" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120011" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BO120011" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120011" 3 "Zebrscop" -999 -999 NA -999 4 5 -999 +"BO120043" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120028" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BO120028" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120028" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120028" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"BO120029" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120026" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO12095B" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO12095B" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO12095B" 3 "Zebrscop" -999 -999 NA -999 4 5 -999 +"BO120056" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120212" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120212" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120212" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120054" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120054" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120054" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120215" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120215" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120215" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120045" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120014" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120014" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120014" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120095" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120032" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120209" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120028" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120028" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO12095B" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO12095B" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO12095B" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120056" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120056" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120056" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120055" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120212" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120054" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120214" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120214" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120214" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120215" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120215" 2 "Zebrscop" -999 -999 NA -999 5 5 -999 +"BO120216" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120045" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120014" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120055" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120213" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120213" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120099" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"BO120099" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"BO120212" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"BO120099" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"BO120014" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"BO120095" 1 "Zebrscop" -999 -999 NA -999 2 7 -999 +"BO120095" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"BO120095" 3 "Zebrscop" -999 -999 NA -999 2 6 -999 +"BO120007" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"BO120007" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"BO120055" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"BO120213" 3 "Zebrscop" -999 -999 NA -999 2 6 -999 +"BO120215" 2 "Zebrscop" -999 -999 NA -999 5 7 -999 +"CH13S099" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P040" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P040" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P040" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13P032" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P033" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P033" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13S131" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13S131" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P066" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13P066" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CH13P066" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13P066" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13P066" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CH13P068" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P068" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13P068" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13S192" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P041" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P059" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CH13S149" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P056" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P057" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P066" 1 "Zebrscop" -999 -999 NA -999 20 5 -999 +"CH13P066" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CH13P066" 2 "Zebrscop" -999 -999 NA -999 20 5 -999 +"CH13P066" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CH13P066" 3 "Zebrscop" -999 -999 NA -999 20 5 -999 +"CH13P066" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CH13P068" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P068" 2 "Zebrscop" -999 -999 NA -999 4 5 -999 +"CH13P068" 3 "Zebrscop" -999 -999 NA -999 4 5 -999 +"CH13P061" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P061" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CH13P061" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P071" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13P071" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P071" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13P037" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P037" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P037" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13P037" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CH13P055" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"CH13P055" 2 "Zebrscop" -999 -999 NA -999 6 5 -999 +"CH13P055" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CH13P063" 2 "Hemifasc" -999 -999 NA -999 2 5 -999 +"CH13S192" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"CH13S192" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13S192" 3 "Zebrscop" -999 -999 NA -999 6 5 -999 +"CH13P041" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P041" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P059" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P059" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P059" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13P059" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P059" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13S095" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13S148" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13S151" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13S153" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CH13S156" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CH13S156" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13S156" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13S156" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P061" 1 "Zebrscop" -999 -999 NA -999 12 5 -999 +"CH13P034" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CH13P068" 2 "Zebrscop" -999 -999 NA -999 3 8 -999 +"CH13P068" 3 "Zebrscop" -999 -999 NA -999 3 8 -999 +"CH13P041" 2 "Zebrscop" -999 -999 NA -999 2 10 -999 +"CH13P041" 3 "Zebrscop" -999 -999 NA -999 2 10 -999 +"CH13P059" 1 "Hemifasc" -999 -999 NA -999 1 6 -999 +"CH13S160" 1 "Hemifasc" -999 -999 NA -999 1 6 -999 +"CH13S160" 2 "Hemifasc" -999 -999 NA -999 1 7 -999 +"CH13S160" 2 "Hemifasc" -999 -999 NA -999 1 6 -999 +"CH13S160" 2 "Hemifasc" -999 -999 NA -999 1 6 -999 +"CH13S160" 3 "Hemifasc" -999 -999 NA -999 1 7 -999 +"CH13P040" 2 "Zebrscop" -999 -999 NA -999 2 10 -999 +"CH13P068" 2 "Zebrscop" -999 -999 NA -999 3 8 -999 +"CH13P068" 3 "Zebrscop" -999 -999 NA -999 3 8 -999 +"CH13P063" 1 "Hemifasc" -999 -999 NA -999 1 10 -999 +"CH13S192" 1 "Zebrscop" -999 -999 NA -999 4 10 -999 +"CH13S192" 2 "Zebrscop" -999 -999 NA -999 2 8 -999 +"CH13S192" 3 "Zebrscop" -999 -999 NA -999 1 10 -999 +"CH13P041" 2 "Zebrscop" -999 -999 NA -999 1 10 -999 +"CH13P041" 3 "Zebrscop" -999 -999 NA -999 1 10 -999 +"CS130011" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130115" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130137" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130951" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130403" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130141" 1 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"CS130141" 2 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"CS130141" 2 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"CS130141" 3 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"CS130141" 3 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"CS130141" 3 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"CS130035" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130033" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130315" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130101" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130904" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130904" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130904" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130092" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130092" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130092" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130316" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130031" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130317" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130317" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130094" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130094" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130094" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130025" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130025" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130920" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130021" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130021" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130021" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130318" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130308" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130308" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130304" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130305" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130305" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130037" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130037" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130075" 1 "Zebrscop" -999 -999 NA -999 11 5 -999 +"CS130075" 2 "Zebrscop" -999 -999 NA -999 11 5 -999 +"CS130075" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130065" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130027" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130027" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130100" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130100" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130100" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130023" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130023" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130023" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130108" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130108" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130108" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130133" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130133" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130133" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130133" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130044" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130044" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130044" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130044" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130044" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130011" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130011" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130011" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130011" 1 "Zebrscop" -999 -999 NA -999 7 5 -999 +"CS130011" 2 "Zebrscop" -999 -999 NA -999 6 5 -999 +"CS130011" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130011" 3 "Zebrscop" -999 -999 NA -999 5 5 -999 +"CS130011" 3 "Zebrscop" -999 -999 NA -999 4 5 -999 +"CS130953" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130953" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130060" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130125" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"CS130125" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130125" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130125" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130125" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130125" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130077" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130077" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130131" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130131" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130131" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130131" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS13Z104" 1 "Zebrscop" -999 -999 NA -999 1.5 5 -999 +"CS13Z104" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS13Z104" 2 "Zebrscop" -999 -999 NA -999 9 5 -999 +"CS13Z104" 3 "Zebrscop" -999 -999 NA -999 1.5 5 -999 +"CS13Z104" 3 "Zebrscop" -999 -999 NA -999 7.5 5 -999 +"CS130070" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130070" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130070" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130047" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130047" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130047" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130079" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130116" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130116" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130116" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130043" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130043" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130082" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130109" 1 "Zebrscop" -999 -999 NA -999 2.4 5 -999 +"CS130109" 2 "Zebrscop" -999 -999 NA -999 2.4 5 -999 +"CS130142" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130142" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130142" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130142" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130129" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130140" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130140" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130140" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130140" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130140" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130140" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130404" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130115" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130115" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130015" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130137" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130137" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130137" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130137" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130137" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130951" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130951" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130951" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130146" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130146" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130146" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130083" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130130" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130130" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130130" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"CS130130" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130130" 2 "Zebrscop" -999 -999 NA -999 5 5 -999 +"CS130130" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130130" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130130" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS13Z106" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS13Z106" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS13Z106" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS13Z106" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130018" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"CS130018" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130018" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130135" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130042" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130126" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130126" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130926" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130926" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130926" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130950" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130950" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130950" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130950" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130950" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130950" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130950" 3 "Zebrscop" -999 -999 NA -999 7 5 -999 +"CS130950" 3 "Zebrscop" -999 -999 NA -999 5 5 -999 +"CS130144" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130144" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130143" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130143" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130143" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130143" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130143" 2 "Zebrscop" -999 -999 NA -999 4 5 -999 +"CS130143" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130143" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130071" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130071" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130071" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130403" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130403" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130403" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130403" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130403" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130081" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130081" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130081" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130081" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130081" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130081" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130045" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130045" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130922" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130922" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130922" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130921" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130921" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130924" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130141" 1 "Zebrscop" -999 -999 NA -999 2.4 5 -999 +"CS130141" 1 "Zebrscop" -999 -999 NA -999 2.4 5 -999 +"CS130141" 2 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"CS130141" 2 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"CS130141" 2 "Zebrscop" -999 -999 NA -999 3.6 5 -999 +"CS130141" 3 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"CS130141" 3 "Zebrscop" -999 -999 NA -999 2.4 5 -999 +"CS130141" 3 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"CS130141" 3 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"CS130405" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130085" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130035" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130035" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130035" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130904" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130904" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130316" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130317" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130317" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130318" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130318" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130318" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130037" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130075" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130075" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130064" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130064" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130310" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130900" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130027" 1 "Zebrscop" -999 -999 NA -999 6 5 -999 +"CS130027" 2 "Zebrscop" -999 -999 NA -999 7 5 -999 +"CS130027" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130100" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130100" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130307" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130307" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130314" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130314" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130314" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130019" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130011" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130011" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130953" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130953" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS13Z104" 2 "Zebrscop" -999 -999 NA -999 16.5 5 -999 +"CS130070" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130070" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130070" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130079" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130079" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130079" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130116" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130082" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130142" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130007" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130007" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130129" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130404" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130404" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130404" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130404" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130404" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130069" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130069" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130069" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130069" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130069" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS13Z106" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS13Z106" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130145" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130950" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130950" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130950" 2 "Zebrscop" -999 -999 NA -999 5 5 -999 +"CS130143" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130143" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130143" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130071" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130403" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130081" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130104" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130316" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130318" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130098" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130039" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130039" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130027" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"CS130027" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"CS130100" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"CS130314" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130314" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"CS130092" 2 "Hemifasc" -999 -999 NA -999 1 7 -999 +"CS130031" 3 "Zebrscop" -999 -999 NA -999 1 8 -999 +"CS130098" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"CS130098" 2 "Zebrscop" -999 -999 NA -999 2 8 -999 +"CS130098" 3 "Zebrscop" -999 -999 NA -999 2 7 -999 +"CS130309" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"CS130064" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"CS130065" 1 "Hemifasc" -999 -999 NA -999 1 7 -999 +"CS130060" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"CS130043" 1 "Zebrscop" -999 -999 NA -999 2 6 -999 +"CS130043" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"CS130054" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"CS130140" 1 "Zebrscop" -999 -999 NA -999 2 6 -999 +"CS130140" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"CS130069" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"CS130952" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"CS130950" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"CS130950" 3 "Zebrscop" -999 -999 NA -999 3 8 -999 +"CS130403" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"CS130407" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"CS130407" 2 "Zebrscop" -999 -999 NA -999 2 6 -999 +"CS130407" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"CS130095" 1 "Zebrscop" -999 -999 NA -999 1 3 -999 +"CS130904" 3 "Zebrscop" -999 -999 NA -999 1 8 -999 +"CS130316" 1 "Zebrscop" -999 -999 NA -999 2 7 -999 +"CS130037" 2 "Hemifasc" -999 -999 NA -999 1 7 -999 +"CS130027" 2 "Zebrscop" -999 -999 NA -999 3 7 -999 +"CS130314" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"CS130044" 1 "Hemifasc" -999 -999 NA -999 1 6 -999 +"CS130070" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"CS130082" 2 "Zebrscop" -999 -999 NA -999 2 6 -999 +"CS130082" 3 "Zebrscop" -999 -999 NA -999 2 6 -999 +"CS130950" 2 "Zebrscop" -999 -999 NA -999 4 6 -999 +"CS130950" 3 "Zebrscop" -999 -999 NA -999 5 8 -999 +"CS130403" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"CS130403" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"CS130318" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"CS130318" 1 "Zebrscop" -999 -999 NA -999 2 10 -999 +"CS130318" 2 "Zebrscop" -999 -999 NA -999 2 10 -999 +"CS130318" 3 "Zebrscop" -999 -999 NA -999 1 10 -999 +"CS130098" 1 "Zebrscop" -999 -999 NA -999 8 6 -999 +"CS130314" 1 "Zebrscop" -999 -999 NA -999 1 9 -999 +"GN130058" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130007" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130060" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130018" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130018" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130190" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130121" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130224" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130192" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130192" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130223" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130223" 1 "Hemifasc" -999 -999 NA -999 3 5 -999 +"GN130223" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130223" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130223" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130185" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130069" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130069" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130069" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130105" 2 "Abalstel" -999 -999 NA -999 1 5 -999 +"GN130114" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130030" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130030" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130030" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130095" 1 "Abalstel" -999 -999 NA -999 1 5 -999 +"GN130142" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130181" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130181" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130181" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130181" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130035" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130091" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130091" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130091" 3 "Zebrscop" -999 -999 NA -999 10 5 -999 +"GN130092" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130209" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130209" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130163" 1 "Zebrscop" -999 -999 NA -999 10 5 -999 +"GN130163" 2 "Zebrscop" -999 -999 NA -999 14 5 -999 +"GN130163" 3 "Zebrscop" -999 -999 NA -999 10 5 -999 +"GN130512" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130512" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130513" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130108" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130164" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130164" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130164" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130139" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130139" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130066" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130066" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130047" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130047" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130152" 1 "Zebrscop" -999 -999 NA -999 14 5 -999 +"GN130152" 2 "Zebrscop" -999 -999 NA -999 16 5 -999 +"GN130152" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130131" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130132" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130132" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130132" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130135" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130179" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130058" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130007" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130060" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130018" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130018" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130190" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130121" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130224" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130192" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130192" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130223" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130223" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130223" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130223" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130223" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130185" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130069" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130069" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130069" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130105" 2 "Abalstel" -999 -999 NA -999 1 5 -999 +"GN130114" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130030" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130030" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130030" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130095" 1 "Abalstel" -999 -999 NA -999 1 5 -999 +"GN130142" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130181" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130181" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130181" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130181" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130035" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130091" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130091" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130091" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130092" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130209" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130209" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130163" 1 "Zebrscop" -999 -999 NA -999 12 5 -999 +"GN130163" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130163" 3 "Zebrscop" -999 -999 NA -999 36 5 -999 +"GN130512" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130512" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130513" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130108" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130164" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130164" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130164" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130139" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130139" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130066" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130066" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130047" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130047" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130152" 1 "Zebrscop" -999 -999 NA -999 12 5 -999 +"GN130152" 2 "Zebrscop" -999 -999 NA -999 19 5 -999 +"GN130152" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130131" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130132" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130132" 2 "Hemifasc" -999 -999 NA -999 12 5 -999 +"GN130132" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130135" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130179" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130058" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130007" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130060" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130018" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130018" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130190" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130121" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130224" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130192" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130192" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130223" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130223" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130223" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130223" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130223" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130185" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130069" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130069" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130069" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130105" 2 "Abalstel" -999 -999 NA -999 1 5 -999 +"GN130114" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130030" 1 "Zebrscop" -999 -999 NA -999 18 5 -999 +"GN130030" 2 "Zebrscop" -999 -999 NA -999 18 5 -999 +"GN130030" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130095" 1 "Abalstel" -999 -999 NA -999 1 5 -999 +"GN130142" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130181" 1 "Zebrscop" -999 -999 NA -999 28 5 -999 +"GN130181" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130181" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130181" 3 "Zebrscop" -999 -999 NA -999 18 5 -999 +"GN130035" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130091" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130091" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130091" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130092" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130209" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130209" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130163" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130163" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130163" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130512" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130512" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130513" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130108" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130164" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130164" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130164" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130139" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130139" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130066" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130066" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130047" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130047" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130152" 1 "Zebrscop" -999 -999 NA -999 18 5 -999 +"GN130152" 2 "Zebrscop" -999 -999 NA -999 18 5 -999 +"GN130152" 3 "Zebrscop" -999 -999 NA -999 18 5 -999 +"GN130131" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130132" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130132" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130132" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130135" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130179" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130058" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130007" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130060" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130018" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130018" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130190" 3 "Zebrscop" -999 -999 NA -999 2 3 -999 +"GN130121" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130224" 2 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130192" 1 "Zebrscop" -999 -999 NA -999 6 4 -999 +"GN130192" 3 "Zebrscop" -999 -999 NA -999 2 4 -999 +"GN130223" 1 "Zebrscop" -999 -999 NA -999 2 3 -999 +"GN130223" 1 "Hemifasc" -999 -999 NA -999 1 3 -999 +"GN130223" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130223" 2 "Zebrscop" -999 -999 NA -999 7 4 -999 +"GN130223" 3 "Zebrscop" -999 -999 NA -999 2 4 -999 +"GN130185" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130069" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130069" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130069" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130105" 2 "Abalstel" -999 -999 NA -999 1 3 -999 +"GN130114" 2 "Zebrscop" -999 -999 NA -999 2 3 -999 +"GN130148" 1 "Zebrscop" -999 -999 NA -999 6 2 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 9 2 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 6 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 7 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 2 2 -999 +"GN130030" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130030" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130030" 3 "Zebrscop" -999 -999 NA -999 1 3 -999 +"GN130095" 1 "Abalstel" -999 -999 NA -999 1 3 -999 +"GN130142" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"GN130181" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"GN130181" 1 "Hemifasc" -999 -999 NA -999 2 4 -999 +"GN130181" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130181" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130035" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130091" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130091" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130091" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130092" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130209" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130209" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130163" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130163" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130163" 3 "Zebrscop" -999 -999 NA -999 6 5 -999 +"GN130512" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130512" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130513" 3 "Zebrscop" -999 -999 NA -999 2 3 -999 +"GN130108" 1 "Hemifasc" -999 -999 NA -999 1 4 -999 +"GN130164" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130164" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130164" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130139" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130139" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130066" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"GN130066" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"GN130047" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130047" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130152" 1 "Zebrscop" -999 -999 NA -999 2 4 -999 +"GN130152" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130152" 3 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130131" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130132" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130132" 2 "Hemifasc" -999 -999 NA -999 1 1 -999 +"GN130132" 3 "Zebrscop" -999 -999 NA -999 1 3 -999 +"GN130135" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130179" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130058" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130007" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130060" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130018" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130018" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130190" 3 "Zebrscop" -999 -999 NA -999 1 3 -999 +"GN130121" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130224" 2 "Zebrscop" -999 -999 NA -999 3 4 -999 +"GN130192" 1 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130192" 3 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130223" 1 "Zebrscop" -999 -999 NA -999 3 3 -999 +"GN130223" 1 "Hemifasc" -999 -999 NA -999 3 3 -999 +"GN130223" 2 "Hemifasc" -999 -999 NA -999 3 5 -999 +"GN130223" 2 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130223" 3 "Zebrscop" -999 -999 NA -999 3 4 -999 +"GN130185" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130069" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130069" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130069" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130105" 2 "Abalstel" -999 -999 NA -999 1 3 -999 +"GN130114" 2 "Zebrscop" -999 -999 NA -999 1 3 -999 +"GN130148" 1 "Zebrscop" -999 -999 NA -999 1 2 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 1 2 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 12 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 12 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 1 2 -999 +"GN130030" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130030" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130030" 3 "Zebrscop" -999 -999 NA -999 1 3 -999 +"GN130095" 1 "Abalstel" -999 -999 NA -999 1 3 -999 +"GN130142" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130181" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130181" 1 "Hemifasc" -999 -999 NA -999 1 4 -999 +"GN130181" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130181" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130035" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130091" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130091" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130091" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130092" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130209" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130209" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130163" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130163" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130163" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130512" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130512" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130513" 3 "Zebrscop" -999 -999 NA -999 1 3 -999 +"GN130108" 1 "Hemifasc" -999 -999 NA -999 3 4 -999 +"GN130164" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130164" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130164" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130139" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130139" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130066" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130066" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130047" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130047" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130152" 1 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130152" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130152" 3 "Zebrscop" -999 -999 NA -999 12 4 -999 +"GN130131" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130132" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130132" 2 "Hemifasc" -999 -999 NA -999 1 1 -999 +"GN130132" 3 "Zebrscop" -999 -999 NA -999 3 3 -999 +"GN130135" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130179" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130058" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130007" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130060" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130018" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130018" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130190" 3 "Zebrscop" -999 -999 NA -999 1 3 -999 +"GN130121" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130224" 2 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130192" 1 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130192" 3 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130223" 1 "Zebrscop" -999 -999 NA -999 1 3 -999 +"GN130223" 1 "Hemifasc" -999 -999 NA -999 1 3 -999 +"GN130223" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"GN130223" 2 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130223" 3 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130185" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130069" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130069" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130069" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130105" 2 "Abalstel" -999 -999 NA -999 3 3 -999 +"GN130114" 2 "Zebrscop" -999 -999 NA -999 1 3 -999 +"GN130148" 1 "Zebrscop" -999 -999 NA -999 1 2 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 1 2 -999 +"GN130148" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130148" 3 "Zebrscop" -999 -999 NA -999 1 2 -999 +"GN130030" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130030" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130030" 3 "Zebrscop" -999 -999 NA -999 3 3 -999 +"GN130095" 1 "Abalstel" -999 -999 NA -999 3 3 -999 +"GN130142" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130181" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130181" 1 "Hemifasc" -999 -999 NA -999 1 4 -999 +"GN130181" 2 "Zebrscop" -999 -999 NA -999 9 5 -999 +"GN130181" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130035" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130091" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130091" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130091" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130092" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130209" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130209" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130163" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"GN130163" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130163" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130512" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130512" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130513" 3 "Zebrscop" -999 -999 NA -999 1 3 -999 +"GN130108" 1 "Hemifasc" -999 -999 NA -999 1 4 -999 +"GN130164" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130164" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130164" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130139" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130139" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130066" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130066" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"GN130047" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130047" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130152" 1 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130152" 2 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130152" 3 "Zebrscop" -999 -999 NA -999 1 4 -999 +"GN130131" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130132" 1 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130132" 2 "Hemifasc" -999 -999 NA -999 1 1 -999 +"GN130132" 3 "Zebrscop" -999 -999 NA -999 1 3 -999 +"GN130135" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"GN130179" 3 "Zebrscop" -999 -999 NA -999 1 1 -999 +"SI070079" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"SI070079" 2 "Zebrscop" -999 -999 NA -999 6 5 -999 +"SI070079" 3 "Zebrscop" -999 -999 NA -999 10 5 -999 +"SI070080" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LA08101B" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LA08101B" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LA08101B" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK080425" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK080425" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK080427" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK080453" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK080453" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK080454" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK090225" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK090225" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK090225" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK090227" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"MK090227" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK090234" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK090248" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK090248" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK090249" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LA100028" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LA100039" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LA100039" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LA100039" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK100205" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK100210" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK100210" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK100213" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"MK100213" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK100215" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK100215" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK100219" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"MK100219" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK100230" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK100231" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK100231" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK100234" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK100234" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK100249" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK100249" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RD100107" 3 "Abalstel" -999 -999 NA -999 1 5 -999 +"RL100076" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RL100076" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RL100076" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"RS070169" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"RS070169" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"RS070169" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"RS070189" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RS070189" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"SI070078" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"SI070079" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"SI070079" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"SI070080" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"LA08101B" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK080425" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK080425" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK080425" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK080427" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK080427" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK080462" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK080462" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK090207" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK090207" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK090207" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK090208" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK090208" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK090231" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RD090103" 1 "Abalstel" -999 -999 NA -999 1 5 -999 +"RD090105" 2 "Abalstel" -999 -999 NA -999 1 5 -999 +"RD090108" 3 "Abalstel" -999 -999 NA -999 1 5 -999 +"RD090109" 1 "Abalstel" -999 -999 NA -999 1 5 -999 +"RL090078" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RL090078" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RL090078" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RL090078" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RL090089" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RL090089" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK100219" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"RD070219" 2 "Abalstel" -999 -999 NA -999 1 5 -999 +"RD070219" 3 "Abalstel" -999 -999 NA -999 1 5 -999 +"RD070230" 1 "Abalstel" -999 -999 NA -999 1 5 -999 +"RL070250" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"SI070082" 3 "Abalstel" -999 -999 NA -999 1 5 -999 +"SI070222" 2 "Abalstel" -999 -999 NA -999 1 5 -999 +"LA08101B" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"MK080427" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK080427" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RL080145" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"RL080145" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"SI080194" 2 "Abalstel" -999 -999 NA -999 1 5 -999 +"MK090211" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK090211" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK090211" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"MK100219" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"MK100240" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"RL100066" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LA08101B" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"MK080426" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK080440" 1 "Zebrscop" -999 -999 NA -999 2 7 -999 +"MK080440" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK080440" 3 "Zebrscop" -999 -999 NA -999 2 7 -999 +"MK080454" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK090227" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK090228" 1 "Zebrscop" -999 -999 NA -999 2 7 -999 +"MK090228" 2 "Zebrscop" -999 -999 NA -999 5 7 -999 +"MK090250" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK100200" 2 "Zebrscop" -999 -999 NA -999 4 7 -999 +"MK100200" 3 "Zebrscop" -999 -999 NA -999 2 7 -999 +"MK100210" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK100215" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK100219" 1 "Zebrscop" -999 -999 NA -999 2 7 -999 +"MK100219" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK100221" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK100240" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK080430" 3 "Zebrscop" -999 -999 NA -999 2 7 -999 +"MK080458" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"RD080031" 1 "Abalstel" -999 -999 NA -999 2 10 -999 +"MK090207" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK090208" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"RL090089" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"RL090093" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"LA100012" 2 "Zebrscop" -999 -999 NA -999 2 6 -999 +"MK100206" 2 "Zebrscop" -999 -999 NA -999 2 7 -999 +"SI070197" 1 "Abalstel" -999 -999 NA -999 1 7 -999 +"SI080194" 3 "Abalstel" -999 -999 NA -999 1 6 -999 +"RL090093" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"MK100230" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"HI120016" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120016" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120016" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120018" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120023" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120023" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120023" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120024" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120024" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120024" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120024" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120024" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120024" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120025" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"HI120026" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120042" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120099" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120171" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120172" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120173" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120173" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120173" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120175" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"HI120175" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120175" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120175" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120175" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120204" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120001" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120016" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"HI120016" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120016" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120018" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120026" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120030" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120030" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120030" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120030" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120046" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120046" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120058" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120060" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120156" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120156" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120156" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120156" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120156" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120205" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"HI120211" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"HI120025" 3 "Hemifasc" -999 -999 NA -999 1 6 -999 +"HI120029" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"HI120099" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HI120149" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HI120171" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"HI120175" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HI120001" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HI120001" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HI120002" 2 "Hemifasc" -999 -999 NA -999 1 6 -999 +"HI120018" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HI120026" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HI120046" 2 "Zebrscop" -999 -999 NA -999 2 7 -999 +"HI120046" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"HI120058" 1 "Zebrscop" -999 -999 NA -999 2 7 -999 +"HI120070" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"HI120086" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HI120099" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HI120099" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HI120171" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HI120173" 1 "Zebrscop" -999 -999 NA -999 1 8 -999 +"HI120173" 2 "Zebrscop" -999 -999 NA -999 1 8 -999 +"HI120201" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"HI120210" 3 "Hemifasc" -999 -999 NA -999 1 7 -999 +"KO130035" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130205" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"KO130205" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"KO130205" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130070" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130208" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130208" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130208" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130305" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO070156" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO070156" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO080183" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO080183" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"KO080033" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO080033" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO080033" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130041" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130013" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130013" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130013" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130089" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130005" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130035" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130035" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130031" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130031" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130031" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130031" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130031" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"KO130031" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130204" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130205" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130205" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"KO130205" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130113" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130203" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130203" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130203" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130112" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130112" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130108" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130108" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130108" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130108" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130108" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130098" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130110" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130110" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130120" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130133" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130209" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130148" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130148" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130147" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130138" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130138" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130138" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130138" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"KO130138" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130138" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130138" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130305" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130305" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130129" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130304" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130139" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130139" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130130" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130130" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130130" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130154" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130177" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130177" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130177" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130176" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130176" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130176" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130176" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130176" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130174" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO080022" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO080024" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130041" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130010" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130013" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO13059b" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO13059b" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130035" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130031" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130202" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130202" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130099" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130099" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130099" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130101" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130101" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"KO130101" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130113" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130112" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130112" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130071" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"KO130059" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130059" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130301" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"KO130301" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130108" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130302" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130110" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130110" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"KO130110" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130110" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130138" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130138" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130138" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"KO130305" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130131" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130139" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130130" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130130" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130165" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130176" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"KO130031" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"KO130205" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"KO080024" 3 "Zebrscop" -999 -999 NA -999 2 6 -999 +"KO080183" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"KO130003" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"KO130035" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"KO130053" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"KO130031" 1 "Zebrscop" -999 -999 NA -999 1 9 -999 +"KO130031" 2 "Zebrscop" -999 -999 NA -999 3 7 -999 +"KO130031" 3 "Zebrscop" -999 -999 NA -999 2 7 -999 +"KO130113" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"KO130059" 2 "Zebrscop" -999 -999 NA -999 1 8 -999 +"KO130059" 3 "Zebrscop" -999 -999 NA -999 1 9 -999 +"KO130132" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"KO130147" 3 "Zebrscop" -999 -999 NA -999 2 6 -999 +"KO130130" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"KO130165" 3 "Zebrscop" -999 -999 NA -999 1 8 -999 +"KO130160" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"KO13059b" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"KO130070" 2 "Hemifasc" -999 -999 NA -999 1 6 -999 +"KO130301" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"KO130097" 1 "Zebrscop" -999 -999 NA -999 2 6 -999 +"KO130097" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"KO130098" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"KO130098" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"KO130302" 1 "Hemifasc" -999 -999 NA -999 1 6 -999 +"KO130302" 2 "Hemifasc" -999 -999 NA -999 1 7 -999 +"KO130133" 3 "Hemifasc" -999 -999 NA -999 1 6 -999 +"KO130138" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"KO130131" 2 "Zebrscop" -999 -999 NA -999 1 8 -999 +"KO130131" 3 "Zebrscop" -999 -999 NA -999 1 8 -999 +"KO130165" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"KO130165" 2 "Zebrscop" -999 -999 NA -999 1 8 -999 +"LI140086" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140086" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140086" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140022" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140022" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140022" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"LI140089" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140089" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140089" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"LI140096" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140096" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140094" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140067" 3 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"LI140102" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140102" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140103" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"LI140103" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"LI140103" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140103" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"LI140103" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140401" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140401" 2 "Zebrscop" -999 -999 NA -999 4 5 -999 +"LI140401" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140104" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140104" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140033" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140033" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140111" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"LI140111" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140111" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"LI140111" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"LI140152" 3 "Hemifasc" -999 -999 NA -999 1.2 5 -999 +"LI140151" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"LI140150" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140121" 2 "Zebrscop" -999 -999 NA -999 1.25 5 -999 +"LI140121" 3 "Zebrscop" -999 -999 NA -999 1.25 5 -999 +"LI140021" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140021" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140089" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140089" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140110" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140096" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140096" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140094" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140100" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140102" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140102" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140035" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140103" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140103" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140103" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140113" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140104" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140307" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140081" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"LI140081" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140083" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140152" 1 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"LI140152" 3 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"LI140082" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140021" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140129" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140129" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"LI140096" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"LI140096" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"LI140100" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140067" 3 "Hemifasc" -999 -999 NA -999 1.2 5 -999 +"LI140102" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"LI140102" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140305" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140103" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140113" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140113" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140401" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140401" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140401" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140104" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140122" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140081" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140081" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140081" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140083" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"LI140083" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"LI140033" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140152" 1 "Zebrscop" -999 -999 NA -999 2.4 5 -999 +"LI140152" 2 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"LI140152" 3 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"LI140151" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140150" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140150" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"LI140022" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"LI140089" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"LI140102" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"LI140077" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"LI140073" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"LI140083" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"LI140028" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"LI140129" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"LI140149" 2 "Hemifasc" -999 -999 NA -999 1 7 -999 +"LI140149" 3 "Hemifasc" -999 -999 NA -999 1 7 -999 +"LI140093" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"LI140096" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"LI140100" 3 "Zebrscop" -999 -999 NA -999 2 8 -999 +"LI140102" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"LI140064" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"LI140305" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"LI140077" 1 "Hemifasc" -999 -999 NA -999 1 7 -999 +"LI140073" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"LI140081" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"LI140129" 2 "Hemifasc" -999 -999 NA -999 1 9 -999 +"LI140102" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"LI140114" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"LI140114" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"LI140113" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"LI140083" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"LI140033" 1 "Zebrscop" -999 -999 NA -999 2 6 -999 +"LI140028" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"HU140035" 3 "Zebrscop" -999 -999 NA -999 4 5 -999 +"HU140031" 3 "Zebrscop" -999 -999 NA -999 2 10 -999 +"HU140035" 1 "Zebrscop" -999 -999 NA -999 4 8 -999 +"HU140035" 2 "Zebrscop" -999 -999 NA -999 4 8 -999 +"ME130400" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130105" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130105" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130105" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130105" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130116" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130120" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130120" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130208" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130117" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130209" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130049" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130049" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130154" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME1300F3" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME1300F3" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130265" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130252" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130262" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130262" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130262" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130273" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130266" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130266" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130266" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130266" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130266" 3 "Zebrscop" -999 -999 NA -999 4 5 -999 +"ME130266" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130260" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130260" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130260" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130241" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130053" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130053" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130053" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130053" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130126" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130126" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130126" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130073" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130073" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130129" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130400" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130400" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130074" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130074" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130074" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130074" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130135" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130213" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130004" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130004" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130004" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130210" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130210" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130210" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130101" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130101" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130108" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130108" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130105" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130105" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130105" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130105" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130089" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130089" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130089" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130124" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130124" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130124" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130066" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130066" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130066" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130066" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130066" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130116" 1 "Zebrscop" -999 -999 NA -999 5 5 -999 +"ME130116" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130116" 2 "Zebrscop" -999 -999 NA -999 4 5 -999 +"ME130116" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130116" 3 "Zebrscop" -999 -999 NA -999 7 5 -999 +"ME130116" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130116" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130137" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME130137" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130137" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130137" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130137" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130090" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130090" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130207" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130120" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130208" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130208" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130117" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"ME130117" 1 "Zebrscop" -999 -999 NA -999 5 5 -999 +"ME130117" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130117" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130117" 2 "Zebrscop" -999 -999 NA -999 7 5 -999 +"ME130117" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130117" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130117" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130215" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130215" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME1347PM" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME1347PM" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME1347PM" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130099" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130099" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130099" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130099" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130099" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130209" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130209" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME130209" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130034" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"ME130022" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130022" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130022" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130050" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130050" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130075" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130075" 1 "Zebrscop" -999 -999 NA -999 5 5 -999 +"ME130075" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130075" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130075" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130075" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130075" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130075" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130075" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130046" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130046" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME130046" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130046" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130046" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130046" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130036" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130121" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130121" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130121" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130049" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130049" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME130049" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME130049" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130111" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130111" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130063" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130063" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130063" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130071" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130071" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130071" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130071" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130071" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130018" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130018" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130018" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130018" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130403" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130403" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130403" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130403" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130403" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130403" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130403" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130403" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130403" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130403" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME1300F3" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME130190" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130190" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130179" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME130179" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME1300F5" 3 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"ME130160" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130160" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130160" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130170" 1 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"ME13102PM" 1 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"ME13102PM" 1 "Hemifasc" -999 -999 NA -999 1.2 5 -999 +"ME13102PM" 2 "Zebrscop" -999 -999 NA -999 9.6 5 -999 +"ME13102PM" 2 "Hemifasc" -999 -999 NA -999 2.4 5 -999 +"ME13102PM" 3 "Zebrscop" -999 -999 NA -999 7.2 5 -999 +"ME13102PM" 3 "Hemifasc" -999 -999 NA -999 1.2 5 -999 +"ME130267" 3 "Hemifasc" -999 -999 NA -999 1.5 5 -999 +"ME130252" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130252" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130252" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130262" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130248" 1 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"ME130248" 3 "Zebrscop" -999 -999 NA -999 1.2 5 -999 +"ME130268" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130268" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130268" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130268" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130266" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130266" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130246" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130054" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130054" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130400" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130400" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130173" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130004" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130004" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130210" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130101" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME130101" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME130108" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130089" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130089" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130089" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130066" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130116" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130116" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130116" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130116" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130137" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME13168PM" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME130212" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130090" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130090" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130128" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130128" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130117" 2 "Zebrscop" -999 -999 NA -999 5 5 -999 +"ME1347PM" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME1347PM" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME1347PM" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME1347PM" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME1347PM" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"ME130099" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130099" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130099" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130022" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130106" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130106" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130107" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130107" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130107" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130111" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130018" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130403" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130403" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130403" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130403" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"ME130403" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"ME130160" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"ME130053" 3 "Zebrscop" -999 -999 NA -999 2 6 -999 +"ME130402" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"ME130115" 1 "Hemifasc" -999 -999 NA -999 1 6 -999 +"ME130105" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"ME130137" 2 "Hemifasc" -999 -999 NA -999 1 6 -999 +"ME130128" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"ME1300F1" 1 "Hemifasc" -999 -999 NA -999 1 6 -999 +"ME1300F1" 2 "Hemifasc" -999 -999 NA -999 1 8 -999 +"ME130190" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"ME130190" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"ME1300F4" 3 "Hemifasc" -999 -999 NA -999 1 10 -999 +"ME13102PM" 3 "Hemifasc" -999 -999 NA -999 1.2 7 -999 +"ME130252" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"ME130053" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"ME130096" 1 "Hemifasc" -999 -999 NA -999 1 6 -999 +"ME130108" 1 "Zebrscop" -999 -999 NA -999 2 6 -999 +"ME130108" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"ME130108" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"ME13168PM" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"ME130049" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"ME130111" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"ME130171" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"OU090061" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090108" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09107C" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"OU09107C" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"OU090123" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090123" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09106C" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"OU09106C" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"OU09106C" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09123B" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09123B" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09129B" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090002" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090025" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090025" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090L52" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"OU090L52" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090L51" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090L14" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L12R" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L22R" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L22R" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L22R" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L36R" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L36R" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090L13" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"OU090020" 1 "Abalstel" -999 -999 NA -999 1 5 -999 +"OU090006" 3 "Abalstel" -999 -999 NA -999 1 5 -999 +"OU09106C" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09106C" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09123B" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09129B" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09129B" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09129B" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"OU09129B" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L51R" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L51R" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090L52" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090L52" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L52R" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"OU090L14" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090L14" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L12R" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L12R" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"OU09L22R" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L22R" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L36R" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"OU09L36R" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"OU090L13" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090005" 1 "Abalstel" -999 -999 NA -999 1 5 -999 +"OU09L51R" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L51R" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L51R" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L14R" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L14R" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090L82" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L12R" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L22R" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU09L22R" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090L22" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090L13" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"OU090116" 1 "Zebrscop" -999 -999 NA -999 2 7 -999 +"OU09107C" 1 "Zebrscop" -999 -999 NA -999 2 7 -999 +"OU09107C" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"OU09107C" 3 "Zebrscop" -999 -999 NA -999 2 8 -999 +"OU090123" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"OU090002" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"OU090L52" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"OU090L14" 1 "Zebrscop" -999 -999 NA -999 2 7 -999 +"OU09107C" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"OU09L52R" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"OU090L14" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"OU09L12R" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"PE140025" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PE140033" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PE140033" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PE140029" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PE140035" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"PE140035" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"PE140035" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PE140035" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PE140007" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PE140007" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PE140031" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PE140031" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PE140031" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120007" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120048" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120092" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"PO120092" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"PO120066" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120121" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PO120096" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120134" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PO120233" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120007" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PO120007" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PO120007" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120018" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120028" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"PO120028" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120004" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PO120004" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120053" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120053" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120200" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120136" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120092" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"PO120092" 2 "Zebrscop" -999 -999 NA -999 4 5 -999 +"PO120092" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"PO120205" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120066" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120121" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"PO120121" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PO120203" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"PO120203" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PO120206" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PO120206" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120206" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120045" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120096" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PO120096" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PO120094" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120094" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120233" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120200" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120092" 3 "Zebrscop" -999 -999 NA -999 2.5 5 -999 +"PO120096" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PO120001" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"PO120121" 2 "Zebrscop" -999 -999 NA -999 2 7 -999 +"PO120203" 3 "Zebrscop" -999 -999 NA -999 1.2 7.2 -999 +"PO120045" 1 "Zebrscop" -999 -999 NA -999 3 6 -999 +"PO120045" 2 "Zebrscop" -999 -999 NA -999 2 7 -999 +"PO120045" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"WA140002" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"WA140002" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150202" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150202" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150001" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150301" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150400" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150400" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150061" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150061" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150061" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150090" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150087" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150094" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150094" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150023" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150032" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150032" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150032" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150012" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150012" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150012" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150011" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150011" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150155" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150137" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150137" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150137" 2 "Zebrscop" -999 -999 NA -999 5 5 -999 +"EN150137" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150137" 2 "Zebrscop" -999 -999 NA -999 4 5 -999 +"EN150137" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150137" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150137" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150138" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150138" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150138" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150138" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150140" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150140" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"EN150139" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150300" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150300" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150301" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150301" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"EN150301" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150301" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150301" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150301" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150301" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150302" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150302" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150119" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150119" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150119" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150307" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150307" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150307" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150307" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150307" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150307" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150307" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150309" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150116" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150116" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150105" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150105" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150105" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150105" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150105" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150105" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150105" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150352" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150352" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150350" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150350" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150350" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150350" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150350" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150350" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150115" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150115" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150351" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150351" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150351" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150108" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150028" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150136" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150136" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150136" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150136" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150136" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150136" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150136" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150136" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150060" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150060" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150060" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150060" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150060" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150060" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"EN150060" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"EN150060" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150137" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150138" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150307" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"EN150001" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"EN150001" 2 "Zebrscop" -999 -999 NA -999 1 9 -999 +"EN150030" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"EN150045" 1 "Zebrscop" -999 -999 NA -999 1 10 -999 +"EN150045" 1 "Zebrscop" -999 -999 NA -999 1 10 -999 +"EN150045" 2 "Zebrscop" -999 -999 NA -999 1 10 -999 +"EN150045" 2 "Zebrscop" -999 -999 NA -999 2 8 -999 +"EN150045" 2 "Zebrscop" -999 -999 NA -999 2 10 -999 +"EN150045" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"EN150045" 3 "Zebrscop" -999 -999 NA -999 2 8 -999 +"EN150032" 2 "Zebrscop" -999 -999 NA -999 1 10 -999 +"EN150032" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"EN150012" 1 "Zebrscop" -999 -999 NA -999 2 10 -999 +"EN150012" 1 "Hemifasc" -999 -999 NA -999 1 10 -999 +"EN150012" 3 "Hemifasc" -999 -999 NA -999 1 10 -999 +"EN150012" 3 "Zebrscop" -999 -999 NA -999 2 10 -999 +"EN150027" 3 "Hemifasc" -999 -999 NA -999 1 7 -999 +"EN150155" 2 "Hemifasc" -999 -999 NA -999 1 7 -999 +"EN150066" 3 "Hemifasc" -999 -999 NA -999 1 8 -999 +"EN150137" 1 "Zebrscop" -999 -999 NA -999 2 10 -999 +"EN150137" 1 "Zebrscop" -999 -999 NA -999 1 8 -999 +"EN150137" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"EN150137" 3 "Zebrscop" -999 -999 NA -999 2 7 -999 +"EN150137" 3 "Zebrscop" -999 -999 NA -999 4 8 -999 +"EN150138" 1 "Zebrscop" -999 -999 NA -999 1 8 -999 +"EN150138" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"EN150300" 2 "Zebrscop" -999 -999 NA -999 1 8 -999 +"EN150301" 3 "Zebrscop" -999 -999 NA -999 2 8 -999 +"EN150305" 1 "Zebrscop" -999 -999 NA -999 1 10 -999 +"EN150305" 2 "Zebrscop" -999 -999 NA -999 1 10 -999 +"EN150350" 1 "Zebrscop" -999 -999 NA -999 2 7 -999 +"EN150311" 3 "Zebrscop" -999 -999 NA -999 1 8 -999 +"EN150313" 1 "Zebrscop" -999 -999 NA -999 1 10 -999 +"AB080008" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB080008" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB080008" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB080027" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB080027" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB080037" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB080015" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB080015" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB080031" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB080031" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB080031" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB080027" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB080057" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB080008" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB080015" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB080015" 2 "Zebrscop" -999 -999 NA -999 2 6 -999 +"AB080015" 3 "Zebrscop" -999 -999 NA -999 4 6 -999 +"AB080057" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB080042" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB090095" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090095" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090095" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090121" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB090121" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB090121" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090097" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090097" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090097" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090602" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090602" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090602" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090149" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090149" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090149" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB090133" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090133" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090151" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090151" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090151" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090127" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090127" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090127" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090105" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090105" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090135" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090135" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090135" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090120" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090122" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090123" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090123" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090148" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090124" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090603" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090125" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB090125" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090126" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090126" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090126" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090132" 1 "Zebrscop" -999 -999 NA -999 1.5 5 -999 +"AB090134" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090134" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090134" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090076" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090076" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090095" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090095" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090098" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090601" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090601" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090602" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090602" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090602" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090149" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090149" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090149" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090133" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090081" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090081" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090151" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090127" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090127" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090105" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090106" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090143" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090125" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090125" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090126" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090126" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB090126" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB090601" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090601" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090602" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090602" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090105" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB090602" 1 "Hemifasc" -999 -999 NA -999 1 7 -999 +"AB090602" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB090133" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB090133" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB090104" 2 "Zebrscop" -999 -999 NA -999 1.2 7 -999 +"AB090104" 3 "Zebrscop" -999 -999 NA -999 1.2 6 -999 +"AB090106" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB090122" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB090125" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB090125" 3 "Zebrscop" -999 -999 NA -999 3 6 -999 +"AB090134" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB090134" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB090601" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB090602" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB090133" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100049" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100049" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100031" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AB100097" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100097" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100097" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100047" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100047" 2 "Zebrscop" -999 -999 NA -999 4 5 -999 +"AB100047" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100025" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100025" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100025" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100119" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100093" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100093" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100093" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100112" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100017" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100017" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100077" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100111" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100111" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100111" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100024" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100024" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100024" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100091" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100091" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100019" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100124" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB100124" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB100124" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB100020" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100020" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100021" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100021" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100052" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100010" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100023" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"AB100023" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100023" 3 "Zebrscop" -999 -999 NA -999 5 5 -999 +"AB100011" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100011" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100011" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100015" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100028" 1 "Zebrscop" -999 -999 NA -999 5 5 -999 +"AB100028" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100028" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100008" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100008" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB100008" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100079" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100078" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100009" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100009" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100081" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100042" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100042" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100042" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100082" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100061" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100062" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100062" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100062" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100085" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100085" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100099" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100099" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100099" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100048" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB100048" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100048" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100095" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100029" 1 "Zebrscop" -999 -999 NA -999 4 5 -999 +"AB100029" 2 "Zebrscop" -999 -999 NA -999 4 5 -999 +"AB100029" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB100029" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AB100090" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100086" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100086" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100086" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100089" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB100060" 1 "Zebrscop" -999 -999 NA -999 5 5 -999 +"AB100060" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB100060" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100006" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100038" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB100036" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100036" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100036" 3 "Zebrscop" -999 -999 NA -999 4 5 -999 +"AB100098" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100088" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100131" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100131" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100132" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100132" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100046" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100046" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100046" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100092" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100092" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100092" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100094" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100002" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"AB100002" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100002" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100096" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100096" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100096" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100049" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100049" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100001" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100112" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100112" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100112" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100017" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100111" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100024" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100124" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100124" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100124" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100021" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100021" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100072" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100010" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100023" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100023" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100081" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100062" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100062" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100062" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100085" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100048" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100029" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100029" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100029" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100086" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100086" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100060" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100060" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100060" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100087" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100087" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100006" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100038" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100088" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100132" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100132" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AB100132" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100132" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100132" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"AB100046" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100094" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100094" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100002" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100096" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100096" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100096" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100112" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100017" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100048" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100087" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100006" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100006" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100006" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100088" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100088" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100131" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100132" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100132" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100046" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"AB100046" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100046" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100094" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"AB100031" 2 "Hemifasc" -999 -999 NA -999 1 8 -999 +"AB100112" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100112" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100017" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100111" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100019" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100019" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100020" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100021" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100021" 2 "Zebrscop" -999 -999 NA -999 3 6 -999 +"AB100052" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100010" 1 "Zebrscop" -999 -999 NA -999 2 6 -999 +"AB100023" 2 "Zebrscop" -999 -999 NA -999 3 6 -999 +"AB100023" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100015" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100028" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100008" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100008" 2 "Zebrscop" -999 -999 NA -999 2 10 -999 +"AB100008" 3 "Zebrscop" -999 -999 NA -999 2 7 -999 +"AB100079" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100055" 2 "Zebrscop" -999 -999 NA -999 1 8 -999 +"AB100061" 1 "Zebrscop" -999 -999 NA -999 3 6 -999 +"AB100061" 2 "Zebrscop" -999 -999 NA -999 2 6 -999 +"AB100061" 3 "Zebrscop" -999 -999 NA -999 2 6 -999 +"AB100062" 1 "Hemifasc" -999 -999 NA -999 1 8 -999 +"AB100062" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100062" 2 "Hemifasc" -999 -999 NA -999 1 6 -999 +"AB100062" 3 "Zebrscop" -999 -999 NA -999 1 8 -999 +"AB100095" 3 "Hemifasc" -999 -999 NA -999 1 6 -999 +"AB100029" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100029" 2 "Zebrscop" -999 -999 NA -999 5 7 -999 +"AB100090" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100086" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100086" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100087" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100087" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100038" 2 "Zebrscop" -999 -999 NA -999 3 6 -999 +"AB100038" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100036" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100088" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100131" 1 "Zebrscop" -999 -999 NA -999 2 8 -999 +"AB100131" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100132" 2 "Zebrscop" -999 -999 NA -999 3 6 -999 +"AB100092" 1 "Zebrscop" -999 -999 NA -999 2 6 -999 +"AB100092" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100094" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100094" 2 "Zebrscop" -999 -999 NA -999 2 7 -999 +"AB100002" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100002" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100002" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100017" 2 "Zebrscop" -999 -999 NA -999 1 8 -999 +"AB100017" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100021" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100090" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100038" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100088" 1 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100088" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100132" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100035" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100046" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"AB100094" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100094" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100002" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"AB100002" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"PA170004" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170005" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170005" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170010" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170042" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170042" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170042" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170060" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170081" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170081" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170018" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170039" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170039" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170041" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170041" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170041" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170041" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170041" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170074" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170066" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170060" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170060" 1 "Zebrscop" -999 -999 NA -999 3 5 -999 +"PA170060" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170060" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170060" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170060" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170060" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170060" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170060" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170060" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170060" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170060" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170059" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170058" 1 "Zebrscop" -999 -999 NA -999 8 5 -999 +"PA170058" 1 "Zebrscop" -999 -999 NA -999 5 5 -999 +"PA170058" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170058" 2 "Zebrscop" -999 -999 NA -999 12 5 -999 +"PA170058" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170058" 3 "Zebrscop" -999 -999 NA -999 7 5 -999 +"PA170058" 3 "Zebrscop" -999 -999 NA -999 8 5 -999 +"PA170058" 3 "Zebrscop" -999 -999 NA -999 3 5 -999 +"PA170058" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170057" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170057" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170057" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170057" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"PA170057" 2 "Zebrscop" -999 -999 NA -999 4 5 -999 +"PA170057" 2 "Zebrscop" -999 -999 NA -999 3 5 -999 +"PA170057" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170057" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170057" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170057" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170057" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170079" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170080" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170080" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170080" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170080" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170080" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170080" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170080" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170080" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170080" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170080" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170081" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170081" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170081" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170056" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170056" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170056" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170016" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170016" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170016" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170016" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170017" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170022" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170054" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170093" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170051" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170050" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170050" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170050" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170041" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170041" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170041" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170041" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170068" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170068" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170058" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170058" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170080" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170080" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170080" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170080" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170043" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170043" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170056" 1 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170056" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170056" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170016" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170022" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170022" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170084" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170084" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170084" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170084" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170084" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170083" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170088" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170093" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170091" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170091" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170091" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170055" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170051" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170050" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170050" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170050" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170050" 1 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170050" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170044" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170014" 3 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170014" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170014" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170015" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170013" 3 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170012" 2 "Zebrscop" -999 -999 NA -999 2 5 -999 +"PA170011" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170011" 3 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170011" 2 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170011" 1 "Zebrscop" -999 -999 NA -999 1 5 -999 +"PA170005" 3 "Hemifasc" -999 -999 NA -999 1 7 -999 +"PA170042" 1 "Hemifasc" -999 -999 NA -999 1 7 -999 +"PA170042" 2 "Hemifasc" -999 -999 NA -999 1 7 -999 +"PA170058" 2 "Zebrscop" -999 -999 NA -999 1 8 -999 +"PA170058" 3 "Zebrscop" -999 -999 NA -999 1 8 -999 +"PA170058" 3 "Zebrscop" -999 -999 NA -999 3 8 -999 +"PA170057" 1 "Zebrscop" -999 -999 NA -999 1 8 -999 +"PA170057" 1 "Zebrscop" -999 -999 NA -999 1 10 -999 +"PA170057" 1 "Hemifasc" -999 -999 NA -999 1 8 -999 +"PA170057" 2 "Zebrscop" -999 -999 NA -999 2 8 -999 +"PA170057" 2 "Zebrscop" -999 -999 NA -999 1 8 -999 +"PA170057" 2 "Zebrscop" -999 -999 NA -999 2 10 -999 +"PA170080" 2 "Zebrscop" -999 -999 NA -999 1 8 -999 +"PA170080" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"PA170043" 1 "Zebrscop" -999 -999 NA -999 1 7 -999 +"PA170056" 2 "Zebrscop" -999 -999 NA -999 2 8 -999 +"PA170056" 2 "Hemifasc" -999 -999 NA -999 1 10 -999 +"PA170056" 3 "Zebrscop" -999 -999 NA -999 2 7 -999 +"PA170056" 3 "Zebrscop" -999 -999 NA -999 1 6 -999 +"PA170016" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"PA170017" 2 "Hemifasc" -999 -999 NA -999 1 8 -999 +"PA170018" 1 "Hemifasc" -999 -999 NA -999 1 6 -999 +"PA170018" 1 "Zebrscop" -999 -999 NA -999 1 8 -999 +"PA170020" 2 "Hemifasc" -999 -999 NA -999 2 7 -999 +"PA170020" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"PA170025" 3 "Zebrscop" -999 -999 NA -999 1 7 -999 +"PA170088" 1 "Zebrscop" -999 -999 NA -999 1 9 -999 +"PA170100" 1 "Hemifasc" -999 -999 NA -999 1 10 -999 +"PA170094" 2 "Zebrscop" -999 -999 NA -999 3 6 -999 +"PA170093" 3 "Zebrscop" -999 -999 NA -999 1 10 -999 +"PA170091" 2 "Zebrscop" -999 -999 NA -999 1 6 -999 +"PA170091" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"PA170055" 3 "Hemifasc" -999 -999 NA -999 1 6 -999 +"PA170014" 2 "Zebrscop" -999 -999 NA -999 1 7 -999 +"PA170013" 2 "Hemifasc" -999 -999 NA -999 1 5 -999 +"PA170030" 3 "Zebrscop" -999 -999 NA -999 2 7 -999 +"PA170027" 3 "Zebrscop" -999 -999 NA -999 1 8 -999 +"PA170027" 2 "Zebrscop" -999 -999 NA -999 1 8 -999
