Mercurial > repos > ecology > cb_div
changeset 0:abc8da8c12ba draft
planemo upload for repository https://github.com/Marie59/champ_blocs commit 0d86db7d42b608c386a54500064f5f9c9d7019a4
author | ecology |
---|---|
date | Wed, 04 Jan 2023 13:21:41 +0000 (2023-01-04) |
parents | |
children | 5b31641e6d30 |
files | CB_ivr.tif cb_dissimilarity.r cb_ivr.r cb_ivr_site_report_col_scale_loop.Rmd div_index.r div_index.xml logo_merged.png loop_col_scale.r macro.xml test-data/Clean_Rdata.rdata test-data/champbloc_ivr.csv test-data/champbloc_qecb.csv test-data/ficheterrain.csv |
diffstat | 13 files changed, 6879 insertions(+), 0 deletions(-) [+] |
line wrap: on
line diff
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/cb_dissimilarity.r Wed Jan 04 13:21:41 2023 +0000 @@ -0,0 +1,1753 @@ +# author: "Jonathan Richir" +# date: "01 October 2022" + + +#Rscript + +############################### +## ## +############################### + +#####Packages : dplyr +# tidyr +# readr +# writexl +# stringr +# readxl +# tibble +# lubridate +# cowplot +# magrittr +# rmarkdown +library(magrittr) +#####Load arguments + +args <- commandArgs(trailingOnly = TRUE) + +#####Import data + +if (length(args) < 1) { + stop("This tool needs at least 1 argument") +}else { + fiche_val <- args[1] + input_data <- args[2] + choice <- args[3] + choice_date <- as.numeric(args[4]) +} + +############################################################# +# # +# Loading and cleaning data # +# # +############################################################# +# load qecb data + +qecb <- read.csv2(input_data, header = TRUE, fileEncoding = "Latin1") # fileEncoding = "Latin1", cfr é in variable names + +# import csv files ficheterrain + +fiche <- read.csv2(fiche_val, header = TRUE, fileEncoding = "Latin1") # fileEncoding = "Latin1", cfr é in variable names + +## work on "Fiche terrain" + +date_fiche <- as.Date(stringr::str_sub(fiche$date.sortie, end = 10), origin = "1970-01-01") +fiche <- tibble::add_column(fiche, date_fiche, .after = "date.sortie") +rm(date_fiche) + +## qecb vs fiche terrain + +fiche_red <- dplyr::filter(fiche, fiche$ID.Fiche %in% unique(qecb[, c("id")])) + +id_count <- qecb %>% dplyr::group_by(id) %>% dplyr::count() +id_count <- dplyr::rename(id_count, "ID.Fiche" = "id") +id_count <- data.frame(id_count) +fiche_red <- dplyr::left_join(fiche_red, id_count) + +# rep fiche terrain information +fiche_expanded <- fiche_red[rep(row.names(fiche_red), fiche_red$n), 1:ncol(fiche_red)] +fiche_expanded <- dplyr::rename(fiche_expanded, "id" = "ID.Fiche") + +## merge qecb data and ficheterrain information + +qecb <- dplyr::bind_cols(qecb, fiche_expanded) +qecb <- dplyr::rename(qecb, "id_qecb" = "id...1") +qecb <- dplyr::rename(qecb, "id_fiche" = "id...68") + +rm(fiche_expanded, fiche_red, id_count) + +qecb <- qecb %>% tidyr::separate(date_fiche, c("Year", "Month", "Day"), sep = "-", remove = FALSE) + + +## quadrat nb : in contrast to ivr df, quadrat number is missing for many observations in qecb df ; but from the Numero.Photo variable (boulder photo associated to field data collection), I could get back most missing quadrat numbers + +quadrat <- stringr::str_extract(qecb$Numero.Photo, "Q[12345]") +qecb <- tibble::add_column(qecb, quadrat, .after = "Numero.Photo") +rm(quadrat) + +# check +quadrat_bis <- rep(NA, length = nrow(qecb)) +qecb <- tibble::add_column(qecb, quadrat_bis, .after = "quadrat") +rm(quadrat_bis) + +qecb$quadrat_bis <- ifelse(qecb$Numéro.Bloc.échantillon %in% c(1, 2) & qecb$Type.Bloc == "Bloc mobile", "Q1", qecb$quadrat_bis) +qecb$quadrat_bis <- ifelse(qecb$Numéro.Bloc.échantillon %in% c(3, 4) & qecb$Type.Bloc == "Bloc mobile", "Q2", qecb$quadrat_bis) +qecb$quadrat_bis <- ifelse(qecb$Numéro.Bloc.échantillon %in% c(5, 6) & qecb$Type.Bloc == "Bloc mobile", "Q3", qecb$quadrat_bis) +qecb$quadrat_bis <- ifelse(qecb$Numéro.Bloc.échantillon %in% c(7, 8) & qecb$Type.Bloc == "Bloc mobile", "Q4", qecb$quadrat_bis) +qecb$quadrat_bis <- ifelse(qecb$Numéro.Bloc.échantillon %in% c(9, 10) & qecb$Type.Bloc == "Bloc mobile", "Q5", qecb$quadrat_bis) + + +qecb$quadrat_bis <- ifelse(qecb$Numéro.Bloc.échantillon == 1 & qecb$Type.Bloc %in% c("Bloc fixé", "Roche en place"), "Q1", qecb$quadrat_bis) +qecb$quadrat_bis <- ifelse(qecb$Numéro.Bloc.échantillon == 2 & qecb$Type.Bloc %in% c("Bloc fixé", "Roche en place"), "Q2", qecb$quadrat_bis) +qecb$quadrat_bis <- ifelse(qecb$Numéro.Bloc.échantillon == 3 & qecb$Type.Bloc %in% c("Bloc fixé", "Roche en place"), "Q3", qecb$quadrat_bis) +qecb$quadrat_bis <- ifelse(qecb$Numéro.Bloc.échantillon == 4 & qecb$Type.Bloc %in% c("Bloc fixé", "Roche en place"), "Q4", qecb$quadrat_bis) +qecb$quadrat_bis <- ifelse(qecb$Numéro.Bloc.échantillon == 5 & qecb$Type.Bloc %in% c("Bloc fixé", "Roche en place"), "Q5", qecb$quadrat_bis) + +## I create two new variables for Site names, one for data analysis and one for data reporting. Only works for actual ivr df with 22 sites ! + +# Name for data analysis + +qecb <- tibble::add_column(qecb, Site = qecb$zone.habitat, .after = "ID.Fiche") + +for (x in seq_along(qecb$Site)) { + if (grepl(pattern = "Locmariaquer", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "GDMO_Locmariaquer" + } else if (grepl(pattern = "Beg Lann", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "GDMO_BegLann" + } else if (grepl(pattern = "Plateau du Four", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "FOUR_PlateauFour" + } else if (grepl(pattern = "Grouin", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "EGMP_GroinCou" + } else if (grepl(pattern = "Ensembert", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "EGMP_PasEmsembert" + } else if (grepl(pattern = "Brée-les-Bains", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "EGMP_BreeBains" + } else if (grepl(pattern = "Antiochat", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "EGMP_PerreAntiochat" + } else if (grepl(pattern = "Chassiron", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "EGMP_Chassiron" + } else if (grepl(pattern = "zone p", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "BASQ_FlotsBleusZP" + } else if (grepl(pattern = "zone f", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "BASQ_FlotsBleusZF" + } else if (grepl(pattern = "Saint-Michel", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "GONB_IlotStMichel" + } else if (grepl(pattern = "Quéménès", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "FINS_Quemenes" + } else if (grepl(pattern = "Goulenez", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "FINS_SeinGoulenez" + } else if (grepl(pattern = "Kilaourou", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "FINS_SeinKilaourou" + } else if (grepl(pattern = "Verdelet", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "ARMO_Verdelet" + } else if (grepl(pattern = "Piégu", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "ARMO_Piegu" + } else if (grepl(pattern = "Bilfot", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "ARMO_Bilfot" + } else if (grepl(pattern = "Plate", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "ARMO_IlePlate" + } else if (grepl(pattern = "Perharidy", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "PDMO_Perharidy" + } else if (grepl(pattern = "Keraliou", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "BRES_Keraliou" + } else if (grepl(pattern = "Mousterlin", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "FINS_Mousterlin" + } else if (grepl(pattern = "Nicolas", qecb$Site[x]) == TRUE) { + qecb$Site[x] <- "FINS_StNicolasGlenan" + } + if (grepl(pattern = "Roz", qecb$site[x]) == TRUE) { + qecb$Site[x] <- "FINS_AnseRoz" +} +} + +# Name for report/plot + +qecb <- tibble::add_column(qecb, Site_bis = qecb$Site, .after = "Site") + +qecb$Site_bis <- ifelse(qecb$Site == "GDMO_Locmariaquer", "Locmariaquer", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "GDMO_BegLann", "Beg Lann", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "FOUR_PlateauFour", "Plateau du Four", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "EGMP_GroinCou", "Groin du Cou", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "EGMP_PasEmsembert", "Le Pas d'Emsembert", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "EGMP_BreeBains", "La Brée-les-Bains", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "EGMP_PerreAntiochat", "Le Perré d'Antiochat", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "EGMP_Chassiron", "Chassiron", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "BASQ_FlotsBleusZP", "Les Flots Bleus / zone pêcheurs", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "BASQ_FlotsBleusZF", "Les Flots Bleus / zone familles", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "GONB_IlotStMichel", "Îlot Saint-Michel", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "FINS_Quemenes", "Quéménès", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "FINS_SeinGoulenez", "Île de Sein - Goulenez", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "FINS_SeinKilaourou", "Île de Sein - Kilaourou", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "ARMO_Verdelet", "Îlot du Verdelet", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "ARMO_Piegu", "Piégu", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "ARMO_Bilfot", "Pointe de Bilfot", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "ARMO_IlePlate", "Île Plate", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "PDMO_Perharidy", "Perharidy", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "BRES_Keraliou", "Keraliou", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "FINS_Mousterlin", "Pointe de Mousterlin", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "FINS_StNicolasGlenan", "Saint-Nicolas des Glénan", qecb$Site_bis) +qecb$Site_bis <- ifelse(qecb$Site == "FINS_AnseRoz", "Pointe de l'Anse du Roz", qecb$Site_bis) + +## change some variables to factor + +# change 'X..' variables that are indeed % to numeric; https://stackoverflow.com/questions/59410939/apply-function-to-all-variables-with-string-in-name +ix <- grep("^X..", names(qecb)) +qecb[ix] <- lapply(qecb[ix], as.numeric) +rm(ix) + + +## save the final, complete qecb df_ + +qecb <- qecb[, c(72:107, 1:71)] + +## qecb df preparation prior qecb calculation + +# Several issues to solve in the df first + + +qecb$Type.Bloc <- factor(qecb$Type.Bloc, levels = c("Bloc mobile", "Bloc fixé", "Roche en place")) + +qecb$Face <- factor(qecb$Face, levels = c("face supérieure", "face inférieure")) + +qecb <- dplyr::arrange(qecb, Type.Bloc, Face, Numéro.Bloc.échantillon) + +qecb <- tibble::add_column(qecb, site_year_month_day = paste0(qecb$Site, ".", qecb$Year, ".", qecb$Month, ".", qecb$Day), .after = "Site_bis") + +# save qecb as a new df_ for analysis purpose => several changes to operate to run the code and functions + +qecbnew <- qecb + +# df with list object nb and corresponding site_year_month_day value to solve for loop issues + +df_list_loop <- data.frame("site_year_month_day" = unique(qecbnew$site_year_month_day), + "loop nb" = c(1:seq_along(unique(qecbnew$site_year_month_day)))) + +# dplyr::filter for df that makes problem, then eventually correct in the dataframe for wrong coding; brackets (xx) for nb because will change when qecb df_ enlarged. +# these listed boulder field survey error when highlighted when running the loop, that ran into an error ; it was a step by step procedure with solving one listed observation after another when issues appeared. Surely not the best way to proceed, maybe better just to skip these surveys (site + date), but in the present case I wanted to keep most of the observations, therefore I corrected them manually whenever needed. + +# list nb (28) - EGMP_BreeBains.2016.04.06 +qecbnew$Face <- as.character(qecbnew$Face) +qecbnew$Face <- ifelse(qecbnew$ID.Fiche == "BDD_IVR&QECB_La Bree_20160406_VImport.xlsx" & qecbnew$Référence.bloc == "avr16-LaBreeB9sup", "face supérieure", qecbnew$Face) +qecbnew$Face <- ifelse(qecbnew$ID.Fiche == "BDD_IVR&QECB_La Bree_20160406_VImport.xlsx" & qecbnew$Référence.bloc == "avr16-LaBreeB10sup", "face supérieure", qecbnew$Face) +qecbnew$Face <- as.factor(qecbnew$Face) + +# list nb 33 - EGMP_PerreAntiochat.2016.04.07 +qecbnew$Face <- as.character(qecbnew$Face) +qecbnew$Face <- ifelse(qecbnew$ID.Fiche == "BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx" & qecbnew$Référence.bloc == "avr16-PerAntB9sup", "face supérieure", qecbnew$Face) +qecbnew$Face <- ifelse(qecbnew$ID.Fiche == "BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx" & qecbnew$Référence.bloc == "avr16-PerAntB10sup", "face supérieure", qecbnew$Face) +qecbnew$Face <- as.factor(qecbnew$Face) + +# list nb 37 - EGMP_Chassiron.2016.03.09 +qecbnew$Face <- as.character(qecbnew$Face) +qecbnew$Face <- ifelse(qecbnew$ID.Fiche == "BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx" & qecbnew$Référence.bloc == "mars16-ChassB9sup", "face supérieure", qecbnew$Face) +qecbnew$Face <- ifelse(qecbnew$ID.Fiche == "BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx" & qecbnew$Référence.bloc == "mars16-ChasB10sup", "face supérieure", qecbnew$Face) +qecbnew$Face <- as.factor(qecbnew$Face) + +# list nb 76 - ARMO_Verdelet.2015.03.23 +qecbnew$Face <- as.character(qecbnew$Face) +qecbnew$Face <- ifelse(qecbnew$ID.Fiche == "BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx" & qecbnew$Référence.bloc == "mar15-VerB10inf", "face inférieure", qecbnew$Face) +qecbnew$Face <- as.factor(qecbnew$Face) + +# list nb 116 - "GDMO_Locmariaquer.2018.09.10" +qecbnew$Type.Bloc <- as.character(qecbnew$Type.Bloc) +qecbnew$Type.Bloc <- ifelse(qecbnew$ID.Fiche == "2018-09-10-GDMO-CDB-001" & qecbnew$Numero.Photo == "2018-09-10_GDMO_01_CDB-5_sup_392578.jpg", "Roche en place", qecbnew$Type.Bloc) +qecbnew$Type.Bloc <- as.factor(qecbnew$Type.Bloc) +qecbnew$quadrat_bis <- ifelse(qecbnew$ID.Fiche == "2018-09-10-GDMO-CDB-001" & qecbnew$Numero.Photo == "2018-09-10_GDMO_01_CDB-5_sup_392578.jpg", "Q5", qecbnew$quadrat_bis) +qecbnew <- qecbnew %>% dplyr::filter(!(ID.Fiche == "2018-09-10-GDMO-CDB-001" & Numero.Photo == "")) + +# Few sites to remove prior running the for loop because it was not just a encoding mistake for one data, but a globally wroing coding for the site + date survey. + +qecb_i <- qecbnew %>% dplyr::filter(site_year_month_day == "FINS_StNicolasGlenan.2016.04.08") # no bloc fixe ! +qecbnew <- qecbnew %>% dplyr::filter(site_year_month_day != "FINS_StNicolasGlenan.2016.04.08") +qecb_i <- qecbnew %>% dplyr::filter(site_year_month_day == "GDMO_Locmariaquer.2019.09.30") # most faces of blocs mobiles do not correspond to each other; only 3 over 10 boulder have data for both face supérieure and face inférieure +qecbnew <- qecbnew %>% dplyr::filter(site_year_month_day != "GDMO_Locmariaquer.2019.09.30") +rm(df_list_loop, qecb_i) + + +# check for species with count within sub-0.1m^2-quadrat (i.e. reduced size quadrat compare to most organisms on boulder to count them, because abundant ; then some extrapolation) + +# first for Spirobranchus + +qecbnew$Nb.Spirobranchus.lamarckii.total.ini <- qecbnew$Nb.Spirobranchus.lamarckii.total +qecbnew$Nb.Spirobranchus.lamarckii.total <- as.character(qecbnew$Nb.Spirobranchus.lamarckii.total) + + +qecbnew_spirobranchus <- (dplyr::filter(qecbnew, Nb.Spirobranchus.lamarckii.total %in% c(NA, "NaN", "Inf", "-Inf"))) +qecbnew_spirobranchus[, c("Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B")] <- sapply(qecbnew_spirobranchus[, c("Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B")], as.character) +(spirobranchus_data <- subset(qecbnew_spirobranchus, !is.na(qecbnew_spirobranchus$Nb.Spirobranchus.lamarckii.1B) || !is.na(qecbnew_spirobranchus$Nb.Spirobranchus.lamarckii.2B) || !is.na(qecbnew_spirobranchus$Nb.Spirobranchus.lamarckii.3B) || !is.na(qecbnew_spirobranchus$Nb.Spirobranchus.lamarckii.4B) || !is.na(qecbnew_spirobranchus$Nb.Spirobranchus.lamarckii.5B))[, c("site_year_month_day", "Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B", "Nb.Spirobranchus.lamarckii.total")]) + +quemenes <- dplyr::filter(qecbnew, Site == "FINS_Quemenes") +quemenes <- dplyr::arrange(quemenes, date_fiche) +# for Quemenes, issue because for sampling date "FINS_Quemenes.2015.09.30" the 5 counts of Spirobranchus were encoded in 1B instead of total !!! I noticed this issue when mining data (see below), therefore I corrected before running below script for Spirobranchus. +qecbnew$Nb.Spirobranchus.lamarckii.total <- ifelse(qecbnew$site_year_month_day == "FINS_Quemenes.2015.09.30" & is.na(qecbnew$Nb.Spirobranchus.lamarckii.total), qecbnew$Nb.Spirobranchus.lamarckii.1B, qecbnew$Nb.Spirobranchus.lamarckii.total) + +(quemenes <- dplyr::filter(qecbnew, site_year_month_day == "FINS_Quemenes.2015.09.30")[, c("site_year_month_day", "Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B", "Nb.Spirobranchus.lamarckii.total")]) +rm(quemenes) + +seinkilaourou <- dplyr::filter(qecbnew, Site == "FINS_SeinKilaourou") +seinkilaourou <- dplyr::arrange(seinkilaourou, date_fiche) +# same issue with SeinKilaourou +qecbnew$Nb.Spirobranchus.lamarckii.total <- ifelse(qecbnew$site_year_month_day == "FINS_SeinKilaourou.2015.04.21" & is.na(qecbnew$Nb.Spirobranchus.lamarckii.total), qecbnew$Nb.Spirobranchus.lamarckii.1B, qecbnew$Nb.Spirobranchus.lamarckii.total) +(seinkilaourou <- dplyr::filter(qecbnew, site_year_month_day == "FINS_SeinKilaourou.2015.04.21")[, c("site_year_month_day", "Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B", "Nb.Spirobranchus.lamarckii.total")]) +rm(seinkilaourou) + +# some more issues however with "x100"count data +spirobranchus <- subset(qecbnew, !is.na(qecbnew$Nb.Spirobranchus.lamarckii.1B) & !is.na(qecbnew$Nb.Spirobranchus.lamarckii.2B) & !is.na(qecbnew$Nb.Spirobranchus.lamarckii.3B) & !is.na(qecbnew$Nb.Spirobranchus.lamarckii.4B) & !is.na(qecbnew$Nb.Spirobranchus.lamarckii.5B) & !is.na(qecbnew$Nb.Spirobranchus.lamarckii.total))[, c("site_year_month_day", "Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B", "Nb.Spirobranchus.lamarckii.total")] + +for (i in c(1:nrow(spirobranchus))) { + spirobranchus$mean.x.100[[i]] <- sum(spirobranchus[i, c(2:6)], na.rm = TRUE) / sum(!is.na(spirobranchus[i, c(2:6)])) * 100 +} + +spirobranchus$mean.x.100 <- unlist(spirobranchus$mean.x.100) +spirobranchus$Nb.Spirobranchus.lamarckii.total <- as.numeric(spirobranchus$Nb.Spirobranchus.lamarckii.total) +for (i in c(1:nrow(spirobranchus))) { + spirobranchus$diff[[i]] <- spirobranchus[i, "Nb.Spirobranchus.lamarckii.total"] - spirobranchus[i, "mean.x.100"] +} + +spirobranchus$diff <- abs(as.integer(spirobranchus$diff)) +spirobranchus <- dplyr::arrange(spirobranchus, desc(diff), mean.x.100) +spirobranchus <- dplyr::arrange(dplyr::filter(spirobranchus, diff != 0 & mean.x.100 != 0), desc(diff)) + +# check it all in the qecbnew df + +for (i in c(1:nrow(qecbnew))) { + qecbnew$mean.x.100[[i]] <- + sum(qecbnew[i, c("Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B")], na.rm = TRUE) / sum(!is.na(qecbnew[i, c("Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B")])) * 100 +} # sum of only NAs/0 = NaN; so replace NaN by Na +qecbnew$mean.x.100 <- as.character(qecbnew$mean.x.100) + + +for (i in c(1:nrow(qecbnew))) { + qecbnew$mean.x.100[[i]] <- ifelse(qecbnew$mean.x.100[[i]] == "NaN", NA, qecbnew$mean.x.100[[i]]) +} +qecbnew$mean.x.100 <- as.integer(qecbnew$mean.x.100) + +qecbnew$Nb.Spirobranchus.lamarckii.total <- as.integer(qecbnew$Nb.Spirobranchus.lamarckii.total) +qecbnew$Nb.Spirobranchus.lamarckii.total.diff <- abs((qecbnew$Nb.Spirobranchus.lamarckii.total - qecbnew$mean.x.100)) +spirobranchus_diff <- qecbnew[, c("Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B", "Nb.Spirobranchus.lamarckii.total", "Nb.Spirobranchus.lamarckii.total.ini", "mean.x.100", "Nb.Spirobranchus.lamarckii.total.diff")] +spirobranchus_diff <- dplyr::arrange(spirobranchus_diff, desc(Nb.Spirobranchus.lamarckii.total.diff), mean.x.100) +spirobranchus_diff <- dplyr::arrange(dplyr::filter(spirobranchus_diff, Nb.Spirobranchus.lamarckii.total.diff != 0 & mean.x.100 != 0), desc(Nb.Spirobranchus.lamarckii.total.diff)) + +qecbnew$Nb.Spirobranchus.lamarckii.total <- ifelse(qecbnew$Nb.Spirobranchus.lamarckii.total.diff != 0 & qecbnew$mean.x.100 != 0, qecbnew$mean.x.100, qecbnew$Nb.Spirobranchus.lamarckii.total) +spirobranchus_diff <- qecbnew[, c("Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B", "Nb.Spirobranchus.lamarckii.total", "Nb.Spirobranchus.lamarckii.total.ini", "mean.x.100", "Nb.Spirobranchus.lamarckii.total.diff")] +spirobranchus_diff$Nb.Spirobranchus.lamarckii.total.diff <- abs(as.integer(spirobranchus_diff$Nb.Spirobranchus.lamarckii.total.diff)) +spirobranchus_diff <- dplyr::arrange(spirobranchus_diff, desc(Nb.Spirobranchus.lamarckii.total.diff), mean.x.100) +spirobranchus_diff <- dplyr::arrange(dplyr::filter(spirobranchus_diff, Nb.Spirobranchus.lamarckii.total.diff != 0 & mean.x.100 != 0), desc(Nb.Spirobranchus.lamarckii.total.diff)) +# ok, change made when data x 100 was not correct. + +# finally, change NA by mean.x100 for Spirobranchus total +qecbnew$Nb.Spirobranchus.lamarckii.total <- as.character(qecbnew$Nb.Spirobranchus.lamarckii.total) +for (i in c(1:nrow(qecbnew))) { + qecbnew$Nb.Spirobranchus.lamarckii.total[[i]] <- ifelse(qecbnew$Nb.Spirobranchus.lamarckii.total[[i]] %in% c(NA, "NaN", "Inf", "-Inf"), sum(qecbnew[i, c("Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B")], na.rm = TRUE) / sum(!is.na(qecbnew[i, c("Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B")])) * 100, qecbnew$Nb.Spirobranchus.lamarckii.total[[i]]) +} # sum of only NAs/0 = NaN; so replace NaN by Na + + +for (i in c(1:nrow(qecbnew))) { + qecbnew$Nb.Spirobranchus.lamarckii.total[[i]] <- ifelse(qecbnew$Nb.Spirobranchus.lamarckii.total[[i]] == "NaN", NA, qecbnew$Nb.Spirobranchus.lamarckii.total[[i]]) +} + +qecbnew$Nb.Spirobranchus.lamarckii.total <- as.integer(qecbnew$Nb.Spirobranchus.lamarckii.total) + +qecbnew$Nb.Spirobranchus.lamarckii.total.diff <- abs(qecbnew$Nb.Spirobranchus.lamarckii.total - qecbnew$Nb.Spirobranchus.lamarckii.total.ini) +spirobranchus_diff <- qecbnew[, c("Nb.Spirobranchus.lamarckii.1B", "Nb.Spirobranchus.lamarckii.2B", "Nb.Spirobranchus.lamarckii.3B", "Nb.Spirobranchus.lamarckii.4B", "Nb.Spirobranchus.lamarckii.5B", "Nb.Spirobranchus.lamarckii.total", "Nb.Spirobranchus.lamarckii.total.ini", "mean.x.100", "Nb.Spirobranchus.lamarckii.total.diff")] +spirobranchus_diff <- dplyr::arrange(spirobranchus_diff, desc(Nb.Spirobranchus.lamarckii.total.diff), mean.x.100) +spirobranchus_diff <- dplyr::arrange(dplyr::filter(spirobranchus_diff, Nb.Spirobranchus.lamarckii.total.diff != 0 & mean.x.100 != 0), desc(Nb.Spirobranchus.lamarckii.total.diff)) + +qecbnew <- subset(qecbnew, select = -c(Nb.Spirobranchus.lamarckii.total.ini, mean.x.100, Nb.Spirobranchus.lamarckii.total.diff)) + +rm(qecbnew_spirobranchus, spirobranchus, spirobranchus_data, spirobranchus_diff) + +# do the same for spirorbis + +qecbnew$Nb.spirorbis.total.ini <- qecbnew$Nb.spirorbis.total +qecbnew$Nb.spirorbis.total <- as.character(qecbnew$Nb.spirorbis.total) + +qecbnew_spirorbis <- (dplyr::filter(qecbnew, Nb.spirorbis.total %in% c(NA, "NaN", "Inf", "-Inf"))) +qecbnew_spirorbis[, c("Nb.spirorbis.1A", "Nb.spirorbis.2A", "Nb.spirorbis.3A", "Nb.spirorbis.4A", "Nb.spirorbis.5A")] <- sapply(qecbnew_spirorbis[, c("Nb.spirorbis.1A", "Nb.spirorbis.2A", "Nb.spirorbis.3A", "Nb.spirorbis.4A", "Nb.spirorbis.5A")], as.character) +(spirobranchus_data <- subset(qecbnew_spirorbis, !is.na(qecbnew_spirorbis$Nb.spirorbis.1A) || !is.na(qecbnew_spirorbis$Nb.spirorbis.2A) || !is.na(qecbnew_spirorbis$Nb.spirorbis.3A) || !is.na(qecbnew_spirorbis$Nb.spirorbis.4A) || !is.na(qecbnew_spirorbis$Nb.spirorbis.5A))[, c("site_year_month_day", "Nb.spirorbis.1A", "Nb.spirorbis.2A", "Nb.spirorbis.3A", "Nb.spirorbis.4A", "Nb.spirorbis.5A", "Nb.spirorbis.total")]) + +# In contrast to Spirobranchus data, no encoding issues for spirorbis data, cfr when sub-quadrat 1A-5A are ALL encoded, NA for total. + +# some more issues however with "x200"count data + +spirorbis <- subset(qecbnew, !is.na(qecbnew$Nb.spirorbis.1A) & !is.na(qecbnew$Nb.spirorbis.2A) & !is.na(qecbnew$Nb.spirorbis.3A) & !is.na(qecbnew$Nb.spirorbis.4A) & !is.na(qecbnew$Nb.spirorbis.5A) & !is.na(qecbnew$Nb.spirorbis.total))[, c("site_year_month_day", "Nb.spirorbis.1A", "Nb.spirorbis.2A", "Nb.spirorbis.3A", "Nb.spirorbis.4A", "Nb.spirorbis.5A", "Nb.spirorbis.total")] +for (i in c(1:nrow(spirorbis))) { + spirorbis$mean.x.200[[i]] <- sum(spirorbis[i, c(2:6)], na.rm = TRUE) / sum(!is.na(spirorbis[i, c(2:6)])) * 200 +} +spirorbis$mean.x.200 <- unlist(spirorbis$mean.x.200) +spirorbis$Nb.spirorbis.total <- as.numeric(spirorbis$Nb.spirorbis.total) +for (i in c(1:nrow(spirorbis))) { + spirorbis$diff[[i]] <- spirorbis[i, "Nb.spirorbis.total"] - spirorbis[i, "mean.x.200"] +} +spirorbis$diff <- abs(as.integer(spirorbis$diff)) +spirorbis <- dplyr::arrange(spirorbis, desc(diff), mean.x.200) +(gonb_ilotstmichel_2015_04_18 <- dplyr::filter(spirorbis, site_year_month_day == "GONB_IlotStMichel.2015.04.18")) +rm(gonb_ilotstmichel_2015_04_18) +spirorbis <- dplyr::arrange(dplyr::filter(spirorbis, diff != 0 & mean.x.200 != 0), desc(diff)) + +# check it all in the qecbnew df + +for (i in c(1:nrow(qecbnew))) { + qecbnew$mean.x.200[[i]] <- sum(qecbnew[i, c("Nb.spirorbis.1A", "Nb.spirorbis.2A", "Nb.spirorbis.3A", "Nb.spirorbis.4A", "Nb.spirorbis.5A")], na.rm = TRUE) / sum(!is.na(qecbnew[i, c("Nb.spirorbis.1A", "Nb.spirorbis.2A", "Nb.spirorbis.3A", "Nb.spirorbis.4A", "Nb.spirorbis.5A")])) * 200 +} # sum of only NAs/0 = NaN; so replace NaN by Na +qecbnew$mean.x.200 <- as.character(qecbnew$mean.x.200) + +for (i in c(1:nrow(qecbnew))) { + qecbnew$mean.x.200[[i]] <- ifelse(qecbnew$mean.x.200[[i]] == "NaN", NA, qecbnew$mean.x.200[[i]]) +} + +qecbnew$mean.x.200 <- as.integer(qecbnew$mean.x.200) + +qecbnew$Nb.spirorbis.total <- as.integer(qecbnew$Nb.spirorbis.total) +qecbnew$Nb.spirorbis.total.diff <- abs((qecbnew$Nb.spirorbis.total - qecbnew$mean.x.200)) +spirorbis_diff <- qecbnew[, c("Nb.spirorbis.1A", "Nb.spirorbis.2A", "Nb.spirorbis.3A", "Nb.spirorbis.4A", "Nb.spirorbis.5A", "Nb.spirorbis.total", "Nb.spirorbis.total.ini", "mean.x.200", "Nb.spirorbis.total.diff")] +spirorbis_diff <- dplyr::arrange(spirorbis_diff, desc(Nb.spirorbis.total.diff), mean.x.200) +spirorbis_diff <- dplyr::arrange(dplyr::filter(spirorbis_diff, Nb.spirorbis.total.diff != 0 & mean.x.200 != 0), desc(Nb.spirorbis.total.diff)) + +qecbnew$Nb.spirorbis.total <- ifelse(qecbnew$Nb.spirorbis.total.diff != 0 & qecbnew$mean.x.200 != 0, qecbnew$mean.x.200, qecbnew$Nb.spirorbis.total) +spirorbis_diff <- qecbnew[, c("Nb.spirorbis.1A", "Nb.spirorbis.2A", "Nb.spirorbis.3A", "Nb.spirorbis.4A", "Nb.spirorbis.5A", "Nb.spirorbis.total", "Nb.spirorbis.total.ini", "mean.x.200", "Nb.spirorbis.total.diff")] +spirorbis_diff$Nb.spirorbis.total.diff <- abs(as.integer(spirorbis_diff$Nb.spirorbis.total.diff)) +spirorbis_diff <- dplyr::arrange(spirorbis_diff, desc(Nb.spirorbis.total.diff), mean.x.200) +spirorbis_diff <- dplyr::arrange(dplyr::filter(spirorbis_diff, Nb.spirorbis.total.diff != 0 & mean.x.200 != 0), desc(Nb.spirorbis.total.diff)) +# ok, change made when data x 200 was not correct. + +# finally, change NA by mean.x200 for spirorbis total +qecbnew$Nb.spirorbis.total <- as.character(qecbnew$Nb.spirorbis.total) +for (i in c(1:nrow(qecbnew))) { + qecbnew$Nb.spirorbis.total[[i]] <- ifelse(qecbnew$Nb.spirorbis.total[[i]] %in% c(NA, "NaN", "Inf", "-Inf"), sum(qecbnew[i, c("Nb.spirorbis.1A", "Nb.spirorbis.2A", "Nb.spirorbis.3A", "Nb.spirorbis.4A", "Nb.spirorbis.5A")], na.rm = TRUE) / sum(!is.na(qecbnew[i, c("Nb.spirorbis.1A", "Nb.spirorbis.2A", "Nb.spirorbis.3A", "Nb.spirorbis.4A", "Nb.spirorbis.5A")])) * 200, qecbnew$Nb.spirorbis.total[[i]]) +} # sum of only NAs/0 = NaN; so replace NaN by Na + +for (i in c(1:nrow(qecbnew))) { + qecbnew$Nb.spirorbis.total[[i]] <- ifelse(qecbnew$Nb.spirorbis.total[[i]] == "NaN", NA, qecbnew$Nb.spirorbis.total[[i]]) +} + +qecbnew$Nb.spirorbis.total <- as.integer(qecbnew$Nb.spirorbis.total) + +qecbnew$Nb.spirorbis.total.diff <- abs(qecbnew$Nb.spirorbis.total - qecbnew$Nb.spirorbis.total.ini) +spirorbis_diff <- qecbnew[, c("Nb.spirorbis.1A", "Nb.spirorbis.2A", "Nb.spirorbis.3A", "Nb.spirorbis.4A", "Nb.spirorbis.5A", "Nb.spirorbis.total", "Nb.spirorbis.total.ini", "mean.x.200", "Nb.spirorbis.total.diff")] +spirorbis_diff <- dplyr::arrange(spirorbis_diff, desc(Nb.spirorbis.total.diff), mean.x.200) +spirorbis_diff <- dplyr::arrange(dplyr::filter(spirorbis_diff, Nb.spirorbis.total.diff != 0 & mean.x.200 != 0), desc(Nb.spirorbis.total.diff)) + +qecbnew <- subset(qecbnew, select = -c(Nb.spirorbis.total.ini, mean.x.200, Nb.spirorbis.total.diff)) + +rm(qecbnew_spirorbis, spirorbis, spirobranchus_data, spirorbis_diff, i) + + +# dplyr::filter for abnormal data, based on histogram distribution of data + +dplyr::filter(qecbnew, X..algues.brunes > 100)[, c("Site", "date_fiche", "Type.Bloc", "Numéro.Bloc.échantillon", "Face", "X..algues.brunes")] +qecbnew$X..algues.brunes <- ifelse(qecbnew$X..algues.brunes > 100, 100, qecbnew$X..algues.brunes) +dplyr::filter(qecbnew, X..algues.rouges > 100)[, c("Site", "date_fiche", "Type.Bloc", "Numéro.Bloc.échantillon", "Face", "X..algues.rouges")] +qecbnew$X..algues.rouges <- ifelse(qecbnew$X..algues.rouges > 100, 100, qecbnew$X..algues.rouges) + + +## SCRIPT I - NAs <- 0 ; cfr previous comment makes no sense to have NA encoded when the presence of an organism is in reality = 0 + +# We are facing an issues with NA observations, because either they were not measured/counted, then they are effectively NAs; or these NAs = indeed "0"; but I cannot have NAs for variables that are included in the index determination, cfr if 5+0 = 5, 5+NA = NA; see for example site_year_month_day == "ARMO_Bilfot.2014.04.28", Nb.Spirobranchus.lamarckii.total is NA ... +# I theregore change these NAs by 0 + +# replace NAs by "0" for variables used in qecb determination +qecbnew[, c("X..algues.brunes", + "X..algues.rouges", + "X..Lithophyllum", + "X..Cladophora", + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..algues.vertes", + "X..Roche.Nue", + "Nb.spirorbis.total", + "X..Balanes.Vivantes", + "Nb.Spirobranchus.lamarckii.total", + "X..Surface.Accolement")] <- lapply(qecbnew[, + c("X..algues.brunes", + "X..algues.rouges", + "X..Lithophyllum", + "X..Cladophora", + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..algues.vertes", + "X..Roche.Nue", + "Nb.spirorbis.total", + "X..Balanes.Vivantes", + "Nb.Spirobranchus.lamarckii.total", + "X..Surface.Accolement")], + function(x) replace(x, is.na(x), 0)) + +# and also replace NA for bivalve by 0 for EGMP and BASQ surveys cfr for accollement correction later on. + +qecbnew$X..Mytilus.sp. <- ifelse((substr(qecbnew$Site, 1, 4) %in% c("EGMP", "BASQ")) & is.na(qecbnew$X..Mytilus.sp.), 0, qecbnew$X..Mytilus.sp.) +qecbnew$Nb.Crassostrea.gigas <- ifelse((substr(qecbnew$Site, 1, 4) %in% c("EGMP", "BASQ")) & is.na(qecbnew$Nb.Crassostrea.gigas), 0, qecbnew$Nb.Crassostrea.gigas) +qecbnew$Nb.Ostrea.edulis <- ifelse((substr(qecbnew$Site, 1, 4) %in% c("EGMP", "BASQ")) & is.na(qecbnew$Nb.Ostrea.edulis), 0, qecbnew$Nb.Ostrea.edulis) + + +# add a region variable +region <- rep(NA, nrow(qecbnew)) +qecbnew <- tibble::add_column(qecbnew, region, .after = "Site_bis") +qecbnew$region <- ifelse(qecbnew$Site %in% c("EGMP_GroinCou", "EGMP_PasEmsembert", "EGMP_BreeBains", "EGMP_PerreAntiochat", "EGMP_Chassiron", "BASQ_FlotsBleusZP", "BASQ_FlotsBleusZF"), "EGMP.BASQ", "Bretagne") +rm(region) +qecbnew <- dplyr::arrange(qecbnew, region, site_year_month_day, Type.Bloc, Numéro.Bloc.échantillon, Face) + +# accolement function according to recent 'retournement' + +## before I go further ahead, I have to correct for surface d'accollement for several variable for BM.FI !! + +# not the same file name between script qecb script (qecbNew) and this script (qecbNew); doesn't matter, only appears here in the first dplyr::filter lines. + +qecbnew <- tibble::add_column(qecbnew, terri_ = substr(qecbnew$Site, 1, 4), .after = "Site_bis") + +qecbnew$X..Eponges_ini <- qecbnew$X..Eponges +qecbnew$X..Ascidies.Coloniales_ini <- qecbnew$X..Ascidies.Coloniales +qecbnew$X..Ascidies.Solitaires_ini <- qecbnew$X..Ascidies.Solitaires +qecbnew$X..Bryozoaires.Dresses_ini <- qecbnew$X..Bryozoaires.Dresses +qecbnew$X..Lithophyllum_ini <- qecbnew$X..Lithophyllum +qecbnew$X..Balanes.Vivantes_ini <- qecbnew$X..Balanes.Vivantes + +df_bm_fs <- qecbnew %>% dplyr::filter(Type.Bloc == "Bloc mobile" & Face == "face supérieure") +df_bm_fi <- qecbnew %>% dplyr::filter(Type.Bloc == "Bloc mobile" & Face == "face inférieure") +df_bf <- qecbnew %>% dplyr::filter(Type.Bloc != "Bloc mobile") + +`%notin%` <- Negate(`%in%`) + +acco_fct <- function(var_) { + + df_bm_fi$var_cor.acco. <<- NA + + for (i in c(1:nrow(df_bm_fi))) { + + df_bm_fi$var_cor.acco.[[i]] <<- if (df_bm_fi$terri_[[i]] %notin% c("EGMP", "BASQ")) { + ifelse(#df_$Couleur.dominante %in% c("Rouge", "Brune", "Brune-Rouge") || + df_bm_fs$Couleur.dominante[[i]] %in% c("Blanche", "Verte", "Blanche-Verte", "Colorée"), df_bm_fi[i, var_] / (100 - df_bm_fi$X..Surface.Accolement[[i]]) * 100, df_bm_fi[i, var_]) + } else { + ifelse(df_bm_fs$Couleur.dominante[[i]] %in% c("Blanche", "Verte", "Blanche-Verte", "Colorée") + & df_bm_fi$X..Surface.Accolement[[i]] != 0 # I have to use it in dplyr::filter this time as well for EGMP- BASQ (but not for Bretagne, although could be added, same result); identical/repeated measure for BM.FI and BM.FS + & df_bm_fs$X..Mytilus.sp.[[i]] == 0, df_bm_fi[i, var_] / (100 - df_bm_fi$X..Surface.Accolement[[i]]) * 100, df_bm_fi[i, var_]) + } + + } + +} + +# I would only consider colors in c("Rouge", "Brune", "Brune-Rouge") for BM.FI correction [ and not the series c("Blanche-Brune", "Rouge", "Brune", "Blanche-Rouge", "Brune-Rouge", "Rouge-Verte", "Brune-Verte") ] ; and for BM.FS, the list c("Blanche", "Verte", "Colorée") => we do the correction for BM.FI accollement based on BM.FS color !!! + + +# apply acco_fct to BM.FI variables + +apply_acco_fct <- function(var_) { + + show(sort(df_bm_fi[, var_], decreasing = TRUE, index.return = FALSE)[1:50]) + pre_ <- as.vector(df_bm_fi[, var_]) + acco_fct(var_) + df_bm_fi <<- tibble::add_column(df_bm_fi, var_cor. = df_bm_fi$var_cor.acco., .after = var_) + show(sort(df_bm_fi$var_cor., decreasing = TRUE, index.return = FALSE)[1:50]) + df_bm_fi$var_cor. <<- as.numeric(ifelse(as.character(df_bm_fi$var_cor.) %in% c(NA, "NaN", "-Inf", "Inf"), "0", as.character(df_bm_fi$var_cor.))) + df_bm_fi$var_cor. <<- ifelse(df_bm_fi$var_cor. > 100, 100, df_bm_fi$var_cor.) + show(sort(df_bm_fi$var_cor., decreasing = TRUE, index.return = FALSE)[1:50]) + show(length(na.omit(which(abs(as.vector(df_bm_fi$var_cor.) - pre_) != 0))) / na.omit(length(df_bm_fi$var_cor.)) * 100) + par(mfrow = c(1, 3)) + hist(pre_, main = var_, xlab = "pre-corection") + hist(df_bm_fi$var_cor., main = var_, xlab = "post-corection") + hist(df_bm_fi[as.vector(which(abs(as.vector(df_bm_fi$var_cor.) - pre_) != 0)), var_], main = var_, xlab = "diff. post-pre != 0") + par(mfrow = c(1, 1)) + df_bm_fi <<- df_bm_fi[, -which(names(df_bm_fi) %in% c(var_, "var_cor.acco."))] + colnames(df_bm_fi)[colnames(df_bm_fi) == "var_cor."] <<- var_ + + rm(pre_) + +} + +apply_acco_fct("X..Eponges") +apply_acco_fct("X..Ascidies.Coloniales") +apply_acco_fct("X..Ascidies.Solitaires") +apply_acco_fct("X..Bryozoaires.Dresses") +apply_acco_fct("X..Lithophyllum") +apply_acco_fct("X..Balanes.Vivantes") + +qecbnew <- dplyr::bind_rows(df_bm_fs, df_bm_fi) +qecbnew <- dplyr::bind_rows(qecbnew, df_bf) + +qecbnew <- dplyr::arrange(qecbnew, region, site_year_month_day, Type.Bloc, Numéro.Bloc.échantillon, Face) + +# do remove some more data ... +# "FINS_Quemenes.2020.10.16", bad encoding, I let know Anna Capietto to make changes => was corrected normally, so unactivate next time I download ESTAMP data +qecbnew <- dplyr::filter(qecbnew, site_year_month_day != "FINS_Quemenes.2020.10.16") + +# save the final qecbnew df_ + +qecb <- qecbnew + + +`%notin%` <- Negate(`%in%`) + +## reorder and/or create new variables + +# variable site_year_month_day moved for clarity purpose, not needed necessarily +qecb <- tibble::add_column(qecb, qecb$site_year_month_day, .after = "Site_bis") +qecb <- qecb[, -which(names(qecb) %in% c("site_year_month_day"))] +qecb <- dplyr::rename(qecb, site_year_month_day = `qecb$site_year_month_day`) + +# new variable period (nothing to see with the existing périod variable) +period <- rep(NA, nrow(qecb)) +qecb <- tibble::add_column(qecb, period, .after = "Day") +qecb$period <- ifelse(as.numeric(qecb$Month) < 7, "p1", "p2") +qecb$period <- as.factor(qecb$period) +rm(period) + +qecb <- dplyr::arrange(qecb, region, site_year_month_day, Type.Bloc, Numéro.Bloc.échantillon, Face) + +# NB: les infos surface d'accolement sont dupliquées de la face inf vers la face sup de blocs mobiles (même si peu de sens d'avoir cette info pour les face sup ...) +# NB: les data "Abondance ressources ciblées par pêcheurs à pied" présentes uniquement pour les blocs mobiles sont dupliquées entre face inf et face sup. + +## SCRIPT I - NAs <- 0 + +# already performed for part in the CB_qecb script ; but here I also consider mobile organisms, logical observation (or not) according to boulders, faces etc ... so more complete. Could be some kind of script fusion to only keep Na to 0 correction in one script, i.e. moving this script to the CB_qecb script ... + +bretagne_bm <- dplyr::filter(qecb, region == "Bretagne" & Type.Bloc == "Bloc mobile") +bretagne_bf <- dplyr::filter(qecb, region == "Bretagne" & Type.Bloc %in% c("Bloc fixé", "Roche en place")) +egmp_basq_bm <- dplyr::filter(qecb, region == "EGMP.BASQ" & Type.Bloc == "Bloc mobile") +egmp_basq_bf <- dplyr::filter(qecb, region == "EGMP.BASQ" & Type.Bloc %in% c("Bloc fixé", "Roche en place")) + +# replace NAs by "0" for variables used in qecb determination + +bretagne_bm[, c( + "X..algues.brunes", + "Strate.algues.brunes", + "X..algues.rouges", + "Strate.algues.rouges", + "X..algues.vertes", + "Strate.algues.vertes", + "X..Cladophora", + "X..Lithophyllum", + "X..Recouvrement.Sediment", # is NA, then replace by 0 as well because no sense to have a NA value for "% recouvrement sédiment" as well. + #"Type.Sediment", + "X..Roche.Nue", # is NA, then replace by 0 as well because no sense to have a NA value for "% roche nue" as well. + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "Nb.Phallusia.mamillata", + "Nb.Tethya.aurantium", + #"Nb.Spirobranchus.lamarckii.1B", + #"Nb.Spirobranchus.lamarckii.2B", + #"Nb.Spirobranchus.lamarckii.3B", + #"Nb.Spirobranchus.lamarckii.4B", + #"Nb.Spirobranchus.lamarckii.5B", + "Nb.Spirobranchus.lamarckii.total", + #"Nb.spirorbis.1A", + #"Nb.spirorbis.2A", + #"Nb.spirorbis.3A", + #"Nb.spirorbis.4A", + #"Nb.spirorbis.5A", + "Nb.spirorbis.total", + #.."Nb.Crassostrea.gigas", + #.."Nb.Ostrea.edulis", + #.."X..Mytilus.sp.", + #.."X..Hermelles", + #.."X..Hydraires", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..Balanes.Vivantes", + #"Commentaires.Avant", + "X..Surface.Accolement", # is NA, then replace by 0 as well because no sense to have a NA value for "% surface accolement" as well. + #"Type.sustrat.observé", + #"Commentaires", + "Nb.Cancer.pagurus..Tourteau.", + "Nb.Necora.puber..Etrille.", + "Nb.Carcinus.maenas..Crabe.vert.", + "Nb.Nucella.lapilus..Pourpre.", + #.."Nb.Eriphia.verrucosa..Crabe.verruqueux.", + #.."Nb.Octopus.vulgaris..Poulpe.", + "Nb.Galathea..Galathées.", + #.."Nb.Paracentrotus.lividus..Oursin.", + "Nb.Lophozozymus.incisus..ancien.Xantho.incisus.", + "Nb.Palaemon.sp..Crevette.bouquet.ou.crevette.rose.", + "Nb.Haliotis.tuberculata..Ormeau.", + #"Nb.Stramonita.haemastoma..Pourpre.bouche.de.sang.", + "Nb.Littorina.littorea..Bigorneau.", + "Nb.Xantho.pilipes..Xanthe.poilu.", + "Nb.Mimachlamys.varia..Pétoncle.noir." + ) + ] <- lapply(bretagne_bm[, c( + "X..algues.brunes", + "Strate.algues.brunes", + "X..algues.rouges", + "Strate.algues.rouges", + "X..algues.vertes", + "Strate.algues.vertes", + "X..Cladophora", + "X..Lithophyllum", + "X..Recouvrement.Sediment", # is NA, then replace by 0 as well because no sense to have a NA value for "% recouvrement sédiment" as well. + #"Type.Sediment", + "X..Roche.Nue", # is NA, then replace by 0 as well because no sense to have a NA value for "% roche nue" as well. + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "Nb.Phallusia.mamillata", + "Nb.Tethya.aurantium", + #"Nb.Spirobranchus.lamarckii.1B", + #"Nb.Spirobranchus.lamarckii.2B", + #"Nb.Spirobranchus.lamarckii.3B", + #"Nb.Spirobranchus.lamarckii.4B", + #"Nb.Spirobranchus.lamarckii.5B", + "Nb.Spirobranchus.lamarckii.total", + #"Nb.spirorbis.1A", + #"Nb.spirorbis.2A", + #"Nb.spirorbis.3A", + #"Nb.spirorbis.4A", + #"Nb.spirorbis.5A", + "Nb.spirorbis.total", + #.."Nb.Crassostrea.gigas", + #.."Nb.Ostrea.edulis", + #.."X..Mytilus.sp.", + #.."X..Hermelles", + #.."X..Hydraires", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..Balanes.Vivantes", + #"Commentaires.Avant", + "X..Surface.Accolement", # is NA, then replace by 0 as well because no sense to have a NA value for "% surface accolement" as well. + #"Type.sustrat.observé", + #"Commentaires", + "Nb.Cancer.pagurus..Tourteau.", + "Nb.Necora.puber..Etrille.", + "Nb.Carcinus.maenas..Crabe.vert.", + "Nb.Nucella.lapilus..Pourpre.", + #.."Nb.Eriphia.verrucosa..Crabe.verruqueux.", + #.."Nb.Octopus.vulgaris..Poulpe.", + "Nb.Galathea..Galathées.", + #.."Nb.Paracentrotus.lividus..Oursin.", + "Nb.Lophozozymus.incisus..ancien.Xantho.incisus.", + "Nb.Palaemon.sp..Crevette.bouquet.ou.crevette.rose.", + "Nb.Haliotis.tuberculata..Ormeau.", + #"Nb.Stramonita.haemastoma..Pourpre.bouche.de.sang.", + "Nb.Littorina.littorea..Bigorneau.", + "Nb.Xantho.pilipes..Xanthe.poilu.", + "Nb.Mimachlamys.varia..Pétoncle.noir." + ) + ], function(x) replace(x, is.na(x), 0)) + + + # bretagne_bf + bretagne_bf[, c( + "X..algues.brunes", + "Strate.algues.brunes", + "X..algues.rouges", + "Strate.algues.rouges", + "X..algues.vertes", + "Strate.algues.vertes", + "X..Cladophora", + "X..Lithophyllum", + "X..Recouvrement.Sediment", # is NA, then replace by 0 as well because no sense to have a NA value for "% recouvrement sédiment" as well. + #"Type.Sediment", + "X..Roche.Nue", # is NA, then replace by 0 as well because no sense to have a NA value for "% roche nue" as well. + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "Nb.Phallusia.mamillata", + "Nb.Tethya.aurantium", + #"Nb.Spirobranchus.lamarckii.1B", + #"Nb.Spirobranchus.lamarckii.2B", + #"Nb.Spirobranchus.lamarckii.3B", + #"Nb.Spirobranchus.lamarckii.4B", + #"Nb.Spirobranchus.lamarckii.5B", + "Nb.Spirobranchus.lamarckii.total", + #"Nb.spirorbis.1A", + #"Nb.spirorbis.2A", + #"Nb.spirorbis.3A", + #"Nb.spirorbis.4A", + #"Nb.spirorbis.5A", + "Nb.spirorbis.total", + #.."Nb.Crassostrea.gigas", + #.."Nb.Ostrea.edulis", + #.."X..Mytilus.sp.", + #.."X..Hermelles", + #.."X..Hydraires", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..Balanes.Vivantes", + #"Commentaires.Avant", + "X..Surface.Accolement"#, # is NA, then replace by 0 as well because no sense to have a NA value for "% surface accolement" as well. + #"Type.sustrat.observé", + #"Commentaires", + #."Nb.Cancer.pagurus..Tourteau.", + #.."Nb.Necora.puber..Etrille.", + #."Nb.Carcinus.maenas..Crabe.vert.", + #."Nb.Nucella.lapilus..Pourpre.", + #.."Nb.Eriphia.verrucosa..Crabe.verruqueux.", + #.."Nb.Octopus.vulgaris..Poulpe.", + #."Nb.Galathea..Galathées.", + #.."Nb.Paracentrotus.lividus..Oursin.", + #."Nb.Lophozozymus.incisus..ancien.Xantho.incisus.", + #."Nb.Palaemon.sp..Crevette.bouquet.ou.crevette.rose.", + #."Nb.Haliotis.tuberculata..Ormeau.", + #."Nb.Stramonita.haemastoma..Pourpre.bouche.de.sang.", + #."Nb.Littorina.littorea..Bigorneau.", + #."Nb.Xantho.pilipes..Xanthe.poilu.", + #."Nb.Mimachlamys.varia..Pétoncle.noir." + ) + ] <- lapply(bretagne_bf[, c( + "X..algues.brunes", + "Strate.algues.brunes", + "X..algues.rouges", + "Strate.algues.rouges", + "X..algues.vertes", + "Strate.algues.vertes", + "X..Cladophora", + "X..Lithophyllum", + "X..Recouvrement.Sediment", # is NA, then replace by 0 as well because no sense to have a NA value for "% recouvrement sédiment" as well. + #"Type.Sediment", + "X..Roche.Nue", # is NA, then replace by 0 as well because no sense to have a NA value for "% roche nue" as well. + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "Nb.Phallusia.mamillata", + "Nb.Tethya.aurantium", + #"Nb.Spirobranchus.lamarckii.1B", + #"Nb.Spirobranchus.lamarckii.2B", + #"Nb.Spirobranchus.lamarckii.3B", + #"Nb.Spirobranchus.lamarckii.4B", + #"Nb.Spirobranchus.lamarckii.5B", + "Nb.Spirobranchus.lamarckii.total", + #"Nb.spirorbis.1A", + #"Nb.spirorbis.2A", + #"Nb.spirorbis.3A", + #"Nb.spirorbis.4A", + #"Nb.spirorbis.5A", + "Nb.spirorbis.total", + #.."Nb.Crassostrea.gigas", + #.."Nb.Ostrea.edulis", + #.."X..Mytilus.sp.", + #.."X..Hermelles", + #.."X..Hydraires", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..Balanes.Vivantes", + #"Commentaires.Avant", + "X..Surface.Accolement"#, # is NA, then replace by 0 as well because no sense to have a NA value for "% surface accolement" as well. + #"Type.sustrat.observé", + #"Commentaires", + #."Nb.Cancer.pagurus..Tourteau.", + #.."Nb.Necora.puber..Etrille.", + #."Nb.Carcinus.maenas..Crabe.vert.", + #."Nb.Nucella.lapilus..Pourpre.", + #.."Nb.Eriphia.verrucosa..Crabe.verruqueux.", + #.."Nb.Octopus.vulgaris..Poulpe.", + #."Nb.Galathea..Galathées.", + #.."Nb.Paracentrotus.lividus..Oursin.", + #."Nb.Lophozozymus.incisus..ancien.Xantho.incisus.", + #."Nb.Palaemon.sp..Crevette.bouquet.ou.crevette.rose.", + #."Nb.Haliotis.tuberculata..Ormeau.", + #."Nb.Stramonita.haemastoma..Pourpre.bouche.de.sang.", + #."Nb.Littorina.littorea..Bigorneau.", + #."Nb.Xantho.pilipes..Xanthe.poilu.", + #."Nb.Mimachlamys.varia..Pétoncle.noir." + ) + ], function(x) replace(x, is.na(x), 0)) + + + # egmp_basq_bm + egmp_basq_bm[, c( + "X..algues.brunes", + "Strate.algues.brunes", + "X..algues.rouges", + "Strate.algues.rouges", + "X..algues.vertes", + "Strate.algues.vertes", + "X..Cladophora", + "X..Lithophyllum", + "X..Recouvrement.Sediment", # is NA, then replace by 0 as well because no sense to have a NA value for "% recouvrement sédiment" as well. + #"Type.Sediment", + "X..Roche.Nue", # is NA, then replace by 0 as well because no sense to have a NA value for "% roche nue" as well. + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "Nb.Phallusia.mamillata", + "Nb.Tethya.aurantium", + #"Nb.Spirobranchus.lamarckii.1B", + #"Nb.Spirobranchus.lamarckii.2B", + #"Nb.Spirobranchus.lamarckii.3B", + #"Nb.Spirobranchus.lamarckii.4B", + #"Nb.Spirobranchus.lamarckii.5B", + "Nb.Spirobranchus.lamarckii.total", + #"Nb.spirorbis.1A", + #"Nb.spirorbis.2A", + #"Nb.spirorbis.3A", + #"Nb.spirorbis.4A", + #"Nb.spirorbis.5A", + "Nb.spirorbis.total", + "Nb.Crassostrea.gigas", + "Nb.Ostrea.edulis", + "X..Mytilus.sp.", + "X..Hermelles", + "X..Hydraires", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..Balanes.Vivantes", + #"Commentaires.Avant", + "X..Surface.Accolement", # is NA, then replace by 0 as well because no sense to have a NA value for "% surface accolement" as well. + #"Type.sustrat.observé", + #"Commentaires", + "Nb.Cancer.pagurus..Tourteau.", + "Nb.Necora.puber..Etrille.", + "Nb.Carcinus.maenas..Crabe.vert.", + "Nb.Nucella.lapilus..Pourpre.", + "Nb.Eriphia.verrucosa..Crabe.verruqueux.", + "Nb.Octopus.vulgaris..Poulpe.", + "Nb.Galathea..Galathées.", + "Nb.Paracentrotus.lividus..Oursin.", + "Nb.Lophozozymus.incisus..ancien.Xantho.incisus.", + "Nb.Palaemon.sp..Crevette.bouquet.ou.crevette.rose.", + "Nb.Haliotis.tuberculata..Ormeau.", + "Nb.Stramonita.haemastoma..Pourpre.bouche.de.sang.", + "Nb.Littorina.littorea..Bigorneau.", + "Nb.Xantho.pilipes..Xanthe.poilu.", + "Nb.Mimachlamys.varia..Pétoncle.noir." + ) + ] <- lapply(egmp_basq_bm[, c( + "X..algues.brunes", + "Strate.algues.brunes", + "X..algues.rouges", + "Strate.algues.rouges", + "X..algues.vertes", + "Strate.algues.vertes", + "X..Cladophora", + "X..Lithophyllum", + "X..Recouvrement.Sediment", # is NA, then replace by 0 as well because no sense to have a NA value for "% recouvrement sédiment" as well. + #"Type.Sediment", + "X..Roche.Nue", # is NA, then replace by 0 as well because no sense to have a NA value for "% roche nue" as well. + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "Nb.Phallusia.mamillata", + "Nb.Tethya.aurantium", + #"Nb.Spirobranchus.lamarckii.1B", + #"Nb.Spirobranchus.lamarckii.2B", + #"Nb.Spirobranchus.lamarckii.3B", + #"Nb.Spirobranchus.lamarckii.4B", + #"Nb.Spirobranchus.lamarckii.5B", + "Nb.Spirobranchus.lamarckii.total", + #"Nb.spirorbis.1A", + #"Nb.spirorbis.2A", + #"Nb.spirorbis.3A", + #"Nb.spirorbis.4A", + #"Nb.spirorbis.5A", + "Nb.spirorbis.total", + "Nb.Crassostrea.gigas", + "Nb.Ostrea.edulis", + "X..Mytilus.sp.", + "X..Hermelles", + "X..Hydraires", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..Balanes.Vivantes", + #"Commentaires.Avant", + "X..Surface.Accolement", # is NA, then replace by 0 as well because no sense to have a NA value for "% surface accolement" as well. + #"Type.sustrat.observé", + #"Commentaires", + "Nb.Cancer.pagurus..Tourteau.", + "Nb.Necora.puber..Etrille.", + "Nb.Carcinus.maenas..Crabe.vert.", + "Nb.Nucella.lapilus..Pourpre.", + "Nb.Eriphia.verrucosa..Crabe.verruqueux.", + "Nb.Octopus.vulgaris..Poulpe.", + "Nb.Galathea..Galathées.", + "Nb.Paracentrotus.lividus..Oursin.", + "Nb.Lophozozymus.incisus..ancien.Xantho.incisus.", + "Nb.Palaemon.sp..Crevette.bouquet.ou.crevette.rose.", + "Nb.Haliotis.tuberculata..Ormeau.", + "Nb.Stramonita.haemastoma..Pourpre.bouche.de.sang.", + "Nb.Littorina.littorea..Bigorneau.", + "Nb.Xantho.pilipes..Xanthe.poilu.", + "Nb.Mimachlamys.varia..Pétoncle.noir." + ) + ], function(x) replace(x, is.na(x), 0)) + + + # egmp_basq_bf + egmp_basq_bf[, c( + "X..algues.brunes", + "Strate.algues.brunes", + "X..algues.rouges", + "Strate.algues.rouges", + "X..algues.vertes", + "Strate.algues.vertes", + "X..Cladophora", + "X..Lithophyllum", + "X..Recouvrement.Sediment", # is NA, then replace by 0 as well because no sense to have a NA value for "% recouvrement sédiment" as well. + #"Type.Sediment", + "X..Roche.Nue", # is NA, then replace by 0 as well because no sense to have a NA value for "% roche nue" as well. + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "Nb.Phallusia.mamillata", + "Nb.Tethya.aurantium", + #"Nb.Spirobranchus.lamarckii.1B", + #"Nb.Spirobranchus.lamarckii.2B", + #"Nb.Spirobranchus.lamarckii.3B", + #"Nb.Spirobranchus.lamarckii.4B", + #"Nb.Spirobranchus.lamarckii.5B", + "Nb.Spirobranchus.lamarckii.total", + #"Nb.spirorbis.1A", + #"Nb.spirorbis.2A", + #"Nb.spirorbis.3A", + #"Nb.spirorbis.4A", + #"Nb.spirorbis.5A", + "Nb.spirorbis.total", + "Nb.Crassostrea.gigas", + "Nb.Ostrea.edulis", + "X..Mytilus.sp.", + "X..Hermelles", + "X..Hydraires", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..Balanes.Vivantes", + #"Commentaires.Avant", + "X..Surface.Accolement"#, # is NA, then replace by 0 as well because no sense to have a NA value for "% surface accolement" as well. + #"Type.sustrat.observé", + #"Commentaires", + #."Nb.Cancer.pagurus..Tourteau.", + #.."Nb.Necora.puber..Etrille.", + #."Nb.Carcinus.maenas..Crabe.vert.", + #."Nb.Nucella.lapilus..Pourpre.", + #.."Nb.Eriphia.verrucosa..Crabe.verruqueux.", + #.."Nb.Octopus.vulgaris..Poulpe.", + #."Nb.Galathea..Galathées.", + #.."Nb.Paracentrotus.lividus..Oursin.", + #."Nb.Lophozozymus.incisus..ancien.Xantho.incisus.", + #."Nb.Palaemon.sp..Crevette.bouquet.ou.crevette.rose.", + #."Nb.Haliotis.tuberculata..Ormeau.", + #."Nb.Stramonita.haemastoma..Pourpre.bouche.de.sang.", + #."Nb.Littorina.littorea..Bigorneau.", + #."Nb.Xantho.pilipes..Xanthe.poilu.", + #."Nb.Mimachlamys.varia..Pétoncle.noir." + ) + ] <- lapply(egmp_basq_bf[, c( + "X..algues.brunes", + "Strate.algues.brunes", + "X..algues.rouges", + "Strate.algues.rouges", + "X..algues.vertes", + "Strate.algues.vertes", + "X..Cladophora", + "X..Lithophyllum", + "X..Recouvrement.Sediment", # is NA, then replace by 0 as well because no sense to have a NA value for "% recouvrement sédiment" as well. + #"Type.Sediment", + "X..Roche.Nue", # is NA, then replace by 0 as well because no sense to have a NA value for "% roche nue" as well. + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "Nb.Phallusia.mamillata", + "Nb.Tethya.aurantium", + #"Nb.Spirobranchus.lamarckii.1B", + #"Nb.Spirobranchus.lamarckii.2B", + #"Nb.Spirobranchus.lamarckii.3B", + #"Nb.Spirobranchus.lamarckii.4B", + #"Nb.Spirobranchus.lamarckii.5B", + "Nb.Spirobranchus.lamarckii.total", + #"Nb.spirorbis.1A", + #"Nb.spirorbis.2A", + #"Nb.spirorbis.3A", + #"Nb.spirorbis.4A", + #"Nb.spirorbis.5A", + "Nb.spirorbis.total", + "Nb.Crassostrea.gigas", + "Nb.Ostrea.edulis", + "X..Mytilus.sp.", + "X..Hermelles", + "X..Hydraires", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..Balanes.Vivantes", + #"Commentaires.Avant", + "X..Surface.Accolement"#, # is NA, then replace by 0 as well because no sense to have a NA value for "% surface accolement" as well. + #"Type.sustrat.observé", + #"Commentaires", + #."Nb.Cancer.pagurus..Tourteau.", + #.."Nb.Necora.puber..Etrille.", + #."Nb.Carcinus.maenas..Crabe.vert.", + #."Nb.Nucella.lapilus..Pourpre.", + #.."Nb.Eriphia.verrucosa..Crabe.verruqueux.", + #.."Nb.Octopus.vulgaris..Poulpe.", + #."Nb.Galathea..Galathées.", + #.."Nb.Paracentrotus.lividus..Oursin.", + #."Nb.Lophozozymus.incisus..ancien.Xantho.incisus.", + #."Nb.Palaemon.sp..Crevette.bouquet.ou.crevette.rose.", + #."Nb.Haliotis.tuberculata..Ormeau.", + #."Nb.Stramonita.haemastoma..Pourpre.bouche.de.sang.", + #."Nb.Littorina.littorea..Bigorneau.", + #."Nb.Xantho.pilipes..Xanthe.poilu.", + #."Nb.Mimachlamys.varia..Pétoncle.noir." + ) + ], function(x) replace(x, is.na(x), 0)) + + +# merge dfs. +qecbnato0 <- dplyr::bind_rows(bretagne_bm, bretagne_bf) +qecbnato0 <- dplyr::bind_rows(qecbnato0, egmp_basq_bm) +qecbnato0 <- dplyr::bind_rows(qecbnato0, egmp_basq_bf) + +qecbnato0 <- dplyr::arrange(qecbnato0, region, site_year_month_day, Type.Bloc, Numéro.Bloc.échantillon, Face) + +rm(bretagne_bm, bretagne_bf, egmp_basq_bm, egmp_basq_bf) + + +## analyse matricielle + +# NB some variables were dplyr::renamed or created, cfr I originally merged qecb and ivr data in below script to do some correlation analysis. This is not the case anymore, so no more merging anymore. + +qecbnato0 <- tibble::add_column(qecbnato0, region.site_year_month_day = paste0(qecbnato0$region, qecbnato0$site_year_month_day), .before = "region") + + +numero_quadrat <- stringr::str_sub(qecbnato0$quadrat_bis, start = -1) +qecbnato0 <- tibble::add_column(qecbnato0, numero_quadrat, .after = "quadrat_bis") +rm(numero_quadrat) +qecbnato0$numero_quadrat <- as.integer(qecbnato0$numero_quadrat) + + +qecbnato0$Year <- as.integer(qecbnato0$Year) +qecbnato0$Month <- as.integer(qecbnato0$Month) +qecbnato0$Day <- as.integer(qecbnato0$Day) + +############################################################ +#!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!! +# Anna still hasn't corrected for boulder nb in FINS_Quemenes.2020.10.16 data encoding ! removed from the df_ +qecbnato0 <- qecbnato0 %>% dplyr::filter(site_year_month_day != "FINS_Quemenes.2020.10.16") +############################################################ + +# what to do with spirorbes & Nb.Spirobranchus.lamarckii.total? log10 transformation + +qecbnato0 <- tibble::add_column(qecbnato0, log10.Nb.spirorbis.total = log10(qecbnato0$Nb.spirorbis.total + 1), .after = "Nb.spirorbis.total") +qecbnato0 <- tibble::add_column(qecbnato0, log10.Nb.Spirobranchus.lamarckii.total = log10(qecbnato0$Nb.Spirobranchus.lamarckii.total + 1), .after = "Nb.Spirobranchus.lamarckii.total") + +saveRDS(qecbnato0, "qecbnato0.RDS") + + +############################################################### +# # +# Start dissimilarity calculation with some data handling # +# # +############################################################### + +# first, create vector (4) for qecb and fishing by region (same as above) + +bret_egmp_basq_qecb <- c( + "X..algues.brunes", + "X..algues.rouges", + "X..algues.vertes", + "X..Cladophora", + "X..Lithophyllum", + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "Nb.Phallusia.mamillata", + "Nb.Tethya.aurantium", + "Nb.Spirobranchus.lamarckii.total", + "Nb.spirorbis.total", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..Balanes.Vivantes" + #, "X..Recouvrement.Sediment" + #, "X..Roche.Nue" + #, "X..Surface.Accolement" + ) + +egmp_basq_qecb <- c("Nb.Crassostrea.gigas", "Nb.Ostrea.edulis", "X..Mytilus.sp.", "X..Hermelles", "X..Hydraires") + +bret_egmp_basq_fishing <- c("Nb.Cancer.pagurus..Tourteau.", + "Nb.Necora.puber..Etrille.", + "Nb.Carcinus.maenas..Crabe.vert.", + "Nb.Nucella.lapilus..Pourpre.", + "Nb.Galathea..Galathées.", + "Nb.Lophozozymus.incisus..ancien.Xantho.incisus.", + "Nb.Palaemon.sp..Crevette.bouquet.ou.crevette.rose.", + "Nb.Haliotis.tuberculata..Ormeau.", + "Nb.Littorina.littorea..Bigorneau.", + "Nb.Xantho.pilipes..Xanthe.poilu.", + "Nb.Mimachlamys.varia..Pétoncle.noir.") + +egmp_basq_fishing <- c("Nb.Eriphia.verrucosa..Crabe.verruqueux.", "Nb.Octopus.vulgaris..Poulpe.", "Nb.Paracentrotus.lividus..Oursin.", "Nb.Stramonita.haemastoma..Pourpre.bouche.de.sang.") + +# here I can choose to either replace spirorbis and/or spirobranchus by their log10 transformation in bret_egmp_basq_qecb vector +bret_egmp_basq_qecb <- replace(bret_egmp_basq_qecb, bret_egmp_basq_qecb == "Nb.spirorbis.total", "log10.Nb.spirorbis.total") +saveRDS(bret_egmp_basq_qecb, "bret_egmp_basq_qecb.RDS") + + +############################################################# +# # +# Compute dissimilarity # +# # +############################################################# +### determination of coefficient of dissimilarity face sup mobile bloc vs fixed bloc + +# loop in a fct + +matri_fct_bmf <- function(data, conca) { + + matri_df <- data + + for (x in c(1:length(unique(matri_df$site_year_month_day)))) { + + qecbnato0_x <- matri_df %>% dplyr::filter(site_year_month_day == unique(matri_df$site_year_month_day)[[x]]) + + rownames(qecbnato0_x) <- paste0(qecbnato0_x$Type.Bloc, "_", qecbnato0_x$Face, "_", qecbnato0_x$Numéro.Bloc.échantillon, "_", qecbnato0_x$quadrat_bis) + + + mtxdis <- vegan::vegdist( + sqrt(qecbnato0_x[, conca]), #Transform your species abundance data_ Typically, raw abundances are transformed prior to analysis. Usually you will use square root, fourth-root, log(X+1), or presence-absence (square root being least extreme, P/A being most). I would start with square root. (https://stats.stackexchange.com/questions/234495/double-zeroes-problem-with-euclidean-distance-and-abundance-data-is-the-proble) + + na.rm = TRUE, + method = "bray" #Construct species abundance dissimilarity matrices with Bray-Curtis. If your data contains samples that are all-zero you will run into the double zero problem. This can be overcome by using a zero-adjusted Bray-Curtis coefficient, which is sometimes referred to as a 'dummy variable' which damps down the similarity fluctuations between samples that are both zero (undefined). => see below for zero-adjusted Bray-Curtis coefficient ; #another possibility, sqrt + 1 ?? + ) + + + #https://rdrr.io/github/phytomosaic/ecole/man/bray0.html + # mtxdis <- ecole::bray0( + # sqrt + # (qecbnato0_x[,conca]), na.rm = TRUE) + + expand.grid(mtxdis) + + mtxdisdf_ <- as.data.frame(as.matrix(mtxdis)) + + a_ <- NA + b_ <- NA + c_ <- NA + d_ <- NA + e_ <- NA + f_ <- NA + g_ <- NA + h_ <- NA + i_ <- NA + j_ <- NA + k_ <- NA + l_ <- NA + m_ <- NA + n_ <- NA + + for (z in c(1:nrow(mtxdisdf_))) { + + a_[[z]] <- (paste0(rownames(mtxdisdf_[z + 1, ]), " & ", ifelse(nrow(mtxdisdf_) >= 1, colnames(mtxdisdf_[1]), NA))) + b_[[z]] <- (paste0(rownames(mtxdisdf_[z + 2, ]), " & ", ifelse(nrow(mtxdisdf_) >= 2, colnames(mtxdisdf_[2]), NA))) + c_[[z]] <- (paste0(rownames(mtxdisdf_[z + 3, ]), " & ", ifelse(nrow(mtxdisdf_) >= 3, colnames(mtxdisdf_[3]), NA))) + d_[[z]] <- (paste0(rownames(mtxdisdf_[z + 4, ]), " & ", ifelse(nrow(mtxdisdf_) >= 4, colnames(mtxdisdf_[4]), NA))) + e_[[z]] <- (paste0(rownames(mtxdisdf_[z + 5, ]), " & ", ifelse(nrow(mtxdisdf_) >= 5, colnames(mtxdisdf_[5]), NA))) + f_[[z]] <- (paste0(rownames(mtxdisdf_[z + 6, ]), " & ", ifelse(nrow(mtxdisdf_) >= 6, colnames(mtxdisdf_[6]), NA))) + g_[[z]] <- (paste0(rownames(mtxdisdf_[z + 7, ]), " & ", ifelse(nrow(mtxdisdf_) >= 7, colnames(mtxdisdf_[7]), NA))) + h_[[z]] <- (paste0(rownames(mtxdisdf_[z + 8, ]), " & ", ifelse(nrow(mtxdisdf_) >= 8, colnames(mtxdisdf_[8]), NA))) + i_[[z]] <- (paste0(rownames(mtxdisdf_[z + 9, ]), " & ", ifelse(nrow(mtxdisdf_) >= 9, colnames(mtxdisdf_[9]), NA))) + j_[[z]] <- (paste0(rownames(mtxdisdf_[z + 10, ]), " & ", ifelse(nrow(mtxdisdf_) >= 10, colnames(mtxdisdf_[10]), NA))) + k_[[z]] <- (paste0(rownames(mtxdisdf_[z + 11, ]), " & ", ifelse(nrow(mtxdisdf_) >= 11, colnames(mtxdisdf_[11]), NA))) + l_[[z]] <- (paste0(rownames(mtxdisdf_[z + 12, ]), " & ", ifelse(nrow(mtxdisdf_) >= 12, colnames(mtxdisdf_[12]), NA))) + m_[[z]] <- (paste0(rownames(mtxdisdf_[z + 13, ]), " & ", ifelse(nrow(mtxdisdf_) >= 13, colnames(mtxdisdf_[13]), NA))) + n_[[z]] <- (paste0(rownames(mtxdisdf_[z + 14, ]), " & ", ifelse(nrow(mtxdisdf_) >= 14, colnames(mtxdisdf_[14]), NA))) + + } + + rm(z) + + y <- length(a_) - (ifelse(nrow(mtxdisdf_) >= 1, 1, nrow(mtxdisdf_))) + a_ <- a_[1:y] + y <- length(b_) - (ifelse(nrow(mtxdisdf_) >= 2, 2, nrow(mtxdisdf_))) + b_ <- b_[1:y] + y <- length(c_) - (ifelse(nrow(mtxdisdf_) >= 3, 3, nrow(mtxdisdf_))) + c_ <- c_[1:y] + y <- length(d_) - (ifelse(nrow(mtxdisdf_) >= 4, 4, nrow(mtxdisdf_))) + d_ <- d_[1:y] + y <- length(e_) - (ifelse(nrow(mtxdisdf_) >= 5, 5, nrow(mtxdisdf_))) + e_ <- e_[1:y] + y <- length(f_) - (ifelse(nrow(mtxdisdf_) >= 6, 6, nrow(mtxdisdf_))) + f_ <- f_[1:y] + y <- length(g_) - (ifelse(nrow(mtxdisdf_) >= 7, 7, nrow(mtxdisdf_))) + g_ <- g_[1:y] + y <- length(h_) - (ifelse(nrow(mtxdisdf_) >= 8, 8, nrow(mtxdisdf_))) + h_ <- h_[1:y] + y <- length(i_) - (ifelse(nrow(mtxdisdf_) >= 9, 9, nrow(mtxdisdf_))) + i_ <- i_[1:y] + y <- length(j_) - (ifelse(nrow(mtxdisdf_) >= 10, 10, nrow(mtxdisdf_))) + j_ <- j_[1:y] + y <- length(k_) - (ifelse(nrow(mtxdisdf_) >= 11, 11, nrow(mtxdisdf_))) + k_ <- k_[1:y] + y <- length(l_) - (ifelse(nrow(mtxdisdf_) >= 12, 12, nrow(mtxdisdf_))) + l_ <- l_[1:y] + y <- length(m_) - (ifelse(nrow(mtxdisdf_) >= 13, 13, nrow(mtxdisdf_))) + m_ <- m_[1:y] + y <- length(n_) - (ifelse(nrow(mtxdisdf_) >= 14, 14, nrow(mtxdisdf_))) + n_ <- n_[1:y] + + rm(y) + + name_ <- c(a_, b_, c_, d_, e_, f_, g_, h_, i_, j_, k_, l_, m_, n_) + df_ <- data.frame(expand.grid(mtxdis), name_[1:nrow(expand.grid(mtxdis))]) + names(df_) <- c("dist.", "name_") + + rm(a_, b_, c_, d_, e_, f_, g_, h_, i_, j_, k_, l_, m_, n_) + rm(name_) + + q_ <- strsplit(df_$name_, " & ") + mat_ <- matrix(unlist(q_), ncol = 2, byrow = TRUE) + q_df_ <- as.data.frame(matrix(unlist(q_), ncol = 2, byrow = TRUE)) + df_ <- dplyr::bind_cols(df_, q_df_) + + rm(q_, mat_, q_df_) + + split_ <- strsplit(df_$V1, "_") + v1_split_ <- as.data.frame(matrix(unlist(split_), ncol = 4, byrow = TRUE)) + split_ <- strsplit(df_$V2, "_") + v2_split_ <- as.data.frame(matrix(unlist(split_), ncol = 4, byrow = TRUE)) + + df_ <- dplyr::bind_cols(df_, v1_split_) + df_ <- dplyr::bind_cols(df_, v2_split_) + df_red_ <- subset(df_, V4...8 == V4...12 & V1...5 != V1...9) + site_year_month_day <- rep(unique(qecbnato0_x$site_year_month_day), nrow(df_red_)) + + df_red_ <- tibble::add_column(df_red_, site_year_month_day, .before = "dist.") + + rm(split_, v1_split_, v2_split_) + rm(mtxdis, mtxdisdf_, df_, site_year_month_day) + + matri_list[[x]] <- df_red_ + matri_list <<- matri_list + + rm(df_red_, qecbnato0_x, x) + + } + + matri_df <- do.call("rbind", matri_list) + + names(matri_df) <- c("site_year_month_day", "dist.", "name_", "name_left", "name_right", "Type.Bloc.left", "Face.left", "Numéro.Bloc.échantillon.left", "Quadrat.left", "Type.Bloc.right", "Face.right", "Numéro.Bloc.échantillon.right", "Quadrat.right") + + matri_df <<- matri_df + + hist(matri_df$dist.) + +} + +data_ <- dplyr::filter(qecbnato0, Face == "face supérieure") +data_$Type.Bloc <- ifelse(as.character(data_$Type.Bloc) == "Roche en place", "Bloc fixé", as.character(data_$Type.Bloc)) +matri_list <- vector("list", length(unique(data_$site_year_month_day))) + +matri_fct_bmf(data = data_, conca = c(bret_egmp_basq_qecb, egmp_basq_qecb)) +hist(matri_df$dist., main = c(paste("Histo. of Bray (0-adjusted) dist. dissimilarity measures"), paste(" (sqrt transfo) - BMfs vs BF -"))) + +matri_full_bm_bf_fs <- matri_df + + +rm(data_, matri_df, matri_list) + + +### determination of coefficient of dissimilarity between blocs mobiles face sup vs face inf. + +# loop in a fct + +matri_fct_bmm <- function(data, conca) { + + matri_df <- data + + for (x in c(1:length(unique(matri_df$site_year_month_day)))) { + + qecbnato0_x <- matri_df %>% dplyr::filter(site_year_month_day == unique(matri_df$site_year_month_day)[[x]]) + + rownames(qecbnato0_x) <- paste0(qecbnato0_x$Type.Bloc, "_", qecbnato0_x$Face, "_", qecbnato0_x$Numéro.Bloc.échantillon, "_", qecbnato0_x$quadrat_bis) + + + mtxdis <- vegan::vegdist( + sqrt(qecbnato0_x[, c(bret_egmp_basq_qecb)]), #Transform your species abundance data_ Typically, raw abundances are transformed prior to analysis. Usually you will use square root, fourth-root, log(X+1), or presence-absence (square root being least extreme, P/A being most). I would start with square root. (https://stats.stackexchange.com/questions/234495/double-zeroes-problem-with-euclidean-distance-and-abundance-data-is-the-proble) + na.rm = TRUE, + method = "bray" #Construct species abundance dissimilarity matrices with Bray-Curtis. If your data contains samples that are all-zero you will run into the double zero problem. This can be overcome by using a zero-adjusted Bray-Curtis coefficient, which is sometimes referred to as a 'dummy variable' which damps down the similarity fluctuations between samples that are both zero (undefined). => see below for zero-adjusted Bray-Curtis coefficient ; #another possibility, sqrt + 1 ?? + ) + + + #mtxdis <- ecole::bray0( + # sqrt(qecbnato0_x[, conca]), na.rm = TRUE) + + + expand.grid(mtxdis) + + mtxdisdf_ <- as.data.frame(as.matrix(mtxdis)) + + a_ <- NA + b_ <- NA + c_ <- NA + d_ <- NA + e_ <- NA + f_ <- NA + g_ <- NA + h_ <- NA + i_ <- NA + j_ <- NA + k_ <- NA + l_ <- NA + m_ <- NA + n_ <- NA + o_ <- NA + p_ <- NA + q_ <- NA + r_ <- NA + s_ <- NA + + for (z in c(1:nrow(mtxdisdf_))) { + + a_[[z]] <- (paste0(rownames(mtxdisdf_[z + 1, ]), " & ", ifelse(nrow(mtxdisdf_) >= 1, colnames(mtxdisdf_[1]), NA))) + b_[[z]] <- (paste0(rownames(mtxdisdf_[z + 2, ]), " & ", ifelse(nrow(mtxdisdf_) >= 2, colnames(mtxdisdf_[2]), NA))) + c_[[z]] <- (paste0(rownames(mtxdisdf_[z + 3, ]), " & ", ifelse(nrow(mtxdisdf_) >= 3, colnames(mtxdisdf_[3]), NA))) + d_[[z]] <- (paste0(rownames(mtxdisdf_[z + 4, ]), " & ", ifelse(nrow(mtxdisdf_) >= 4, colnames(mtxdisdf_[4]), NA))) + e_[[z]] <- (paste0(rownames(mtxdisdf_[z + 5, ]), " & ", ifelse(nrow(mtxdisdf_) >= 5, colnames(mtxdisdf_[5]), NA))) + f_[[z]] <- (paste0(rownames(mtxdisdf_[z + 6, ]), " & ", ifelse(nrow(mtxdisdf_) >= 6, colnames(mtxdisdf_[6]), NA))) + g_[[z]] <- (paste0(rownames(mtxdisdf_[z + 7, ]), " & ", ifelse(nrow(mtxdisdf_) >= 7, colnames(mtxdisdf_[7]), NA))) + h_[[z]] <- (paste0(rownames(mtxdisdf_[z + 8, ]), " & ", ifelse(nrow(mtxdisdf_) >= 8, colnames(mtxdisdf_[8]), NA))) + i_[[z]] <- (paste0(rownames(mtxdisdf_[z + 9, ]), " & ", ifelse(nrow(mtxdisdf_) >= 9, colnames(mtxdisdf_[9]), NA))) + j_[[z]] <- (paste0(rownames(mtxdisdf_[z + 10, ]), " & ", ifelse(nrow(mtxdisdf_) >= 10, colnames(mtxdisdf_[10]), NA))) + k_[[z]] <- (paste0(rownames(mtxdisdf_[z + 11, ]), " & ", ifelse(nrow(mtxdisdf_) >= 11, colnames(mtxdisdf_[11]), NA))) + l_[[z]] <- (paste0(rownames(mtxdisdf_[z + 12, ]), " & ", ifelse(nrow(mtxdisdf_) >= 12, colnames(mtxdisdf_[12]), NA))) + m_[[z]] <- (paste0(rownames(mtxdisdf_[z + 13, ]), " & ", ifelse(nrow(mtxdisdf_) >= 13, colnames(mtxdisdf_[13]), NA))) + n_[[z]] <- (paste0(rownames(mtxdisdf_[z + 14, ]), " & ", ifelse(nrow(mtxdisdf_) >= 14, colnames(mtxdisdf_[14]), NA))) + o_[[z]] <- (paste0(rownames(mtxdisdf_[z + 15, ]), " & ", ifelse(nrow(mtxdisdf_) >= 15, colnames(mtxdisdf_[15]), NA))) + p_[[z]] <- (paste0(rownames(mtxdisdf_[z + 16, ]), " & ", ifelse(nrow(mtxdisdf_) >= 16, colnames(mtxdisdf_[16]), NA))) + q_[[z]] <- (paste0(rownames(mtxdisdf_[z + 17, ]), " & ", ifelse(nrow(mtxdisdf_) >= 17, colnames(mtxdisdf_[17]), NA))) + r_[[z]] <- (paste0(rownames(mtxdisdf_[z + 18, ]), " & ", ifelse(nrow(mtxdisdf_) >= 18, colnames(mtxdisdf_[18]), NA))) + s_[[z]] <- (paste0(rownames(mtxdisdf_[z + 19, ]), " & ", ifelse(nrow(mtxdisdf_) >= 19, colnames(mtxdisdf_[19]), NA))) + + } + + rm(z) + + y <- length(a_) - (ifelse(nrow(mtxdisdf_) >= 1, 1, nrow(mtxdisdf_))) + a_ <- a_[1:y] + y <- length(b_) - (ifelse(nrow(mtxdisdf_) >= 2, 2, nrow(mtxdisdf_))) + b_ <- b_[1:y] + y <- length(c_) - (ifelse(nrow(mtxdisdf_) >= 3, 3, nrow(mtxdisdf_))) + c_ <- c_[1:y] + y <- length(d_) - (ifelse(nrow(mtxdisdf_) >= 4, 4, nrow(mtxdisdf_))) + d_ <- d_[1:y] + y <- length(e_) - (ifelse(nrow(mtxdisdf_) >= 5, 5, nrow(mtxdisdf_))) + e_ <- e_[1:y] + y <- length(f_) - (ifelse(nrow(mtxdisdf_) >= 6, 6, nrow(mtxdisdf_))) + f_ <- f_[1:y] + y <- length(g_) - (ifelse(nrow(mtxdisdf_) >= 7, 7, nrow(mtxdisdf_))) + g_ <- g_[1:y] + y <- length(h_) - (ifelse(nrow(mtxdisdf_) >= 8, 8, nrow(mtxdisdf_))) + h_ <- h_[1:y] + y <- length(i_) - (ifelse(nrow(mtxdisdf_) >= 9, 9, nrow(mtxdisdf_))) + i_ <- i_[1:y] + y <- length(j_) - (ifelse(nrow(mtxdisdf_) >= 10, 10, nrow(mtxdisdf_))) + j_ <- j_[1:y] + y <- length(k_) - (ifelse(nrow(mtxdisdf_) >= 11, 11, nrow(mtxdisdf_))) + k_ <- k_[1:y] + y <- length(l_) - (ifelse(nrow(mtxdisdf_) >= 12, 12, nrow(mtxdisdf_))) + l_ <- l_[1:y] + y <- length(m_) - (ifelse(nrow(mtxdisdf_) >= 13, 13, nrow(mtxdisdf_))) + m_ <- m_[1:y] + y <- length(n_) - (ifelse(nrow(mtxdisdf_) >= 14, 14, nrow(mtxdisdf_))) + n_ <- n_[1:y] + y <- length(o_) - (ifelse(nrow(mtxdisdf_) >= 15, 15, nrow(mtxdisdf_))) + o_ <- o_[1:y] + y <- length(p_) - (ifelse(nrow(mtxdisdf_) >= 16, 16, nrow(mtxdisdf_))) + p_ <- p_[1:y] + y <- length(q_) - (ifelse(nrow(mtxdisdf_) >= 17, 17, nrow(mtxdisdf_))) + q_ <- q_[1:y] + y <- length(r_) - (ifelse(nrow(mtxdisdf_) >= 18, 18, nrow(mtxdisdf_))) + r_ <- r_[1:y] + y <- length(s_) - (ifelse(nrow(mtxdisdf_) >= 19, 19, nrow(mtxdisdf_))) + s_ <- s_[1:y] + + rm(y) + + name_ <- c(a_, b_, c_, d_, e_, f_, g_, h_, i_, j_, k_, l_, m_, n_, o_, p_, q_, r_, s_) + df_ <- data.frame(expand.grid(mtxdis), name_[1:seq_len(nrow(expand.grid(mtxdis)))]) + names(df_) <- c("dist.", "name_") + + rm(a_, b_, c_, d_, e_, f_, g_, h_, i_, j_, k_, l_, m_, n_, o_, p_, q_, r_, s_) + rm(name_) + + q_ <- strsplit(df_$name_, " & ") + mat_ <- matrix(unlist(q_), ncol = 2, byrow = TRUE) + q_df_ <- as.data.frame(matrix(unlist(q_), ncol = 2, byrow = TRUE)) + df_ <- dplyr::bind_cols(df_, q_df_) + + rm(q_, mat_, q_df_) + + split_ <- strsplit(df_$V1, "_") + v1_split_ <- as.data.frame(matrix(unlist(split_), ncol = 4, byrow = TRUE)) + split_ <- strsplit(df_$V2, "_") + v2_split_ <- as.data.frame(matrix(unlist(split_), ncol = 4, byrow = TRUE)) + + df_ <- dplyr::bind_cols(df_, v1_split_) + df_ <- dplyr::bind_cols(df_, v2_split_) + df_red_ <- subset(df_, V4...8 == V4...12 & V3...7 == V3...11) + site_year_month_day <- rep(unique(qecbnato0_x$site_year_month_day), nrow(df_red_)) + + df_red_ <- tibble::add_column(df_red_, site_year_month_day, .before = "dist.") + + rm(split_, v1_split_, v2_split_) + rm(mtxdis, mtxdisdf_, df_, site_year_month_day) + + matri_list[[x]] <- df_red_ + matri_list <<- matri_list + + rm(df_red_, qecbnato0_x, x) + + } + + matri_df <- do.call("rbind", matri_list) + + names(matri_df) <- c("site_year_month_day", "dist.", "name_", "name_left", "name_right", "Type.Bloc.left", "Face.left", "Numéro.Bloc.échantillon.left", "Quadrat.left", "Type.Bloc.right", "Face.right", "Numéro.Bloc.échantillon.right", "Quadrat.right") + + matri_df <<- matri_df + + hist(matri_df$dist.) + +} + +data_ <- dplyr::filter(qecbnato0, Type.Bloc == "Bloc mobile") +matri_list <- vector("list", length(unique(data_$site_year_month_day))) + +matri_fct_bmm(data = data_, conca = c(bret_egmp_basq_qecb, egmp_basq_qecb)) +hist(matri_df$dist., main = c(paste("Histo. of Bray (0-adjusted) dist. dissimilarity measures"), paste(" (sqrt transfo) - BMfs vs BMfi -"))) + +matri_full_bm_bf_fi <- matri_df + +rm(data_, matri_df, matri_list) + + +############################################################# +# # +# Plot dissimilarity # +# # +############################################################# +## plot + +# activate line + +matri_full_bm_bf_fs <- tidyr::separate(matri_full_bm_bf_fs, "site_year_month_day", into = c("departement", "Site", "Year", "Month", "Day"), remove = FALSE) +matri_full_bm_bf_fs$Site <- paste0(matri_full_bm_bf_fs$departement, "_", matri_full_bm_bf_fs$Site) +matri_full_bm_bf_fs <- subset(matri_full_bm_bf_fs, select = - c(departement)) + +matri_full_bm_bf_fs <- tibble::add_column(matri_full_bm_bf_fs, Date = as.Date(paste0(matri_full_bm_bf_fs$Year, "-", matri_full_bm_bf_fs$Month, "-", matri_full_bm_bf_fs$Day), origin = "1970-01-01"), .after = "Site") +matri_full_bm_bf_fs$Site <- as.factor(matri_full_bm_bf_fs$Site) + +matri_full_bm_bf_fi <- tidyr::separate(matri_full_bm_bf_fi, "site_year_month_day", into = c("departement", "Site", "Year", "Month", "Day"), remove = FALSE) +matri_full_bm_bf_fi$Site <- paste0(matri_full_bm_bf_fi$departement, "_", matri_full_bm_bf_fi$Site) +matri_full_bm_bf_fi <- subset(matri_full_bm_bf_fi, select = - c(departement)) +matri_full_bm_bf_fi <- tibble::add_column(matri_full_bm_bf_fi, Date = as.Date(paste0(matri_full_bm_bf_fi$Year, "-", matri_full_bm_bf_fi$Month, "-", matri_full_bm_bf_fi$Day), origin = "1970-01-01"), .after = "Site") +matri_full_bm_bf_fi$Site <- as.factor(matri_full_bm_bf_fi$Site) + +# if error message "Error in .Call.graphics(C_palette2, .Call(C_palette2, NULL)) : invalid graphics state" + + +bf_fs_plot <- ggplot2::ggplot(matri_full_bm_bf_fs, ggplot2::aes(x = Site, y = dist.)) + + ggplot2::geom_boxplot() + + #geom_jitter(shape = 16, position=position_jitter(0.2)) + + ggplot2::xlab("") + + ggplot2::ylab("distance diss. BM.BF_FS") + + ggplot2::theme(axis.text.x = ggplot2::element_text(angle = 90, vjust = 0.5, hjust = 1)) + +ggplot2::ggsave("distance_diss_BF_FS.png", bf_fs_plot, height = 4.5, width = 4) + +fs_fi_plot <- ggplot2::ggplot(matri_full_bm_bf_fi, ggplot2::aes(x = Site, y = dist.)) + + ggplot2::geom_boxplot() + + #geom_jitter(shape = 16, position=position_jitter(0.2)) + + ggplot2::xlab("") + + ggplot2::ylab("distance diss. BM_FS.FI") + + ggplot2::theme(axis.text.x = ggplot2::element_text(angle = 90, vjust = 0.5, hjust = 1)) + +ggplot2::ggsave("distance_diss_FS_FI.png", fs_fi_plot, height = 4.5, width = 4) + +# issue with type de bloc, numéro de bloc and quadrat for df_ BM.BF_FS, cfr df_ left vs right variables doesn't give the right combination (variables with left vs right label in names come from the dissimilarity coefficient functions). +matri_full_bm_bf_fs$Quadrat <- NA +for (i in c(1:seq_len(nrow(matri_full_bm_bf_fs)))) { + ifelse(matri_full_bm_bf_fs$Type.Bloc.left[i] == "Bloc mobile", matri_full_bm_bf_fs$Quadrat[i] <- matri_full_bm_bf_fs$Quadrat.left[i], matri_full_bm_bf_fs$Quadrat[i] <- matri_full_bm_bf_fs$Quadrat.right[i]) +} +matri_full_bm_bf_fs$Numéro.Bloc <- NA +for (i in c(1:seq_len(nrow(matri_full_bm_bf_fs)))) { + ifelse(matri_full_bm_bf_fs$Type.Bloc.left[i] == "Bloc mobile", matri_full_bm_bf_fs$Numéro.Bloc[i] <- matri_full_bm_bf_fs$Numéro.Bloc.échantillon.left[i], matri_full_bm_bf_fs$Numéro.Bloc[i] <- matri_full_bm_bf_fs$Numéro.Bloc.échantillon.right[i]) +} + +matri_full_bm_bf_fs <- tibble::add_column(matri_full_bm_bf_fs, site_year_month_day.q_BMnb = paste0(matri_full_bm_bf_fs$site_year_month_day, "_", matri_full_bm_bf_fs$Quadrat, "_", matri_full_bm_bf_fs$Numéro.Bloc), .after = "site_year_month_day") +matri_full_bm_bf_fi <- tibble::add_column(matri_full_bm_bf_fi, site_year_month_day.q_BMnb = paste0(matri_full_bm_bf_fi$site_year_month_day, "_", matri_full_bm_bf_fi$Quadrat.left, "_", matri_full_bm_bf_fi$Numéro.Bloc.échantillon.left), .after = "site_year_month_day") + +colnames(matri_full_bm_bf_fs) <- paste("BM.BF_FS", colnames(matri_full_bm_bf_fs), sep = "_") +matri_full_bm_bf_fs <- dplyr::rename(matri_full_bm_bf_fs, site_year_month_day.q_BMnb = BM.BF_FS_site_year_month_day.q_BMnb) +colnames(matri_full_bm_bf_fi) <- paste("BM_FS.FI", colnames(matri_full_bm_bf_fi), sep = "_") +matri_full_bm_bf_fi <- dplyr::rename(matri_full_bm_bf_fi, site_year_month_day.q_BMnb = BM_FS.FI_site_year_month_day.q_BMnb) + +matri_full <- dplyr::full_join(matri_full_bm_bf_fs[, c("site_year_month_day.q_BMnb", "BM.BF_FS_dist.")], matri_full_bm_bf_fi[, c("site_year_month_day.q_BMnb", "BM_FS.FI_dist.")]) + +matri_full <- tidyr::separate(matri_full, "site_year_month_day.q_BMnb", into = c("departement", "Site", "Year", "Month", "Day", "Quadrat", "Bloc Mobile Number"), remove = FALSE) +matri_full$Site <- paste0(matri_full$departement, "_", matri_full$Site) +matri_full <- subset(matri_full, select = - c(departement)) +matri_full <- tibble::add_column(matri_full, Date = as.Date(paste0(matri_full$Year, "-", matri_full$Month, "-", matri_full$Day), origin = "1970-01-01"), .after = "Site") + +# Name for report/plot + +matri_full <- tibble::add_column(matri_full, Site_bis = matri_full$Site, .after = "Site") + +matri_full$Site_bis <- ifelse(matri_full$Site == "GDMO_Locmariaquer", "Locmariaquer", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "GDMO_BegLann", "Beg Lann", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "FOUR_PlateauFour", "Plateau du Four", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "EGMP_GroinCou", "Groin du Cou", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "EGMP_PasEmsembert", "Le Pas d'Emsembert", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "EGMP_BreeBains", "La Brée-les-Bains", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "EGMP_PerreAntiochat", "Le Perré d'Antiochat", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "EGMP_Chassiron", "Chassiron", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "BASQ_FlotsBleusZP", "Les Flots Bleus / zone pêcheurs", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "BASQ_FlotsBleusZF", "Les Flots Bleus / zone familles", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "GONB_IlotStMichel", "Îlot Saint-Michel", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "FINS_Quemenes", "Quéménès", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "FINS_SeinGoulenez", "Île de Sein - Goulenez", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "FINS_SeinKilaourou", "Île de Sein - Kilaourou", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "ARMO_Verdelet", "Îlot du Verdelet", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "ARMO_Piegu", "Piégu", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "ARMO_Bilfot", "Pointe de Bilfot", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "ARMO_IlePlate", "Île Plate", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "PDMO_Perharidy", "Perharidy", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "BRES_Keraliou", "Keraliou", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "FINS_Mousterlin", "Pointe de Mousterlin", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "FINS_StNicolasGlenan", "Saint-Nicolas des Glénan", matri_full$Site_bis) +matri_full$Site_bis <- ifelse(matri_full$Site == "FINS_AnseRoz", "Pointe de l'Anse du Roz", matri_full$Site_bis) + +saveRDS(matri_full, "matri_full.RDS") + +############################################################# +# # +# Plot the dissimilarity per site # +# # +############################################################# +## plot dissimilarity coefficient + +matri_full$Year <- as.integer(matri_full$Year) +matri_full$Month <- as.integer(matri_full$Month) +matri_full$Day <- as.integer(matri_full$Day) + + +## BM_FS.FI_dist => mobile boulder upper vs lower faces + +# Stats + +bm_fs_fi_dist_stat <- matri_full %>% dplyr::group_by(Site, Site_bis, Date, Year, Month, Day) %>% dplyr::summarize(BM_FS.FI_dist.moy = mean(BM_FS.FI_dist., na.rm = TRUE), BM_FS.FI_dist.et = sd(BM_FS.FI_dist., na.rm = TRUE), BM_FS.FI_dist.med = median(BM_FS.FI_dist., na.rm = TRUE), BM_FS.FI_dist.min = min(BM_FS.FI_dist., na.rm = TRUE), BM_FS.FI_dist.max = max(BM_FS.FI_dist., na.rm = TRUE), nb. = dplyr::n(), nb.notNa = sum(!is.na(BM_FS.FI_dist.))) + +bm_fs_fi_dist_stat <- dplyr::ungroup(bm_fs_fi_dist_stat) + +# Quality scale based on quartiles + +if (choice == "N") { + one <- round(mean(unlist(dplyr::filter(matri_full, BM_FS.FI_dist. <= quantile(matri_full$BM_FS.FI_dist., 0.25, na.rm = TRUE))["BM_FS.FI_dist."])), digits = 3) + two <- round(mean(unlist(dplyr::filter(matri_full, BM_FS.FI_dist. > quantile(matri_full$BM_FS.FI_dist., 0.25, na.rm = TRUE) & BM_FS.FI_dist. <= quantile(matri_full$BM_FS.FI_dist., 0.5, na.rm = TRUE))["BM_FS.FI_dist."])), digits = 3) + three <- round(mean(unlist(dplyr::filter(matri_full, BM_FS.FI_dist. > quantile(matri_full$BM_FS.FI_dist., 0.5, na.rm = TRUE) & BM_FS.FI_dist. <= quantile(matri_full$BM_FS.FI_dist., 0.75, na.rm = TRUE))["BM_FS.FI_dist."])), digits = 3) + four <- round(mean(unlist(dplyr::filter(matri_full, BM_FS.FI_dist. > quantile(matri_full$BM_FS.FI_dist., 0.75, na.rm = TRUE))["BM_FS.FI_dist."])), digits = 3) +}else { + one <- 0.47 + two <- 0.7 + three <- 0.83 + four <- 0.98 +} + +val_xmax <- as.Date(paste0(as.character(choice_date + 1), "-01-01"), origin = "1970-01-01") + +for (i in c(1:length(unique(bm_fs_fi_dist_stat$Site)))) { + + df1 <- dplyr::filter(bm_fs_fi_dist_stat, bm_fs_fi_dist_stat$Site == unique(bm_fs_fi_dist_stat$Site)[i]) + + bm_fs_fi_plot <- ggplot2::ggplot() + + ggplot2::geom_point(ggplot2::aes(x = bm_fs_fi_dist_stat$Date, y = bm_fs_fi_dist_stat$BM_FS.FI_dist.med), col = "grey") + + ggplot2::geom_rect(ggplot2::aes(xmin = as.Date("2013-01-01", origin = "1970-01-01"), xmax = val_xmax, ymin = - 0.1, ymax = one, fill = "blue"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = as.Date("2013-01-01", origin = "1970-01-01"), xmax = val_xmax, ymin = one, ymax = two, fill = "green"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = as.Date("2013-01-01", origin = "1970-01-01"), xmax = val_xmax, ymin = two, ymax = three, fill = "yellow"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = as.Date("2013-01-01", origin = "1970-01-01"), xmax = val_xmax, ymin = three, ymax = four, fill = "orange"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = as.Date("2013-01-01", origin = "1970-01-01"), xmax = val_xmax, ymin = four, ymax = 1.1, fill = "red"), alpha = 0.3) + + ggplot2::scale_fill_manual(values = c("#FF0000", "#F59404", "#18E125", "#1A1AE8", "#FAFA15")) + + ggplot2::geom_pointrange(ggplot2::aes(x = df1$Date, y = df1$BM_FS.FI_dist.med, ymin = df1$BM_FS.FI_dist.min, ymax = df1$BM_FS.FI_dist.max), col = "black") + + ggplot2::xlab("Date") + + ggplot2::ylab("Coef dissim BM FS-FI") + + ggplot2::ggtitle(unique(df1$Site_bis)) + + ggplot2::theme(axis.text.x = ggplot2::element_text(angle = 90, vjust = 0.5, hjust = 1), legend.position = "none") + +ggplot2::ggsave(paste0("fs_fi_", df1$Site, ".png"), device = "png", bm_fs_fi_plot, height = 3, width = 3.5) + +} + +rm(df1, four, i, one, three, two, xmax_, xmin_, ymax_, ymin_) + + +## BM.BF_FS_dist => mobile boulder vs fixed boulder upper faces + +# Stats + +bm_bf_fs_dist_stat <- matri_full %>% dplyr::group_by(Site, Site_bis, Date, Year, Month, Day) %>% dplyr::summarize(BM.BF_FS_dist.moy = mean(BM.BF_FS_dist., na.rm = TRUE), BM.BF_FS_dist.et = sd(BM.BF_FS_dist., na.rm = TRUE), BM.BF_FS_dist.med = median(BM.BF_FS_dist., na.rm = TRUE), BM.BF_FS_dist.min = min(BM.BF_FS_dist., na.rm = TRUE), BM.BF_FS_dist.max = max(BM.BF_FS_dist., na.rm = TRUE), nb. = dplyr::n(), nb.notNa = sum(!is.na(BM.BF_FS_dist.))) + +bm_bf_fs_dist_stat <- dplyr::ungroup(bm_bf_fs_dist_stat) + +# Quality scale based on quartiles + +if (choice == "N") { + one <- round(mean(unlist(dplyr::filter(matri_full, BM.BF_FS_dist. <= quantile(matri_full$BM.BF_FS_dist., 0.25, na.rm = TRUE))["BM.BF_FS_dist."])), digits = 3) + two <- round(mean(unlist(dplyr::filter(matri_full, BM.BF_FS_dist. > quantile(matri_full$BM.BF_FS_dist., 0.25, na.rm = TRUE) & BM.BF_FS_dist. <= quantile(matri_full$BM.BF_FS_dist., 0.5, na.rm = TRUE))["BM.BF_FS_dist."])), digits = 3) + three <- round(mean(unlist(dplyr::filter(matri_full, BM.BF_FS_dist. > quantile(matri_full$BM.BF_FS_dist., 0.5, na.rm = TRUE) & BM.BF_FS_dist. <= quantile(matri_full$BM.BF_FS_dist., 0.75, na.rm = TRUE))["BM.BF_FS_dist."])), digits = 3) + four <- round(mean(unlist(dplyr::filter(matri_full, BM.BF_FS_dist. > quantile(matri_full$BM.BF_FS_dist., 0.75, na.rm = TRUE))["BM.BF_FS_dist."])), digits = 3) + +}else { + one <- 0.19 + two <- 0.32 + three <- 0.455 + four <- 0.735 +} +# Plot + +for (i in c(1:length(unique(bm_bf_fs_dist_stat$Site)))) { + + df1 <- dplyr::filter(bm_bf_fs_dist_stat, bm_bf_fs_dist_stat$Site == unique(bm_bf_fs_dist_stat$Site)[i]) + + bm_bf_fs_plot <- ggplot2::ggplot() + + ggplot2::geom_point(ggplot2::aes(x = bm_bf_fs_dist_stat$Date, y = bm_bf_fs_dist_stat$BM.BF_FS_dist.med), col = "grey") + + ggplot2::geom_rect(ggplot2::aes(xmin = as.Date("2013-01-01", origin = "1970-01-01"), xmax = val_xmax, ymin = - 0.1, ymax = one, fill = "red"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = as.Date("2013-01-01", origin = "1970-01-01"), xmax = val_xmax, ymin = one, ymax = two, fill = "orange"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = as.Date("2013-01-01", origin = "1970-01-01"), xmax = val_xmax, ymin = two, ymax = three, fill = "yellow"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = as.Date("2013-01-01", origin = "1970-01-01"), xmax = val_xmax, ymin = three, ymax = four, fill = "green"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = as.Date("2013-01-01", origin = "1970-01-01"), xmax = val_xmax, ymin = four, ymax = 1.1, fill = "blue"), alpha = 0.3) + + ggplot2::scale_fill_manual(values = c("#FF0000", "#F59404", "#18E125", "#1A1AE8", "#FAFA15")) + + ggplot2::geom_pointrange(ggplot2::aes(x = df1$Date, y = df1$BM.BF_FS_dist.med, ymin = df1$BM.BF_FS_dist.min, ymax = df1$BM.BF_FS_dist.max), col = "black") + + ggplot2::xlab("Date") + + ggplot2::ylab("Coef dissim BM-BF FS") + + ggplot2::ggtitle(unique(df1$Site_bis)) + + ggplot2::theme(axis.text.x = ggplot2::element_text(angle = 90, vjust = 0.5, hjust = 1), legend.position = "none") + +ggplot2::ggsave(paste0("bm_bf_", df1$Site, ".png"), device = "png", bm_bf_fs_plot, height = 3, width = 3.5) + +} + +rm(df1, four, i, one, three, two, xmax_, xmin_, ymax_, ymin_)
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/cb_ivr.r Wed Jan 04 13:21:41 2023 +0000 @@ -0,0 +1,321 @@ +# author: "Jonathan Richir" +# date: "19 April 2021" ) + +#Rscript + +############################### +## ## +############################### + +#####Packages : dplyr +# tidyr +# readr +# writexl +# stringr +# readxl +# tibble +# lubridate +# cowplot +# magrittr +# rmarkdown +library(magrittr) +#####Load arguments + +args <- commandArgs(trailingOnly = TRUE) + +### Import data + +if (length(args) < 1) { + stop("This tool needs at least 1 argument") +}else { + fiche_val <- args[1] + input_data <- args[2] + +} + +############################################################# +# # +# Load and clean the data # +# # +############################################################# +### load ivr data + +ivr <- read.csv2(input_data, header = FALSE, fileEncoding = "Latin1") +names_ <- as.vector(unlist(ivr[1, ])) +names_ <- gsub(" ", ".", names_) +colnames(ivr) <- names_ +ivr <- ivr[-1, ] +ivr <- ivr[, -17] + +# NB inversion between id and ID.Fiche variable names +ivr <- dplyr::rename(ivr, XX = ID.Fiche) +ivr <- dplyr::rename(ivr, ID.Fiche = id) +ivr <- dplyr::rename(ivr, id = XX) + + +### load excel files "Fiche terrain" the metadata + +fiche <- read.csv2(fiche_val, fileEncoding = "Latin1") # fileEncoding = "Latin1" cfr é in variable names + +date_fiche <- as.Date(stringr::str_sub(fiche$date.sortie, end = 10), origin = "1970-01-01") +fiche <- tibble::add_column(fiche, date_fiche, .after = "date.sortie") +rm(date_fiche) + +## ivr vs fiche terrain +ivr$id <- as.numeric(ivr[, c("id")]) + +fiche_red <- dplyr::filter(fiche, fiche$ID.Fiche %in% unique(ivr[, c("id")])) + +id_count <- ivr %>% dplyr::group_by(id) %>% dplyr::count() +id_count <- dplyr::rename(id_count, "ID.Fiche" = "id") +id_count <- dplyr::ungroup(id_count) +id_count <- as.data.frame(id_count) + +fiche_red <- dplyr::left_join(fiche_red, id_count) + +# rep fiche terrain information +fiche_expanded <- fiche_red[rep(row.names(fiche_red), fiche_red$n), 1:ncol(fiche_red)] +fiche_expanded <- dplyr::rename(fiche_expanded, "id" = "ID.Fiche") + +## merge ivr data and ficheterrain information +ivr <- dplyr::bind_cols(ivr, fiche_expanded) +ivr <- dplyr::rename(ivr, "id.ivr" = "id...1") +ivr <- dplyr::rename(ivr, "id.fiche" = "id...17") + +rm(fiche_expanded, fiche_red, id_count) + +ivr <- ivr %>% tidyr::separate(date_fiche, c("Year", "Month", "Day"), sep = "-", remove = FALSE) + +## I create two new variables for Site names, one for data analysis and one for data reporting. Only works for actual ivr df with 22 sites ! + +# Name for data analysis +ivr <- tibble::add_column(ivr, Site = ivr$zone.habitat, .after = "ID.Fiche") +ivr$Site <- gsub(pattern = " \\(champ de blocs\\)", replacement = "", ivr$Site) +ivr$Site <- gsub(pattern = " \\(champ blocs\\)", replacement = "", ivr$Site) + +for (x in seq_along(ivr$Site)) { + if (grepl(pattern = "Locmariaquer", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "GDMO_Locmariaquer" + } else if (grepl(pattern = "Beg Lann", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "GDMO_BegLann" + } else if (grepl(pattern = "Plateau du Four", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "FOUR_PlateauFour" + } else if (grepl(pattern = "Grouin", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "EGMP_GroinCou" + } else if (grepl(pattern = "Ensembert", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "EGMP_PasEmsembert" + } else if (grepl(pattern = "Brée-les-Bains", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "EGMP_BreeBains" + } else if (grepl(pattern = "Antiochat", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "EGMP_PerreAntiochat" + } else if (grepl(pattern = "Chassiron", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "EGMP_Chassiron" + } else if (grepl(pattern = "zone p", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "BASQ_FlotsBleusZP" + } else if (grepl(pattern = "zone f", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "BASQ_FlotsBleusZF" + } else if (grepl(pattern = "Saint-Michel", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "GONB_IlotStMichel" + } else if (grepl(pattern = "Quéménès", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "FINS_Quemenes" + } else if (grepl(pattern = "Goulenez", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "FINS_SeinGoulenez" + } else if (grepl(pattern = "Kilaourou", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "FINS_SeinKilaourou" + } else if (grepl(pattern = "Verdelet", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "ARMO_Verdelet" + } else if (grepl(pattern = "Piégu", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "ARMO_Piegu" + } else if (grepl(pattern = "Bilfot", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "ARMO_Bilfot" + } else if (grepl(pattern = "Plate", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "ARMO_IlePlate" + } else if (grepl(pattern = "Perharidy", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "PDMO_Perharidy" + } else if (grepl(pattern = "Keraliou", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "BRES_Keraliou" + } else if (grepl(pattern = "Mousterlin", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "FINS_Mousterlin" + } else if (grepl(pattern = "Nicolas", ivr$Site[x]) == TRUE) { + ivr$Site[x] <- "FINS_StNicolasGlenan" + } +if (grepl(pattern = "Roz", ivr$site[x]) == TRUE) { + ivr$Site[x] <- "FINS_AnseRoz" +} +} + +# Name for report/plot + +ivr <- tibble::add_column(ivr, Site_bis = ivr$Site, .after = "Site") + +ivr$Site_bis <- ifelse(ivr$Site == "GDMO_Locmariaquer", "Locmariaquer", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "GDMO_BegLann", "Beg Lann", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "FOUR_PlateauFour", "Plateau du Four", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "EGMP_GroinCou", "Grouin du Cou", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "EGMP_PasEmsembert", "Le Pas d'Emsembert", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "EGMP_BreeBains", "La Brée-les-Bains", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "EGMP_PerreAntiochat", "Le Perré d'Antiochat", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "EGMP_Chassiron", "Chassiron", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "BASQ_FlotsBleusZP", "Les Flots Bleus / zone pêcheurs", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "BASQ_FlotsBleusZF", "Les Flots Bleus / zone familles", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "GONB_IlotStMichel", "Îlot Saint-Michel", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "FINS_Quemenes", "Quéménès", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "FINS_SeinGoulenez", "Île de Sein - Goulenez", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "FINS_SeinKilaourou", "Île de Sein - Kilaourou", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "ARMO_Verdelet", "Îlot du Verdelet", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "ARMO_Piegu", "Piégu", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "ARMO_Bilfot", "Pointe de Bilfot", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "ARMO_IlePlate", "Île Plate", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "PDMO_Perharidy", "Perharidy", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "BRES_Keraliou", "Keraliou", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "FINS_Mousterlin", "Pointe de Mousterlin", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "FINS_StNicolasGlenan", "Saint-Nicolas des Glénan", ivr$Site_bis) +ivr$Site_bis <- ifelse(ivr$Site == "FINS_AnseRoz", "Pointe de l'Anse du Roz", ivr$Site_bis) + +## change some variable format to integer +ivr$Nb.Blocs.Non.Retournes <- as.integer(ivr$Nb.Blocs.Non.Retournes) +ivr$Nb.Blocs.Retournes <- as.integer(ivr$Nb.Blocs.Retournes) + +ivr$Year <- as.integer(ivr$Year) +ivr$Month <- as.integer(ivr$Month) +ivr$Day <- as.integer(ivr$Day) +ivr$Numero.Quadrat <- as.integer(ivr$Numero.Quadrat) + + +## save the final, commplete ivr df. + +ivr <- ivr[, c(19:54, 1:18)] + + +## percentage of unturned vs overturned boulders and IVR previous 0-5 discrete scale values calculation + +# create two new variables first +site_year_month_day <- paste0(ivr$Site, ".", gsub("-", ".", as.character(ivr$date_fiche))) +ivr <- tibble::add_column(ivr, site_year_month_day, .after = "Site_bis") +rm(site_year_month_day) + +site_year_month_day_qdnb <- paste0(ivr$Site, ".", gsub("-", ".", as.character(ivr$Date)), ".", ivr$Numero.Quadrat) +ivr <- tibble::add_column(ivr, site_year_month_day_qdnb, .after = "site_year_month_day") +rm(site_year_month_day_qdnb) + +ivr <- dplyr::arrange(ivr, Site, Year, Month, Numero.Quadrat) + +# remove data with NA value for Nb.Blocs.Retournes & Nb.Blocs.Non.Retournes +ivr_naomit <- ivr %>% dplyr::filter(!is.na(ivr$Nb.Blocs.Retournes)) +ivr_naomit <- as.data.frame(ivr_naomit) +colnames(ivr_naomit) <- colnames(ivr) +ivr_naomit <- ivr_naomit %>% dplyr::filter(!is.na(ivr_naomit$Nb.Blocs.Non.Retournes)) +ivr_naomit <- as.data.frame(ivr_naomit) + +# also remove data with Nb.Blocs.Retournes = 0 & Nb.Blocs.Non.Retournes = 0, cfr equivalent to quadrat with no boulders ... makes no sense to consider quadrat without boulder for ivr determination. +ivr_rm <- dplyr::filter(ivr_naomit, ivr_naomit$Nb.Blocs.Retournes == 0 && ivr_naomit$Nb.Blocs.Non.Retournes == 0) +ivr_naomit <- ivr_naomit %>% dplyr::anti_join(ivr_rm) +rm(ivr_rm) + +ivr_val_qu_ <- ivr_naomit + + + +############################################################# +# # +# Calcul of the IVR # +# # +############################################################# + +### Percentage of turned boulder +for (i in 1:nrow(ivr_naomit)) { + (bm <- sum(ivr_naomit$Nb.Blocs.Non.Retournes[i], ivr_naomit$Nb.Blocs.Retournes[i])) + (ivr_val_qu_$blocs.retournes.fr.[i] <- (ivr_naomit$Nb.Blocs.Retournes[i] / bm) * 100) + (ivr_val_qu_$blocs.non.retournes.fr.[i] <- (ivr_naomit$Nb.Blocs.Non.Retournes[i] / bm) * 100) +} + +rm(bm, i) + + +ivr_val_qu_$blocs.non.retournes.fr. <- ifelse(is.nan(ivr_val_qu_$blocs.non.retournes.fr.), NA, ivr_val_qu_$blocs.non.retournes.fr.) +ivr_val_qu_$blocs.retournes.fr. <- ifelse(is.nan(ivr_val_qu_$blocs.retournes.fr.), NA, ivr_val_qu_$blocs.retournes.fr.) + + +# ivr for loop by quadrat. +for (i in 1:seq_len(nrow(ivr_val_qu_))) { + if (ivr_val_qu_$Nb.Blocs.Non.Retournes[i] == 0 && ivr_val_qu_$Nb.Blocs.Retournes[i] == 0) { + ivr_ <- NA + }else { + if (ivr_val_qu_$blocs.retournes.fr.[i] < 5) { + ivr_ <- 0 + } else if (ivr_val_qu_$blocs.retournes.fr.[i] >= 5 && ivr_val_qu_$blocs.retournes.fr.[i] < 25) { + ivr_ <- 1 + } else if (ivr_val_qu_$blocs.retournes.fr.[i] >= 25 && ivr_val_qu_$blocs.retournes.fr.[i] < 45) { + ivr_ <- 2 + } else if (ivr_val_qu_$blocs.retournes.fr.[i] >= 45 && ivr_val_qu_$blocs.retournes.fr.[i] < 65) { + ivr_ <- 3 + } else if (ivr_val_qu_$blocs.retournes.fr.[i] >= 65 && ivr_val_qu_$blocs.retournes.fr.[i] < 85) { + ivr_ <- 4 + } else { + ivr_ <- 5 + } + + ivr_val_qu_$valeur.ivr_quadrat[i] <- ivr_ + } +} + +rm(i, ivr_) + +# reorder variables for logical purpose +ivr_val_qu_ <- ivr_val_qu_[, c(1:56, 58, 57, 59)] +indic_full <- ivr_val_qu_ +saveRDS(ivr_val_qu_, "ivr_val_qu.RDS") +rm(ivr_naomit) + + +## Calculate ivr statistics now +ivr_val_qu_stat_ <- ivr_val_qu_ %>% dplyr::group_by(id.ivr, Site, Site_bis, Year, Month, Day) %>% dplyr::summarize(ivr_moy = mean(valeur.ivr_quadrat), ivr_et = sd(valeur.ivr_quadrat), ivr_med = median(valeur.ivr_quadrat), ivr_min = min(valeur.ivr_quadrat), ivr_max = max(valeur.ivr_quadrat), fr.r.moy = mean(blocs.retournes.fr.), fr.r.et = sd(blocs.retournes.fr.), fr.r.med = median(blocs.retournes.fr.), fr.r.min = min(blocs.retournes.fr.), fr.r.max = max(blocs.retournes.fr.), fr.nr.moy = mean(blocs.non.retournes.fr.), fr.nr.et = sd(blocs.non.retournes.fr.), fr.nr.med = median(blocs.non.retournes.fr.), fr.nr.min = min(blocs.non.retournes.fr.), fr.nr.max = max(blocs.non.retournes.fr.), nb. = dplyr::n()) + +Date <- as.Date(paste0(ivr_val_qu_stat_$Year, "-", ivr_val_qu_stat_$Month, "-", ivr_val_qu_stat_$Day), origin = "1970-01-01") +ivr_val_qu_stat_ <- tibble::add_column(ivr_val_qu_stat_, Date, .after = "Site_bis") +rm(Date) + +ivr_val_qu_stat_ <- as.data.frame(ivr_val_qu_stat_) +indic <- ivr_val_qu_stat_ + + +############################################################# +# # +# Plot the IVR per site # +# # +############################################################# + +## plot ivr (NB: Year, Month, Day variable names are replace by Annee, Mois, Jour, cfr previous label use in the script) +ivr_val_qu_stat_ <- dplyr::rename(ivr_val_qu_stat_, Annee = Year) +ivr_val_qu_stat_ <- dplyr::rename(ivr_val_qu_stat_, Mois = Month) +ivr_val_qu_stat_ <- dplyr::rename(ivr_val_qu_stat_, Jour = Day) + + +# new IVR scale with continuous 0 to 5 environmental status levels based on % of overturned boulders /20, plus other site data + +for (i in c(1:length(unique(ivr_val_qu_stat_$Site)))) { + + ivr_val_eg <- dplyr::filter(ivr_val_qu_stat_, ivr_val_qu_stat_$Site == unique(ivr_val_qu_stat_$Site)[i]) + + ivr_plot <- ggplot2::ggplot() + + ggplot2::geom_point(ggplot2::aes(x = ivr_val_qu_stat_$Date, y = ivr_val_qu_stat_$fr.r.moy / 20), col = "grey") + + ggplot2::geom_rect(ggplot2::aes(xmin = min(ivr_val_qu_stat_$Date), xmax = max(ivr_val_qu_stat_$Date), ymin = - 0.5, ymax = 5 / 20, fill = "#FF0000"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = min(ivr_val_qu_stat_$Date), xmax = max(ivr_val_qu_stat_$Date), ymin = 5 / 20, ymax = 25 / 20, fill = "#F59404"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = min(ivr_val_qu_stat_$Date), xmax = max(ivr_val_qu_stat_$Date), ymin = 25 / 20, ymax = 45 / 20, fill = "#FAFA15"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = min(ivr_val_qu_stat_$Date), xmax = max(ivr_val_qu_stat_$Date), ymin = 45 / 20, ymax = 65 / 20, fill = "#18E125"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = min(ivr_val_qu_stat_$Date), xmax = max(ivr_val_qu_stat_$Date), ymin = 65 / 20, ymax = 85 / 20, fill = "#04F5F5"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = min(ivr_val_qu_stat_$Date), xmax = max(ivr_val_qu_stat_$Date), ymin = 85 / 20, ymax = 5.5, fill = "#1A1AE8"), alpha = 0.3) + + ggplot2::scale_fill_manual(values = c("#F59404", "#FAFA15", "#FF0000", "#04F5F5", "#18E125", "#1A1AE8")) + + ggplot2::geom_pointrange(ggplot2::aes(x = ivr_val_eg$Date, y = ivr_val_eg$fr.r.moy / 20, ymin = ivr_val_eg$fr.r.moy / 20 - ivr_val_eg$fr.r.et / 20, ymax = ivr_val_eg$fr.r.moy / 20 + ivr_val_eg$fr.r.et / 20), col = "black") + + ggplot2::xlab("Date") + + ggplot2::ylab("IVR") + + ggplot2::ggtitle(unique(ivr_val_eg$Site_bis)) + + ggplot2::theme(axis.text.x = ggplot2::element_text(angle = 90, vjust = 0.5, hjust = 1), legend.position = "none") + +ggplot2::ggsave(paste0("ivr_", unique(ivr_val_eg$Site), ".png"), ivr_plot, height = 3, width = 3.5) + + +} + +report <- args[3] +loop_file <- source(args[4])
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/cb_ivr_site_report_col_scale_loop.Rmd Wed Jan 04 13:21:41 2023 +0000 @@ -0,0 +1,170 @@ +--- +params: + Site: v +title: "Indice Visuel de Retournement des blocs (IVR) - suivi 2014-2022" +#author: "Jonathan Richir, Christian Kerbiriou, Pauline Poisson, Maud Bernard, Juliette Delavenne, Isabelle Le Viol" +#date: "30 Avril 2021" +output: + #word_document: + #reference_docx: word_template.docx + officedown::rdocx_document +--- + +```{r setup, include=FALSE} +knitr::opts_chunk$set( + echo = FALSE + , message = FALSE + , warning = FALSE + ) + +df <- indic +df_full <- indic_full + +df1 <- df %>% dplyr::filter(df$Site == v) +df1 <- droplevels(df1) +``` + +# Contexte + +Mieux comprendre les effets des changements globaux et locaux sur les habitats marins, et l’efficacité des mesures de gestion adoptées sous-entend de disposer de suivis standardisés et d’indicateurs robustes et sensibles reflétant l’état des habitats. + +L’habitat « Champs de blocs médiolittoraux » abrite une forte diversité de micro-habitats et d’espèces de par sa forte hétérogénéité structurelle et sa position intermédiaire sur l’estran, qui en font un des habitats les plus diversifiés du médiolittoral et à fort intérêt écologique, le long de la façade Manche-Atlantique française. Il est aussi un habitat très attractif pour la pratique de pêche à pied de loisir, qui via le remaniement des blocs, peut impacter les communautés. + +Ainsi, l’habitat « Champs de blocs médiolittoraux » a-t-il fait l’objet de plusieurs initiatives nationales et locales (dont LIFE+ « Expérimentation pour une gestion durable et concertée de la pêche à pied récréative en France » 2013-2017) pour mieux évaluer son état et le mettre en relation avec la pression de pêche à pied en vue d’adapter la gestion locale, notamment à travers le réseau d’Aires Marines Protégées (Natura 2000, PNM, PNR etc.). + +Ces projets ont en particulier permis de développer un réseau d’acteurs-trices de terrain-gestionnaires impliqué-e-s et des outils d’évaluation de l’état écologique et de la pression de pêche à pied: (1) l’Indicateur Visuel de Retournement des blocs (IVR) - objet du présent rapport - qui s’apparente à un indicateur « paysager » pour évaluer la pression de pêche sur la base de critères architecturaux; (2) L’indice de Qualité Écologique des Champs de Blocs (QECB) basé sur des variables biotiques et abiotiques qui répondent à la perturbation « retournement des blocs ». + + +# Application et calcul de l'Indicateur Visuel de Retournement des blocs (IVR) + +Basé sur les proportions de blocs « retournés « et « non retournés » et variant entre 0 et 5, cet indicateur peut être appliqué très rapidement et plusieurs fois dans l'année par le-la gestionnaire. + +Pour son application, cinq quadrats de 25m^2^ sont répartis à l’échelle du champ de blocs. Dans chaque quadrat, les blocs retournables à dominance d'algues brunes et/ou rouges (blocs « bruns/rouges »), et les blocs retournables à dominance d'algues vertes opportunistes ou de roche nue (blocs « blancs/verts ») sont dénombrés. + +Le rapport, par quadrat, entre le nombre de blocs « bruns/rouges » ou le nombre de blocs « blancs/verts » sur le nombre total de blocs comptés donnent deux valeurs de pourcentage (qui additionnées égalent 100%). A partir de ces pourcentages, la valeur de l'IVR peut être déterminée pour chaque quadrat. + +Dans sa version originale, ces plages de pourcentages étaient transformées en des équivalents entiers numériques allant de 0 à 5 comme suit: + +- IVR 0: présence quasi-exclusive de blocs « bruns/rouges » (entre 95% et 100%), pas de bloc ou de rares blocs retournés par les pêcheurs à pied (entre 0% et <5%); +- IVR 1: forte dominance des blocs « bruns/rouges » (entre 75% et <95%) et faible représentation des blocs « blancs/verts » (entre 5% et <25%); +- IVR 2: dominance des blocs « bruns/rouges » (entre 55% et <75%) mais bonne proportion de blocs « blancs/verts » (entre 25% et <45%); +- IVR 3: représentation équivalente de blocs « bruns/rouges » (entre 35% et <55%) et des blocs « blancs/verts » (entre 45% et <65%); +- IVR 4: faible représentation des blocs « bruns/rouges » (entre 15% et <35%) et dominance des blocs « blancs/verts » (entre 65% et <85%); +- IVR 5: très faible représentation des blocs « bruns/rouges » (entre 0% et <15%) et très forte dominance des blocs « blancs/verts » (entre 85% et 100%). + +<br> + +{width=1000} + +Légende de la figure. Photos de champs de blocs caractéristiques aux valeurs d'IVR allant de 0 (en haut à gauche, champ de blocs non impacté) à 5 (en bas à droite, très forte pression de pêche à pied) (© Maud Bernard). + +Cependant, passer d'une variable continue allant de 0% à 100% à une variable discrète ne contenant qu'un nombre réduit de valeurs réelles (de 0 à 5) peut-être considéré comme une simplification, justifiable, des observations de terrain. Afin de conserver cette dimension de continuité de la fréquence d'occurrence des blocs « bruns/rouges » vs « blancs/verts », une alternative consiste à considérer ces valeurs calculées de pourcentages, et à les diviser par 20 pour ainsi en revenir à une échelle de valeurs continues cette fois, toujours comprises entre 0 et 5. A chacune des 6 classes de valeurs continues d'indice IVR ainsi obtenues peut lui être associé un code couleur, allant du bleu pour une occurrence inférieure à 5% des blocs « blancs/verts » à rouge pour une occurrence supérieure à 85% des blocs « blancs/verts ». + +```{r} + +ivr_scale <- data.frame(matrix(NA, nrow = 6, ncol = 3)) +colnames(ivr_scale) <- c("Occurrence des blocs blancs/verts", "Valeur d'IVR", "Signification") + +ivr_scale$`Occurrence des blocs blancs/verts` <- c( + "entre 0% et <5%", + "entre 5% et <25%", + "entre 25% et <45%", + "entre 45% et <65%", + "entre 65% et <85%", + "entre 85% et 100%") +ivr_scale$`Valeur d'IVR` <- c( + "0 = IVR < 0.25", + "0.25 = IVR < 1.25", + "1.25 = IVR < 2.25", + "2.25 = IVR < 3.25", + "3.25 = IVR < 4.25", + "4.25 = IVR = 5") +ivr_scale$Signification <- c("Pas de bloc ou de rares blocs retournés", "Faible représentation des blocs blancs/verts", "Bonne proportion de blocs blancs/verts", "Représentation équivalente de blocs bruns/rouges et blancs/verts", "Dominance des blocs blancs/verts", "Très forte dominance des blocs blancs/verts") + +#ivr_scale + +``` + +```{r} +library(magrittr) + +qu_tbl <- flextable::flextable(ivr_scale) +qu_tbl <- flextable::bg(qu_tbl, i = 1, bg = "#1A1AE8") +qu_tbl <- flextable::bg(qu_tbl, i = 2, bg = "#04F5F5") +qu_tbl <- flextable::bg(qu_tbl, i = 3, bg = "#18E125") +qu_tbl <- flextable::bg(qu_tbl, i = 4, bg = "#FAFA15") +qu_tbl <- flextable::bg(qu_tbl, i = 5, bg = "#F59404") +qu_tbl <- flextable::bg(qu_tbl, i = 6, bg = "#FF0000") + +qu_tbl %>% flextable::autofit() %>% flextable::fit_to_width(7) + +``` + +Légende de la table. Pourcentages de blocs « blancs/verts », exprimés en une échelle continue de valeurs équivalentes d'IVR allant de 0 à 5. + + +# Observations pour le suivi du site `r unique(df1$Site_bis)` + +Les observations des taux de retournement/non retournement de blocs de vingt-quatre champs distribués le long de la façade Manche-Atlantique française sont stockées dans la base de données ESTAMP (http://www.pecheapied-loisir.fr/base-de-donnees-estamp/), hébergée par l'Office Français de la Biodiversité, créée dans le cadre du projet LIFE+ Pêche à Pied de Loisir, et que vous avez contribué à enrichir de vos observations. L'évolution des valeurs médianes de l'indice IVR: au site `r unique(df1$Site.bis)` et tous champs de blocs confondus, pour la période de suivi 2014-2017, est représentée graphiquement sur les deux figures ci-dessous. A des fins de comparaisons entre la précédente échelle discrète et la nouvelle échelle continue de valeurs d'IVR, et des distributions associées des valeurs d'indice en escalier ou continues, les deux représentations graphiques sont données. + +Selon l'échelle discrète de valeurs de l'IVR, les valeurs médianes au site `r unique(df1$Site.bis)` (points noirs) sont comprises entre un minimum égal à `r min(df1$ivr.med, na.rm = T)` et un maximum égal à `r max(df1$ivr.med, na.rm = T)`. Les valeurs individuelles, par quadrat (barres), sont quant à elles comprises entre un minimum égal à `r min(df1$ivr.min, na.rm = T)` et un maximum égal à `r max(df1$ivr.max, na.rm = T)`. Selon l'échelle continue de valeurs de l'IVR, les valeurs médianes sont comprises entre un minimum égal à `r round(min(df1$fr.r.med/20, na.rm = T), digits = 2)` et un maximum égal à `r round(max(df1$fr.r.med/20, na.rm = T), digits = 2)`. Les valeurs individuelles, par quadrat (barres), sont quant à elles comprises entre un minimum égal à `r round(min(df1$fr.r.min/20, na.rm = T), digits = 2)` et un maximum égal à `r round(max(df1$fr.r.max/20, na.rm = T), digits = 2)`. + +```{r} + +par(mar = c(5, 5, 4, 2) + 0.1) + + ggplot2::ggplot() + + ggplot2::geom_pointrange(ggplot2::aes(x = df1$Date, y = df1$fr.r.moy / 20, ymin = df1$fr.r.moy / 20 - df1$fr.r.et / 20, ymax = df1$fr.r.moy / 20 + df1$fr.r.et / 20), col = "black") + + ggplot2::xlab("Date") + + ggplot2::ylab("IVR") + + ggplot2::ggtitle(unique(df1$Site)) + + ggplot2::theme(axis.text.x = ggplot2::element_text(angle = 90, vjust = 0.5, hjust = 1), legend.position = "none") +``` + +```{r} + +par(mar = c(5, 5, 4, 2) + 0.1) + + ggplot2::ggplot() + + ggplot2::geom_point(ggplot2::aes(x = df$Date, y = df$fr.r.moy / 20), col = "grey") + + ggplot2::geom_rect(ggplot2::aes(xmin = min(df$Date), xmax = max(df$Date), ymin = - 0.5, ymax = 5 / 20, fill = "#FF0000"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = min(df$Date), xmax = max(df$Date), ymin = 5 / 20, ymax = 25 / 20, fill = "#F59404"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = min(df$Date), xmax = max(df$Date), ymin = 25 / 20, ymax = 45 / 20, fill = "#FAFA15"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = min(df$Date), xmax = max(df$Date), ymin = 45 / 20, ymax = 65 / 20, fill = "#18E125"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = min(df$Date), xmax = max(df$Date), ymin = 65 / 20, ymax = 85 / 20, fill = "#04F5F5"), alpha = 0.3) + + ggplot2::geom_rect(ggplot2::aes(xmin = min(df$Date), xmax = max(df$Date), ymin = 85 / 20, ymax = 5.5, fill = "#1A1AE8"), alpha = 0.3) + + ggplot2::scale_fill_manual(values = c("#F59404", "#FAFA15", "#FF0000", "#04F5F5", "#18E125", "#1A1AE8")) + + ggplot2::geom_pointrange(ggplot2::aes(x = df1$Date, y = df1$fr.r.moy / 20, ymin = df1$fr.r.moy / 20 - df1$fr.r.et / 20, ymax = df1$fr.r.moy / 20 + df1$fr.r.et / 20), col = "black") + + ggplot2::xlab("Date") + + ggplot2::ylab("IVR") + + ggplot2::ggtitle(unique(df1$Site_bis)) + + ggplot2::theme(axis.text.x = ggplot2::element_text(angle = 90, vjust = 0.5, hjust = 1), legend.position = "none") +``` + +Légende des figures. Evolution temporelle de la valeur mediane de l'IVR au site `r unique(df1$Site.bis)` (points noirs), en comparaison à celles des vingt-trois autres champs de blocs suivis le long de la façade Manche-Atlantique française (points gris). Les barres représentent la distribution des valeurs individuelles d'IVR par quadrat au site `r unique(df1$Site.bis)` (n = `r sort(unique(df1$nb.))`) entre valeurs minimums et maximums. Graphique du haut - La distribution en escalier des valeurs médianes de l'IVR reflète le caractère discret de l'échelle utilisée. Graphique du bas - Le découpage horizontal de la fenêtre graphique représente les 5 classes d'occurrence de retournement des blocs mobiles, de quasi-inexistant en bleu à dominant en rouge, ramenée sur une échelle continue de 0 à 5. + +Ces valeurs propres au site `r unique(df1$Site.bis)` peuvent être resituées par rapport aux autres valeurs médianes de l'IVR obtenues pour les vingt-trois autres sites suivis sur la période 2014-2017 à l’échelle de la façade Manche-Atlantique française (points gris). Tous sites confondus, la pression de pêche à pied est très variable dans le temps et dans l'espace, ce qui se traduit par une distribution des valeurs médianes de l'IVR occupant toute la fenêtre graphique. + + +# Continuité du suivi du site `r unique(df1$Site_bis)` + +Ce bref rapport présente l'évolution de la valeur de l'indice IVR au site `r unique(df1$Site.bis)`, suivi de `r min(unique(df1$Annee), na.rm = T)` à `r max(unique(df1$Annee), na.rm = T)`, et la resitue par rapport aux valeurs IVR des vingt-trois autres champs de blocs suivis de 2014 à 2017 sur la façade Manche-Atlantique française. Il illustre l'évolution dans le temps de la pression de la pêche à pied, et rappelle la nécessité de continuer d'en évaluer l'impact, que les observations récoltées traduisent du maintien d'une faible pression de pêche, d'une diminution de cette dernière au fil du temps, au plus préoccupant d'un retournement dommageable d'un grand nombre de blocs. + +Au nom du Groupe de Travail Champs de Blocs, nous espérons pouvoir continuer à compter sur vous pour participer à ces suivis; et bien évidemment, si vous avez la possibilité dès le printemps prochain de retourner sur le terrain effectuer de nouveaux relevés, ceux-ci, très utiles, permettront d'évaluer les tendances observées graphiquement ci-dessus sur une plus longue période. + + +# Remerciements et bibliographie + +Le projet est financé, à daté du 15 avril 2021, par une convention OFB Muséum national d'Histoire naturelle (MNHN) dans le cadre du Life Marha (LIFE 16 IPE FR001). Le Groupe de Travail Champs de Blocs remercie tous les participants au projet. + +Contacts : jonathan.richir@mnhn.fr (post-doctorant MNHN, en charge du projet), isabelle.le-viol@mnhn.fr (responsable MNHN du projet), christian.kerbiriou@mnhn.fr (responsable MNHN du projet), pour le Groupe de Travail. + +Littérature conseillée: + +- Bernard M., (2012). Les habitats rocheux intertidaux sous l’influence d’activités anthropiques : structure, dynamique et enjeux de conservation. Sciences agricoles. Université de Bretagne occidentale - Brest. NNT : 2012BRES0010. 423 pp. Thèse disponible sur https://tel.archives-ouvertes.fr/tel-00720611/. + +- Verbeke G., Maison E. (2013). Fiche S8. Définition d’indicateurs de perturbations des champs de blocs, dans : La gestion de la pêche de loisir dans les aires marines protégées, Recueil d’expériences des gestionnaires. Coll. « Cahiers techniques », Montpellier, Aten, n°87: 63-66. Fiche disponible sur http://ct87.espaces-naturels.fr/. + +<br> + +{width=1000}
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/div_index.r Wed Jan 04 13:21:41 2023 +0000 @@ -0,0 +1,187 @@ +# author: "Jonathan Richir" +# date: "01 October 2022" + + +#Rscript + +############################### +## ## +############################### + +#####Packages : dplyr +# tidyr +# readr +# writexl +# stringr +# readxl +# tibble +# lubridate +# cowplot +# magrittr +# rmarkdown +library(magrittr) +library(dplyr) +#####Load arguments + +args <- commandArgs(trailingOnly = TRUE) + +#####Import data + +if (length(args) < 1) { + stop("This tool needs at least 1 argument") +}else { + qecnato0 <- args[1] + +} + +qecnato0 <- readRDS(qecnato0) + + +# first, create vector (4) for qecb and fishing by region (same as above) + +bret_egmp_basq_qecb <- c( + "X..algues.brunes", + "X..algues.rouges", + "X..algues.vertes", + "X..Cladophora", + "X..Lithophyllum", + "Nb.Littorina.obtusata", + "Nb.Gibbula.cineraria", + "Nb.Gibbula.pennanti", + "Nb.Gibbula.umbilicalis", + "Nb.Phallusia.mamillata", + "Nb.Tethya.aurantium", + "Nb.Spirobranchus.lamarckii.total", + "Nb.spirorbis.total", + "X..Eponges", + "X..Ascidies.Coloniales", + "X..Ascidies.Solitaires", + "X..Bryozoaires.Dresses", + "X..Balanes.Vivantes" + #, "X..Recouvrement.Sediment" + #, "X..Roche.Nue" + #, "X..Surface.Accolement" + ) + +egmp_basq_qecb <- c("Nb.Crassostrea.gigas", "Nb.Ostrea.edulis", "X..Mytilus.sp.", "X..Hermelles", "X..Hydraires") + +bret_egmp_basq_fishing <- c("Nb.Cancer.pagurus..Tourteau.", + "Nb.Necora.puber..Etrille.", + "Nb.Carcinus.maenas..Crabe.vert.", + "Nb.Nucella.lapilus..Pourpre.", + "Nb.Galathea..Galathées.", + "Nb.Lophozozymus.incisus..ancien.Xantho.incisus.", + "Nb.Palaemon.sp..Crevette.bouquet.ou.crevette.rose.", + "Nb.Haliotis.tuberculata..Ormeau.", + "Nb.Littorina.littorea..Bigorneau.", + "Nb.Xantho.pilipes..Xanthe.poilu.", + "Nb.Mimachlamys.varia..Pétoncle.noir.") + +egmp_basq_fishing <- c("Nb.Eriphia.verrucosa..Crabe.verruqueux.", "Nb.Octopus.vulgaris..Poulpe.", "Nb.Paracentrotus.lividus..Oursin.", "Nb.Stramonita.haemastoma..Pourpre.bouche.de.sang.") + +# here I can choose to either replace spirorbis and/or spirobranchus by their log10 transformation in bret_egmp_basq_qecb vector +bret_egmp_basq_qecb <- replace(bret_egmp_basq_qecb, bret_egmp_basq_qecb == "Nb.spirorbis.total", "log10.Nb.spirorbis.total") + +## Diversity index + + +# adiv contains two main functions for species diversity indices: speciesdiv, which includes widely used indices such as species richness and the Shannon index, and divparam, which includes indices that have a parameter to control the importance given to rare versus abundant species in diversity measurements (Pavoine (2020) - adiv: An r package to analyse biodiversity in ecology). + +# NB: just like for dissimilarity distance matrices, no sense to use the "fishing" variable lists, because either they are present for the bloc mobile and not for the bloc fixe (therefore false higher diversity for bloc mobile), either they are repeated between face supérieure and face inférieure of bloc mobile. + +# function in a loop + +row.names(qecnato0) <- c(paste0(qecnato0$region.site_year_month_day, "_", qecnato0$Quadrat.bis, "_", qecnato0$Type.Bloc, "_", qecnato0$Numéro.Bloc.échantillon, "_", qecnato0$Face)) + +# later on I can copy-paste above code to recreate variable names vector +#bret_egmp_basq_qecb +#egmp_basq_qecb +#Bret_EGMP.BASQ_fishing +#EGMP.BASQ_fishing + +# remove boulder variables +bret_egmp_basq_qecb <- bret_egmp_basq_qecb[! bret_egmp_basq_qecb %in% c("X..Recouvrement.Sediment", "X..Roche.Nue", "X..Surface.Accolement")] + +qecnato0$period <- as.character(qecnato0$period) +qecnato0$Face <- as.character(qecnato0$Face) + +div_list <- vector("list", length(unique(qecnato0$site_year_month_day))) + +for (i in c(1:nrow(qecnato0))) { + div_i <- dplyr::filter(qecnato0, site_year_month_day == qecnato0$site_year_month_day[i]) + + ifelse(unique(div_i$region) == "Bretagne", var. <- c(bret_egmp_basq_qecb), var. <- c(bret_egmp_basq_qecb, egmp_basq_qecb)) # Qu. : Why can't R's ifelse statements return vectors? => you can circumvent the problem if you assign the result inside the ifelse. + + #8 remove empty row cfr: In speciesdiv(div_i[, var.]) & divparam(div_i[, var.]) : empty communities should be discarded + div_i <- dplyr::filter(div_i, rowSums(div_i[, var.]) > 0) + + div_i_speciesdiv <- adiv::speciesdiv(div_i[, var.]) + adiv_i_df <- data.frame(div_i_speciesdiv) + + div_i_divparam <- adiv::divparam(div_i[, var.], q = c(0, 0.25, 0.5, 1, 2, 4, 8)) # When q increases, abundant species are overweighted compared to rare species, we thus expect that the evenness in species weights decreases. + + + par(mfrow = c (1, 1)) + plot(adiv::divparam(div_i[, var.], q = 0), main = unique(div_i$site_year_month_day)) + plot(adiv::divparam(div_i[, var.], q = 0:10), legend = FALSE, main = unique(div_i$site_year_month_day)) + + adiv_i_df$x <- div_i_divparam$div$`1` + colnames(adiv_i_df)[which(colnames(adiv_i_df) == "x")] <- paste0("Para. ISD, q = ", div_i_divparam$q[1], " (equi. richness)") + adiv_i_df$x <- div_i_divparam$div$`2` + colnames(adiv_i_df)[which(colnames(adiv_i_df) == "x")] <- paste0("Para. ISD, q = ", div_i_divparam$q[2]) + adiv_i_df$x <- div_i_divparam$div$`3` + colnames(adiv_i_df)[which(colnames(adiv_i_df) == "x")] <- paste0("Para. ISD, q = ", div_i_divparam$q[3]) + adiv_i_df$x <- div_i_divparam$div$`4` + colnames(adiv_i_df)[which(colnames(adiv_i_df) == "x")] <- paste0("Para. ISD, q = ", div_i_divparam$q[4]) + adiv_i_df$x <- div_i_divparam$div$`5` + colnames(adiv_i_df)[which(colnames(adiv_i_df) == "x")] <- paste0("Para. ISD, q = ", div_i_divparam$q[5], " (equi. Simpson)") + adiv_i_df$x <- div_i_divparam$div$`6` + colnames(adiv_i_df)[which(colnames(adiv_i_df) == "x")] <- paste0("Para. ISD, q = ", div_i_divparam$q[6]) + adiv_i_df$x <- div_i_divparam$div$`7` + colnames(adiv_i_df)[which(colnames(adiv_i_df) == "x")] <- paste0("Para. ISD, q = ", div_i_divparam$q[7]) + + # plot + par(mfrow = c(3, 2)) + sapply(names(adiv_i_df[, c(1, 8, 2, 3, 12, 4:7, 9:11, 13:ncol(adiv_i_df))]), + function(cname) { + png(paste0(cname, "_histo.png")) + hist(adiv_i_df[, c(1, 8, 2, 3, 12, 4:7, 9:11, 13:ncol(adiv_i_df))][[cname]], main = "", xlab = cname, breaks = length(unique(adiv_i_df[, c(1, 8, 2, 3, 12, 4:7, 9:11, 13:ncol(adiv_i_df))][[cname]]))) +dev.off() + } + +) + par(mfrow = c(1,1)) + + div_list[[i]] <- adiv_i_df + + rm(div_i, adiv_i_df, div_i_speciesdiv, div_i_divparam) + +} + +# for the error message due to richness NA data => 35 observations in 21 surveys; no reason to remove these data "...remo", was checked in the complete script. + + +div_df <- do.call("rbind", div_list) + + +# There is an issue with region.terri that are merged with no "_" ... + +div_df <- tibble::add_column(div_df, rownames. = rownames(div_df), .before = "richness") +div_df <- tidyr::separate(div_df, rownames., into = c("region.terri.", "site_year_month_day", "Quadrat.bis", "Type.Bloc", "Numéro.Bloc.échantillon", "Face"), sep = "_") + +# I therefore add these lines to solve that issue + +div_df <- tibble::add_column(div_df, terri. = substring(div_df$region.terri., nchar(div_df$region.terri.)-3), .after = "region.terri.") + +div_df$region.terri. <- substring(div_df$region.terri., 1, nchar(div_df$region.terri)-4) +div_df <- dplyr::rename(div_df, region = region.terri.) + +div_df$site_year_month_day <- paste0(div_df$terri., "_", div_df$site_year_month_day) +div_df <- subset(div_df, select = -c(terri.)) + +div_df$Type.Bloc <- as.factor(div_df$Type.Bloc) +div_df$Face <- as.factor(div_df$Face) +div_df$Numéro.Bloc.échantillon <- as.integer(div_df$Numéro.Bloc.échantillon) + +saveRDS(div_df, "div_df.RDS") +write.table(div_df, "Valeurs_stat.tabular", row.names = FALSE, quote = FALSE, sep = "\t", dec = ".", fileEncoding = "UTF-8")
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/div_index.xml Wed Jan 04 13:21:41 2023 +0000 @@ -0,0 +1,83 @@ +<tool id="cb_div" name="Diversity" version="@VERSION@" profile = "20.01"> + <description>indicators</description> + <macros> + <import>macro.xml</import> + </macros> + <expand macro="cb_requirements"> + <requirement type="package" version="1.3.2">r-tidyverse</requirement> + <requirement type="package" version="1.7_20">r-ade4</requirement> + <requirement type="package" version="2.2">r-adiv</requirement> + <requirement type="package" version="3.4.0">r-ggplot2</requirement> + </expand> + <required_files> + <include type="literal" path="div_index.r"/> + </required_files> + <command detect_errors="exit_code"><![CDATA[ + Rscript + '$__tool_directory__/div_index.r' + '$input_data' + '$output_div' + '$output_rdata' + '$plots' + ]]> + </command> + <inputs> + <param name="input_data" type="data" format="rdata" label="Input Clean data"/> + </inputs> + <outputs> + <data name="output_div" from_work_dir="Valeurs_stat.tabular" format="tabular" label="Diversity index"/> + <data name="output_rdata" from_work_dir="div_df.RDS" format="rdata" label="Diversity Rdata"/> + <collection type="list" name="plots" label="Diversity plot"> + <discover_datasets pattern="(?P<designation>.+)\.png" visible="false" format="png"/> + </collection> + </outputs> + <tests> + <test expect_num_outputs="3"> + <param name="input_data" value="Clean_Rdata.rdata"/> + <output name="output_div"> + <assert_contents> + <has_n_columns n="20"/> + </assert_contents> + </output> + <output name="output_rdata"> + <assert_contents> + <has_text text="no"/> + </assert_contents> + </output> + <output_collection name="plots" type="list" count="14"/> + </test> + </tests> + <help><![CDATA[ +==================== +Diversity indicators +==================== + + +**What it does** + +Calculates the diversity indicators (Shannon, Simpson, ...). + +**Input description** + +Clean Rdata file from the previous tool Dissimilarity. + ++----------------+ +| Rdata | ++================+ +| Clean data | ++----------------+ +| ... | ++----------------+ + + +**Output** + +- 1 .RDS file +- 1 tabular file for all the diversity indices +- Multiple png plots one for each indices + + + + ]]> </help> + <expand macro="cb_bibref"/> +</tool>
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/loop_col_scale.r Wed Jan 04 13:21:41 2023 +0000 @@ -0,0 +1,14 @@ +library("rmarkdown") + +df <- indic +df_full <- indic_full +dir.create("results") +slices <- unique(df$Site)[!is.na(unique(df$Site))] + +for (v in slices) { + rmarkdown::render(report, + output_file = paste0(v, ".docx"), + output_dir = file.path("results"), + params = list(Site = v) + ) + }
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/macro.xml Wed Jan 04 13:21:41 2023 +0000 @@ -0,0 +1,35 @@ +<macros> + <token name="@VERSION@">0.0.0</token> + <xml name="cb_requirements"> + <requirements> + <requirement type="package" version="4.2.2">r-base</requirement> + <requirement type="package" version="1.0.10">r-dplyr</requirement> + <requirement type="package" version="1.2.1">r-tidyr</requirement> + <requirement type="package" version="1.5.0">r-stringr</requirement> + <requirement type="package" version="3.1.8">r-tibble</requirement> + <requirement type="package" version="1.41">r-knitr</requirement> + <requirement type="package" version="2.0.3">r-magrittr</requirement> + <yield/> + </requirements> + </xml> + <xml name="cb_input"> + <param name="fiche_val" type="data" format="data" label="Input ficheterrain.csv"/> + </xml> + <xml name="cb_bibref"> + <citations> + <citation type="bibtex"> + @Manual{, + title = {Les habitats rocheux intertidaux sous l’influence d’activités anthropiques : structure, dynamique et enjeux de conservation. Sciences agricoles}, + author = {Bernard M.}, + year = {2012}, + note = {https://tel.archives-ouvertes.fr/tel-00720611/} + </citation> + </citations> + </xml> + <xml name="topic"> + <edam_topics> + <edam_topic>topic_0610</edam_topic> + <edam_topic>topic_3050</edam_topic> + </edam_topics> + </xml> +</macros>
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/test-data/champbloc_ivr.csv Wed Jan 04 13:21:41 2023 +0000 @@ -0,0 +1,867 @@ +"ID Fiche";"id";"Numero Quadrat";"GPS1 Latitude";"GPS1 Longitude";"GPS2 Latitude";"GPS2 Longitude";"GPS3 Latitude";"GPS3 Longitude";"GPS4 Latitude";"GPS4 Longitude";"Numero Photo";"Num�ro strate";"Description Strate";"Nb Blocs Non Retournes";"Nb Blocs Retournes" +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";4;47.547729;-2.950839;;;;;;;"Strate1_Q4.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";19;4; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";5;47.548053;-2.951211;;;;;;;"Strate2_Q5.JPG";"2";"Zone de blocs mobiles sur platier rocher qui s'ensable, domin�s par le Fucus serratus, blocs de taille moyenne.";38;11; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";1;47.54815;-2.951336;;;;;;;"Strate2_Q1.JPG";"2";"Zone de blocs mobiles sur platier rocher qui s'ensable, domin�s par le Fucus serratus, blocs de taille moyenne.";24;20; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";2;47.547829;-2.950839;;;;;;;"Strate1_Q2.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";24;7; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";3;47.547866;-2.950759;;;;;;;"Strate1_Q3.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";20;10; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";5;47.54803;-2.95118;;;;;;;"DSCN1175.JPG";"2";"Zone de blocs mobiles sur platier rocher qui s'ensable, domin�s par le Fucus serratus, blocs de taille moyenne.";39;6; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";4;47.5477;-2.95079;;;;;;;"DSCN1167.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";23;11; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";3;47.54779;-2.95073;;;;;;;"DSCN1160.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";18;10; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";2;47.54783;-2.95083;;;;;;;"DSCN1149.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";16;31; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";1;47.54812;-2.95133;;;;;;;"DSCN1141.JPG";"2";"Zone de blocs mobiles sur platier rocher qui s'ensable, domin�s par le Fucus serratus, blocs de taille moyenne.";34;5; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";5;47.54803;-2.95118;;;;;;;"DSCN2997.JPG";"2";"Zone de blocs mobiles sur platier rocher qui s'ensable, domin�s par le Fucus serratus, blocs de taille moyenne.";27;5; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";4;47.5477;-2.95079;;;;;;;"DSCN2991.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";20;13; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";3;47.54779;-2.95073;;;;;;;"DSCN2985.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";26;9; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";2;47.54783;-2.95083;;;;;;;"DSCN2979.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";10;8; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";1;47.54812;-2.95133;;;;;;;"DSCN2970.JPG";"2";"Zone de blocs mobiles sur platier rocher qui s'ensable, domin�s par le Fucus serratus, blocs de taille moyenne.";24;15; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";5;47.54803;-2.95118;;;;;;;"DSCN3297.JPG";"2";"Blocs mobiles de taille moyenne sur platier rocheux qui s'ensable, domin�s par le Fucus serratu";6;1; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";4;47.5477;-2.95079;;;;;;;"DSCN3199.JPG";"1";"Blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�lange et de nombreuses zones de roche nue";4;1; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";3;47.54779;-2.95073;;;;;;;"DSCN3193.JPG";"1";"Blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�lange et de nombreuses zones de roche nue";5;1; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";2;47.54783;-2.95083;;;;;;;"DSCN3189.JPG";"1";"Blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�lange et de nombreuses zones de roche nue";8;2; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";1;47.54812;-2.95133;;;;;;;"DSCN3214.JPG";"2";"Blocs mobiles sur platier rocheux qui s'ensable, domin�s par du Fucus serratus, blocs de taille moyenne.";10;2; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";5;47.54803;-2.95118;;;;;;;"DSCN5108.JPG";"2";"Blocs de taille moyenne � �lev�e, assez ensabl�s, sur sable grossier et d�bris coquilliers. Blocs domin�s par du Fucus seratus, des algues rouges et des Ulves";3;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";4;47.5477;-2.95079;;;;;;;"DSCN5098.JPG";"1";"Blocs de petite taille sur sable grossier et d�bris coquillers, domin�s � la fois par des algues vertes opportunistes et des algues brunes. Pr�sence forte de s�diment sablo-vaseux � la surface des blocs";3;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";3;47.54779;-2.95073;;;;;;;"DSCN5089.JPG";"1";"Blocs de petite taille sur sable grossier et d�bris coquilliers, mais �galement sur du platier rocheux. Blocs domin�s par des algues vertes opportunistes et des algues rouges (50/50)";3;3; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";2;47.54783;-2.95083;;;;;;;"DSCN5081.JPG";"1";"Blocs de taille moyenne et petits sur sable grossier et d�bris coquilliers, domin�s par des algues rouges et vertes opportunistes (50/50) + quelques algues brunes";6;3; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";1;47.54812;-2.95133;;;;;;;"DSCN5075.JPG";"2";"Blocs de taille moyenne et petits sur sable grossier et d�bris coquilliers, domin�s par du Fucus serratus, des algues rouges en m�lange et quelques algues vertes opportunistes";16;2; +373797;"BDD_IVR_Locmariaquer_20161020_VImport.xlsx";5;47.54803;-2.95118;;;;;;;"DSC08969.JPG";"2";"Rares blocs mobiles et nombreuses zones de platier rocheux qui s'ensable. Nombreux d�bris coquilliers. Blocs domin�s par le Fucus serratus";2;0; +373797;"BDD_IVR_Locmariaquer_20161020_VImport.xlsx";4;47.5477;-2.95079;;;;;;;"DSC08968.JPG";"1";"Petits blocs sur d�bris coquilliers et sable grossier, domin�s par les algues rouges; pr�sence de quelques algues brunes et vertes opportunistes";8;3; +373797;"BDD_IVR_Locmariaquer_20161020_VImport.xlsx";3;47.54779;-2.95073;;;;;;;"DSC08967.JPG";"1";"Blocs de petite taille sur platier rocheux, sable grossier et d�bris coquilliers. Blocs domin�s par les algues brunes et vertes opportunistes";3;3; +373797;"BDD_IVR_Locmariaquer_20161020_VImport.xlsx";2;47.54783;-2.95083;;;;;;;"DSC08966.JPG";"1";"Blocs de taille moyenne � petite sur sable grossier et d�brits coquilliers. Dominance d'algues brunes et rouges en m�lange et quelques algues vertes opportunistes";8;4; +373797;"BDD_IVR_Locmariaquer_20161020_VImport.xlsx";1;47.54812;-2.95133;;;;;;;"DSC08964.JPG";"2";"Blocs de taille moyenne � petite, sur d�bris coquilliers et sable grossier. Blocs domin�s par le Fucus serratus et quelques algues vertes opportunistes";9;2; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";5;47.50112;-2.73803;;;;;;;;"1";"Blocs mobiles de taille petite � moyenne, domin�s par les algues vertes opportunistes, de la roche nue, des algues rouges en m�lange, quelques patchs de Fucus serratus Blocs sur s�diments grossiers, cailloutis, petits blocs, sable vaseux.";20;5; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";4;47.50053;-2.73799;;;;;;;;"1";"Blocs mobiles de taille petite � moyenne, domin�s par les algues vertes opportunistes, de la roche nue, des algues rouges en m�lange, quelques patchs de Fucus serratus Blocs sur s�diments grossiers, cailloutis, petits blocs, sable vaseux.";15;3; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";3;47.50063;-2.73841;;;;;;;;"2";"Blocs mobiles sur platier rocheux qui s'ensable progressivement en limite basse, de taille petite � moyenne, domin�s par m�lange d'algues rouges et larges zones de roche nue. ";20;35; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";2;47.50067;-2.7382;;;;;;;"Q2.JPG";"2";"Blocs mobiles sur platier rocheux qui s'ensable progressivement en limite basse, de taille petite � moyenne, domin�s par m�lange d'algues rouges et larges zones de roche nue. ";17;8; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";1;47.50053;-2.73847;;;;;;;"Q1.JPG";"2";"Blocs mobiles sur platier rocheux qui s'ensable progressivement en limite basse, de taille petite � moyenne, domin�s par m�lange d'algues rouges et larges zones de roche nue. ";26;10; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";5;47.50112;-2.73803;;;;;;;"DSCN1197.JPG";"2";"Zone de blocs mobiles sur platier rocher qui s'ensable, domin�s par le Fucus serratus, blocs de taille moyenne.";52;6; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";4;47.50053;-2.73799;;;;;;;"DSCN1204.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";12;7; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";3;47.50063;-2.73841;;;;;;;"DSCN1183.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";37;5; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";2;47.50067;-2.7382;;;;;;;"DSCN1190.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";26;55; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";1;47.50053;-2.73847;;;;;;;"DSCN1210.JPG";"2";"Zone de blocs mobiles sur platier rocher qui s'ensable, domin�s par le Fucus serratus, blocs de taille moyenne.";43;6; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";5;47.50112;-2.73803;;;;;;;"DSCN3025.JPG";"2";"Zone de blocs mobiles sur platier rocher qui s'ensable, domin�s par le Fucus serratus, blocs de taille moyenne.";10;14; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";4;47.50053;-2.73799;;;;;;;"DSCN3019.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";6;12; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";3;47.50063;-2.73841;;;;;;;"DSCN3004.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";8;38; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";2;47.50067;-2.7382;;;;;;;"DSCN3011.JPG";"1";"Zone de blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Blocs dont les faces sup�rieures sont domin�es par des algues vertes opportunistes, des algues rouges en m�nage + nombreux patchs de roche nue";6;21; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";1;47.50053;-2.73847;;;;;;;"DSCN3031.JPG";"2";"Zone de blocs mobiles sur platier rocher qui s'ensable, domin�s par le Fucus serratus, blocs de taille moyenne.";3;14; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";5;47.50112;-2.73803;;;;;;;"DSCN3250.JPG";"2";"Blocs mobiles de taille moyenne sur platier rocheux qui s'ensable, domin�s par du Fucus serratus";15;9; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";4;47.50053;-2.73799;;;;;;;"DSCN3242.JPG";"1";"Blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Faces sup�rieures domin�es par des algues vertes opportunistes, des algues rouges en m�lange et de nombreuses zones de roche nue";25;26; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";3;47.50063;-2.73841;;;;;;;"DSCN3221.JPG";"1";"Blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Faces sup�rieures domin�es par des algues vertes opportunistes, des algues rouges en m�lange et de nombreuses zones de roche nue";15;25; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";2;47.50067;-2.7382;;;;;;;"DSCN3228.JPG";"1";"Blocs mobiles de taille moyenne sur sable grossier, cailloux et cailloutis. Faces sup�rieures domin�es par des algues vertes opportunistes, des algues rouges en m�lange et de nombreuses zones de roche nue";7;17; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";1;47.50053;-2.73847;;;;;;;"DSCN3257.JPG";"2";"Blocs mobiles de taille moyenne sur platier rocheux qui s'ensable, domin�s par du Fucus serratus";7;11; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";5;47.50112;-2.73803;;;;;;;"Q5.JPG";"2";"Blocs de taille moyenne sur substrat sablo-vaseux, domin�s par de la roche nue, quelques algues rouges dress�es et algues vertes opportunistes";5;16; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";4;47.50053;-2.73799;;;;;;;"Q4.JPG";"1";"Blocs mobiles sur substrat sablo-vaseux et petits cailloux, domin�s majoritairement pas les algues rouges dress�es et les algues vertes opportunistes ";9;16; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";3;47.50063;-2.73841;;;;;;;"Q3.JPG";"1";"Blocs de taille moyenne sur sable grossier et d�bris coquillers, pr�sence de nombreuses nasses. M�lange d'algues vertes opportunistes et d'algues rouges dress�es";1;20; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";2;47.50067;-2.7382;;;;;;;"Q2.JPG";"1";"Blocs de taille moyenne � �lev�e sur substrat sablo-vaseux et d�bris coquillers, domin�s par de la roche nue et des algues rouges en m�lange. Quelques algues vertes opportunistes, Fucus serratus et rares Laminaires";3;13; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";1;47.50053;-2.73847;;;;;;;"Q1.JPG";"2";"Blocs de taille moyenne � �lev�e sur substrat sablo-vaseux, domin�s par de la roche nue, quelques algues rouges dress�es et du Fucus serratus + des algues vertes; Nombreuses nasses";1;5; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";5;;;;;;;;;;"Pas de stratification";;;; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";4;;;;;;;;;;"Pas de stratification";;;; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";3;47.2957222;-2.6311667;;;;;;;"P1230459.JPG";"1";"Strate compos�e de blocs h�t�rog�nes, dominance de gros blocs, sur s�diments grossiers et petits blocs. Certains bloc sont recouverts de paquets de moules, Quadrat positionn� en milieu d'estran";6;21; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";2;47.2957778;-2.6338056;;;;;;;"P1230483.JPG";"1";"Strate compos�e de blocs h�t�rog�nes, moyens � gros, sur s�diments grossiers, galets et petits blocs. Les faces sup�rieures sont domin�es par les algues vertes opportunistes. Pr�sence de f.serratus, Quadrat positionn� en haut d'estran";6;9; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";1;47.2950556;-2.63425;;;;;;;"DSC00108.JPG";"2";"Strate compos�e de blocs h�t�rog�nes, dominance de gros blocs, sur s�diments grossiers et petits blocs. Les faces sup�rieures sont domin�es par les algues vertes opportunistes. Quadrat positionn� en bas d'estran";5;10; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";5;47.2955556;-2.6343056;;;;;;;"DSC01725.JPG";"1";"Blocs de taille h�t�rog�ne (petits � moyens sur mouli�re et s�diment vaseux, les algues vertes (ulves et cladophora) pr�dominent largement le quadrat.";0;6; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";4;47.2959167;-2.63325;;;;;;;"DSC01681.JPG";"1";"Blocs de taille h�t�rog�ne (petits � moyens) sur petits galets et sables grossiers coquillers. Blocs recouverts d'un m�lange d'algues brunes et rouges. Des laminaires sont pr�sentes.";26;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";3;47.2957222;-2.6311667;;;;;;;"DSC00516.JPG";"1";"Blocs de taille petite � moyenne, domin�s par algues rouges, brunes et vertes opportunites sur s�diments grossiers et petits blocs. Certains bloc sont recouverts de paquets de moules, Quadrat positionn� en milieu d'estran. ";16;10; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";2;47.2957778;-2.6338056;;;;;;;"P1230507.JPG";"1";"Blocs de taille petite � moyenne, domin�s par algues rouges, brunes et vertes opportunites sur s�diments grossiers, galets et petits blocs. Les faces sup�rieures sont domin�es par les algues vertes opportunistes. Pr�sence de f.serratus, Quadrat position";18;2; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";1;47.2950556;-2.63425;;;;;;;"DSCF3208.JPG";"2";"Blocs de taille �lev�e, domin�s par algues rouges, brunes et vertes opportunites sur s�diments grossiers, galets et petits blocs. Les faces sup�rieures sont domin�es par un m�lange d'algues vertes opportunistes et non opportunistes et de fucus. Quadra";21;0; +374261;"BDD_IVR_PlateauFour_20150803_VImport.xlsx";5;47.2955556;-2.6343056;;;;;;;"P1230565.JPG";"1";"Strate compos�e de blocs h�t�rog�nes (moyens � gros) sur mouli�re et s�diment vaseux+coquillier, les algues vertes (ulves et cladophora) pr�dominent largement le quadrat � 80%.";21;0; +374261;"BDD_IVR_PlateauFour_20150803_VImport.xlsx";4;47.2959167;-2.63325;;;;;;;"P1230559.JPG";"1";"Strate compos�e de blocs h�t�rog�nes de taille moyenne sur petits galets et sables grossiers coquillers. Blocs recouverts � 60% d'un m�lange d'algues brunes -rouges (2/3) et verte (1/3). Des laminaires sont pr�sentes (env.30%).";38;0; +374261;"BDD_IVR_PlateauFour_20150803_VImport.xlsx";3;47.2957222;-2.6311667;;;;;;;"P1230578.JPG";"1";"Strate compos�e de blocs h�t�rog�nesde taille moyenne, sur s�diments grossiers coquillier et petits blocs. Recouverts � 60% d'algues vertes et 40% de laminaires. Quadrat positionn� en milieu d'estran";59;0; +374261;"BDD_IVR_PlateauFour_20150803_VImport.xlsx";2;47.2957778;-2.6338056;;;;;;;"DSCN0207.JPG";"1";"Strate compos�e de blocs h�t�rog�nes, �quivalence de petits et moyens blocs, certains sont �pais, sur s�diments grossiers coquillier et petits blocs. Pr�sence de f.serratus, Quadrat positionn� en haut d'estran";26;8; +374261;"BDD_IVR_PlateauFour_20150803_VImport.xlsx";1;47.2950556;-2.63425;;;;;;;"DSCN0215.JPG";"2";"Strate compos�e de blocs h�t�rog�nes, dominance de gros blocs plut�t agr�g�s, sur s�diments grossiers coquillier et petits blocs. Les faces sup�rieures sont domin�es du fucus. Quadrat positionn� en bas d'estran";12;9; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";5;47.2955556;-2.6343056;;;;;;;"DSC03528.JPG";"1";"Strate compos�e de blocs h�t�rog�nes (moyens � gros) sur mouli�re et s�diment vaseux. Blocs peu mobiles. Les algues vertes (ulves et cladophora) pr�dominent largement le quadrat. Qq algues brunes.";0;6; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";4;47.2959167;-2.63325;;;;;;;"DSCN3873.JPG";"1";"Strate compos�e de blocs h�t�rog�nes (petits � moyens) sur petits galets et sables grossiers coquillers. Blocs recouverts d'un m�lange d'algues brunes et rouges. Des laminaires sont pr�sentes.";18;5; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";3;47.2957222;-2.6311667;;;;;;;;"1";"Strate compos�e de blocs h�t�rog�nes, dominance de gros blocs, sur s�diments grossiers et petits blocs. Certains bloc sont recouverts de paquets de moules, Quadrat positionn� en milieu d'estran";;; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";2;47.2957778;-2.6338056;;;;;;;"DSCN3920.JPG";"1";"Strate compos�e de blocs h�t�rog�nes, moyens � gros, sur s�diments grossiers, galets et petits blocs. Les faces sup�rieures sont domin�es par un m�lange d'algues vertes opportunistes (50%) et d'algues brunes (50%). Pr�sence de f.serratus, Quadrat positio";9;10; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";1;47.2950556;-2.63425;;;;;;;"DSC03504.JPG";"2";"Strate compos�e de blocs h�t�rog�nes (petits � moyens), dominance de gros blocs, sur s�diments grossiers et petits blocs. Les faces sup�rieures sont domin�es par un m�lange d'algues brunes et quelques ulves (+qq laminaires). Quadrat positionn� en bas d'e";12;5; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";5;47.2955556;-2.6343056;;;;;;;"P1400729.JPG";"1";"Strate compos�e de blocs h�t�rog�nes (moyens � gros). Blocs peu mobiles. Les algues vertes (ulves et cladophora) dominent largement le quadrat";6;13; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";4;47.2959167;-2.63325;;;;;;;"DSC_0006.JPG";"1";"Strate compos�e de blocs h�t�rog�nes (petits � moyens) sur petits galets et sables grossiers coquillers. Blocs recouverts d'algues rouges surtout, quelques blocs avec des algues vertes";14;4; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";3;47.2957222;-2.6311667;;;;;;;"DSC_0039.JPG";"1";"Strate compos�e de blocs homog�nes, dominance de blocs moyens, sur s�diments grossiers et petits blocs. M�lange de blocs recouverts d'algues rouges (++), d'algues vertes non opportunistes (++), et blocs nus.";7;2; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";2;47.2957778;-2.6338056;;;;;;;"P1230674.JPG";"1";"Strate compos�e de blocs h�t�rog�nes, moyens � gros, sur s�diments grossiers, galets et petits blocs. Les faces sup�rieures sont domin�es par les algues rouges . Pr�sence �parse d'algues vertes et d'ulves. Quadrat positionn� en haut d'estran";11;6; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";1;47.2950556;-2.63425;;;;;;;"P1230629.JPG";"2";"Strate compos�e de blocs h�t�rog�nes (petits � moyens), sur s�diments grossiers et petits blocs. Les faces sup�rieures sont domin�es les algues brunes et rouges, quelques ulves. Quadrat positionn� en bas d'estran";12;6; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";5;47.2955556;-2.6343056;;;;;;;"DSC_0211.JPG";"1";"Blocs moyens, dominance d'algues vertes. Substrat de sable grossier coquillier et petits blocs";3;20; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";4;47.2959167;-2.63325;;;;;;;"P1230759.JPG";"1";"Blocs �parses dansle quadrat; H�t�rog�nes petit � moyen-gros ; Pr�sence algues vertes et rouges surtout";23;6; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";3;47.2957222;-2.6311667;;;;;;;"DSC_0146.JPG";"1";"Blocs petits � moyens, dominace algues vertes avec quelques blocs dominance algues rouges";14;10; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";2;47.2957778;-2.6338056;;;;;;;"DSC_0178.JPG";"1";"Blocs petits � moyens, m�lange algues rouges et vertes opportunistes, pr�sence de Fucus serratus; substrat sableux/platier rocheux";8;8; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";1;47.2950556;-2.63425;;;;;;;"P1230704.JPG";"2";"Blocs h�t�rog�nes, petits � gros. M�lange d'algues vertes opportunistes et d'algues rouges";12;4; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";5;47.2955556;-2.6343056;;;;;;;"DSC_0325.JPG";"1";"Blocs moyens, dominance d'algues vertes. Substrat de sable grossier coquillier et petits blocs";1;17; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";4;47.2959167;-2.63325;;;;;;;"DSC_0366.JPG";"1";"Blocs �parses dans le quadrat ; H�t�rog�nes petit � moyen-gros ; Pr�sence algues vertes (40%) et rouges (60%) + pr�sence laminaires. Nessain de moules tr�s pr�sent";7;1; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";3;47.2957222;-2.6311667;;;;;;;"P1230883.JPG";"1";"Blocs petits � moyens, dominance algues vertes avec quelques blocs dominance algues rouges. Peu de gros blocs mobiles, surtout petits blocs. Nessain de moules tr�s pr�sent";0;21; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";2;47.2957778;-2.6338056;;;;;;;"P1230920.JPG";"1";"Blocs petits � moyens, m�lange algues rouges et vertes opportunistes, pr�sence fucus; substrat sableux/platier rocheux";8;9; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";1;47.2950556;-2.63425;;;;;;;"P1230847.JPG";"2";"Blocs h�t�rog�nes, petits � gros. M�lange d'algues vertes opportunistes (20%) et d'algues rouges (80%). Sable coquilier. Peu de blocs mobiles";6;4; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";5;46.3416111;-1.47575;;;;;;;;"4";"Strate situ�e en limite haute du champ de blocs, compos�e de petits blocs dont les faces sup�rieures sont domin�es par les balanes et la roche nue. Substrat sous-jacent : petits blocs, cailloux et pr�sence de platier rocheux +";40;11; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";4;46.3410278;-1.4760556;;;;;;;;"3";"Strate compos�e de blocs de petite taille dont les faces sup�rieures sont domin�es par la pr�sence de mouli�res. Substrat sous-jacent : petits blocs, quelques zones de platier rocheux et s�diments grossiers +";11;35; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";3;46.3404722;-1.4766944;;;;;;;;"2";"Strate situ�e dans la limite basse � moyenne du champ de blocs, domin�e par des blocs de taille �lev�e, pr�sence de nombreuses algues vertes opportunistes sur les faces sup�rieures. Substrat sous-jacent : petits blocs, cailloux et pr�sence de platier roc";81;17; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";2;46.34075;-1.4754444;;;;;;;;"2";"Strate situ�e dans la limite basse � moyenne du champ de blocs, domin�e par des blocs de taille �lev�e, pr�sence de nombreuses algues vertes opportunistes sur les faces sup�rieures. Substrat sous-jacent : petits blocs, cailloux et pr�sence de platier roc";0;69; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";1;46.3410556;-1.4773611;;;;;;;;"1";"Strate situ�e dans la limite inf�rieure du champ de blocs, orientation ouest, pr�sent�e en arc de cercle, compos�e de blocs de taille tr�s diverse avec une dominance de mouli�res sur les faces sup�rieures. Substrat sous-jacent compos� de petits blocs et ";48;19; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";5;46.3416111;-1.47575;;;;;;;"Q5.JPG";"4";"Strate compos�e de blocs de taille moyenne � �lev�e, sur s�diments grossiers et petits blocs, dont les faces sup�rieures. ";13;18; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";4;46.3410278;-1.4760556;;;;;;;"Q4.JPG";"3";"Strate compos�e de blocs de taille moyenne � �lev�e, sur s�diments grossiers et petits blocs, dont les faces sup�rieures. ";17;30; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";3;46.3404722;-1.4766944;;;;;;;"Q3.JPG";"2";"Strate compos�e de blocs de taille moyenne � �lev�e, sur s�diments grossiers et petits blocs, dont les faces sup�rieures. ";21;4; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";2;46.34075;-1.4754444;;;;;;;"Q2.JPG";"2";"Strate compos�e de blocs de taille moyenne � �lev�e, sur s�diments grossiers et petits blocs, dont les faces sup�rieures. ";14;16; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";1;46.3410556;-1.4773611;;;;;;;"Q1.JPG";"1";"Strate compos�e de blocs de taille moyenne � �lev�e, sur s�diments grossiers et petits blocs, dont les faces sup�rieures. ";23;27; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";5;46.3416111;-1.47575;;;;;;;"Tranche_01102015_Q5.JPG";"4";;17;40; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";4;46.3410278;-1.4760556;;;;;;;"Tranche_02102015_Q4.JPG";"3";;20;20; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";3;46.3404722;-1.4766944;;;;;;;"Tranche_01102015_Q3.JPG";"2";;13;49; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";2;46.34075;-1.4754444;;;;;;;"Tranche_01102015_Q2.JPG";"2";;11;24; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";1;46.3410556;-1.4773611;;;;;;;"Tranche_30092015_Q1.JPG";"1";;45;79; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";5;46.3416111;-1.47575;;;;;;;"P1010378.JPG";"4";"Blocs mobiles domin�s par des balanes et/ou de la roche nue";9;22; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";4;46.3410278;-1.4760556;;;;;;;"P1010369.JPG";"3";"Blocs mobiles domin�s par les mouli�res";11;11; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";3;46.3404722;-1.4766944;;;;;;;"DSCF7947.JPG";"2";"Blocs mobiles domin�s par des algues vertes opportunistes et/ou de la roche nue";24;18; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";2;46.34075;-1.4754444;;;;;;;"P1010376.JPG";"2";"Blocs mobiles domin�s par des algues vertes opportunistes et/ou de la roche nue";2;23; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";1;46.3410556;-1.4773611;;;;;;;"P1010363.JPG";"1";"Blocs mobiles domin�s par les mouli�res";11;38; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";5;46.3416111;-1.47575;;;;;;;"Q5.JPG";"4";"Blocs de taille moyenne � �lev�e";9;5; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";4;46.3410278;-1.4760556;;;;;;;"Q4.JPG";"3";"Blocs de taille petite � moyenne, pr�sence d'algues vertes opportunistes";2;12; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";3;46.3404722;-1.4766944;;;;;;;"Q3.JPG";"2";"Blocs de taille moyenne � �lev�e, avec pr�sence d'algues vertes opportunistes";1;25; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";2;46.34075;-1.4754444;;;;;;;"Q2.JPG";"2";"Blocs de taille petite � moyenne, domin�s par des algues vertes opportunistes";2;20; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";1;46.3410556;-1.4773611;;;;;;;"Q1.JPG";"1";"Blocs de taille petite � moyenne,dont les faces sup�rieures sont domin�es par des algues vertes opportunistes";1;26; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";5;33.9417993;10.0386781;;;;;;;;"Pas de stratification";;30;4; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";4;33.941837;10.0384992;;;;;;;;"2";;36;7; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";3;33.942117;10.0383335;;;;;;;;"2";;27;5; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";2;33.9414627;10.0383245;;;;;;;;"2";;50;10; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";1;33.9428247;10.037875;;;;;;;;"1";;26;6; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";5;33.9417993;10.0386781;;;;;;;"DSC02677.JPG";"2";"Blocs de petite taille sur gravier, galets, rares algues rouges";37;20; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";4;33.941837;10.0384992;;;;;;;"DSC06094.JPG";"2";"Blocs de petite taille sur sable grossier, cailloux/cailloutis et galets, domin�s par quelques algues brunes";25;20; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";3;33.942117;10.0383335;;;;;;;"DSC02668.JPG";"2";"Blocs de petite taille sur gravier et galets, domin�s par les algues rouges";19;36; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";2;33.9414627;10.0383245;;;;;;;"DSC06101.JPG";"2";"Blocs sur galets et cailloux/cailloutis, domin�s par quelques algues rouges";17;11; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";1;33.9428247;10.037875;;;;;;;"DSC06108.JPG";"1";"Blocs sur galets et cailloux de taille moyenne, domin�s par quelques algues rouges et vertes opportunistes";15;9; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";5;33.9418504;10.038701;;;;;;;"DSC06342.JPG";"2";"Blocs de petite taille domin�s par les algues rouges et vertes opportunistes";31;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";4;33.9415846;10.0384542;;;;;;;"DSC06353.JPG";"2";"Blocs de petite taille domin�s par les algues rouges et vertes opportunistes";35;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";3;33.9421266;10.038329;;;;;;;"DSC02985.JPG";"2";"Blocs de taille variable mais majoritairement petits, domin�s � la fois par des algues vertes opportunistes et des algues rouges";22;8; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";2;33.9414631;10.0382968;;;;;;;"DSC02986.JPG";"2";"Blocs sur blocs de petite taille, domin�s par les algues vertes opportunistes et quelques algues rouges";20;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";1;33.9428177;10.0379141;;;;;;;"DSC02992.JPG";"1";"Blocs de petite taille domin�s par algues rouges et vertes opportunistes";11;5; +375068;"BDD_IVR_LaBree_08092014_VImport.xlsx";5;46.027437;-1.346964;;;;;;;"Strate 5 (9).JPG";"5";"Strate situ�e en limite basse (d�couvre � partit d'un coefficient de 90 et plus). Strate peu large et longue (tombant de banche en escalier), blocs moyens. Fr�quentation pour la p�che � pied: ++";30;14; +375068;"BDD_IVR_LaBree_08092014_VImport.xlsx";4;46.028231;-1.345188;;;;;;;"Strate 4 (5).JPG";"4";"Strate qui constitue la limite basse du champ de blocs (d�couvre � partir d'un coefficient de 95 et plus). Strate peu large et longue (tombant de banche en escalier), gros blocs r�cents. Fr�quentation pour la p�che � pied: +";19;5; +375068;"BDD_IVR_LaBree_08092014_VImport.xlsx";3;46.027453;-1.344091;;;;;;;"Strate 3 (1).JPG";"3";"Strate situ�e en limite basse du champ de blocs (d�couvre � partit d'un coefficient de 90 et plus). Forte densit� de blocs de toutes tailles, blocs assez gros, flaques, strate �tendue sur le bas d'estran. Fr�quentation pour la p�che � pied: ++";24;13; +375068;"BDD_IVR_LaBree_08092014_VImport.xlsx";2;46.02652;-1.346628;;;;;;;"Strate 2 (13).JPG";"2";"Strate situ�e en limite haute du champ de blocs (d�couvre � partir d'un coeff icient de 85 et plus). Blocs dispers�s, pr�sence de blocs assez gros, substrat compos� d'ulves en d�p�ts, eau et gravier. Fr�quentation pour la p�che � pied: -";24;9; +375068;"BDD_IVR_LaBree_08092014_VImport.xlsx";1;46.025006;-1.347422;;;;;;;"Strate 1 (15).JPG";"1";"Strate situ�e en limite haute (d�couvre � partir de oefficient de 80 et plus). Blocs moyens et dispers�s, substrat ulves et eau, l�g�rement ensabl�. Fr�quentation pour la p�che � pied: -";22;11; +375075;"BDD_IVR_LaBree_11092014_Vmport.xlsx";5;46.027437;-1.346964;;;;;;;"Strate 5 (5).JPG";"5";"Strate situ�e en limite basse (d�couvre � partit d'un coefficient de 90 et plus). Strate peu large et longue (tombant de banche en escalier), blocs moyens. Fr�quentation pour la p�che � pied: ++";31;9; +375075;"BDD_IVR_LaBree_11092014_Vmport.xlsx";4;46.028231;-1.345188;;;;;;;"Strate 4 (7).JPG";"4";"Strate qui constitue la limite basse du champ de blocs (d�couvre � partir d'un coefficient de 95 et plus). Strate peu large et longue (tombant de banche en escalier), gros blocs r�cents. Fr�quentation pour la p�che � pied: +";42;7; +375075;"BDD_IVR_LaBree_11092014_Vmport.xlsx";3;46.027453;-1.344091;;;;;;;"Strate 3 (6).JPG";"3";"Strate situ�e en limite basse du champ de blocs (d�couvre � partit d'un coefficient de 90 et plus). Forte densit� de blocs de toutes tailles, blocs assez gros, flaques, strate �tendue sur le bas d'estran. Fr�quentation pour la p�che � pied: ++";32;5; +375075;"BDD_IVR_LaBree_11092014_Vmport.xlsx";2;46.02652;-1.346628;;;;;;;"Strate 2 (8).JPG";"2";"Strate situ�e en limite haute du champ de blocs (d�couvre � partir d'un coeff icient de 85 et plus). Blocs dispers�s, pr�sence de blocs assez gros, substrat compos� d'ulves en d�p�ts, eau et gravier. Fr�quentation pour la p�che � pied: -";21;10; +375075;"BDD_IVR_LaBree_11092014_Vmport.xlsx";1;46.025006;-1.347422;;;;;;;"Strate 1 (5).JPG";"1";"Strate situ�e en limite haute (d�couvre � partir de oefficient de 80 et plus). Blocs moyens et dispers�s, substrat ulves et eau, l�g�rement ensabl�. Fr�quentation pour la p�che � pied: -";26;6; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";5;46.027483;-1.34703;;;;;;;"oct14-BreeQ5.JPG";"2";"Blocs sur blocs avec cailloutis.";26;7; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";4;46.02823;-1.34573;;;;;;;;"1";"Blocs sur blocs. +Bonne proportion. +Blocs sur banche. +Sable.";12;8; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";3;46.027283;-1.34385;;;;;;;;"3";"Blocs petits � gros. +Matrice caillouteuse et petits blocs. +S�diment avec d�bris coquilliers. +Zone tr�s p�ch�e avec pr�sence d'eau.";33;5; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";2;46.0266;-1.346567;;;;;;;"oct14-BreeQ2.JPG";"4";"Blocs sur blocs. +Cailloutis. +Petits blocs en g�n�ral.";25;1; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";1;46.025283;-1.347267;;;;;;;"oct14-BreeQ1.JPG";"1";"Matrice cailloux type cal�. +Blocs petits � moyens. +Zone peu p�ch�e, point de passage.";4;4; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";5;46.027483;-1.34703;;;;;;;;"2";"Blocs sur blocs avec cailloutis.";23;3; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";4;46.02823;-1.34573;;;;;;;;"1";"Blocs sur blocs. +Bonne proportion. +Blocs sur banche. +Sable.";8;4; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";3;46.027283;-1.34385;;;;;;;;"3";"Blocs petits � gros. +Matrice caillouteuse et petits blocs. +S�diment avec d�bris coquilliers. +Zone tr�s p�ch�e avec pr�sence d'eau.";10;3; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";2;46.0266;-1.346567;;;;;;;;"4";"Blocs �pars gros � petits sur une matrice de petits blocs. Dominance de blocs rouges.";13;6; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";1;46.025283;-1.347267;;;;;;;;"1";"Matrice cailloux type cal�. +Blocs petits � moyens. +Zone peu p�ch�e, point de passage.";7;3; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";5;46.027483;-1.34703;;;;;;;"La Bree Oct 2015 Q5 (2).JPG";"2";"Petits blocs sur petits blocs (juste qq moyens), peu exond�";27;1; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";4;46.02823;-1.34573;;;;;;;"La Bree Oct 2015 Q4 (2).JPG";"1";"Quadrat en bord de faille, nombreux blocs fixes de tailles variables";10;7; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";3;46.027283;-1.34385;;;;;;;"La Bree Oct 2015 Q3 (2).JPG";"3";"Blocs sur blocs de tailles moyennes � petites, majoritairement exond�";12;1; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";2;46.0266;-1.346567;;;;;;;"La Bree Oct 2015 Q2 (3).JPG";"4";"Blocs de tailles moyennes � petites sur platier et galets, exond� pour la moiti� du quadrat";10;1; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";1;46.025283;-1.347267;;;;;;;"La Bree Oct 2015 Q1 (2).JPG";"1";"Blocs de petites tailles sur platier et galets, majoritairement exond�";8;1; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";5;46.027483;-1.34703;;;;;;;"La br�e Avr16 Q5 vue g�n�rale.JPG";"2";"Blocs de toutes tailles";22;6; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";4;46.02823;-1.34573;;;;;;;"La br�e Avr16 Q4 Vue G�n�rale.JPG";"1";"Gros blocs ensabl�s sur petits blocs";6;9; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";3;46.027283;-1.34385;;;;;;;"La br�e Avr16 Q3 Vue G�n�rale.JPG";"3";"Blocs sur banche et galets";16;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";2;46.0266;-1.346567;;;;;;;"La br�e Avr16 Q2 Vue G�n�rale.JPG";"4";"Blocs mobiles de taille petite � moyenne sur cailloux, galets";10;1; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";1;46.025283;-1.347267;;;;;;;"La br�e Avr16 Q1 vue g�n�rale.JPG";"1";"Petits blocs sur cailloutis, �pars, domin�s par de la roche nue et des algues rouges";6;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";5;46.027483;-1.34703;;;;;;;"La br�e Oct16 Q5 vuegen.JPG";"2";"Blocs de taille petite � moyenne sur platier rocheux";20;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";4;46.02823;-1.34573;;;;;;;"La br�e Oct16 Q4 vueGen.JPG";"1";"Blocs de taille tr�s �lev�e sur petits blocs et sable grossier";19;2; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";3;46.027283;-1.34385;;;;;;;"La br�e Oct16 Q3 vuegen.JPG";"3";"Blocs sur cailloutis et galets";16;2; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";2;46.0266;-1.346567;;;;;;;"La br�e Oct16 Q2 vuegen.JPG";"4";"Blocs �pars sur cailloutis et galets";9;3; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";1;46.028415;-1.3467067;;;;;;;"La br�e Oct16 Q1 vuegen.JPG";"1";"Blocs sur petits blocs et sable grossier";14;3; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";5;46.050313;-1.3836;;;;;;;"Vue_gen_Q5.JPG";"4";"Zone de blocs mobiles situ�e dans la zone moyenne du champ de blocs, � son extr�mit� sud. Blocs de taille moyenne � petite, relativement �parses, sur s�diments grossiers, cailloutis et petits blocs. Faces sup�rieures domin�es par des algues rouges en m�l";17;5; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";4;46.051018;-1.38473;;;;;;;"Vue_gen_Q4_2.JPG";"5";"Zone de blocs mobiles situ�e en limite basse du champ de blocs. Les blocs sont de taille moyenne � �lev�e, sur petits blocs, cailloux et sable grossier. Faces sup�rieures domin�es par des algues rouges en m�lange pour les blocs non retourn�s et pr�sence ";43;6; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";3;46.051254;-1.38408;;;;;;;"Vue_gen_Q3.JPG";"2";"Zone de blocs mobiles situ�e dans la zone moyenne du champ de blocs, tr�s fr�quent�e. Les blocs sont de taille �lev�e � tr�s �lev�e, sur s�diments grossiers et cailloutis.Faces sup�rieures domin�es par des mosa�ques d'esp�ces : patchs d'algues rouges et ";46;2; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";2;46.051781;-1.383774;;;;;;;"Vue_gen_Q2_1.JPG";"1";"Zone de blocs mobiles situ�e en limite haute du champ de blocs. Pr�sence de nombreuses mares. Les blocs sont �parses, de taille moyenne � petite, sur blocs principalement. Les faces sup�rieures sont majoritairement nues, quelques blocs pr�sentent une cou";44;3; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";1;46.051354;-1.383463;;;;;;;"Vue_gen_Q1.JPG";"2";"Zone de blocs mobiles situ�e en limite haute du champ de blocs. Les blocs sont �parses, de taille moyenne � petite, sur s�diments grossiers, galets et petits blocs. Les faces sup�rieures sont majoritairement nues mais quelques blocs pr�sentent une couver";43;2; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";5;46.050313;-1.3836;;;;;;;;"4";"Blocs avec flaques permanentes";12;1; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";4;46.051018;-1.38473;;;;;;;"Perret Avr15 Q4 vue g�n�rale 1.JPG";"5";"Blocs de taille plus importante sur blocs, platiers et galets";32;12; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";3;46.051254;-1.38408;;;;;;;"Perret Avr15 Q3 Vue Global 2.JPG";"2";"Blocs soud�s par les hermelles, nombreuses flaques";17;3; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";2;46.051781;-1.383774;;;;;;;;"1";;25;1; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";1;46.051354;-1.383463;;;;;;;"Perret Avr15 Q1 vue g�n�rale 1.JPG";"2";"Blocs sur platier";22;2; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";5;46.050313;-1.3836;;;;;;;"Antiochat Oct 2015 Q5 (3).JPG";"4";"Blocs petits � moyens, banches et galets. Canop�e alguale importante.";27;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";4;46.051018;-1.38473;;;;;;;"Antiochat Oct 2015 Q4.JPG";"5";"Blocs sur cailloux et sable grossier";21;3; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";3;46.051254;-1.38408;;;;;;;"Antiochat Oct 2015 Q3 (1).JPG";"2";"Gros et moyens blocs sur platier ensabl� par sable grossier";21;4; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";2;46.051781;-1.383774;;;;;;;"Antiochat Oct 2015 Q2.JPG";"1";"Blocs sur blocs et blocs sur banche � 1/4 du quadrat";43;4; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";1;46.051354;-1.383463;;;;;;;"Antiochat Oct 2015 Q1 (2).JPG";"2";"Blocs moyens et gros, dans flaques et sur banches. Galets. Pr�sence d'hermelles et algues rouges";36;1; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";5;46.050313;-1.3836;;;;;;;"Antiochat Avr16 Q5 Vue g�n�rale.JPG";"4";"Bloc sur platier rocheux ensabl� etgalets";12;2; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";4;46.051018;-1.38473;;;;;;;"Antiochat Avr16 Q4 Vue g�n�rale.JPG";"5";"Blocs sur blocs, sable grossier et galets";38;4; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";3;46.051254;-1.38408;;;;;;;"Antiochat Avr16 Q3 vue G�n�rale.JPG";"2";"Blocs de taille �lev�e en bordure de flaques, pr�sence d'hermelles,. Blocs sur sable, cailloutis et banches";29;3; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";2;46.051781;-1.383774;;;;;;;"Antiochat Avr16 Q2 Vue G�n�rale.JPG";"1";"Blocs sur platier rocheux et sable grossier";19;2; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";1;46.051354;-1.383463;;;;;;;"Antiochat Avr16 Q1 Vue G�n�rale.JPG";"2";"Blocs de taille moyenne domin�s par les hermelles et les algues rouges. Substrat sous-jacent: banches ensabl�es";23;7; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";1;46.051354;-1.383463;;;;;;;"Perre Oct 16 Q1 vuegen.JPG";"2";"Bloc sur platier rocheux qui s'ensable avec pr�sence de nombreuses moules.";24;1; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";2;46.051781;-1.383774;;;;;;;"Perre Oct 16 Q2 vuegen.JPG";"1";"Blocs sur blocs, galets sables";25;1; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";5;46.050313;-1.3836;;;;;;;"Perre Oct 16 Q5 vuegen.JPG";"4";"Blocs de taille �lev�e � moyenne sur galets et cailloutis";16;4; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";3;46.051254;-1.38408;;;;;;;"Perre Oct 16 Q3 vuegen.JPG";"2";"Blocs sur sable grossier";17;1; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";4;46.051018;-1.38473;;;;;;;"Perre Oct 16 Q4 vue gen.JPG";"5";"Blocs de taille �lev�e � moyenne sur blocs fix�s car tr�s ensabl�s, galets et sable";23;6; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";5;46.0451610032;-1.41821312496;;;;;;;"Chassiron Avr15 Q5 Vue Globale.JPG";"3";"Blocs sur sables et galets en haut de champ de blcos";11;8; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";4;46.045017086;-1.41817366379;;;;;;;"Chassiron Avr15 Q4 Vue Globale.JPG";"3";"Blocs sur blocs et substrat de sables grossier dans flaque";;; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";3;46.0450641247;-1.41859154763;;;;;;;;"2";"Blocs gros � tr�s gros assez fix�s. Dans le milieu du champs de blocs en bordure de flaques. Moules";25;1; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";2;46.0450286923;-1.41892574726;;;;;;;"Chassiron Avr15 Q2 Vue Globale.JPG";"2";"Blocs gros sur platier rocheux";16;14; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";1;46.0446735417;-1.41935982014;;;;;;;"Chassiron Avr15 Q1 Vue Globale.JPG";"1";"Bas d'estran. Blocs gros � tr�s gros sur banche. S�diment";26;1; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";5;46.0451610032;-1.41821312496;;;;;;;"Chassiron_Oct2015_Q5 (1).JPG";"3";"Haut du champs de blocs, bloc moyen � gros ds sables sur bloc m�diolittoral moyen";23;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";4;46.045017086;-1.41817366379;;;;;;;"Chassiron_Oct2015_Q4.JPG";"3";"Haut du champs de blocs, bloc moyen � gros ds sables sur bloc m�diolittoral moyen";54;7; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";3;46.0450641247;-1.41859154763;;;;;;;"Chassiron_Oct2015_Q3 (1).JPG";"2";"Blocs sur Blocs bordure mare m�diolittoral bas";65;4; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";2;46.0450286923;-1.41892574726;;;;;;;"Chassiron_Oct2015_Q2 (2).JPG";"2";"Blocs sur platier bordure mare m�diolittoral moyen � inf�rieur";30;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";1;46.0446735417;-1.41935982014;;;;;;;"Chassiron_Oct2015_Q1 (2).JPG";"1";"Blocs sur platier exond� m�diolittoral inf�rieur";21;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";5;46.0451610032;-1.41821312496;;;;;;;"Chassiron Mar16 Q5 VG.JPG";"2";"Blocs de taille moyenne sur blocs (50%) et sable grossier/platier rocheux (50%). Pr�sence de flaques permanentes. Blocs domin�s par les algues rouges dress�es, de nombreuses algues vertes opportunistes, quelques hermelles et balanes vivantes";56;18; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";4;46.045017086;-1.41817366379;;;;;;;"Chassiron Mar16 Q4 VG.JPG";"2";"Blocs de taille moyenne sur sable grossier et flaque permanente. Blocs domin�s par les algues rouges dress�es, les hermelles et quelques balanes. S�diment sableux important � la surface des blocs";9;16; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";3;46.0450641247;-1.41859154763;;;;;;;"Chassiron Mar16 Q3 VG.JPG";"3";"Blocs gros � tr�s gros sur matrice rocheuse et blocs. Quelques blocs moyens. Nombreux blocs fix�s, coh�sion par hermelles. Bordure de flaques. Algues rouges et brunes dominantes";47;4; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";2;46.0450286923;-1.41892574726;;;;;;;"Chassiron Mar16 Q2 VG.JPG";"3";"Blocs sur platier rocheux, domin�s par algues rouges dress�es et vertes opportunistes en m�lange. Pr�sence importante de s�diment � la surface des blocs";18;9; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";1;46.0446735417;-1.41935982014;;;;;;;"Chassiron Mar16 Q1 VG.JPG";"4";"Amas de blocs en bords de banche sur platier rocheux qui s'ensable. En bord de zone de laminaires et pr�sence de nombreux Codium tomentoseum et Chondrus crispus.";12;11; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";5;46.0451610032;-1.41821312496;;;;;;;"Chassiron Sept16 Q5 vue Gen.JPG";"2";"Blocs de taille moyenne sur blocs (50%) et sable grossier/platier rocheux (50%). Pr�sence de flaques permanentes. Blocs domin�s par les algues rouges dress�es, de nombreuses algues vertes opportunistes, quelques hermelles et balanes vivantes";56;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";3;46.0450641247;-1.41859154763;;;;;;;"Chassiron Sept16 Q3 VueGen.JPG";"3";"Blocs gros � tr�s gros sur matrice rocheuse et blocs. Quelques blocs moyens. Nombreux blocs fix�s, coh�sion par hermelles. Bordure de flaques. Algues rouges et brunes dominantes";22;1; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";2;46.0450286923;-1.41892574726;;;;;;;"Chassiron Sept16 Q2 Vue Gen.JPG";"3";"Blocs sur platier rocheux, domin�s par algues rouges dress�es et vertes opportunistes en m�lange. Pr�sence importante de s�diment � la surface des blocs";24;2; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";1;46.0446735417;-1.41935982014;;;;;;;"Chassiron Sept 16 Q1 vue Gen1.JPG";"4";"Amas de blocs en bords de banche sur platier rocheux qui s'ensable. En bord de zone de laminaires et pr�sence de nombreux Codium tomentoseum et Chondrus crispus.";11;6; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";4;46.045017086;-1.41817366379;;;;;;;"Chassiron Sept16 Q4 vue Gen.JPG";"2";"Blocs de taille moyenne sur sable grossier et flaque permanente. Blocs domin�s par les algues rouges dress�es, les hermelles et quelques balanes. S�diment sableux important � la surface des blocs";27;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";5;43.398283;-1.6648;;;;;;;"Q5.JPG";"1";"Blocs de taille moyenne � �lev�e sur blocs et s�diments grossiers, dominance d'algues rouges. ";35;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";4;43.398916;-1.6654;;;;;;;"Q4.JPG";"2";"Blocs de taille moyenne � �lev�e sur m�lange de petits blocs, cailloux, sable grossier et d�bris coquillers. Pr�sence d'une zone de cuvette. Blocs domin�s par algues rouges en dehors de la cuvette et par algues vertes dans la cuvette.";21;7; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";3;43.398667;-1.6651;;;;;;;"Q3.JPG";"2";"Blocs de taille moyenne � �lev�e sur m�lange de petits blocs, cailloux, sable grossier et d�bris coquillers. M�lange de blocs mobiles domin�s par algues rouges, roche nue et/ou algues vertes. ";14;8; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";2;43.398516;-1.66555;;;;;;;"Q2.JPG";"1";"Blocs de taille moyenne � �lev�e sur blocs, dominance d'algues rouges. ";17;5; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1.JPG";"2";"Blocs de taille moyenne � �lev�e sur petits blocs, de cailloux, de sable grossier et d�bris coquillers. Dominance d'algues rouges mais encorede nombreux blocs mobiles pr�sentant de fins tapis d'algues vertes sur leurs faces sup�rieures";31;12; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";5;43.398283;-1.6648;;;;;;;;"1";"Blocs sur blocs et galets.";38;6; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";4;43.398916;-1.6654;;;;;;;"Q4 DSC_2990.JPG";"2";"Blocs sur blocs et galets.";19;8; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";3;43.398667;-1.6651;;;;;;;;"2";"Strate sur blocs et galets";6;31; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";2;43.398516;-1.66555;;;;;;;"Q2 DSC_2724.JPG";"1";"Tr�s ensabl�. Blocs sur blocs, strates et galets. ";16;3; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_2666.JPG";"2";"Strate rouge/vert, blocs et galets. ";17;8; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";5;43.398283;-1.6648;;;;;;;"Q5 DSC_3495.JPG";"1";"Blocs sur blocs et dalles. Quadrat tr�s ensabl�.";11;11; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";4;43.398916;-1.6654;;;;;;;"Q4 DSC_3480.JPG";"2";"Blocs sur blocs et galets. Vert, brun et nu. Petite cuvette moins du quart du quadrat.";6;13; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";3;43.398667;-1.6651;;;;;;;"Q3 DSC_3430.JPG";"2";"Dominante verte/nue. Petits blocs sur gros galets, quelques grands blocs.";4;24; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";2;43.398516;-1.66555;;;;;;;"Q2 DSC_3410.JPG";"1";"Dominance dalgues rouges. Nombreux gros blocs et galets.";13;6; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_3391.JPG";"2";"Dominante verte, plusieurs cuvettes. Blocs verts sur blocs et galets/graviers.";7;25; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_3643.JPG";"2";"Dominante verte. Blocs verts sur strates et galets/graviers.";13;11; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";2;43.398516;-1.66555;;;;;;;"Q2 DSC_3661.JPG";"1";"Dominance d'algues vertes + roche nue. Plut�t des petits blocs, Blocs sur blocs et galets.";4;16; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";3;43.398667;-1.6651;;;;;;;"Q3 DSC_3578.JPG";"2";"Dominante rouge. Blocs de bonne taille + petis blocs sur dalles, cuvettes.";13;5; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";4;43.398916;-1.6654;;;;;;;"Q4 DSC_3555.JPG";"2";"Blocs sur blocs et galets. Vert, brun et nu. Petite cuvette moins du quart du quadrat.";12;16; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";5;43.398283;-1.6648;;;;;;;"Q5 DSC_3604.JPG";"1";"Blocs sur blocs et strate. Quadrat tr�s ensabl�.";30;1; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";5;43.398283;-1.6648;;;;;;;"Q5 DSC_4012.JPG";"1";"Blocs sur strates et blocs + sable, Dominante rouge,";18;6; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";4;43.398916;-1.6654;;;;;;;;"2";"Blocs de taille h�t�rog�nes sur sable et galets. Dominante rouge";2;9; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";3;43.398667;-1.6651;;;;;;;;"2";"Blocs sur blocs, galets et sable, Dominante rouge + roche nue";8;11; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";2;43.398516;-1.66555;;;;;;;;"1";"blocs sur blocs et galets, en partie immerg�e, Dominante rouge";8;3; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_4055.JPG";"2";"blocs sur blocs galets et graviers, dominante verte color�e";8;13; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";5;43.398283;-1.6648;;;;;;;"Q5 DSC_4507.JPG";"3";"Blocs sur blocs et platier rocheux qui s'ensable, domin�s par les algues rouges";17;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";4;43.398916;-1.6654;;;;;;;"Q4 DSC_4493.JPG";"3";"Blocs de taille tr�s �lev�e sur blocs et galets, domin�s par les algues rouges. Strate en partie immerg�e. ";12;6; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";3;43.398667;-1.6651;;;;;;;"Q3 DSC_4544.JPG";"2";"Blocs sur blocs et galets. Dominance d'algues vertes et tr�s nombreuses balanes. Pr�sence de tr�s gros blocs.";10;3; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";2;43.398516;-1.66555;;;;;;;"Q2 DSC_4468.JPG";"3";"Blocs sur blocs, galets et graviers. Dominance d'algues rouge.";8;2; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_4532.JPG";"2";"Bloc sur blocs et galets, l�g�rement domin�s par algues rouges. Strate en partie immerg�e";21;3; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";5;43.398283;-1.6648;;;;;;;"Q5 DSC_4667.JPG";"3";"Blocs sur blocs, platier rocheux , galets et graviers, domin�s par les algues rouges.";23;2; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";4;43.398916;-1.6654;;;;;;;"Q4 DSC_4637.JPG";"2";"Blocs de taille variable sur galets, domin�s par les algues vertes et rouges dress�es (strate 2).";12;5; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";3;43.398667;-1.6651;;;;;;;"Q3 DSC_4600.JPG";"2";"Blocs de taille variable sur blocs et graviers, domin�s par les algues vertes.";11;10; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";2;43.398516;-1.66555;;;;;;;"Q2 DSC_4653.JPG";"3";"Blocs sur blocs, galets et graviers, domin�s par les algues rouges. Partie immerg�e = flaque + codium adh�rent + stipocolon + cystoc�res";9;1; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_4678.JPG";"2";"Bloc sur petits blocs et galets, domin�s par les algues vertes. Strate en partie immerg�e";25;1; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";5;43.398283;-1.6648;;;;;;;"Q5 DSC_4906.JPG";"3";"Blocs sur blocs, platier rocheux, galets et graviers. Domin�s par les algues rouges. Pr�sence de quelques gros blocs retourn�s.";13;5; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";4;43.398916;-1.6654;;;;;;;"Q4 DSC_4854.JPG";"2";"Blocs de taille �lev�e sur petits blocs et galets, domin�s par les algues rouges. Pr�sence de nombreuses cuvettes d'eau permanente";13;2; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";3;43.398667;-1.6651;;;;;;;"Q3 DSC_4918.JPG";"2";"Blocs de taille variable sur blocs et graviers. Domin� par la roche nue,les algues rouges ou les algues vertes";11;5; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";2;43.398516;-1.66555;;;;;;;"Q2 DSC_4876.JPG";"3";"Blocs sur blocs, galets et graviers, domin�s par les algues rouge. Quelques blocs de taille �lev�e.";9;2; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_4936.JPG";"2";"Blocs sur petits blocs et galets, majoritairement de petite taille et domin�s par les algues vertes. ";9;4; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";3;43.398667;-1.6651;;;;;;;"Q3 DSC_5139.JPG";"2";"Blocs sur blocs, dalles et graviers, domin�s par algues vertes et roche nue";4;10; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";2;43.398516;-1.66555;;;;;;;"Q2 DSC_5072.JPG";"3";"Blocs sur blocs et platier rocheux, domin�s par les algues rouges. Pr�sence de blocs de taille tr�s �lev�e";6;2; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_5110.JPG";"2";"Blocs sur blocs et galets, domin�s par les algues vertes";8;5; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";5;43.398283;-1.6648;;;;;;;"Q5 DSC_5093.JPG";"3";"Blocs sur blocs et strates., en partie ensabl�s, domin�s par les algues rouges";10;1; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";4;43.398916;-1.6654;;;;;;;"Q4 DSC_5082.JPG";"2";"Blocs sur blocs et graviers, domin�s par les algues rouges. Pr�sence de tr�s gros blocs mobiles";6;11; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";5;43.397883;-1.663283;;;;;;;"Q5 DSC_3321.JPG";"1";"Blocs sur galets et graviers. Dominace d'algues vertes mais pr�sence importante de Corallines et de Stypocaulon dans les cuvettes. Algues rouges encro�tantes sur les galets.";6;35; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";4;43.397816;-1.66225;;;;;;;"Q4 DSC_3280.JPG";"3";"Strate � dominanate verte. Blocs sur galets, graviers. Pr�sence de Corallines.";5;22; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";3;43.397133;-1.663283;;;;;;;"Q3 DSC_3197.JPG";"1";"Blocs sur galets et graviers. Gigartinales.";12;11; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";2;43.396983;-1.659616;;;;;;;"Q2 DSC_3158.JPG";"2";"Blocs et galets sur galets. Mix rouge et vert.";8;10; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_3109.JPG";"3";"Blocs petits � moyens, nus sur galets et graviers.";5;44; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";5;43.397883;-1.663283;;;;;;;"Q5 DSC_3791.JPG";"1";"Semble tr�s ensabl�. Dominance d'algues rouges avec de nombreuses algues arbustives, ulves �galement plus grandes. Strate de petits blocs et galets sur strae, sable et galets. Vers 14h30 est rest�e immerg�e en grande partie. Nombreuses nasses, gibbules e";4;5; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";4;43.397816;-1.66225;;;;;;;"Q4 DSC_3691.JPG";"3";"Gros blocs sur blocs, galets et sable. Domnante verte, corallines et Stypocaulon dans les cuvettes.";2;21; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";3;43.397133;-1.663283;;;;;;;"Q3 DSC_3776.JPG";"1";"Strate � dominance d'algues rouges. Zone de travail encore immerg�e � 13h40. Blocs sur dalle, blocs moyens � gros, sable dans les intersitces et pris dans les algues.";20;6; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";2;43.396983;-1.659616;;;;;;;"Q2 DSC_3763.JPG";"2";"blocs et galets assez immerg�s, vert et rouge. ombreux crustac�s, crabes et Pagurus, monodontes et gibules, crevettes.";9;12; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_3679.JPG";"3";"Petits blocs � moyens sur blocs et galets, gris et color�s";3;49; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";5;43.397883;-1.663283;;;;;;;"Q5 DSC_4271.JPG";"1";"Strate � dominante rouge, bloc sur graviers";8;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";4;43.397816;-1.66225;;;;;;;"Q4 DSC_4084.JPG";"3";"Starte de blocs moyens � gros sur galets, blocs et sable, dominante verte, reste en eau";7;16; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";3;43.397133;-1.663283;;;;;;;"Q3 DSC_4177.JPG";"1";"Strate � dominante rouge restant en partie immerg�e, blocs sur blocs et galets";14;2; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";2;43.396983;-1.659616;;;;;;;;"2";"Strate a� dominante rouge, blocs sur blocs, sur dalles et galets, nombreux blocs non mobiles";21;1; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_4072.JPG";"3";"Blocs petits � moyens, dominante grise (couleur roche), Pas mal retourn�s, blocs sur blocs, strates, galets et graviers";1;30; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";1;43.398583;-1.665183;;;;;;;;"3";"Blocs de petite taille sur galets, domin�s par du biofilm (algues vertes) et de la roche nue ";6;5; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";2;43.396983;-1.659616;;;;;;;;"2";"Blocs sur blocs, strates et galets, domin�s par des algues rouges dress�es";8;8; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";3;43.397133;-1.663283;;;;;;;"Q3 DSC_4346.JPG";"1";"Blocs sur strates, galets et graviers, domin�s par des algues rouges (dont Gelidium sp.). Nombreux blocs fix�s";7;2; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";4;43.397816;-1.66225;;;;;;;"Q4 DSC_4556.JPG";"3";"Blocs moyens sur sable et graviers, domin�s par les algues vertes. Strate en parie immerg�e";14;3; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";5;43.397883;-1.663283;;;;;;;"Q5 DSC_4297.JPG";"1";"Blocs majoritairement de petite taille sur blocs et galets, domin�s par les algues rouges et vertes (en particulier pour les blocs de plus grande taille)";17;6; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";3;43.397133;-1.663283;;;;;;;;"1";"Blocs sur strate. Pr�sence de tr�s gros et petits blocs. Dominante algues rouges.";13;1; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";5;43.397883;-1.663283;;;;;;;"Q5 DSC_4794.JPG";"1";"Blocs sur petits blocs, domin�s par les algues vertes opportunistes (ulves bien d�velopp�es). ";11;3; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";4;43.397816;-1.66225;;;;;;;"Q4 DSC_4818.JPG";"3";"Blocs de taille variable sur sable et gravier, domin�s par les algues vertes.";11;3; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";2;43.396983;-1.659616;;;;;;;"Q2 DSC_4759.JPG";"2";"Blocs de taille variable sur strate et petits blocs, domin�s par les algues vertes et quelques algues rouges. Nombreuses flaques.";12;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_4734.JPG";"3";"Blocs de taille moyenne sur petits blocs, galets et graviers, domin�s par de la roche nue et des algues vertes opportunistes. ";9;12; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";5;43.397883;-1.663283;;;;;;;"Q5 DSC_5045.JPG";"2";"Blocs blocs, galets et strate. Majorit� de petits blocs. Dominante algues vertes.";4;5; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";4;43.397816;-1.66225;;;;;;;"Q4 DSC_4995.JPG";"2";"Blocs sur blocs, sables et galets. Dominante algues vertes.";7;2; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";3;43.397133;-1.663283;;;;;;;"Q3 DSC_5021.JPG";"3";"Blocs sur blocs et galets. Dominante de petits blocs. Dominante algues rouges.";6;4; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";2;43.396983;-1.659616;;;;;;;"Q2 DSC_5007.JPG";"2";"Bloc sur blocs, galets et graviers. Dominante algues rouges. ";11;6; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";1;43.398583;-1.665183;;;;;;;"Q1 DSC_4967.JPG";"1";"Bloc sur petits blocs, galets et graviers. Dominante roche nue.";2;7; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";4;48.65603;-2.42776;;;;;;;;"2";"Zone de blocs de taille moyenne dont les faces sup�rieures sont domin�es par les algues vertes opportunistes (Enteromorpha spp. et Ulva spp.). La zone se situe dans l�extr�mit� sud et en limite inf�rieure du champ de blocs. ";34;25; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";1;48.656;-2.42824;;;;;;;;"1";"Zone de blocs de taille moyenne sur s�diments grossiers, cailloutis et petits blocs, tr�s accol�s les uns aux autres. La couverture algale dominante est le Fucus serratus et les algues rouges en m�lange, seuls quelques blocs sont domin�s par les algues v";;; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";2;48.65598;-2.42807;;;;;;;"PA080156.JPG";"2";"Zone de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par de la roche nue ou les algues vertes opportunistes. Les blocs sont pos�s sur du sable tr�s grossier et des d�bris coquillers. ";38;40; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";3;48.65585;-2.42787;;;;;;;;"2";"Zone de blocs de taille moyenne � �lev�e, assez �parses et situ�s dans la limite inf�rieure du champ de blocs. Leurs faces sup�rieures sont domin�es par des algues rouges, mais plusieurs blocs sont �galement r�cemment retourn�s (faces sup�rieures domin�e";;; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";5;48.65561;-2.42785;;;;;;;;"1";"Zone de blocs de taille moyenne dont les faces sup�rieures sont majoritairement domin�es par du Fucus serratus et des algues rouges en m�lange. Pr�sence �galement de plusieurs blocs domin�s par les algues vertes opportunistes ou r�cemment retourn�s. ";30;23; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";1;48.656;-2.42824;;;;;;;;"1";"Blocs moyens � gros � 75% mobiles. Dabris coquillers fins (dont du ma�rl) + cailloux";29;14; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";5;48.65561;-2.42785;;;;;;;"Q5.JPG";"1";"Blocs moyens � gros";36;; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";4;48.65603;-2.42776;;;;;;;"Q4.JPG";"2";"Blocs moyens � petits, couverture algues vertes, sable fin + cailloux";51;25; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";3;48.65585;-2.42787;;;;;;;"Q3.JPG";"2";"Blocs moyens � gros � 60% mobiles. D�bris coquillers grossiers + d�bris de ma�rl+cailloux ";33;9; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";2;48.65598;-2.42807;;;;;;;"Q2.JPG";"2";"Blocs moyens � gros � 60% mobiles. D�bris coquillers fins + d�bris de ma�rl";27;12; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";5;48.65561;-2.42785;;;;;;;"Q5_IVR.JPG";"1";"Fucus serratus, peu d'eau, algues rouges";21;7; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";4;48.65603;-2.42776;;;;;;;"Q4_IVR.JPG";"2";"Fucus serratus, beaucoup de blocs retourn�s, m�lange de petits et moyens blocs, algues vertes (Ulva spp.), Algues rouges, s�diment fin";52;14; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";3;48.65585;-2.42787;;;;;;;"Q3_IVR.JPG";"2";"Fucus serratus, pr�sence d'algues rouges, s�diment fin";23;25; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";2;48.65598;-2.42807;;;;;;;"Q2_IVR.JPG";"2";"Fucus serratus, pr�sence d'algues rouges, s�diments fin, peu d'eau";13;11; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";1;48.656;-2.42824;;;;;;;"Q1_IVR.JPG";"1";"Fucus serratus, pr�sence d'algues rouges, s�diments grossiers (+ galets), pas d'eau";21;10; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";5;48.65561;-2.42785;;;;;;;"Q5_111.JPG";"1";"Blocs domin�s par du Fucus serratus en m�lange avec algues brunes/rouges et quelques enteromorphes";26;23; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";1;48.6560022;-2.42824;;;;;;;"Q1_108.JPG";"1";"Blocs domin�s par du Fucus serratusen m�lange avec algues brunes/rouges et quelques enteromorphes";28;11; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";2;48.65598;-2.42807;;;;;;;"Q2_104.JPG";"2";"Blocs domin�s par du Fucus serratus en m�lange avec algues brunes/rouges et quelques enteromorphes";40;20; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";3;48.65585;-2.42787;;;;;;;"Q3_112.JPG";"2";"Blocs domin�s par du Fucus serratus en m�lange avec algues brunes/rouges et quelques enteromorphes. Nombreuses zones de roche nue. Blocs sur substrat grossier et d�bris coquillers";36;9; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";4;48.65603;-2.42776;;;;;;;"Q4_113.JPG";"2";"Blocs domin�s par du Fucus serratus en m�lange avec algues brunes/rouges et quelques enteromorphes. Quadrat positionn� dans mare d'eau permanente (mouvement du banc de sable observ�)";53;21; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";5;48.65561;-2.42785;;;;;;;"PA170156.JPG";"1";"Fucus serratus en m�lange avec algues rouges, blocs assez gros";42;3; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";4;48.65603;-2.42776;;;;;;;"PA180103.JPG";"2";"Fucus serratus, un peu d'Enteromorphes";23;12; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";3;48.65585;-2.42787;;;;;;;"PA170154.JPG";"2";"Blocs moyens, domin�s par Fucus serratus et quelques Ent�romorphes, sur d�bris coquillers.";47;9; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";2;48.65598;-2.42807;;;;;;;"PA170089.JPG";"2";"Algues brunes, rouges et vertes, zones nues avec substrat grossier";32;23; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";1;48.656;-2.42824;;;;;;;"PA180217.JPG";"1";"Fucus serratus et un peu d'Enteromorphes. Blocs moyens � petits";19;10; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";5;48.3783;-4.91041667;;;;;;;"P9300044.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et Saccharina et algue rouges. ";55;0; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";1;48.3784;-4.9097;;;;;;;"P9300005.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et rouges. ";62;0; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";2;48.378683;-4.9104;;;;;;;"P9300007.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et Saccharina et algue rouges. ";61;0; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";3;48.378567;-4.910683;;;;;;;"P9300035.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et Saccharina et algue rouges. ";68;0; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";4;48.37855;-4.910933;;;;;;;"P9300037.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et Saccharina et algue rouges + algues vertes.";61;0; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";1;48.3784;-4.9097;;;;;;;"P4070005.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et rouges. ";62;0; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";5;48.3783;-4.91041667;;;;;;;;"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et Saccharina et algue rouges. ";55;0; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";4;48.37855;-4.910933;;;;;;;;"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et Saccharina et algue rouges + algues vertes.";61;0; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";3;48.378567;-4.910683;;;;;;;"P4070035.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et Saccharina et algue rouges. ";68;0; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";2;48.378683;-4.9104;;;;;;;"P4070007.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et Saccharina et algue rouges. ";61;0; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";5;48.3783;-4.91041667;;;;;;;;"Pas de stratification";;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";1;48.3784;-4.9097;;;;;;;;"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et fucus et rouges. ";33;0; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";2;48.378683;-4.9104;;;;;;;;"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et rouges et verte. ";30;0; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";3;48.378567;-4.910683;;;;;;;;"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et rouges. ";37;0; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";4;48.37855;-4.910933;;;;;;;;"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et rouges et verte. ";25;0; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";1;48.3784;-4.9097;;;;;;;"P4270015.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes et rouges. ";37;0; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";5;48.3783;-4.91041667;;;;;;;"P4270028.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et algue rouges. ";17;0; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";3;48.378567;-4.910683;;;;;;;"P4270009.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et algue rouges et algues verte";28;6; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";2;48.378683;-4.9104;;;;;;;"P4270001.JPG";"Pas de stratification";;49;0; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";4;48.37855;-4.910933;;;;;;;"P4270022.JPG";"Pas de stratification";"Strate compos�e de blocs de taille moyenne � �lev�e, dont les faces sup�rieures sont domin�es par les algues brunes Himanthalia et Saccharina et algue rouges + algues vertes.";36;0; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";4;48.377317;-4.91038333E8;;;;;;;"DSCF0423.JPG";"Pas de stratification";"sable moyen, cailloutis, blocs �parses";29;0; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";5;48.37705;-4.91053333;;;;;;;"DSCF0430.JPG";"Pas de stratification";"sable moyen, cailloutis, blocs �parses";35;1; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";3;;;;;;;;;;"Pas de stratification";;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";2;;;;;;;;;;"Pas de stratification";;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";1;48.377567;-4.91018333;;;;;;;"DSCF0417.JPG";"Pas de stratification";"sable moyen, cailloutis, blocs �parses";29;0; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";5;;;;;;;;;;"Pas de stratification";;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";4;;;;;;;;;;"Pas de stratification";;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";3;48.3776;-4.9104333;;;;;;;"PA070055.JPG";"Pas de stratification";"blocs sur cailloutis et galets";25;2; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";2;48.3778;-4.91033333;;;;;;;"PA070038.JPG";"Pas de stratification";"sable grossier, cailloutis et blocs mobiles �parses";29;8; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";1;;;;;;;;;;"Pas de stratification";;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";2;48.043167;-4.873083;;;;;;;"P4080007.JPG";"Pas de stratification";"PETITS BLOCS <A4 QUELQUES BLOCS VERTS CHONDRUS ++";16;3; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";5;48.04435;-4.87025;;;;;;;"P4080025.JPG";"Pas de stratification";"GROS BLOCS SUR PETITS BLOCS ""TRES TRAVAILLES""";55;2; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";1;48.043417;-4.87325;;;;;;;"P4080001.JPG";"Pas de stratification";"CHONDRUS +++ PETITS BLOCS BRUNS PALMARIA ET BIFFURCATA ULVES";28;3; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";4;48.0435;-4.872233;;;;;;;"P4080019.JPG";"Pas de stratification";"GROS BLOCS QUELQUES VERTS QUELQUES BLANCS";91;7; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";3;48.043467;-4.872333;;;;;;;"P4080013.JPG";"Pas de stratification";"BLOCS TAILLE MOYENNE QUELQUES BLOCS VERTS";29;1; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";3;48.043467;-4.872333;;;;;;;"RIMG1065.JPG";"Pas de stratification";"BLOCS TAILLE MOYENNE QUELQUES BLOCS VERTS";134;6; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";1;48.043417;-4.87325;;;;;;;"RIMG1089.JPG";"Pas de stratification";"CHONDRUS +++ PETITS BLOCS BRUNS PALMARIA ET BIFFURCATA ULVES";40;6; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";2;;;;;;;;;;"Pas de stratification";;;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";4;48.0435;-4.872233;;;;;;;"RIMG1075.JPG";"Pas de stratification";"GROS BLOCS QUELQUES VERTS QUELQUES BLANCS";21;3; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";5;;;;;;;;;;"Pas de stratification";;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";5;48.04435;-4.87025;;;;;;;"RIMG1468.JPG";"Pas de stratification";"algues vertes 40% +Chondrus crispus 60%";163;2; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";1;48.043417;-4.87325;;;;;;;"RIMG1501.JPG";"Pas de stratification";"algues vertes 10% +Hymenthallia 10% +Bifucaria bifurcata 10% +Chondrus crispus 70%";113;5; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";2;48.043167;-4.873083;;;;;;;"RIMG1491.JPG";"Pas de stratification";"algues vertes 10% +Hymenthallia 10% +Chondrus crispus 80%";142;2; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";3;;;;;;;;;;"Pas de stratification";;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";4;48.0435;-4.872233;;;;;;;"RIMG1479.JPG";"Pas de stratification";"algues vertes 10% +Laminaria digitata 10% +Chondrus crispus 80%";117;4; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";5;48.04435;-4.87025;;;;;;;"P1130161.JPG";"Pas de stratification";"algues vertes 40% +Chondrus crispus 60%";37;0; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";1;48.043417;-4.87325;;;;;;;"P1130130.JPG";"Pas de stratification";"algues vertes 10% +Hymenthallia 10% +Bifucaria bifurcata 10% +Chondrus crispus 70%";106;1; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";2;48.043167;-4.873083;;;;;;;"P1130137.JPG";"Pas de stratification";"algues vertes 10% +Hymenthallia 10% +Chondrus crispus 80%";129;5; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";3;48.043467;-4.872333;;;;;;;"P1130143.JPG";"Pas de stratification";"algues vertes 10% +Hymenthallia 10% +Chondrus crispus 80%";167;2; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";4;48.0435;-4.872233;;;;;;;"P1130154.JPG";"Pas de stratification";"algues vertes 10% +Laminaria digitata 10% +Chondrus crispus 80%";189;1; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";1;48.033667;-4.83436111;;;;;;;"P4210003.JPG";"Pas de stratification";"Gros blocs tr�s accol�s sur petits blocs ; Hementhales, ulves, algues rouges (dominance de chondrus crispus)";59;26; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";5;;;;;;;;;;"Pas de stratification";;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";4;48.033667;-4.834;;;;;;;"DSCF8852.JPG";"Pas de stratification";"blocs de taille moyenne � �lev�s plus ou moins �pars. Sur blocs, limite haute du chanmps de blocs";69;5; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";3;48.033639;-4.83405556;;;;;;;"P4210009.JPG";"Pas de stratification";"Gros blocs tr�s accol�s sur sable ; Hemanthales, laminaires, Chondrus crispus, eau ""stagnante""";58;0; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";2;48.03375;-4.83416667;;;;;;;"DSCF8842.JPG";"Pas de stratification";"Gros blocs tr�s accol�s sur blocs, quelques blocs fixes ;AB Fucus/hemanthale et AR laminaria digitata";41;0; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";1;48.033683;-4.83403333;;;;;;;"RIMG0643.JPG";"Pas de stratification";"Gros blocs tr�s accol�s sur petits blocs ; Himenthales, enth�romorphe, algues rouges (dominance de Palmaria palmata, chondrus, et laminaria digitata) ; 1 bloc fixe";37;0; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";2;48.034033;-4.8341;;;;;;;"RIMG0662.JPG";"Pas de stratification";" blocs de taille moyenne tr�s accol�s sur blocs, pas de blocs fixes laminaria digitata domine +++ ; AR autres : palmaria et chondrus. Strate inf�rieure du champs e bloc (infralitoral inf�rieur, d�couvert 1h le jour de la manipe)";32;0; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";3;48.039667;-4.83423333;;;;;;;"RIMG0663.JPG";"Pas de stratification";"Gros blocs tr�s accol�s sur blocs ; Hemanthales, laminaires, Chondrus crispus, Palmaria ; 6 blocs fixes.";29;1; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";4;48.033883;-4.83445;;;;;;;"RIMG0671.JPG";"Pas de stratification";"blocs de taille moyenne � �lev�s. 10 blocs fixe Sur blocs, limite moyenne du champs de blocs. Hementhale, algues rouges";50;11; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";5;48.033817;-4.83461667;;;;;;;"RIMG0679.JPG";"Pas de stratification";"blocs de taille moyenne � �lev�s. 10 blocs fixe Sur blocs, limite haute du champs de blocs.Dominance d'algues brunes de type Bifurcaria bifurcata. 5 blocs fixes";28;13; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";1;;;;;;;;;"P4080046.JPG";"Pas de stratification";"20% PALMARIA +60% CHONDRUS +10% FUCUS +10% LAMINAIRES";137;3; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";2;;;;;;;;;"P4080016.JPG";"Pas de stratification";"50% FUCUS +50% LAMINAIRES";158;0; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";3;;;;;;;;;"P4080025.JPG";"Pas de stratification";"60% LAMINAIRES +40% PALMARIA";94;2; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";4;;;;;;;;;"P4080032.JPG";"Pas de stratification";"70% LAMIAIRES +15% +15% PALMARIA";170;10; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";5;;;;;;;;;"P4080038.JPG";"Pas de stratification";"70% LAMINAIRES +15% FUCUS +15% PALMARIA";92;3; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";1;;;;;;;;;"RIMG0993.JPG";"Pas de stratification";"Laminaria digitata";48;0; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";2;;;;;;;;;;"Pas de stratification";;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";3;;;;;;;;;"RIMG1005.JPG";"Pas de stratification";"Laminaria digitata et Chondrus crspus";44;5; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";4;;;;;;;;;"RIMG1006.JPG";"Pas de stratification";"Laminaria digitata et Chondrus crspus";62;3; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";5;;;;;;;;;"RIMG1012.JPG";"Pas de stratification";"Chondrus crispus, Himenthalia, Bifurcaria bifurcata,Fucus ssp";66;8; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";4;;;;;;;;;;"Pas de stratification";;6;32; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";1;;;;;;;;;"IMGP4160.JPG";"Pas de stratification";"Chondrus et laminaires majoritaires bcp de blocs en cours de recolonisation";40;10; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";3;;;;;;;;;"IMGP4163.JPG";"Pas de stratification";;12;29; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";5;;;;;;;;;"IMGP4177.JPG";"Pas de stratification";;19;36; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";2;;;;;;;;;;"Pas de stratification";;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";1;;;;;;;;;"RIMG1879.JPG";"Pas de stratification";"Laminaria digitata, Fucus serratus, Chondrus Crispus";120;0; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";2;;;;;;;;;;"Pas de stratification";;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";3;;;;;;;;;"RIMG1870.JPG";"Pas de stratification";"L digitata, Algues rouges diverses et Chondrus crispus";103;0; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";4;;;;;;;;;"RIMG1886.JPG";"Pas de stratification";;59;0; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";5;;;;;;;;;"RIMG1895.JPG";"Pas de stratification";"Bifurcaria bifurcata";39;3; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";2;48.6055;-2.5616389;;;;;;;;"Pas de stratification";"Blocs de taille moyenne sur blocs et cailloutis";24;15; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";5;48.6054444;-2.5620556;;;;;;;;"Pas de stratification";"Blocs de taille moyenne sur cailloutis et sable coquillier";22;17; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";4;48.6055556;-2.5618889;;;;;;;;"Pas de stratification";"Blocs de taille moyenne sur cailloutis et sable coquillier";34;5; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";3;48.6056111;-2.5617778;;;;;;;;"Pas de stratification";"Blocs de taille moyenne sur sable coquillier dans la limite basse du champ de blocs";0;38; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";1;48.6053333;-2.5615833;;;;;;;;"Pas de stratification";"Blocs de taille moyenne sur blocs et cailloutis";27;7; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";5;48.6054444;-2.5620556;;;;;;;;"Pas de stratification";"Blocs de taille moyenne sur cailloutis et sable coquillier";34;12; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";1;48.6053333;-2.5615833;;;;;;;;"Pas de stratification";"Blocs de taille moyenne sur blocs et cailloutis";69;16; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";2;48.6055;-2.5616389;;;;;;;;"Pas de stratification";"Blocs de taille moyenne sur blocs et cailloutis";36;25; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";3;48.6056111;-2.5617778;;;;;;;;"Pas de stratification";"Blocs de taille moyenne sur sable coquillier dans la limite basse du champ de blocs";35;6; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";4;48.6055556;-2.5618889;;;;;;;;"Pas de stratification";"Blocs de taille moyenne sur cailloutis et sable coquillier";32;10; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";1;48.6053333;-2.5615833;;;;;;;;"1";"blocs rapproch�s sur sable grossier, cailloutis";16;18; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";5;48.6054444;-2.5620556;;;;;;;;"1";"blocs rapproch�s sur sable grossier, cailloutis";26;12; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";4;48.6055556;-2.5618889;;;;;;;"IMGP0861.JPG";"1";"blocs rapproch�s sur sable grossier, cailloutis";36;5; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";3;48.6056111;-2.5617778;;;;;;;;"1";"blocs rapproch�s sur sable grossier, cailloutis";43;21; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";2;48.6055;-2.5616389;;;;;;;"IMGP0860.JPG";"1";"blocs rapproch�s sur sable grossier, cailloutis";65;18; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";5;48.6054444;-2.5620556;;;;;;;"IMGP1391.JPG";"1";"Blocs de taille moyenne sur cailloutis et sable coquillier";18;7; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";1;48.6053333;-2.5615833;;;;;;;"IMGP1415.JPG";"1";"Blocs de taille moyenne sur blocs et cailloutis";14;21; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";2;48.6055;-2.5616389;;;;;;;"IMGP1413.JPG";"1";"Blocs de taille moyenne sur blocs et cailloutis";29;20; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";3;48.6056111;-2.5617778;;;;;;;"IMGP1409.JPG";"1";"Blocs de taille moyenne sur sable coquillier dans la limite basse du champ de blocs";60;4; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";4;48.6055556;-2.5618889;;;;;;;"IMGP1400.JPG";"1";"Blocs de taille moyenne sur cailloutis et sable coquillier";37;6; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";5;48.6054444;-2.5620556;;;;;;;"P1000170.JPG";"1";"Blocs �pars domin�s par du Fucus serratus et sur sable grossier";49;19; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";3;48.6056111;-2.5617778;;;;;;;"P1000168.JPG";"1";"Blocs �pars domin�s par du Fucus serratus, Saccharina latissima,Ulva sp.. et algues rouges en m�lange. Substrat sous-jacent domin� par du sable grossier.";49;17; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";2;48.6055;-2.5616389;;;;;;;"P1000164.JPG";"1";"Blocs �pars domin�s par du Fucus serratus, Saccharina latissima,Ulva sp.. et algues rouges en m�lange. Substrat sous-jacent domin� par du sable grossier.";44;10; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";1;48.6053333;-2.5615833;;;;;;;"P1000174.JPG";"1";"Blocs �pars et de petite taille, domin�s par du Fucus serratus. Substrat sous-jacent domin� par du sable grossier.";88;4; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";4;48.6055556;-2.5618889;;;;;;;"P1000172.JPG";"1";"Blocs �pars domin�s par du Fucus serratus et sur sable grossier";63;6; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";1;48.6053333;-2.5615833;;;;;;;;"1";"Blocs de taille moyenne � petite sur sable coquillier, domin�s par du Fucus serratus.";28;19; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";5;48.6054444;-2.5620556;;;;;;;;"1";"Blocs de taille moyenne sur sable coquillier, domin�s par du Fucus serratus ";29;17; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";4;48.6055556;-2.5618889;;;;;;;;"1";"Blocs de taille moyenne sur sable coquillier, domin�s par du Fucus serratus ";24;3; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";3;48.6056111;-2.5617778;;;;;;;;"1";"Blocs de taille moyenne sur sable coquillier, domin�s par du Fucus serratus, Saccharina latissima,Ulva sp.. et algues rouges en m�lange. ";49;10; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";2;48.6055;-2.5616389;;;;;;;;"1";"Blocs de taille �lev�e � moyenne sur sable coquillier et cailloutis, domin�s par du Fucus serratus, Saccharina latissima,Ulva sp.. et algues rouges en m�lange. ";25;15; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";5;48.5988333;-2.5569444;;;;;;;;"4";"Blocs de taille moyenne sur sable grossier. Limite basse du champ de blocs.";5;12; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";1;48.5993056;-2.5555833;;;;;;;;"1";"Blocs de taille moyenne assez ensabl�s sur sable fin. Limite haute du champ de blocs. Faible densit� de blocs.";1;14; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";2;48.5935;-2.5559444;;;;;;;;"1";"Blocs de taille moyenne sur cailloutis et sable fin. Limite haute du champ de blocs.";0;45; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";3;48.5992222;-2.5562222;;;;;;;;"2";"Blocs de taille moyenne sur sable grossier et cailloutis. Limite basse du champ de blocs.";12;10; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";4;48.5992778;-2.5565833;;;;;;;;"3";"Blocs de taille moyenne sur sable grossier et cailloutis. Limite basse du champ de blocs.";1;33; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";1;48.5993056;-2.5555833;;;;;;;;"1";"Blocs de taille moyenne assez ensabl�s sur sable fin. Limite haute du champ de blocs. Faible densit� de blocs.";6;9; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";5;48.5988333;-2.5569444;;;;;;;;"4";"Blocs de taille moyenne sur sable grossier. Limite basse du champ de blocs.";12;14; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";4;48.5992778;-2.5565833;;;;;;;;"3";"Blocs de taille moyenne sur sable grossier et cailloutis. Limite basse du champ de blocs.";4;12; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";3;48.5992222;-2.5562222;;;;;;;;"2";"Blocs de taille moyenne sur sable grossier et cailloutis. Limite basse du champ de blocs.";15;6; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";2;48.5935;-2.5559444;;;;;;;;"1";"Blocs de taille moyenne sur cailloutis et sable fin. Limite haute du champ de blocs.";3;16; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";5;48.5988333;-2.5569444;;;;;;;"IMGP0795.JPG";"4";"blocs �parses sur sable grossier et cailloutis";31;12; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";1;48.5993056;-2.5555833;;;;;;;"IMGP0766.JPG";"1";"blocs �parses sur sable grossier";32;14; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";2;48.5935;-2.5559444;;;;;;;"IMGP0770.JPG";"1";"blocs �parses sur roche en place, cailloutis et sable grossier";5;42; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";3;48.5992222;-2.5562222;;;;;;;;"2";"blocs �parses sur roche en place, cailloutis et sable grossier";39;3; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";4;48.5992778;-2.5565833;;;;;;;"IMGP0790.JPG";"3";"blocs �parses sur roche en place, cailloutis et sable grossier";30;6; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";1;48.5993056;-2.5555833;;;;;;;"IMGP1225.JPG";"1";"Blocs de taille moyenne, �parses. Dominance algues brunes + balanes";16;18; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";5;48.5988333;-2.5569444;;;;;;;"IMGP1222.JPG";"4";"Blocs sur sable de taille moyenne, �parses. Algues brunes et vertes en m�lange.";22;20; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";3;48.5992222;-2.5562222;;;;;;;"IMGP1209.JPG";"2";"Blocs sur cailloutis de taille moyenne � petite. Dominance algues brunes";17;11; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";2;48.5935;-2.5559444;;;;;;;"IMGP1204.JPG";"1";"Blocs sur sable de taille moyenne, assez espac�s les uns des autres. Algues brunes, vertes et balanes";9;53; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";4;48.5992778;-2.5565833;;;;;;;"IMGP1213.JPG";"3";"Blocs sur sable et cailloutis de taille moyenne � petite. Algues brunes et vertes en m�lange";17;14; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";4;48.5992778;-2.5565833;;;;;;;"P1000150.JPG";"3";"Blocs �pars sur cailloutis, domin�s par Fucus serrastus";25;7; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";5;48.5988333;-2.5569444;;;;;;;"P1000148.JPG";"4";"Blocs assez �pars sur sable fin et quelques cailloutis. Blocs domin�s par du Fucus serratus et des algues rouges";9;13; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";3;48.5992222;-2.5562222;;;;;;;"P1000146.JPG";"2";"Blocs assez �pars sur sable grossier, petits cailloux et roche en place, domin�s par de la roche nue et des algues vertes opportunistes";17;9; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";2;48.5935;-2.5559444;;;;;;;"P1000153.JPG";"1";"Blocs tr�s accol�s les uns aux autres sur blocs, domin�s par de la roche nue et des balanes.";3;40; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";1;48.5993056;-2.5555833;;;;;;;"P1000154.JPG";"1";"Blocs �pars sur sable, domin�s par de la roche nue et des balanes.";8;8; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";5;48.5988333;-2.5569444;;;;;;;"P1000243.JPG";"4";"Blocs tr�s �pars sur sable fin et quelques cailloutis. Blocs domin�s par du Fucus serratus et des algues rouges";0;60; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";4;48.5992778;-2.5565833;;;;;;;"P1000240.JPG";"3";"Blocs �pars sur cailloutis, domin�s par Fucus serrastus";13;36; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";3;48.5992222;-2.5562222;;;;;;;"P1000238.JPG";"2";"Blocs assez �pars sur sable grossier, petits cailloux et roche en place, domin�s par de la roche nue et des algues vertes opportunistes";22;17; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";2;48.5935;-2.5559444;;;;;;;"P1000234.JPG";"1";"Blocs �pars sur sable, domin�s par de la roche nue, des balanes mais �galement par du Fucus serrarus";27;33; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";1;48.5993056;-2.5555833;;;;;;;"P1000231.JPG";"1";"Blocs �pars sur sable, domin�s par de la roche nue, des balanes mais �galement par du Fucus serrarus";34;13; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";2;48.774361;-2.952806;;;;;;;;"Pas de stratification";"Blocs petits � moyens, peu denses, sur sable en limite basse du champ de blocs (dominance des Rhodophytes).";40;13; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";5;48.772;-2.954056;;;;;;;;"Pas de stratification";"Blocs moyens sur sable grossiers et cailloutis.";25;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";1;48.773306;-2.954;;;;;;;;"Pas de stratification";"Blocs moyens sur sable grossier. Moyennement dense en blocs.";49;9; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";4;48.772444;-2.953389;;;;;;;;"Pas de stratification";"Blocs moyens sur sable grossiers et cailloutis.";24;1; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";3;48.773028;-2.953667;;;;;;;;"Pas de stratification";"Blocs petits � moyens sur sable. Peu dense en blocs. Limite haute du champ de blocs (quelques Fucus vesiculosus en m�lange avec Fucus serratus)";31;2; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";3;48.773028;-2.953667;;;;;;;"IMGP0715.JPG";"3";"Blocs petits � moyens sur sable. Peu dense en blocs. Limite haute du champ de blocs (quelques Fucus vesiculosus en m�lange avec Fucus serratus)";37;6; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";1;48.773306;-2.954;;;;;;;"IMGP0714.JPG";"1";"Blocs moyens sur sable grossier. Moyennement dense en blocs.";36;21; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";2;48.774361;-2.952806;;;;;;;"IMGP0708.JPG";"2";"Blocs petits � moyens, peu denses, sur sable en limite basse du champ de blocs (dominance des Rhodophytes).";11;25; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";4;48.772444;-2.953389;;;;;;;"IMGP0717.JPG";"4";"Blocs moyens sur sable grossiers et cailloutis.";6;7; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";5;48.772;-2.954056;;;;;;;"IMGP0719.JPG";"5";"Blocs moyens sur sable grossiers et cailloutis.";25;6; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";5;48.772;-2.9540556;;;;;;;"IMG_0756.JPG";"5";"Dominance � Fucus serratus, Fucus vesiculosus, osmonde. Blocs moyens + cailloutis + sable grossier. Blocs ensabl�s et proches.";23;11; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";1;48.7733056;-2.954;;;;;;;"IMG_0772.JPG";"1";"blocs moyens sur petits blocs + cailloutis. Fucus serratus + ulves + Chondrus crispus.";15;29; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";2;48.7743611;-2.9528056;;;;;;;"IMG_0768.JPG";"2";"blocs moyens � gros sur sable grossier. Chondrus crispus, sargasse, un peu zost�re marine, osmonde, ulve. Blocs proches � accol�s.";15;5; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";3;48.7730278;-2.9536667;;;;;;;"IMGP1006.JPG";"3";"dominance Fucus serratus et Chondrus crispus. Blocs moyens � petits tr�s accol�s. Blocs ensabl�s (sable grossier)";8;4; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";4;48.7724167;-2.9535;;;;;;;"IMG_0760.JPG";"4";"blocs moyens ensabl�s (sable grossier coquillier), �parses. Dominance Fucus serratus.";11;1; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";5;48.772;-2.9540556;;;;;;;;"5";"blocs moyens, �parses, sur cailloutis essentiellement.";17;19; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";1;48.7733056;-2.954;;;;;;;;"1";"blocs accol�s de taille moyenne, sur sable grossier et cailloutis.";24;29; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";2;48.7743611;-2.9528056;;;;;;;;"2";"blocs assez accol�s de taille petite � moyenne, sur sable grossier et cailloutis.";37;21; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";3;48.7730278;-2.9536667;;;;;;;"IMGP1312.JPG";"3";"blocs assez accol�s de taille moyenne, sur sable grossier et cailloutis.";19;22; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";4;48.7724444;-2.9533889;;;;;;;;"4";"blocs tr�s ensabl�s, tr�s �parses, petits � moyens.";5;9; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";5;48.772;-2.9540556;;;;;;;"P1000159.JPG";"5";"Blocs �pars sur cailloutis.";7;22; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";4;48.7724444;-2.9533889;;;;;;;"P1000155.JPG";"4";"Blocs �pars sur sable coquillier.";2;8; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";3;48.7730278;-2.9536667;;;;;;;"P1000156.JPG";"3";"Blocs tr�s accol�s les uns aux autres sur sable coquillier.";15;19; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";2;48.7743611;-2.9528056;;;;;;;"P1000158.JPG";"2";"Blocs �pars sur sable coquillier.";28;17; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";1;48.7733056;-2.954;;;;;;;"P1000157.JPG";"1";"Blocs tr�s accol�s les uns aux autres sur cailloutis et sable coquillier.";15;58; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";5;48.772;-2.9540556;;;;;;;"IMG_20161015_123158.JPG";"5";"Blocs �pars sur s�diments grossiers et d�bris coquilliers. Domin�s par Fucus serratus";21;8; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";1;48.7733056;-2.954;;;;;;;"IMG_20161015_134314.JPG";"1";"Blocs accol�s sur fond sableux.";18;26; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";2;48.7743611;-2.9528056;;;;;;;"IMG_20161015_132736.JPG";"2";"Blocs accol�s et �pars sur s�diments grossiers et sable.";17;8; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";3;48.7730278;-2.9536667;;;;;;;"IMG_20161015_140507.JPG";"3";"Blocs �pars sur sable grossier.";7;9; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";4;48.7724444;-2.9533889;;;;;;;"IMG_20161015_124949.JPG";"4";"Blocs �pars sur s�diments grossiers et d�bris coquilliers. Domin�s par Fucus serratus";5;3; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";1;48.8835278;-3.49325;;;;;;;;"Pas de stratification";"Blocs moyens sur blocs et sable grossier";34;9; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";5;48.8839444;-3.49275;;;;;;;;"Pas de stratification";"blocs moyens sur blocs et sable grossier";32;2; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";4;48.8836667;-3.4914722;;;;;;;;"Pas de stratification";"blocs moyens sur blocs et sable grossier";30;5; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";3;48.8836944;-3.4929167;;;;;;;;"Pas de stratification";"blocs moyens sur blocs dans une mare intertidale";60;16; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";2;48.8834722;-3.4929167;;;;;;;;"Pas de stratification";"blocs moyens sur blocs et sable grossier";59;7; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";5;48.8839444;-3.49275;;;;;;;"IMGP0949.JPG";"2";"blocs moyens sur petits blocs, cailloutis et sable grossier. Dominance algues vertes (ulves, ent�romorphes) + H. elongata et B. bifurcata. Blocs ensabl�s";14;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";1;48.8835278;-3.49325;;;;;;;"IMGP0927.JPG";"1";"blocs moyens accol�s sur cailloutis + sable grossier. H. elongata dominante + B. bifurcata + algues rouges. Majorit� de blocs non retourn�s.";24;3; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";2;48.8834722;-3.4929167;;;;;;;"IMGP0957.JPG";"1";"blocs gros � moyens sur sable et cailloutis. H. elongata dominante + L. pinatifida + B. bifurcata + algues rouges.";20;1; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";3;48.8836944;-3.4929167;;;;;;;"IMGP0937.JPG";"2";"blocs de taille moyenne proches + quelques gros blocs sur cailloutis et petit blocs (peu de sable). H. elongata dominante. ";29;2; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";4;48.8836667;-3.4914722;;;;;;;"IMGP0943.JPG";"3";"blocs moyens �parses sur cailloutis et sable grossier. H. elongata + B. bifurcata + algues rouges + corallina. Beaucoup de blocs ensabl�s.";17;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";1;48.8835278;-3.49325;;;;;;;"IMGP1326.JPG";"1";"Blocs petits � moyens. Blocs �parses. Substrat cailloutis, sable grossier. Dominance Fucus serratus et algues rouges.";20;4; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";3;48.8836944;-3.4929167;;;;;;;"IMGP1331.JPG";"2";"Blocs petits � moyens. Blocs �parses. Substrat cailloutis, sable grossier. Dominance algues rouges (surtout Chondrus crispus)";32;4; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";2;48.8834722;-3.4929167;;;;;;;"IMGP1349.JPG";"1";"Blocs petits � moyens. Blocs �parses. Substrat cailloutis, sable grossier. Dominance algues brunes et rouges, un peu d'algues vertes.";35;4; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";5;48.8839444;-3.49275;;;;;;;"IMGP1344.JPG";"2";"Petits blocs, �parses. Substrat cailloutis, sable grossier. Dominace algues brunes et rouges.";22;1; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";4;48.8836667;-3.4914722;;;;;;;"IMGP1337.JPG";"3";"Blocs petits � moyens. Blocs �parses. Substrat cailloutis, sable grossier. Dominance algues brunes.";24;2; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";2;48.8834722;-3.4929167;;;;;;;"IMGP1602.JPG";"1";"Blocs de taille moyenne (80%) et de petite taille (20%), assez �pars. Blocs sur sable grossier, roche et cailloutis, domin�s par les algues rouges (60%), brunes (30%) et vertes opportunistes (10%).";30;4; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";5;48.8839444;-3.49275;;;;;;;"IMGP1607.JPG";"2";"Blocs de taille moyenne assez �pars sur sable, roche et cailloutis. Blocs domin�s par algues rouges (55%), brunes (40%) et vertes opportunistes (5%).";18;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";4;48.8836667;-3.4914722;;;;;;;"IMGP1605.JPG";"3";"Blocs de taille moyenne assez �pars sur sable grossier, roche, cailloux et cailloutis. Blocs domin�s par algues rouges (50%), brunes (45%) et vertes opportunistes (5%).";24;4; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";3;48.8836944;-3.4929167;;;;;;;"IMGP1593.JPG";"2";"Blocs de taille moyenne plut�t �pars sur sable grossier, roche et cailloutis. Blocs domin�s par algues rouges en m�lange (50%), Cladophora rupestris, algues brunes (30%) et vertes opportunistes (20%).";29;3; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";1;48.8835278;-3.49325;;;;;;;"IMGP1581.JPG";"1";"Blocs de taille moyenne et �pars, sur sable grossier, roche et cailloux. Blocs domin�s par les algues rouges (60%) et brunes (40%).";31;3; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";5;48.8839444;-3.49275;;;;;;;;"2";"Blocs �pars, de taille moyenne sur un m�lange de platier rocheux, cailloutis et sable grossier. Blocs domin�s par les algues brunes, rouges et Cladophora rupestris. Quelques blocs domin�s par de la roche nue";25;1; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";1;48.8835278;-3.49325;;;;;;;;"1";"Blocs �pars, de taille moyenne sur platier rocheux, cailloutis et sable grossier. Domin�s par les brunes et algues rouges en m�lange. Quelques blocs domin�s par de la roche nue";28;4; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";2;48.8834722;-3.4929167;;;;;;;;"1";"Blocs �pars, de taille moyenne sur un m�lange de platier rocheux, cailloutis et sable grossier. Blocs domin�s par les algues brunes et rouges en m�lange. Quelques blocs domin�s par de la roche nue";34;4; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";3;48.8836944;-3.4929167;;;;;;;;"2";"Blocs �pars, de taille moyenne sur un m�lange de platier rocheux, cailloutis et sable grossier. Dominance d'algues rouges, de Cladophora rupestris. Quelques blocs domin�s par de la roche nue";61;3; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";4;48.8836667;-3.4914722;;;;;;;;"3";"Blocs �pars, de taille moyenne sur un m�lange de platier rocheux, cailloutis et sable grossier. Blocs domin�s par les algues brunes et rouges en m�lange. Quelques blocs domin�s par de la roche nue";50;1; +379872;"BD_IVR_Perharidy_17052014_Import.xlsx";1;48.724188;-4.022797;;;;;;;;"3";;23;28; +379872;"BD_IVR_Perharidy_17052014_Import.xlsx";5;48.72271;-4.02158;;;;;;;;"1";;125;25; +379872;"BD_IVR_Perharidy_17052014_Import.xlsx";4;48.723;-4.02064;;;;;;;;"1";;84;59; +379872;"BD_IVR_Perharidy_17052014_Import.xlsx";3;48.72383;-4.02166;;;;;;;;"3";;19;7; +379872;"BD_IVR_Perharidy_17052014_Import.xlsx";2;48.724397;-4.022354;;;;;;;;"3";;134;8; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";5;48.722876;-4.021307;;;;;;;"Q5_1.JPG";"1";"Blocs sur blocs de taille moyenne � �lev�e, tr�s accol�s les uns aux autres, strate assez �tendue. Blocs domin�s par algues rouges en m�lange (Mastocarpus stellatus, Chondrus crispus, Palmaria palmata, Chylocladia verticillata) et Bifurcaria bifurcata. P";54;6; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";1;48.724188;-4.022797;;;;;;;"Q1_2.JPG";"3";"Blocs sur petits blocs et cailloux/cailloutis, de taille moyenne � petite taille, blocs plus �pars qu'en strate 1. Blocs domin�s par algues rouges en m�lange (Mastocarpus stellatus, Chondrus crispus, Palmaria palmata, Chylocladia verticillata) et Bifurca";27;6; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";2;48.724397;-4.022354;;;;;;;"Q2_1.JPG";"3";"Blocs sur petits blocs et cailloux/cailloutis, de taille moyenne � petite taille, blocs plus �pars qu'en strate 1. Blocs domin�s par algues rouges en m�lange (Mastocarpus stellatus, Chondrus crispus, Palmaria palmata, Chylocladia verticillata) et Bifurca";26;3; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";3;48.72383;-4.02166;;;;;;;"Q3_1.JPG";"3";"Blocs sur petits blocs et cailloux/cailloutis, de taille moyenne � petite taille, blocs plus �pars qu'en strate 1. Blocs domin�s par algues rouges en m�lange (Mastocarpus stellatus, Chondrus crispus, Palmaria palmata, Chylocladia verticillata) et Bifurca";34;8; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";4;48.723549;-4.021434;;;;;;;"Q4_2.JPG";"3";"Blocs sur petits blocs et cailloux/cailloutis et sable grossier. Blocs de taille moyenne � petite taille, blocs plus �pars qu'en strate 1. Blocs domin�s par algues rouges en m�lange (Mastocarpus stellatus, Chondrus crispus, Palmaria palmata, Chylocladia ";13;4; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";1;48.724188;-4.022797;;;;;;;"DSC01487.JPG";"3";"Gros blocs sur sable fin. Majorit� d'algues rouges. Un peu de laminaires.";28;12; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";4;48.723;-4.02064;;;;;;;"DSC_0081.JPG";"1";"Zone tr�s ensabl�e domin�e par les algues rouges. Zone de passage important.";36;10; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";3;48.72383;-4.02166;;;;;;;"DSC_0009.JPG";"3";"Zone tr�s perturb�e. Fortement ensabl�e. Zone de passage vers l'extr�mit� Nord du champ de blocs.";21;28; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";2;48.724397;-4.022354;;;;;;;"DSCN2870.JPG";"3";"Palmaria palmata et Chondrus crispus en majorit�. Un peu de Fucus serratus. Blocs moyens sur blocs et cailloux, � la limite des laminaires.";29;13; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";5;48.72271;-4.02158;;;;;;;"DSC_0143.JPG";"1";"Pr�sence de laminaires et de petites cuvettes. Se d�couvre tr�s tard lors d'un coefficient de 100. Dominance d'algues rouges";57;15; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";5;48.72271;-4.02158;;;;;;;"DSC00174.JPG";"1";"Pr�sence de laminaires (tr�s peu) et de petites cuvettes. Se d�couvre tard. Dominance d'algues rouges. Couverture algale tr�s importante. Peu de blocs.";29;5; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";4;48.723;-4.02064;;;;;;;"DSC01548.JPG";"1";"Zone tr�s ensabl�e domin�e par les algues rouges (Chondrus crispus). Blocs sur sable. Zone de passage important.";59;10; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";3;48.72383;-4.02166;;;;;;;"DSC00167.JPG";"3";"Zone tr�s perturb�e (la plus perturb�e des 5 quadrats). Petits blocs sur blocs et sable. Zone de passage vers l'extr�mit� Nord du champ de blocs.";59;33; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";2;48.724397;-4.022354;;;;;;;"DSC01538.JPG";"3";"Palmaria palmata et Fucus serratus en majorit�. Blocs moyens sur blocs et cailloux. Pr�sence de laminaires.";77;7; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";1;48.724188;-4.022797;;;;;;;"DSC00126.JPG";"3";"Gros blocs sur sable fin et cailloux. Couverture algale tr�s importante, beaucoup plus qu'au mois de mars. Abondance d'algues brunes et rouges.";44;3; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";1;48.724188;-4.022797;;;;;;;"DSC00300.JPG";"3";"Ceinture de Fucus serratus, d�but des laminaires. Blocs de taille moyenne sur cailloux. Couverture algale moyennement importante Blocs assez ensabl�s.";37;9; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";5;48.72266;-4.0215;;;;;;;"DSC00319.JPG";"1";"D�but de la ceinture � Laminaires. Nombreux blocs mobiles de grande taille.";35;17; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";4;48.723;-4.02064;;;;;;;"DSC01918.JPG";"1";"Blocs petits � moyens sur sable, relativement ensabl�s.";36;14; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";3;48.72388;-4.02167;;;;;;;"DSC01903.JPG";"3";"Blocs moyens sur sable.";29;7; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";2;48.724397;-4.022354;;;;;;;"DSC01894.JPG";"3";"Pr�sence de Fucus serratus et d�but de la ceinture � Laminaires. Gros blocs mobiles avec une couverture algale importante.";40;6; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";1;48.724188;-4.022797;;;;;;;"Q1.JPG";"3";"Ceinture � Fucus serratus, d�but des Laminaires. Blocs de taille moyenne sur cailloux. Couverture algale tr�s importante (dominance d'algues rouges).";50;1; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";2;48.724397;-4.022354;;;;;;;"DSC00362.JPG";"3";"Pr�sence de Fucus serratus et d�but de la ceinture � Laminaires. Gros blocs mobiles. Couverture algale importante.";26;5; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";3;48.72388;-4.02167;;;;;;;"Q3.JPG";"3";"Blocs moyens sur sable.";38;5; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";4;48.72303;-4.02081;;;;;;;"Q4.JPG";"1";"Blocs petits � moyens sur sable. Relativement ensabl�. ";34;4; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";5;48.72266;-4.0215;;;;;;;"DSC00409.JPG";"1";"D�but de la ceinture � Laminaires. Nombreux blocs mobiles de grande taille. Couverture algale tr�s importante (dominance d'algues rouges). Acc�s difficile au quadrat.";27;11; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";5;48.3679056;-4.402325;;;;;;;"78.JPG";"3";"Blocs �parses de taille moyenne, d�pos�s sur du sable grossier et des cailloutis";48;24; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";1;48.3679667;-4.4022083;;;;;;;;"2";"Blocs petits � moyens en m�lange et tr�s accol�s les uns aux autres, dispos�s sur des cailloutis et du sable. Strate compos�e d'une majorit� de blocs retourn�s";22;63; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";2;48.379075;-4.4022694;;;;;;;"DSCF8695.JPG";"2";"Quadrat positionn� entre la strate 2 compos�e de blocs �parses de taille moyenne, sur cailloux, cailloutis et sable grossier, dont la couverture algale est assez faible et la strate 8, plus basse, caract�ris�e par une couverture algale de densit� moyenne";36;10; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";3;48.36795;-4.4023083;;;;;;;"DSCF8703.JPG";"2";"Blocs peu nombreux, dominance de blocs non retourn�s dispos�s sur des cailloux";41;8; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";4;48.3679389;-4.4023389;;;;;;;"85.JPG";"4";"State compos�e de gros blocs �parses, dispos�s sur du sable coquiller et des cailloux. Blocs non retourn�s dominants.";28;4; +380269;"BDD_IVR_Keraliou_20150122_Import.xlsx";5;48.374095;-4.413952;;;;;;;;"3";"Strate d�finie par les points GPS 428 � 504. Strate compos�e de blocs plut�t �parses de taille petite � moyenne, sur cailloutis et sable grossier � tr�s faible couverture de Fucus serratus et algues rouges en m�lange.";69;6; +380269;"BDD_IVR_Keraliou_20150122_Import.xlsx";1;48.374474;-4.413244;;;;;;;"P1220033.JPG";"2";"Strate d�finie par les points GPS 590 � 725. Compos�e de blocs �parses, de taille moyenne, sur cailloux, cailloutis et sable grossier (Photo 30). Couverture algale des blocs assez faible, principalement quelques pieds de Fucus serratus et de rdhodophytes.";66;3; +380269;"BDD_IVR_Keraliou_20150122_Import.xlsx";2;48.374477;-4.413606;;;;;;;"P1220038.JPG";"2";"Strate d�finie par les points GPS 590 � 725. Compos�e de blocs �parses, de taille moyenne, sur cailloux, cailloutis et sable grossier (Photo 30). Couverture algale des blocs assez faible, principalement quelques pieds de Fucus serratus et de rdhodophytes.";25;0; +380269;"BDD_IVR_Keraliou_20150122_Import.xlsx";3;48.374361;-4.413858;;;;;;;;"2";"Strate d�finie par les points GPS 590 � 725. Compos�e de blocs �parses, de taille moyenne, sur cailloux, cailloutis et sable grossier (Photo 30). Couverture algale des blocs assez faible, principalement quelques pieds de Fucus serratus et de rdhodophytes.";54;0; +380269;"BDD_IVR_Keraliou_20150122_Import.xlsx";4;48.374079;-4.414141;;;;;;;"P1220026.JPG";"4";"Contourage de la strate � d�finir � partir des autres contourages GPS. Strate compos�e de blocs de taille moyenne tr�s accol�s les uns aux autres, sur cailloux et sable grossier. Blocs dont les faces sup�rieures sont domin�es par les rhodophytes et pr�se";;; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";3;48.36795;-4.4023083;;;;;;;"DSCN0152.JPG";"2";"cailloutis, sable coquillier, petits blocs tr�s �pars";36;1; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";5;48.3679056;-4.402325;;;;;;;"DSCN0125.JPG";"3";"cailloutis, sable coquillier, petits blocs �pars";47;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";4;48.3679389;-4.4023389;;;;;;;"DSCN0140.JPG";"4";"cailloutis, sable coquillier, petits blocs �pars, 2 gros blocs";27;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";2;48.379075;-4.4022694;;;;;;;"DSCN0190.JPG";"2";"sable coquillier, dominante cailloutti, couleur rouge brun, beaucoup orange de mer, blocs espac�s de taille A4 et A5";29;6; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";1;48.3679667;-4.4022083;;;;;;;"DSCN0171.JPG";"2";"sable coquilleir et grossier, petits cailloux, blocs taille A5 �pars en majorit� mobiles, couleur principale brun rouge, bigirneaux, patelles, balanes, spirobranchus";27;26; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";5;48.3679056;-4.402325;;;;;;;"DSCN0489.JPG";"3";"Blocs �pars, plut�t petits sur cailloutis et sable grossier";56;8; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";1;48.367967;-4.402208;;;;;;;"DSCN0468.JPG";"2";"Nombreux petits blocs �pars sur cailloutis ";39;15; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";2;48.379075;-4.4022694;;;;;;;"DSCN0512.JPG";"2";"Blocs mobiles peu nombreux, �pars sur cailloutis et sable grossier";19;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";3;48.3679639;-4.4023083;;;;;;;"DSCN0498.JPG";"2";"Blocs �pars, plutot petits sur cailloutis et sable grossier";43;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";4;48.367911;-4.402339;;;;;;;"DSCN0479.JPG";"4";"Blocs �pars, de petite taille sur cailloutis et sable grossier";38;2; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";1;48.367967;-4.402208;;;;;;;"DSCN1103.JPG";"2";"Blocs de tr�s petite taille, inf�rieure � un format A4, sur cailloutis et sable coquiller. Dominance de roche nue, et d'Enteromorpha sp.";13;59; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";5;48.3679056;-4.402325;;;;;;;"DSCN1134.JPG";"3";"Blocs de tr�s petite taille, inf�rieure � un format A4, sur cailloux, sable coquiller et sable grossier";26;22; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";4;48.367911;-4.402339;;;;;;;"DSCN1119.JPG";"4";"Blocs de tr�s petite taille, inf�rieure � un format A4, sur sable coquiller et galets. Dominance d'algues brunes et rouges";20;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";3;48.3679639;-4.4023083;;;;;;;"IMGP3615.JPG";"2";"Blocs de tr�s petite taille, inf�rieure � un format A4, sur cailloutis et sable coquiller. Dominance d'algues rouges et dans une moindre mesure, d'algues vetes opportunistes";34;3; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";2;48.379075;-4.4022694;;;;;;;"DSCN1118.JPG";"2";"Blocs de tr�s petite taille, inf�rieure � un format A4, sur cailloutis. Dominance en surface d'algues brunes et d'algues vertes opportunistes.";27;17; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";5;47.838032;-4.040404;;;;;;;"IMG_0217.JPG";"2";"Champ de bloc homog�ne: une seule strate, mais zone compos�e de blocs petits � gros, �parses, sur sables grossiers +";9;16; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";1;47.838718;-4.039637;;;;;;;"DSCF8678.JPG";"2";"Champ de bloc homog�ne: une seule strate, mais zone plut�t compos�e de blocs de taille moyenne, �parses, sur sables grossiers et cailloux ";16;12; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";2;47.837822;-4.040651;;;;;;;"DSCF8685.JPG";"2";"Champ de bloc homog�ne: une seule strate, mais zone plut�t compos�e d'un m�lange de gros blocs et de petits bocs, sur sables fins, d�bris coquilliers et cailloux +";35;7; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";3;47.83852;-4.040015;;;;;;;"IMG_0205.JPG";"2";"Champ de bloc homog�ne: une seule strate, mais zone compos�e de blocs de taille moyenne, sur sables grossiers et cailloutis +";25;5; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";4;47.838364;-4.040229;;;;;;;"IMG_0210.JPG";"2";"Champ de bloc homog�ne: une seule strate, mais zone plut�t compos�e de blocs petits � gros, �parses, sur sables grossiers et cailloutis +";18;11; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";5;47.838032;-4.040404;;;;;;;"DSC00122.JPG";"2";"Blocs �parses sur sable grossier, blocs sup�rieur � A4, surtout algues rouges (Chondrus crispus et Osmundea pinnatifida)";21;7; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";2;47.837822;-4.040651;;;;;;;"DSC00110.JPG";"2";"Blocs �pars sur sable fin et cailloux, gros et petits blocs (-A4), algues rouges : Osmundea pinnatifida, Corallina, Chondrus crispus, etc�), Ulves et Sargasses. Pr�sence �galement de li�vres de mer";19;3; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";1;47.838718;-4.039637;;;;;;;"DSC00131.JPG";"2";"Blocs �pars, sable grossier et moyen, algues rouges tr�s pr�sentes (Chondrus crispus, Osmundea pinnatifida)";13;3; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";4;47.838364;-4.040229;;;;;;;"DSC02143.JPG";"2";"Sable grossier, cailloutis, cailloux, sable gratt�, algues rouges (Chondrus crispus, Osmundea pinnatifida�) et Ulves.";12;6; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";3;47.83852;-4.040015;;;;;;;"DSC02126.JPG";"2";"Sable moyen, d�bris coquillers, m�lange de bloc (A5), algues rouges (Chondrus crispus, Mastocarpus stellatus, Osmundea pinnatifida, Coralinac�es, etc�) et Bifurcaria bifurcata. Pr�sence d'une �toile de mer �pineuse";22;4; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";2;47.837822;-4.040651;;;;;;;"PA270317.JPG";"2";"Strate compos�e de blocs �parses de taille moyenne, sur sable grossier � fin, dont les faces sup�rieures sont domin�es par les algues rouges (Chondrus crispus, etc...), Ulves et Bifurcaria bifurcata ";23;12; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";5;47.838032;-4.040404;;;;;;;"DSCN0218.JPG";"1";"Strate compos�e de blocs �parses de taille moyenne, sur sable grossier et cailloutis, dont les faces sup�rieures sont domin�es par les algues rouges. +";38;5; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";4;47.838364;-4.040229;;;;;;;"DSCN0231.JPG";"1";"Strate compos�e de blocs �parses de taille petite � moyenne, sur cailloux et cailloutis, dont les faces sup�rieures sont domin�es par les algues rouges (Chondrus crispus), Ulves et Bifurcaria bifurcata +";13;10; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";3;47.83852;-4.040015;;;;;;;"DSC06599.JPG";"2";"Strate compos�e de blocs �parses de taille moyenne, sur sable fin coquiller et cailloutis, dont les faces sup�rieures sont domin�es par les algues rouges (Chondrus crispus, Mastocarpus stellats, Gelidium sp., etc�) +et Bifurcata bifurcata +";25;6; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";1;47.838718;-4.039637;;;;;;;"DSCN0208.JPG";"1";"Strate compos�e de blocs �parses de taille moyenne, sur s�diments grossiers et cailloutis, dont les faces sup�rieures sont domin�es par les algues rouges (Chondrus crisps) et Ulves ";15;3; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";5;47.838032;-4.040404;;;;;;;"P1050107.JPG";"2";"Blocs petits � moyens; sur cailloutis, sable grossier et d�bris coquillers. Dominance d'algues rouges dress�es (Osmundea pinnatifida et Chondrus crispus)";23;2; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";4;47.838364;-4.040229;;;;;;;"P1050089.JPG";"2";"Blocs petits, moyens et grands en m�lange sur sables grossiers, d�bris coquillers et cailloutis. Dominance d'algues rouges et brunes dress�es (Chondrus crispus, Osmundea pinnatifida, Bifurcaria bifurcata...). Couverture algale tr�s ensabl�e.";8;2; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";3;47.83852;-4.040015;;;;;;;"P1050133.JPG";"2";"Blocs moyens � grands sur sable grossier, d�bris coquillers et cailloutis. Dominance d'algues rouges dress�es notamment d'Osmundea pinnatifida";17;4; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";2;47.837822;-4.040651;;;;;;;"P1050123.JPG";"2";"Blocs moyens � grands sur sable moyen et d�bris coquillers. Dominance d'algues rouges et brunes dress�es";22;3; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";1;47.838718;-4.039637;;;;;;;"P1050079.JPG";"2";"Blocs mobiles petits � moyens, fortement ensabl�s, sable grossier et d�bris coquillers. Dominance d'algues rouges (Osmundea pinnatifida et Chondrus crispus) et d'algues brunes notamment de Sargasses";10;1; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";1;47.838718;-4.039637;;;;;;;"P1050504.JPG";"2";"Blocs moyens � grands, domin�s par les algues rouges dress�es (Mastocarpus stellatus, Chondrus crispus�)";24;4; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";2;47.837822;-4.040651;;;;;;;"P1050486.JPG";"2";"Blocs moyens � grands, domin�s par les algues rouges dress�es (Mastocarpus stellatus, Gelidium sp., Osmundea pinnatifida, Enteromorpha sp. et Ulva sp.)";12;8; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";3;47.83852;-4.040015;;;;;;;"P1050491.JPG";"2";"Blocs moyens � petits, domin�s par les algues rouges dress�es, (majoritairement +Chondrus crispus et Mastocarpus stellatus) et quelques Ulva sp.";8;2; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";4;47.838364;-4.040229;;;;;;;"P1050498.JPG";"2";"Quelques gros blocs parmi une majorit� de petits blocs mobiles domin�s par des algues rouges dress�es (Chondrus crispus et Mastocarpus +stellatus) et quelques algues vertes opportunistes";11;2; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";5;47.838032;-4.040404;;;;;;;"P1050509.JPG";"2";"Blocs petits � moyens sur sable grossier, cailloutis et d�bris coquillers. Dominance d'algues rouges dress�es (Mastocarpus stellatus et Chondrus crispus)";48;4; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";1;47.7219729;-4.0107757;;;;;;;"Q1_MD.JPG";"1";"Algues dominantes : Bifurcaria bifurcata, Mastocarpus stellatus Photo prise en septembre: photo 9768 +Points GPS 52 � 77 pour le contourage. +Blocs sur platier qui s'ensable en limite inf�";14;4; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";2;47.7216153;-4.01034982;;;;;;;"St-Nicolas_Q2_vue_ensemble_2_10102014_MD.JPG";"2";"Blocs sur s�diments grossiers, cailloutis et petits blocs, Algues dominantes : Bifurcaria bifurcata, Himanthalia elongata et algues rouges en m�lange Photos prises en septembre: photos 9775 et 9776 (photo 9769 = ligne droi";37;14; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";3;47.7217781;-4.01096287;;;;;;;;"2";;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";4;47.7215326;-4.01059457;;;;;;;;"2";;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";5;47.7218174;-4.01025728;;;;;;;"St-Nicolas_Q5_vue_ensemble_10102014_MD.JPG";"3";"Blocs sur s�diments grossiers, a priori strate plus perturb�e par la p�che � pied car nombreux blocs retourn�s proches les uns des autres. M�lange de blocs mobiles domin�s par Bifurcaria bifurcata/Himanthalia elongata/algues rouges en m�lange et algues ";13;19; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";5;47.7218174;-4.01025728;;;;;;;"DSC00145.JPG";"3";;13;8; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";4;47.7215326;-4.01059457;;;;;;;"DSC02191.JPG";"3";"Blocs variables, cailloux, pr�sence d'algues diverses: Himanthalia elongata, Bifurcaria bifurcata, Osmundea pinnatifida, Chondrus crispus, Ulves et Enteromorphes.";11;7; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";2;47.7216153;-4.01034982;;;;;;;"DSC00136.JPG";"3";"Blocs variables, sable moyen, cailloux, pr�sence d'algues diverses: Bifurcaria bifurcata, Osmundea pinnatifida, Chondrus crispus, Mastocarpus stellatus, Ulves et Enteromorphes.";21;4; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";1;47.7219729;-4.0107757;;;;;;;"DSC02209.JPG";"2";"Blocs m�lang�s nombreux, pr�sence d'algues diverses: Fucus serratus, Himanthalia elongata, Bifurcaria bifurcata, Osmundea pinnatifida, Chondrus crispus, Mastocarpus stellatus, Ulves et Enteromorphes. Pr�sence �galement de nombreuses nasses.";28;2; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";3;47.7217781;-4.01096287;;;;;;;"DSC00137.JPG";"2";;41;15; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";5;47.72181;-4.01027;;;;;;;"DSC_0037.JPG";"3";"Blocs de taille variable sur sable grossier et cailloux, domin�s par les algues brunes (Bifurcaria bifurcata, Himanthalia elongata) et rouges dress�es et quelques algues vertes opportunistes";43;9; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";1;47.722;-4.01079;;;;;;;;"1";;;; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";2;47.72153;-4.01033;;;;;;;"DSC_0005.JPG";"2";"M�lange de blocs mobiles domin�s par algues brunes (Bifurcaria bifurcata, Himanthalia elongata) et rouges dress�es et quelques algues vertes opportunistes";8;4; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";3;47.72178;-4.01088;;;;;;;"DSC_0029.JPG";"2";"Blocs mobiles de taille variable sur sable grossier et cailloux, domin�s par les algues rouges dress�es et vertes opportunistes. Pr�sence �galement de Bifurcaria bifurcata";33;6; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";4;47.72156;-4.01059;;;;;;;"DSC_0012.JPG";"2";"Blocs de taille variable sur sable grossier et cailloux, domin�s par les algues brunes (Bifurcaria bifurcata, Himanthalia elongata) et rouges dress�es";40;7; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";5;47.72181;-4.01027;;;;;;;"DSC05976.JPG";"3";"Blocs mobiles de taille moyenne, sur sable grossier et cailloux, domin�s par algues brunes (Himanthalia elongata, Bifurcaria bifurcata), quelques algues vertes de type Ulva sp. mais aussi des algues rouges dress�es en m�lange.";19;3; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";2;47.72153;-4.01033;;;;;;;"DSC05974.JPG";"2";"Blocs mobiles de taille moyenne � �lev�e, sur sable grossier et petits blocs, domin�s par algues brunes (Himanthalia elongata, Bifurcaria bifurcata), de nombreuses algues vertes de type Ulva sp. mais aussi des algues rouges dress�es en m�lange. + +";39;6; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";3;47.72178;-4.01088;;;;;;;"DSC05975.JPG";"2";"Blocs mobiles de taille moyenne, sur sable grossier et cailloux, domin�s par algues brunes (Himanthalia elongata, Bifurcaria bifurcata), de nombreuses algues vertes de type Ulva sp. mais aussi des algues rouges dress�es en m�lange.";13;2; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";1;47.722;-4.01079;;;;;;;"DSC05984.JPG";"1";"Blocs mobiles de taille variable sur sable et cailloutis, domin�s par les algues rouges dress�es et algues brunes (Bifurcaria bifurcata, Fucus serratus) +";4;4; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";4;47.72156;-4.01059;;;;;;;"DSC05978.JPG";"2";"Blocs mobiles de taille moyenne, sur sable grossier et cailloux, domin�s par algues brunes (Himanthalia elongata, Bifurcaria bifurcata), quelques algues vertes de type Ulva sp. mais aussi des algues rouges dress�es en m�lange.";15;0; +477617;"2020-10-16-PNMI-CDB-001";4;48.0435;4.872067;;;;;;;"2020-10-16_PNMI_07_CDB-Q4_477637.jpg";"Pas de stratification";"CHAMPS DE BLOCS ABSENT +Pr�sence de petites pierres +fucale et AR pr�sente";0;0; +477617;"2020-10-16-PNMI-CDB-001";5;48.043583;4.87015;;;;;;;"2020-10-16_PNMI_07_CDB-Q5_477638.jpg";"4";"L. sacchoriza (un peu) +Chondrus crispus +Palmaria palmata +ulva sp +Laurencia pinatifida";76;15; +477617;"2020-10-16-PNMI-CDB-001";1;48.043417;4.87325;;;;;;;"2020-10-16_PNMI_07_CDB-Q1_477634.jpg";"2";"Chondrus crispus +Himentalia +Ulva +Bifurcaria bifurcata +";76;10; +477617;"2020-10-16-PNMI-CDB-001";2;48.042617;4.873833;;;;;;;"2020-10-16_PNMI_07_CDB-Q2_477635.jpg";"4";"Laminaria digitata +Ulva sp. +Chondrus crispus +";44;12; +477617;"2020-10-16-PNMI-CDB-001";3;48.043467;4.872333;;;;;;;"2020-10-16_PNMI_07_CDB-Q3_477636.jpg";"2";"Himenthalia +chondrus +Ulves +Asparogopsis +Algues rouges sp +";45;12; +477640;"2020-10-16-PNMI-CDB-002";4;48.033717;-4.83445;;;;;;;"2020-10-16_PNMI_07_CDB-Q4_477652.jpg";"4";"50% fucus +10% L. digitata +20% Chondrus crispus +20% autres";81;0; +477640;"2020-10-16-PNMI-CDB-002";5;49.033817;-4.834617;;;;;;;"2020-10-16_PNMI_07_CDB-Q5_477653.jpg";"4";"80% L. digitata +10% himanthalia +Chondus +fucus";20;0; +477640;"2020-10-16-PNMI-CDB-002";1;48.033683;-4.834617;;;;;;;"2020-10-16_PNMI_07_CDB-Q1_477649.jpg";"3";"50% chondrus +20% Himenthalia +20% fucus +10% divers AR";79;0; +477640;"2020-10-16-PNMI-CDB-002";3;48.039667;-4.834233;;;;;;;"2020-10-16_PNMI_07_CDB-Q3_477651.jpg";"4";"60% L. digitata +30% himenthale +10% fucus +Chondus crispus";81;0; +477640;"2020-10-16-PNMI-CDB-002";2;48.040167;-4.8341;;;;;;;"2020-10-16_PNMI_07_CDB-Q2_477650.jpg";"4";"80% L. digitata +10% Himenthalia el +fucus sp. +Chondrus ";27;0; +477714;"2020-03-12-PNMI-CDB-001";5;48.043583;-4.87015;;;;;;;;"2";"Chondrus/ Algues rouges";37;7; +477714;"2020-03-12-PNMI-CDB-001";4;48.0435;-4.872067;;;;;;;;"4";"Laminaria digitata/Chondrus crispus";22;0; +477714;"2020-03-12-PNMI-CDB-001";2;48.042617;-4.873833;;;;;;;;"3";"Chondrus crispus/ Fucus seratus/ Himenthales";18;2; +477714;"2020-03-12-PNMI-CDB-001";3;48.043467;-4.872333;;;;;;;;"2";"Laurencia pinatifida/ Algues rouges";42;6; +477714;"2020-03-12-PNMI-CDB-001";1;48.043417;-4.87325;;;;;;;;"4";"Chondrus crispus/ Laminaria Digitata/ ulves/ Hymenthales";37;6; +477733;"2019-03-22-PNMI-CDB-001";2;48.03403;4.8341;;;;;;;"2019-03-22_PNMI_07_CDB-Q2_477736.JPG";"4";"Laminaires ; pas plus de description donn�e";78;0; +477733;"2019-03-22-PNMI-CDB-001";5;48.03368;4.83403;;;;;;;"2019-03-22_PNMI_07_CDB-Q5_477739.JPG";"4";"Laminaires ; pas plus d'informations";51;0; +477733;"2019-03-22-PNMI-CDB-001";4;48.03388;4.83445;;;;;;;;"4";"Pas de photos +laminaire";66;2; +477733;"2019-03-22-PNMI-CDB-001";3;48.033733;4.8335;;;;;;;"2019-03-22_PNMI_07_CDB-Q3_477737.JPG";"4";"Laminaires- pas d'autres remarques";47;0; +477733;"2019-03-22-PNMI-CDB-001";1;48.0382;4.83462;;;;;;;;"4";"Laminaires- pas de photo disponible";61;0; +477743;"2019-10-29-PNMI-CDB-001";2;;;;;;;;;;"Pas de stratification";"NB : Le point Q2 n'a pas �t� r�alis� ; probablement marnage trop important pour y avoir acc�s? +";0;0; +477743;"2019-10-29-PNMI-CDB-001";5;48.03368;4.83403;;;;;;;"2019-10-29_PNMI_07_CDB-Q5_477749.jpg";"4";"Hymenthalles, laminaires, Chondrus, Dulse";25;0; +477743;"2019-10-29-PNMI-CDB-001";1;48.0382;4.83462;;;;;;;"2019-10-29_PNMI_07_CDB-Q1_477745.jpg";"4";"Hymenthalles, laminaires, Chondrus, Dulse";51;0; +477743;"2019-10-29-PNMI-CDB-001";4;48.03388;4.83445;;;;;;;;"4";"Pas de photo +Hymenthalles, laminaires, Chondrus, Dulse";57;0; +477743;"2019-10-29-PNMI-CDB-001";3;48.033733;4.8335;;;;;;;"2019-10-29_PNMI_07_CDB-Q3_477747.jpg";"4";"Hymenthalles, laminaires, Chondrus, Dulse";21;0; +477750;"2019-10-29-PNMI-CDB-002";1;48.043417;4.87325;;;;;;;;"2";"Chondrus crispus, Hymenthalles, laminaires";28;6; +477750;"2019-10-29-PNMI-CDB-002";5;48.043583;4.87015;;;;;;;;"3";"Lauwrancia, himenthalles, bifurcaria, dychota +Pas de photo";35;3; +477750;"2019-10-29-PNMI-CDB-002";4;48.0435;4.872067;;;;;;;;"3";"Chondrus, fucales, himenthales";20;4; +477750;"2019-10-29-PNMI-CDB-002";3;48.043467;4.872333;;;;;;;;"Pas de stratification";"Chondrus hymenthalle";43;3; +477750;"2019-10-29-PNMI-CDB-002";2;48.042617;4.873833;;;;;;;;"4";"LAminaire chondrus +Pas de photo exploitable";19;0; +477757;"2019-03-22-PNMI-CDB-002";5;48.043833;4.870533;;;;;;;"2019-03-22_PNMI_07_CDB-Q5_477763.JPG";"3";"Pas d'information voir photo";35;14; +477757;"2019-03-22-PNMI-CDB-002";4;48.0435;4.872067;;;;;;;"2019-03-22_PNMI_07_CDB-Q4_477762.JPG";"Pas de stratification";"Chondrus/ himenthallia/ Fucus/ palmaria";53;8; +477757;"2019-03-22-PNMI-CDB-002";3;48.043467;4.872333;;;;;;;"2019-03-22_PNMI_07_CDB-Q3_477761.JPG";"3";"Chondrus +Himenthalles";65;3; +477757;"2019-03-22-PNMI-CDB-002";2;48.042967;4.8734;;;;;;;"2019-03-22_PNMI_07_CDB-Q2_477760.JPG";"Pas de stratification";"Chondrus Himenthalle";22;0; +477757;"2019-03-22-PNMI-CDB-002";1;48.043417;4.87325;;;;;;;"2019-03-22_PNMI_07_CDB-Q1_477759.JPG";"Pas de stratification";"Algues rouges Chondrus et autres +himenthalle";79;3; +478379;"2021-03-31-PNMI-CDB-001";5;;;;;;;;;;"Pas de stratification";"blocs moyens avec bloc sur bloc +substrat caillouteux +algues rouges (pioka)";91;2; +478379;"2021-03-31-PNMI-CDB-001";2;;;;;;;;;;"Pas de stratification";"blocs �parses, moyen � petits blocs +Laminaires, algues rouges (pioka)";65;7; +478379;"2021-03-31-PNMI-CDB-001";3;;;;;;;;;"P3310001.JPG";"Pas de stratification";"blocs moyens sur cailloux et d�bris coquilliers +Algues rouges et himanthales";76;5; +478379;"2021-03-31-PNMI-CDB-001";1;;;;;;;;;"2021-03-31_PNMI_02_CDB-Q1_478381.JPG";"Pas de stratification";"Algues rouges et laminaires. Quelques algues vertes. Sable grossier et cailloux. Blocs moyens � gros.";81;2; +478379;"2021-03-31-PNMI-CDB-001";4;;;;;;;;;"2021-03-31_PNMI_02_CDB-Q4_478384.JPG";"Pas de stratification";"gros blocs +laminaires et algues rouges +dans l'eau (ruisseau) +sur sable grossier coquillier";41;8; +487404;"2021-03-31-PNMI-CDB-002";4;48.0435;-4.872067;;;;;;;"2021-03-31_PNMI_07_CDB-Q4_488099.jpg";"2";"10% Ulves +70% Chondrus +3% Laurencia pinatifida +1R diverses +1 petit ormeau";5;1; +487404;"2021-03-31-PNMI-CDB-002";5;48.043583;-4.87015;;;;;;;"2021-03-31_PNMI_07_CDB-Q5_488100.jpg";"2";"80% chondrus +AR diverses";57;2; +487404;"2021-03-31-PNMI-CDB-002";1;48.043417;-4.87325;;;;;;;"2021-03-31_PNMI_07_CDB-Q1_488096.jpg";"3";"80% chondrus +40% Himanthalia +3% Laurencia pinatifida +7% AR diverses";58;2; +487404;"2021-03-31-PNMI-CDB-002";2;48.042617;-4.873833;;;;;;;"2021-03-31_PNMI_07_CDB-Q2_488097.jpg";"Pas de stratification";"80% Laminaria digitata +20% Fucus serratus";26;3; +487404;"2021-03-31-PNMI-CDB-002";3;48.043467;-4.872333;;;;;;;"2021-03-31_PNMI_07_CDB-Q3_488098.jpg";"3";"50% Himanthalia +30% chnondrus +3% Laurencia pinatifida +Ormeaux pr�sents (3 petits)";29;6; +487405;"2021-03-31-PNMI-CDB-003";5;48.03385;-4.834517;;;;;;;"2021-03-31_PNMI_07_CDB-Q5_488106.jpeg";"3";"Fucus +Chondrus +Laminaria digitata +point recal� +";67;3; +487405;"2021-03-31-PNMI-CDB-003";3;48.033983;-4.83425;;;;;;;"2021-03-31_PNMI_07_CDB-Q3_488104.jpeg";"Pas de stratification";"Laminaria D. +Fucus +Palmaria +Chondrus +Point recal�!";46;2; +487405;"2021-03-31-PNMI-CDB-003";2;48.0337;-4.833983;;;;;;;"2021-03-31_PNMI_07_CDB-Q2_488103.jpeg";"4";"Laminaria digitata en majorit� +Fucus +Palmaria +Point recal�!";113;14; +487405;"2021-03-31-PNMI-CDB-003";4;48.033933;-4.83435;;;;;;;"2021-03-31_PNMI_07_CDB-Q4_488105.jpeg";"4";"Laminaria digitata +Fucus +Point recal�!";81;10; +487405;"2021-03-31-PNMI-CDB-003";1;48.033667;-4.834133;;;;;;;"2021-03-31_PNMI_07_CDB-Q1_488102.jpeg";"4";"Point recal� par rapport � position origibnal de Q1 (trop d'eau) +Laminaria digitata +Fucus";142;6; +494799;"2020-10-16-PNMI-CDB-003";5;;;;;;;;;;"Pas de stratification";"Le champ de blocs de Qu�m�nes pr�sente une stratification assez homog�ne. Une premi�re strate est constitu�e de � blocs sur petits blocs, cailloutis et s�diments grossiers � recouverts de Bifurcaria bifurcata et d�Himanthalia elongata en couverture assez ";122;2; +494799;"2020-10-16-PNMI-CDB-003";4;;;;;;;;;;"Pas de stratification";"Le champ de blocs de Qu�m�nes pr�sente une stratification assez homog�ne. Une premi�re strate est constitu�e de � blocs sur petits blocs, cailloutis et s�diments grossiers � recouverts de Bifurcaria bifurcata et d�Himanthalia elongata en couverture assez ";64;1; +494799;"2020-10-16-PNMI-CDB-003";3;;;;;;;;;;"Pas de stratification";"Le champ de blocs de Qu�m�nes pr�sente une stratification assez homog�ne. Une premi�re strate est constitu�e de � blocs sur petits blocs, cailloutis et s�diments grossiers � recouverts de Bifurcaria bifurcata et d�Himanthalia elongata en couverture assez ";77;5; +494799;"2020-10-16-PNMI-CDB-003";2;;;;;;;;;;"Pas de stratification";"Le champ de blocs de Qu�m�nes pr�sente une stratification assez homog�ne. Une premi�re strate est constitu�e de � blocs sur petits blocs, cailloutis et s�diments grossiers � recouverts de Bifurcaria bifurcata et d�Himanthalia elongata en couverture assez ";115;6; +494799;"2020-10-16-PNMI-CDB-003";1;;;;;;;;;;"Pas de stratification";"Le champ de blocs de Qu�m�nes pr�sente une stratification assez homog�ne. Une premi�re strate est constitu�e de � blocs sur petits blocs, cailloutis et s�diments grossiers � recouverts de Bifurcaria bifurcata et d�Himanthalia elongata en couverture assez ";80;2; +496510;"2019-03-22-PNMI-CDB-003";4;;;;;;;;;"2019-03-22_PNMI_02_CDB-Q4_496515.JPG";"Pas de stratification";"Blocs �parses moyens � �lev�s, ulves, himanthalia, saccharina, digitata";35;3; +496510;"2019-03-22-PNMI-CDB-003";5;;;;;;;;;"2019-03-22_PNMI_02_CDB-Q5_496516.JPG";"Pas de stratification";"Blocs petits, moyens, �lev�s� Chondrus, laurencia, ulves";76;0; +496510;"2019-03-22-PNMI-CDB-003";3;;;;;;;;;"2019-03-22_PNMI_02_CDB-Q3_496514.JPG";"Pas de stratification";"Blocs moyens, laurencia, chondrus, himanthalia, dulce, ulve";49;1; +496510;"2019-03-22-PNMI-CDB-003";2;;;;;;;;;"2019-03-22_PNMI_02_CDB-Q2_496513.JPG";"Pas de stratification";"Blocs moyens, digitata, saccharina, himanthalia";62;0; +496510;"2019-03-22-PNMI-CDB-003";1;;;;;;;;;"2019-03-22_PNMI_02_CDB-Q1_496512.JPG";"Pas de stratification";"blocs moyens � �lev�s, himanthale et saccharina, ulves, chondrus, laurencia, palmaria�";35;3; +496519;"2019-09-30-PNMI-CDB-002";5;;;;;;;;;"2019-09-30_PNMI_02_CDB-Q5_496525.JPG";"Pas de stratification";;55;8; +496519;"2019-09-30-PNMI-CDB-002";4;;;;;;;;;"2019-09-30_PNMI_02_CDB-Q4_496524.JPG";"Pas de stratification";;119;8; +496519;"2019-09-30-PNMI-CDB-002";3;;;;;;;;;"2019-09-30_PNMI_02_CDB-Q3_496523.JPG";"Pas de stratification";;89;1; +496519;"2019-09-30-PNMI-CDB-002";2;;;;;;;;;"2019-09-30_PNMI_02_CDB-Q2_496522.JPG";"Pas de stratification";;32;0; +496519;"2019-09-30-PNMI-CDB-002";1;;;;;;;;;"2019-09-30_PNMI_02_CDB-Q1_496521.JPG";"Pas de stratification";;101;3; +512043;"2021-11-03-PNMI-CDB-001";5;;;;;;;;;;"Pas de stratification";"BLOCS moyens � grands, blocs sur blocs +80% rouges, 5% brunes, 5% vertes";40;1; +512043;"2021-11-03-PNMI-CDB-001";4;;;;;;;;;;"Pas de stratification";"BLOCS MOYENS +Himanthales, Saccorhize, chondrus, ulves";39;6; +512043;"2021-11-03-PNMI-CDB-001";3;;;;;;;;;;"Pas de stratification";"Blocs petits � gros +Himanthales, chondrus, ulves";75;3; +512043;"2021-11-03-PNMI-CDB-001";2;;;;;;;;;;"Pas de stratification";"Petits et moyens blocs. Himanthales, ulves, chondrus, Saccorhize, lomentaria";76;0; +512043;"2021-11-03-PNMI-CDB-001";1;;;;;;;;;;"Pas de stratification";"blocs petits � moyens. Chondrus, Hymanthales, bifurcaria, ulves";60;0; +512569;"2021-10-07-EGMP-CDB-001";2;46.045029;-1.418926;;;;;;;"2021-10-07_EGMP_119_CDB-Q2_512571.JPG";"Pas de stratification";"A cheval sur partie immerg�e avec sables et une partie �merg�e avec blocs moyens � gros sur platier rocheux.";9;20; +512569;"2021-10-07-EGMP-CDB-001";5;46.045161;-1.418213;;;;;;;"2021-10-07_EGMP_119_CDB-Q5_512574.JPG";"Pas de stratification";"Blocs de tailles vari�es. Blocs sur platier et sables. Quelques algues 10- 15 cm.";7;31; +512569;"2021-10-07-EGMP-CDB-001";3;46.045064;-1.418592;;;;;;;"2021-10-07_EGMP_119_CDB-Q3_512572.JPG";"Pas de stratification";"Nombreux blocs de tailles vari�es. Pr�sence de gros blocs (A3/A2). Quelques algues vertes 10-15cm. Blocs sur platier et quelques galets-petits blocs.";14;41; +512569;"2021-10-07-EGMP-CDB-001";4;46.045017;-1.418174;;;;;;;"EVALHABLOC_CHASSIRON_Q4_5.JPG";"Pas de stratification";"Blocs de taille moyenne (A4/A3) sur sables grossiers immerg�s. Blocs majoritairement mobiles de teinte claire. Algues vertes (ulves) et rouges (15-20cm).";6;36; +513924;"2021-10-07-EGMP-CDB-002";5;46.027483;-1.347033;;;;;;;"2021-10-07_EGMP_114_CDB-Q5_513929.JPG";"Pas de stratification";"Nombreux blocs de tailles vari�es, galets et sables grossiers sur platier rocheux. Immerg� en partie. Quelques algues vertes 10-15 cm.";27;4; +513924;"2021-10-07-EGMP-CDB-002";4;46.028233;-1.345733;;;;;;;"2021-10-07_EGMP_114_CDB-Q4_513928.JPG";"Pas de stratification";"Nombreux blocs de tailles vari�es et sables grossiers. Pr�sence de gros blocs. Algues vertes et rouges 30 cm.";10;0; +513924;"2021-10-07-EGMP-CDB-002";2;46.0266;-1.346567;;;;;;;"2021-10-07_EGMP_114_CDB-Q2_513927.JPG";"Pas de stratification";"Blocs immerg�s et sables grossiers sur platier. Algues vertes et rouges 30 cm.";13;0; +513924;"2021-10-07-EGMP-CDB-002";1;46.028415;-1.346707;;;;;;;"2021-10-07_EGMP_114_CDB-Q1_513926.JPG";"Pas de stratification";"Sables grossiers et cailloux sur platier rocheux immerg�. Peu de blocs. Algues 15-20 cm.";2;0; +526185;"2021-10-07-BRES-CDB-003";5;;;;;;;;;"2021-10-07_BRES_12_CDB-Q5_526191.JPG";"Pas de stratification";" en attente de la carto";168;38; +526185;"2021-10-07-BRES-CDB-003";2;;;;;;;;;"2021-10-07_BRES_12_CDB-Q2_526188.JPG";"Pas de stratification";" en attente de la carto";95;44; +526185;"2021-10-07-BRES-CDB-003";4;;;;;;;;;"2021-10-07_BRES_12_CDB-Q4_526190.JPG";"Pas de stratification";"en attente de la carto";85;63; +526834;"2021-10-08-PNMI-CDB-002";5;;;;;;;;;"2021-10-08_PNMI_07_CDB-Q5_526840.jpg";"Pas de stratification";"Chondrus crispus 80% +Algues rouges 10% +";67;0; +526834;"2021-10-08-PNMI-CDB-002";4;;;;;;;;;"2021-10-08_PNMI_07_CDB-Q4_526839.jpg";"Pas de stratification";"Himanthalia elongata 40% +Chondrus 40% +Bifurcaria bifurcata 5% +Algues vertes 5%";66;4; +526834;"2021-10-08-PNMI-CDB-002";3;;;;;;;;;"2021-10-08_PNMI_07_CDB-Q3_526838.jpg";"Pas de stratification";"Himanthalia elongata 40% +Chondrus 40% +Pr�sence de laminaires +Algues vertes 5% +Algues rouges 5%";91;0; +526834;"2021-10-08-PNMI-CDB-002";2;;;;;;;;;"2021-10-08_PNMI_07_CDB-Q2_526837.jpg";"Pas de stratification";"laminaire 50% +palmaria palmata 20% +algues rouges 30%";23;1; +526834;"2021-10-08-PNMI-CDB-002";1;;;;;;;;;"2021-10-08_PNMI_07_CDB-Q1_526836.jpg";"Pas de stratification";"Chondrus crispus 70% +Algues vertes 5% +Himanthalia elongata 10% +Algues rouges 15%";103;2; +527881;"2020-03-13-BRES-CDB-001";3;48.32785;4.324033;;;;;;;;"Pas de stratification";"Peu de blocs, petits blocs +Sables grossiers, ma�rl +Quelques algues vertes +Algues brunes et rouges";51;53; +527881;"2020-03-13-BRES-CDB-001";2;48.327983;4.324367;;;;;;;;"Pas de stratification";"Blocs ensabl�s nombreux, blocs �parses +Majorit� de substrat (coquillages, ma�rl, sable grossier) +Majorit� d'algues brunes et rouges";35;18; +527881;"2020-03-13-BRES-CDB-001";1;48.32795;4.324167;;;;;;;;"Pas de stratification";"Blocs petits � moyens sur sable grossier, ma�rl, petits blocs +M�lange blocs retourn�s/non retourn�s + algues brunes/rouges";66;64; +527937;"2020-09-18-BRES-CDB-002";4;;;;;;;;;"2020-09-18_BRES_12_CDB-Q4_527942.JPG";"Pas de stratification";"Sable coquillier, petits d�bris +Beaucoup de petits blocs mais quelques gros blocs";106;17; +527937;"2020-09-18-BRES-CDB-002";3;;;;;;;;;"2020-09-18_BRES_12_CDB-Q3_527941.JPG";"Pas de stratification";"Sable coquillier +Petits d�bris +Beaucoup de petits blocs";36;40; +527937;"2020-09-18-BRES-CDB-002";2;;;;;;;;;"2020-09-18_BRES_12_CDB-Q2_527940.JPG";"Pas de stratification";"Petits blocs �parses, d�bris coquillers et ma�rl +En cours de recolonisation";16;50; +527937;"2020-09-18-BRES-CDB-002";1;;;;;;;;;"2020-09-18_BRES_12_CDB-Q1_527939.JPG";"Pas de stratification";"Dominance algues brunes, blocs de taille moyenne sur cailloutis, tr�s accol�s";104;57; +527943;"2020-09-19-BRES-CDB-003";5;;;;;;;;;"2020-09-19_BRES_12_CDB-Q5_527945.JPG";"Pas de stratification";"Petits blocs, peu de blocs +Dominance algues rouges +Ma�rl +Quelques algues vertes +Impact p�che visible";110;28;
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/test-data/champbloc_qecb.csv Wed Jan 04 13:21:41 2023 +0000 @@ -0,0 +1,2939 @@ +"id";"ID Fiche";"Type Bloc";"Num�ro Bloc �chantillon";"Face";"Couleur dominante";"Numero Photo";"R�f�rence bloc";"% algues brunes";"Strate algues brunes";"% algues rouges";"Strate algues rouges";"% algues vertes";"Strate algues vertes";"% Cladophora";"% Lithophyllum";"% Recouvrement Sediment";"Type Sediment";"% Roche Nue";"Nb Littorina obtusata";"Nb Gibbula cineraria";"Nb Gibbula pennanti";"Nb Gibbula umbilicalis";"Nb Phallusia mamillata";"Nb Tethya aurantium";"Nb Spirobranchus lamarckii 1B";"Nb Spirobranchus lamarckii 2B";"Nb Spirobranchus lamarckii 3B";"Nb Spirobranchus lamarckii 4B";"Nb Spirobranchus lamarckii 5B";"Nb Spirobranchus lamarckii total";"Nb spirorbis 1A";"Nb spirorbis 2A";"Nb spirorbis 3A";"Nb spirorbis 4A";"Nb spirorbis 5A";"Nb spirorbis total";"Nb Crassostrea gigas";"Nb Ostrea edulis";"% Mytilus sp.";"% Hermelles";"% Hydraires";"% Eponges";"% Ascidies Coloniales";"% Ascidies Solitaires";"% Bryozoaires Dresses";"% Balanes Vivantes";"Commentaires Avant";"% Surface Accolement";"Type sustrat observ�";"Commentaires";"Nb Cancer pagurus (Tourteau)";"Nb Necora puber (Etrille)";"Nb Carcinus maenas (Crabe vert)";"Nb Nucella lapilus (Pourpre)";"Nb Eriphia verrucosa (Crabe verruqueux)";"Nb Octopus vulgaris (Poulpe)";"Nb Galathea (Galath�es)";"Nb Paracentrotus lividus (Oursin)";"Nb Lophozozymus incisus (ancien Xantho incisus)";"Nb Palaemon sp (Crevette bouquet ou crevette rose)";"Nb Haliotis tuberculata (Ormeau)";"Nb Stramonita haemastoma (Pourpre bouche de sang)";"Nb Littorina littorea (Bigorneau)";"Nb Xantho pilipes (Xanthe poilu)";"Nb Mimachlamys varia (P�toncle noir)";"Commentaires" +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"Strate 1 Q2 BF.JPG";"oct14-LocB1Q2";0.0;;75.0;2;1.0;2;0.0;0.0;20.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;4.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Color�e";"S2 Q5 Bloc9 face sup.JPG";"oct14-LocB9sup";75.0;2;15.0;2;1.0;1;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;1;0;0;0;;;;;;2;;;;;;0;;;;;;3.0;0.0;0.0;0.0;45.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"S2 Q5 Bloc9 face inf.JPG";"oct14-LocB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";35.0;0;0;0;0;0;0;;;;;;220;;;;;;320;;;;;;0.0;0.0;0.0;0.0;2.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"S1 Q4 Bloc8 face sup.JPG";"oct14-LocB8sup";0.0;;85.0;2;1.0;2;0.0;5.0;35.0;"Sable fin";1.5;0;0;5;0;0;0;;;;;;20;;;;;;0;;;;;;0.5;0.0;0.5;0.0;0.0;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Rouge";"S1 Q4 Bloc8 face inf.JPG";"oct14-LocB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;18;0;0;0;0;;;;;;140;;;;;;1280;;;;;;2.5;1.5;0.5;0.0;0.0;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Color�e";"S1 Q4 Bloc7 face sup.JPG";"oct14-LocB7sup";0.0;;50.0;2;21.0;2;0.0;0.0;30.0;"Vase";3.0;0;0;2;0;4;0;;;;;;240;;;;;;0;;;;;;0.0;0.0;0.0;0.0;5.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"S1 Q4 Bloc7 face inf.JPG";"oct14-LocB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;380;;;;;;1960;;;;;;3.0;0.0;0.0;0.0;1.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"S1 Q3 Bloc6 face sup.JPG";"oct14-LocB6sup";0.0;;87.0;2;1.5;2;0.0;1.0;3.0;"Sable fin";0.0;0;0;1;0;0;0;;;;;;160;;;;;;0;;;;;;0.0;0.0;1.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Rouge";"S1 Q3 Bloc6 face inf.JPG";"oct14-LocB6inf";0.0;;0.5;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;220;;;;;;0;;;;;;0.0;17.0;1.0;2.0;1.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"S1 Q3 Bloc5 face sup.JPG";"oct14-LocB5sup";0.0;;80.0;2;3.0;2;0.0;0.0;10.0;"Vase";2.5;0;0;3;0;4;0;;;;;;260;;;;;;0;;;;;;0.0;0.0;0.0;0.0;7.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Rouge";"S1 Q3 Bloc5 face inf.JPG";"oct14-LocB5inf";0.0;;9.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;240;;;;;;2000;;;;;;4.0;30.0;2.5;4.5;2.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"Strate 1 Q3 BF.JPG";"oct14-LocB1Q3";1.0;2;90.0;2;0.0;;0.0;0.0;50.0;"Vase";0.0;0;0;0;0;0;0;;;;;;100;;;;;;0;;;;;;0.0;2.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune";"S2 Q1 Bloc1 face sup.JPG";"oct14-LocB1sup";80.0;2;2.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;1;0;0;0;;;;;;260;;;;;;0;;;;;;0.0;5.5;0.0;0.0;26.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Brune";"S2 Q1 Bloc1 face inf.JPG";"oct14-LocB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;3;2;0;0;0;;;;;;220;;;;;;60;;;;;;20.0;0.0;4.5;0.0;50.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"S2 Q1 Bloc2 face sup.JPG";"oct14-LocB2sup";0.0;;1.5;2;21.0;2;0.0;0.0;0.0;"Pas de s�diment";4.0;0;0;4;2;0;0;;;;;;200;;;;;;0;;;;;;0.0;0.0;0.0;0.0;14.0;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Verte";"S2 Q1 Bloc2 face inf.JPG";"oct14-LocB2inf";2.0;2;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;1;5;6;0;0;;;;;;180;;;;;;360;;;;;;1.0;0.0;3.0;0.0;9.5;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"S1 Q2 Bloc3 face sup.JPG";"oct14-LocB3sup";0.0;;14.0;2;50.0;1;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;0;0;0;0;;;;;;320;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;1;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Rouge";"S1 Q2 Bloc3 face inf.JPG";"oct14-LocB3inf";0.0;;24.0;2;10.0;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;2;7;0;0;0;;;;;;160;;;;;;1500;;;;;;0.0;2.0;0.0;0.0;3.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;1;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"S1 Q2 Bloc4 face sup.JPG";"oct14-LocB4sup";0.0;;35.0;2;4.0;2;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;1;0;0;0;;;;;;220;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"S1 Q2 Bloc4 face inf.JPG";"oct14-LocB4inf";0.0;;6.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";6.0;0;5;0;1;0;0;;;;;;200;;;;;;2500;;;;;;0.0;0.0;0.0;0.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Color�e";"S2 Q5 Bloc10 face sup.JPG";"oct14-LocB10sup";51.0;2;10.0;2;6.0;2;0.0;1.0;0.0;"Pas de s�diment";0.0;0;0;4;0;0;0;;;;;;20;;;;;;0;;;;;;5.0;0.0;0.0;0.0;15.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"S2 Q5 Bloc10 face inf.JPG";"oct14-LocB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;1;5;0;0;;;;;;200;;;;;;280;;;;;;0.0;3.0;0.0;0.0;2.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"Strate 1 Q4 BF.JPG";"oct14-LocB1Q4";0.0;;85.0;1;1.5;1;0.0;0.0;85.0;"Vase";0.0;0;0;6;0;0;0;;;;;;0;;;;;;0;;;;;;4.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"Strate 2 Q5 BF.JPG";"oct14-LocB1Q5";95.0;3;25.0;2;1.0;2;0.0;0.0;2.5;"Vase";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;2.0;0.0;0.0;0.0;10.0;;;;;;;;;;;;;;;;;;;; +373462;"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Color�e";"Strate 2 Q1 BF.JPG";"oct14-LocB1Q1";65.0;2;13.0;1;6.0;2;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;2;3;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;10.0;;;;;;;;;;;;;;;;;;;; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune";"DSCN1176.JPG";"mar15-LocB9sup";30.0;3;60.0;2;4.0;2;0.0;0.0;40.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;3.5;0.0;0.0;0.0;6.5;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCN1177.JPG";"mar15-LocB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;3;1;0;0;0;;;;;;92;0;0;1;2;2;200;;;;;;6.0;0.0;0.0;0.0;14.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Brune-Rouge";"DSCN1182.JPG";"mar15-LocB1Q5";50.0;2;;2;10.0;1;0.0;5.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;11.0;;;;;;;;;;;;;;;;;;;; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"DSCN1173.JPG";"mar15-LocB1Q4";0.5;;80.0;2;20.0;2;0.0;0.0;0.0;"Pas de s�diment";1.0;1;0;5;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"DSCN1165.JPG";"mar15-LocB1Q3";0.0;;60.0;2;11.0;2;0.0;0.0;7.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;2.5;0.0;;;;;;;;;;;;;;;;;;;; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"DSCN1159.JPG";"mar15-LocB1Q2";0.0;;75.0;2;25.0;2;0.0;0.0;20.0;"Vase";0.0;0;0;0;0;0;1;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune";"DSCN1148.JPG";"mar15-LocB1Q1";31.0;;10.0;;10.0;;1.0;0.0;0.0;"Pas de s�diment";0.0;0;0;6;0;0;0;;;;;;8;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;11.0;;;;;;;;;;;;;;;;;;;; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"DSCN1178.JPG";"mar15-LocB10sup";100.0;3;10.0;2;35.0;2;0.0;2.0;0.0;"Pas de s�diment";0.0;0;0;7;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;15.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSCN1179.JPG";"mar15-LocB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;7;3;0;0;;;;;;56;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;22.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"DSCN1171.JPG";"mar15-LocB8sup";0.0;;65.0;2;10.0;2;0.0;1.5;0.0;"Pas de s�diment";0.0;0;0;1;0;0;0;;;;;;7;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;1.5;0.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"DSCN1172.JPG";"mar15-LocB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;13;0;0;0;0;0;0;;;;;;5.5;0.0;2.0;8.0;10.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Rouge";"DSCN1168.JPG";"mar15-LocB7sup";0.0;;40.0;2;7.0;2;0.0;0.0;70.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"DSCN1169.JPG";"mar15-LocB7inf";0.0;;0.0;;0.0;;0.0;50.0;5.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;2.0;0.0;0.0;0.0;0.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Verte";"DSCN1163.JPG";"mar15-LocB6sup";0.0;;25.0;2;75.0;2;0.0;0.0;6.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;1.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSCN1164.JPG";"mar15-LocB6inf";0.0;;0.0;;0.0;;0.0;4.5;1.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;4.0;10.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge-Verte";"DSCN1161.JPG";"mar15-LocB5sup";0.0;;40.0;2;40.0;2;0.0;0.0;60.0;"Vase";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"DSCN1162.JPG";"mar15-LocB5inf";0.0;;5.0;2;0.0;;0.0;19.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;1;0;0;3;4;160;0;0;0;0;0;0;;;;;;7.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"DSCN1155.JPG";"mar15-LocB4sup";1.0;;100.0;2;26.0;2;0.0;0.0;0.0;"Vase";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"DSCN1157.JPG";"mar15-LocB4inf";0.0;;10.0;;0.0;;0.0;7.0;0.0;"Pas de s�diment";0.0;0;2;0;0;0;0;3;2;1;3;0;180;0;0;0;0;0;0;;;;;;18.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"DSCN1150.JPG";"mar15-LocB3sup";0.0;;65.0;2;2.5;2;0.0;0.0;100.0;"Vase";0.0;0;0;3;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"DSCN1153.JPG";"mar15-LocB3inf";0.0;;0.0;;0.0;;0.0;0.0;2.0;"Vase";0.0;0;0;0;0;0;0;;;;;;23;0;0;0;0;0;0;;;;;;3.5;0.0;0.0;0.0;1.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"DSCN1144.JPG";"mar15-LocB2sup";7.0;2;10.0;2;6.0;2;0.0;0.0;0.0;"Pas de s�diment";8.0;0;0;3;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;4.0;0.0;0.0;0.0;40.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;2;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCN1145.JPG";"mar15-LocB2inf";15.0;3;2.0;2;1.0;2;0.0;0.0;0.0;"Pas de s�diment";5.0;0;3;0;1;3;0;;;;;;15;0;0;0;0;0;0;;;;;;5.0;0.0;0.0;8.0;20.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;2;0;0; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune";"DSCN1142.JPG";"mar15-LocB1sup";100.0;3;10.0;2;4.0;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;4;3;0;0;;;;;;17;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;45.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373529;"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"DSCN1147.JPG";"mar15-LocB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;2;2;0;0;0;;;;;;40;0;0;0;0;0;0;;;;;;8.0;0.0;3.0;0.0;10.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Brune-Rouge";"DSCN2978.JPG";"sept15-LocB1Q1";60.0;2;14.0;2;2.0;2;0.0;0.0;10.0;"Sable grossier";2.0;0;0;0;5;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.5;10.0;;;;;;;;;;;;;;;;;;;; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"DSCN3000.JPG";"sept15-LocB10sup";90.0;1;20.0;2;5.0;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;22;5;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;35.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;2; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSCN3002.JPG";"sept15-LocB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";7.0;0;30;3;0;0;0;2;3;5;2;1;260;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;3.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;2; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge-Verte";"DSCN2998.JPG";"sept15-LocB9sup";0.0;;4.0;2;25.0;2;0.0;0.0;0.0;"Pas de s�diment";1.5;0;0;0;0;0;0;;;;;;35;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;40.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;2;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCN3001.JPG";"sept15-LocB9inf";0.0;;2.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;3;0;0;0;0;5;0;0;2;3;200;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;15.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;2;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune-Rouge";"DSCN2971.JPG";"sept15-LocB1sup";42.0;2;55.0;2;10.0;2;0.0;0.0;0.0;"Pas de s�diment";2.0;0;2;4;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;39.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCN2975.JPG";"sept15-LocB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;2;9;0;0;0;4;5;0;2;1;240;0;0;0;0;0;0;;;;;;7.0;0.0;0.0;0.0;5.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Rouge";"DSCN2973.JPG";"sept15-LocB2sup";50.0;3;10.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;5;0;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;2.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCN2976.JPG";"sept15-LocB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;8;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;1.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"DSCN2994.JPG";"sept15-LocB8sup";0.0;;45.0;2;40.0;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;3;0;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSCN2995.JPG";"sept15-LocB8inf";0.0;;13.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;3;0;0;0;;;;;;26;0;0;0;0;0;0;;;;;;0.0;5.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;3;0;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"DSCN2980.JPG";"sept15-LocB3sup";0.0;;80.0;2;27.0;2;0.0;0.0;0.0;"Vase";0.0;0;0;3;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCN2982.JPG";"sept15-LocB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;6;3;0;0;0;;;;;;57;0;0;0;0;0;0;;;;;;3.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"DSCN2981.JPG";"sept15-LocB4sup";0.0;;95.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSCN2983.JPG";"sept15-LocB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";45.0;0;0;4;2;0;0;;;;;;3;0;0;0;0;0;0;;;;;;0.5;4.0;0.0;0.0;0.5;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"DSCN2992.JPG";"sept15-LocB7sup";0.0;;70.0;2;40.0;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;1;0;3;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;1; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSCN2993.JPG";"sept15-LocB7inf";0.0;;1.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;1;0;2;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;4.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;1; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Verte";"DSCN2987.JPG";"sept15-LocB6sup";0.0;;10.0;2;100.0;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;2;2;0;0;;;;;;5;0;0;0;0;0;0;;;;;;0.0;0.0;0.5;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSCN2989.JPG";"sept15-LocB6inf";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;12;1;0;0;;;;;;4;0;0;0;0;0;0;;;;;;3.0;3.0;1.5;5.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"DSCN2986.JPG";"sept15-LocB5sup";0.0;;80.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;1;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;3;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSCN2988.JPG";"sept15-LocB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;7;2;0;0;0;;;;;;45;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;3;0;;0;0;0; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune-Rouge";"DSCN3003.JPG";"sept15-LocB1Q5";25.0;2;50.0;2;5.0;2;0.0;0.0;2.0;"D�bris coquilliers";1.0;0;0;5;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;5.0;;;;;;;;;;;;;;;;;;;; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"DSCN2996.JPG";"sept15-LocB1Q4";0.0;;100.0;2;4.0;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"DSCN2990.JPG";"sept15-LocB1Q3";0.0;;60.0;2;5.0;2;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.5;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373596;"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Rouge";"DSCN2984.JPG";"sept15-LocB1Q2";0.0;;100.0;2;5.5;2;0.0;0.0;0.0;"Pas de s�diment";;0;0;0;0;0;1;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"DSCN3215.JPG";"mars16-locB1sup";0.0;;35.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;0;14;0;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;20.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCN3217.JPG";"mars16-locB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;1;5;0;0;0;;;;;;44;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;18.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"DSCN3198.JPG";"mars16-LocB1Q3";0.0;;90.0;2;4.5;2;0.0;0.0;90.0;"Vase";0.0;0;0;2;0;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.75;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Rouge";"DSCN1282.JPG";"mars16-LocB1Q2";0.0;;50.0;2;1.0;2;0.0;0.0;40.0;"D�bris coquilliers";0.0;0;3;5;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune";"DSCN3220.JPG";"mars16-LocB1Q1";85.0;3;4.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;2;8;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;30.0;;;;;;;;;;;;;;;;;;;; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune-Rouge";"DSCN3209.JPG";"mars16-locB10sup";15.0;3;35.0;2;0.5;2;0.0;1.0;15.0;"D�bris coquilliers";0.5;0;11;6;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.125;0.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSCN3212.JPG";"mars16-locB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";11.0;0;7;4;2;0;0;;;;;;73;1;10;0;0;4;600;;;;;;2.5;0.0;0.0;0.0;0.25;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge-Verte";"DSCN3206.JPG";"mars16-LocB1Q3";0.0;;70.0;2;13.0;2;0.0;0.0;40.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.125;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"DSCN3194.JPG";"mars16-locB6sup";0.0;;65.0;2;6.0;2;0.0;0.0;85.0;"Sable grossier";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSCN3197.JPG";"mars16-locB6inf";0.0;;0.25;2;0.0;;0.0;2.5;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;49;0;23;15;32;2;2880;;;;;;0.5;0.0;0.125;0.0;0.25;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"DSCN3213.JPG";"mars16-LocB1Q5";45.0;3;30.0;2;0.125;2;0.0;2.0;0.0;"Pas de s�diment";5.0;0;2;15;4;0;0;;;;;;13;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune-Rouge";"DSCN3208.JPG";"mars16-locB9sup";55.0;3;50.0;2;1.5;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;2;10;0;0;0;;;;;;13;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;14.0;;65.0;"Vase";;0;0;0;0;;;0;;0;4;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCN3210.JPG";"mars16-locB9inf";0.0;;0.0;;0.0;;0.0;0.0;3.0;"Vase";0.0;0;1;1;0;0;0;;;;;;60;0;0;0;0;0;0;;;;;;3.0;0.5;0.25;0.0;8.0;;65.0;"Vase";;0;0;0;0;;;0;;0;4;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"DSCN1285.JPG";"mars16-locB8sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;1;3;2;0;0;0;;;;;;98;13;2;0;2;5;880;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Rouge-Verte";"DSCN3203.JPG";"mars16-locB8inf";0.0;;80.0;2;12.0;2;0.0;1.0;1.0;"Vase";1.5;0;6;0;0;0;0;;;;;;32;10;8;1;0;0;760;;;;;;0.0;0.0;0.0;0.5;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"DSCN3201.JPG";"mars16-locB7sup";0.0;;65.0;2;6.0;2;0.0;0.0;65.0;"Sable grossier";0.0;0;0;2;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSCN3205.JPG";"mars16-locB7inf";0.0;;2.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;1;0;0;0;;;;;;42;0;0;0;0;0;0;;;;;;0.25;2.0;0.75;1.0;0.125;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge-Verte";"DSCN3195.JPG";"mars16-locB5sup";0.0;;35.0;2;16.0;2;0.0;0.0;10.0;"D�bris coquilliers";2.0;0;3;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSCN1284.JPG";"mars16-locB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;15;5;2;15;6;860;31;11;11;12;4;2760;;;;;;0.0;0.0;0.5;0.0;0.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"DSCN3191.JPG";"mars16-locB4sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";19.0;0;0;10;1;0;0;;;;;;77;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Brune";"DSCN3192.JPG";"mars16-locB4inf";0.0;;40.0;2;2.0;2;0.0;0.0;3.0;"D�bris coquilliers";1.0;0;2;37;0;0;0;;;;;;28;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"DSCN3190.JPG";"mars16-locB3sup";0.5;2;50.0;2;2.5;2;0.0;0.0;70.0;"D�bris coquilliers";1.5;0;3;1;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCN1281.JPG";"mars16-locB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";4.0;0;3;1;0;0;0;;;;;;51;1;3;8;0;2;560;;;;;;0.0;1.0;0.25;0.0;0.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Rouge";"DSCN3216.JPG";"mars16-locB2sup";10.0;2;40.0;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";9.0;0;3;13;7;0;0;;;;;;3;0;0;0;0;0;0;;;;;;0.125;0.0;0.0;0.0;3.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373663;"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCN3219.JPG";"mars16-locB2inf";0.0;;0.0;;0.0;;0.0;0.0;5.0;"Pas de s�diment";0.5;0;3;1;0;0;0;;;;;;36;0;0;3;6;0;360;;;;;;4.0;0.0;0.125;0.0;1.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune-Rouge";"DSCN5110.JPG";"sept16-locB9sup";10.0;2;25.0;2;5.0;2;0.0;0.0;3.0;"Sable grossier";7.0;0;13;11;19;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;2.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCN5111.JPG";"sept16-locB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;12;4;6;17;20;1180;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"DSCN5109.JPG";"sept16-locQ5";75.5;3;26.0;2;0.0;;0.0;0.75;3.0;"D�bris coquilliers";3.0;0;7;10;38;0;0;0;6;2;3;2;260;17;2;8;3;6;1440;;;;;;0.25;0.0;0.0;0.0;23.0;;;;;;;;;;;;;;;;;;;; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge-Verte";"DSCN5099.JPG";"sept16-LOCQ4";0.0;;40.0;2;7.0;2;0.0;0.0;25.0;"Sable grossier";0.0;0;1;3;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.625;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Color�e";"DSCN5090.JPG";"sept16-locB4sup";0.0;;4.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;0;0;0;0;0;13;2;0;1;0;320;0;0;2;5;0;280;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Rouge";"DSCN5092.JPG";"sept16-locB4inf";0.0;;60.0;2;4.0;2;0.0;0.0;8.0;"Vase";0.0;0;3;3;0;0;0;0;0;0;3;0;60;0;0;0;0;0;0;;;;;;0.0;1.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche-Verte";"DSCN5086.JPG";"sept16-locB3sup";0.0;;4.0;1;6.0;2;0.0;0.0;0.0;"Pas de s�diment";13.0;0;3;1;2;0;0;0;0;1;0;2;60;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;2.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"DSCN5087.JPG";"sept16-locB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.5;0;1;2;0;1;0;0;2;8;0;4;280;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche-Rouge";"DSCN5080.JPG";"sept16-locB2sup";0.5;2;33.0;2;0.25;2;0.0;0.0;0.0;"Pas de s�diment";18.0;0;1;0;9;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;6.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"DSCN5085.JPG";"sept16-locB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;5;3;1;0;0;3;0;10;2;6;420;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune";"DSCN5076.JPG";"sept16-locB1sup";75.0;3;14.0;2;0.5;2;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;0;6;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;6.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";;"sept16-locB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;9;0;8;0;0;;;;;;;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;1.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Rouge";"DSCN5093.JPG";"sept16-locB5sup";0.0;;30.0;2;0.0;;0.0;0.0;15.0;"Vase";0.0;0;0;0;0;0;0;0;0;2;0;0;40;0;0;0;0;0;0;;;;;;0.0;0.125;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"DSCN5094.JPG";"sept16-locB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;4;0;0;0;0;8;2;0;4;7;420;0;0;0;0;4;160;;;;;;0.5;0.25;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge-Verte";"DSCN5082.JPG";"sept16-locQ2";1.0;2;68.0;2;10.0;2;0.0;0.0;22.0;"Sable grossier";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;1.25;0.0;2.25;0.0;;;;;;;;;;;;;;;;;;;; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge-Verte";"DSCN5091.JPG";"SEPT16-LOCQ3";0.0;;50.5;2;4.0;2;0.0;0.0;27.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Brune-Rouge";"DSCN5077.JPG";"sept16-locQ1";50.0;3;57.0;2;0.5;2;0.0;6.0;0.25;"D�bris coquilliers";4.0;0;4;1;0;0;0;0;0;1;0;2;60;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;25.5;;;;;;;;;;;;;;;;;;;; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Rouge";"DSCN5112.JPG";"sept16-locB10sup";0.0;;12.5;2;3.5;2;0.0;0.0;15.0;"Sable grossier";2.0;0;2;0;1;0;0;;;;;;0;0;0;6;2;0;320;;;;;;0.0;0.0;0.0;0.0;1.5;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSCN5113.JPG";"sept16-locB10inf";0.0;;0.0;;0.0;;0.0;0.0;37.5;"Sable grossier";2.0;0;0;0;0;0;0;8;2;10;6;2;560;2;1;4;0;1;320;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"DSCN5100.JPG";"sept16-locB7sup";0.0;;30.0;2;2.0;2;0.0;0.0;12.0;"Vase";0.25;0;1;1;0;0;0;0;0;0;0;4;80;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.0;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";;"sept16-locB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";9.0;0;2;0;0;0;0;6;7;7;2;0;440;10;5;14;7;2;1520;;;;;;0.0;0.5;0.0;0.0;0.0;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Rouge";"DSCN5096.JPG";"sept16-locB6sup";0.0;;22.0;1;0.25;2;0.0;0.0;7.0;"Vase";10.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"DSCN5097.JPG";"sept16-locB6inf";0.0;;0.0;;0.5;2;0.0;0.0;0.0;"Pas de s�diment";1.0;0;5;0;0;0;0;10;3;0;7;6;520;0;0;0;5;0;200;;;;;;0.0;0.5;0.0;0.0;0.0;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"DSCN5105.JPG";"sept16-locB8sup";5.0;2;40.0;2;7.0;2;0.0;0.0;2.0;"Sable grossier";2.0;0;5;3;1;0;0;5;0;8;0;0;260;0;0;0;0;0;0;;;;;;0.0;1.0;0.0;0.0;0.0;;100.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373730;"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"DSCN5107.JPG";"sept16-locB8inf";0.0;;0.0;;0.0;;0.0;20.0;0.0;"Pas de s�diment";3.0;0;10;1;2;0;0;7;8;0;0;2;340;4;2;5;0;0;440;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"S1 Q5 Bloc9 face sup.JPG";"nov14-BegB9sup";0.0;;85.0;2;0.0;;0.0;0.0;100.0;"Vase";0.0;0;0;0;0;0;0;;;;;;60;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;1;0;;0;4;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Rouge";"S1 Q5 Bloc9 face inf.JPG";"nov14-BegB9inf";0.0;;0.0;;0.0;;0.0;0.0;40.0;"Vase";0.0;0;0;0;0;0;0;;;;;;260;;;;;;0;;;;;;5.5;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;1;0;;0;4;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Color�e";"Strate 1 Q4 BF.JPG";"nov14-BegB1Q4";50.0;2;50.0;2;0.0;;0.0;0.0;75.0;"Sable fin";0.0;0;0;5;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"Strate 2 Q2 BF.JPG";"nov14-BegB1Q2";0.0;;4.0;2;5.0;2;0.0;0.0;100.0;"Vase";0.0;0;0;2;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Color�e";"Strate 2 Q1 BF.JPG";"nov14-BegB1Q1";5.0;2;20.0;2;15.0;2;0.0;5.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;1;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"S1 Q4 Bloc8 face sup.JPG";"nov14-BegB8sup";0.0;;40.0;2;3.0;2;0.0;0.0;20.0;"Vase";0.0;0;3;0;0;0;0;;;;;;200;;;;;;200;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;6;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Rouge";"S1 Q4 Bloc8 face inf.JPG";"nov14-BegB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";45.0;0;3;23;0;0;0;;;;;;180;;;;;;0;;;;;;0.0;0.0;0.0;0.0;7.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;6;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Color�e";"S1 Q4 Bloc7 face sup.JPG";"nov14-BegB7sup";50.0;2;0.0;;60.0;2;0.0;0.0;100.0;"Vase";0.0;0;0;2;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;2.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;4;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"S1 Q4 Bloc7 face inf.JPG";"nov14-BegB7inf";0.0;;0.0;;0.0;;0.0;0.0;15.0;"Vase";9.0;0;0;0;0;0;0;;;;;;220;;;;;;0;;;;;;2.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;4;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"S2 Q3 Bloc6 face sup.JPG";"nov14-BegB6sup";0.0;;30.0;2;0.0;;0.0;0.0;5.0;"Sable fin";10.0;2;0;0;0;0;0;;;;;;500;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Rouge";"S2 Q3 Bloc6 face inf.JPG";"nov14-BegB6inf";0.0;;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;720;;;;;;0;;;;;;4.0;0.0;0.5;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";;"nov14-BegB5sup";0.0;;25.0;1;0.0;;0.0;0.0;75.0;"Vase";0.0;0;1;3;0;0;0;;;;;;560;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;3;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Rouge";"S2 Q3 Bloc5 face inf.JPG";"nov14-BegB5inf";0.0;;5.0;2;0.0;;0.0;0.0;10.0;"Vase";2.0;1;3;0;0;3;0;;;;;;260;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;3;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Color�e";"S2 Q2 Bloc4 face sup.JPG";"nov14-BegB4sup";0.5;2;40.0;2;2.0;2;0.0;0.0;60.0;"Sable fin";5.0;10;0;0;0;0;0;;;;;;300;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;3;0;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"S2 Q2 Bloc4 face inf.JPG";"nov14-BegB4inf";0.0;;3.0;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";5.0;0;0;1;0;0;0;;;;;;220;;;;;;0;;;;;;0.0;0.0;0.0;0.0;10.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;3;0;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Color�e";"Strate 2 Q3 BF.JPG";"nov14-BegB1Q3";0.0;;19.0;2;12.0;2;0.0;0.0;100.0;"Vase";30.0;0;1;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"Strate 1 Q5 BF.JPG";"nov14-BegB1Q5";0.0;;55.0;2;0.0;;0.0;0.0;100.0;"Vase";30.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"S2 Q1 Bloc2 face sup.JPG";"nov14-BegB2sup";0.0;;50.0;2;1.0;2;0.0;0.0;5.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;6;0;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Rouge";"S2 Q1 Bloc2 face inf.JPG";"nov14-BegB2inf";0.0;;1.5;2;0.0;2;0.0;5.0;0.0;"Pas de s�diment";2.0;0;2;0;0;0;0;;;;;;420;;;;;;0;;;;;;1.0;0.5;1.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;6;0;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"S1 Q5 Bloc10 face sup.JPG";"nov14-BegB10sup";0.0;;80.0;2;0.0;;0.0;0.0;75.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Rouge";"S1 Q5 Bloc10 face inf.JPG";"nov14-BegB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;160;;;;;;0;;;;;;3.0;3.0;0.0;0.0;2.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"S2 Q1 Bloc1 face sup.JPG";"nov14-BegB1sup";5.0;2;70.0;2;6.0;2;0.0;0.0;100.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;300;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;4;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Rouge";"S2 Q1 Bloc1 face inf.JPG";"nov14-BegB1inf";0.0;;0.0;;0.0;;0.0;0.0;50.0;"Vase";0.0;0;0;0;0;0;0;;;;;;680;;;;;;0;;;;;;7.0;6.0;1.5;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;4;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"S2 Q2 Bloc3 face sup.JPG";"nov14-BegB3sup";1.0;2;17.0;2;0.0;;0.0;0.0;20.0;"Vase";10.0;0;0;0;0;0;0;;;;;;10;;;;;;0;;;;;;0.0;0.0;0.0;0.0;35.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +373804;"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Rouge";"S2 Q2 Bloc3 face inf.JPG";"nov14-BegB3inf";0.0;;0.0;;0.0;;0.0;0.0;50.0;"Vase";0.0;0;0;2;0;0;0;;;;;;420;;;;;;0;;;;;;2.0;3.0;4.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"DSCN1192.JPG";"mars15-BegB3sup";0.0;;18.0;2;12.0;2;0.0;0.0;100.0;"Vase";0.0;0;0;0;0;0;0;;;;;;580;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;65.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCN1193.JPG";"mars15-BegB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;520;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;65.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"DSCN1211.JPG";"mars15- BegB1inf";0.0;;65.0;2;0.0;;0.0;0.0;100.0;"Vase";0.0;0;0;0;0;0;0;;;;;;580;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;75.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;5; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCN1212.JPG";"mars15- BegB1sup";0.0;;0.0;;0.0;;0.0;0.0;85.0;"Vase";10.0;0;1;0;0;0;0;;;;;;460;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;75.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;5; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"DSCN1213.JPG";"mars15-BegB2sup";0.0;;55.0;2;3.0;2;0.0;0.0;100.0;"Vase";0.0;0;0;0;0;0;0;;;;;;560;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCN1214.JPG";"mars15-BegB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;460;;;;;;0;;;;;;0.0;0.0;0.0;7.0;0.0;;50.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;1; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune-Rouge";"DSCN1202.JPG";"mars15-BegB1Q5";0.0;;34.0;2;1.0;2;0.0;5.0;100.0;"Vase";0.0;0;0;0;0;0;0;;;;;;500;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge-Verte";"DSCN1209.JPG";"mars15-BegB1Q4";0.0;;10.0;2;2.5;2;0.0;0.0;100.0;"Vase";0.0;0;0;0;0;0;0;;;;;;480;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"DSCN1191.JPG";"mars15-BegB1Q3";5.0;2;35.0;2;1.5;2;0.0;0.0;100.0;"Vase";0.0;0;0;0;0;0;0;;;;;;160;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge-Verte";"DSCN1196.JPG";"mars15-BegB1Q2";0.0;;65.0;2;14.0;2;0.0;0.0;100.0;"Vase";0.0;0;0;0;0;0;0;;;;;;620;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune";;"mars15-BegB1Q1";75.0;2;11.0;2;0.0;;0.0;0.0;100.0;"Vase";1.5;0;0;0;0;0;0;;;;;;260;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"DSCN1186.JPG";"mars15-BegB5sup";0.0;;0.0;;0.0;;0.0;0.0;80.0;"Vase";0.0;0;0;0;0;0;0;;;;;;300;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSCN1187.JPG";"mars15-BegB5inf";0.0;;0.0;;0.0;;0.0;0.0;5.0;"Vase";1.0;0;2;0;0;0;0;;;;;;340;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Rouge";"DSCN1200.JPG";"mars15-BegB10sup";0.0;;30.0;2;0.0;;0.0;0.0;85.0;"Vase";1.0;0;0;0;0;0;0;;;;;;320;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSCN1201.JPG";"mars15-BegB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.5;0;3;0;0;0;0;;;;;;360;;;;;;0;;;;;;0.0;0.0;40.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune-Rouge";"DSCN1198.JPG";"mars15-BegB9sup";0.0;;0.0;;0.0;;0.0;0.0;7.0;"Vase";3.0;0;0;0;0;0;0;;;;;;240;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCN1199.JPG";"mars15-BegB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.5;0;0;0;0;0;0;;;;;;340;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.5;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune";"DSCN1194.JPG";"mars15-BegB4sup";0.0;;33.0;2;0.0;;0.0;0.0;80.0;"Vase";0.0;0;0;0;0;0;0;;;;;;380;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Vase";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSCN1195.JPG";"mars15-BegB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;500;;;;;;0;;;;;;2.0;0.0;0.0;0.0;0.0;;50.0;"Vase";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"DSCN1207.JPG";"mars15-BegB8sup";0.0;;9.0;2;7.5;2;0.0;0.0;100.0;"Vase";0.0;0;0;0;0;0;0;;;;;;480;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;85.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSCN1208.JPG";"mars15-BegB8inf";0.0;;0.0;;0.0;;0.0;0.0;100.0;"Vase";25.0;0;0;0;0;0;0;;;;;;280;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;85.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"DSCN1205.JPG";"mars15-BegB7sup";1.0;;0.0;;0.0;;0.0;0.0;50.0;"Vase";45.0;0;0;0;0;0;0;;;;;;340;;;;;;0;;;;;;0.0;0.0;4.5;0.0;0.0;;100.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Rouge";"DSCN1206.JPG";"mars15-BegB7inf";2.0;3;80.0;2;0.0;;0.0;0.0;100.0;"Vase";0.0;0;0;0;0;0;0;;;;;;360;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Rouge";"DSCN1188.JPG";"mars15-BegB6sup";0.0;;12.0;2;0.0;;0.0;0.0;95.0;"Vase";0.0;0;0;0;0;0;0;;;;;;440;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373871;"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSCN1189.JPG";"mars15-BegB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";7.0;0;3;1;0;0;0;;;;;;380;;;;;;0;;;;;;0.0;0.0;2.0;0.0;0.5;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Brune";"DSCN3010.JPG";"sept15-BegB1Q3";25.0;3;0.0;;0.0;;0.0;6.0;5.0;"Vase";2.0;0;0;0;4;0;0;3;2;4;3;2;280;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;11.0;;;;;;;;;;;;;;;;;;;; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Rouge";"DSCN3007.JPG";"sept15-BegB6sup";0.0;;0.0;;0.0;;0.0;0.0;100.0;"Vase";0.0;0;0;0;0;0;0;5;6;3;3;2;380;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Vase";;0;0;2;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSCN3009.JPG";"sept15-BegB6inf";0.0;;12.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;16;1;0;0;0;5;6;7;3;4;500;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;100.0;"Vase";;0;0;2;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"DSCN3014.JPG";"sept15-BegB4sup";0.0;;0.0;;0.0;;0.0;0.0;80.0;"Vase";0.0;0;0;0;0;0;0;11;8;2;14;9;880;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Vase";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSCN3017.JPG";"sept15-BegB4inf";0.5;1;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";4.0;0;5;0;0;0;0;4;6;2;4;6;440;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Vase";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"DSCN3005.JPG";"sept15-BegB5sup";0.0;;18.0;2;2.0;2;0.0;0.0;60.0;"Vase";0.0;0;0;0;0;0;0;1;4;4;2;1;240;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Sable grossier";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSCN3008.JPG";"sept15-BegB5inf";0.0;;0.0;;0.0;;0.0;0.0;5.0;"Vase";10.0;0;1;5;0;0;0;4;0;2;1;1;160;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;2.5;;80.0;"Sable grossier";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge-Verte";"DSCN3024.JPG";"sept15-BegB1Q4";0.0;;30.0;2;4.0;2;0.0;2.0;20.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"DSCN3032.JPG";"sept15- BegB1inf";0.0;;0.0;;0.0;;0.0;0.0;30.0;"Vase";25.0;0;0;0;0;0;0;;;;;;17;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;4.5;;75.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCN3035.JPG";"sept15- BegB1sup";0.0;;0.5;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;1;15;2;1;0;0;8;7;8;6;5;680;0;0;0;0;0;0;;;;;;2.0;0.0;2.5;0.0;0.0;;75.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"DSCN3033.JPG";"sept15-BegB2sup";3.0;;40.0;2;5.0;2;0.0;0.0;10.0;"Vase";0.0;0;0;0;0;0;0;5;2;3;3;8;420;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCN3034.JPG";"sept15-BegB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;7;0;1;0;0;9;8;5;5;7;680;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"DSCN3012.JPG";"sept15-BegB3sup";0.0;;40.0;2;7.0;2;0.0;0.0;60.0;"Vase";1.0;0;0;21;0;0;0;3;4;1;1;2;220;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;65.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCN3016.JPG";"sept15-BegB3inf";0.0;;2.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;2;0;7;0;8;6;7;2;6;580;0;0;0;0;0;0;;;;;;0.0;0.0;15.0;0.0;0.0;;65.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge-Verte";"DSCN3030.JPG";"sept15-BegB1Q5";0.0;;21.0;2;5.0;2;0.0;0.0;20.0;"Sable grossier";4.0;0;0;0;0;0;0;2;2;0;4;0;160;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"DSCN3020.JPG";"sept15-BegB7sup";0.0;;0.0;;0.0;;0.0;0.0;85.0;"Vase";0.0;0;0;0;0;0;0;7;6;7;8;5;660;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Rouge";"DSCN3021.JPG";"sept15-BegB7inf";0.0;;22.0;2;2.0;2;0.0;0.0;0.0;"Pas de s�diment";4.0;0;0;3;0;0;0;8;6;8;5;0;540;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;100.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"DSCN3022.JPG";"sept15-BegB8sup";0.0;;20.0;2;4.0;2;0.0;0.0;50.0;"Vase";0.0;0;0;0;0;0;0;1;8;5;3;6;460;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSCN3023.JPG";"sept15-BegB8inf";0.0;;2.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;5;8;5;7;9;680;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"DSCN3026.JPG";"sept15-BegB9sup";0.0;;50.0;2;0.0;;0.0;0.0;80.0;"Vase";0.0;0;0;2;0;0;0;2;1;3;2;1;180;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCN3029.JPG";"sept15-BegB9inf";0.0;;0.0;;0.0;;0.0;0.0;10.0;"Vase";0.0;0;2;2;0;0;0;3;3;6;5;4;420;0;0;0;0;0;0;;;;;;0.0;0.0;3.5;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"DSCN3027.JPG";"sept15-BegB10sup";0.0;;40.0;2;0.0;;0.0;0.0;8.0;"Vase";0.5;1;0;0;0;0;0;3;5;4;0;0;240;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Vase";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSCN3028.JPG";"sept15-BegB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;5;0;0;0;0;5;8;3;5;0;420;0;0;0;0;0;0;;;;;;1.0;2.0;2.0;0.0;0.0;;80.0;"Vase";;0;0;1;0;;;0;;0;0;0;;0;0;0; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune";"DSCN3036.JPG";"sept15-BegB1Q1";30.0;3;15.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;1;0;0;0;11;0;0;3;0;280;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;16.0;;;;;;;;;;;;;;;;;;;; +373938;"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"DSCN3018.JPG";"sept15-BegB1Q2";0.0;;50.0;2;3.0;2;0.0;0.0;20.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche-Rouge";"DSCN3241.JPG";"mars16-begB1Q2";0.0;;30.0;2;0.0;;0.0;0.0;75.0;"Sable fin";5.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Rouge";"DSCN3259.JPG";"mars16-begB1sup";0.0;;3.5;2;0.0;;0.0;0.0;25.0;"Sable fin";1.0;0;0;1;0;0;0;3;1;12;9;8;660;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.75;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCN3262.JPG";"mars16-begB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.5;0;1;1;0;0;0;0;3;5;4;2;280;0;0;0;0;0;0;;;;;;0.0;0.0;4.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"DSCN3258.JPG";"mars16-begB2sup";0.0;;0.0;;0.0;;0.0;0.0;75.0;"Sable fin";0.0;0;0;0;0;0;0;8;19;14;8;16;1300;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCN3261.JPG";"mars16-begB2inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";10.0;0;7;2;0;0;0;0;8;0;6;0;280;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"DSCN3229.JPG";"mars16-begB3sup";0.0;;8.0;2;0.0;;0.0;0.0;90.0;"Sable fin";1.5;0;0;0;0;0;0;3;11;7;4;9;680;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;25.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCN3231.JPG";"mars16-begB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.5;0;1;1;0;0;0;0;3;4;7;5;380;0;0;0;0;0;0;;;;;;0.0;5.0;5.0;0.0;0.0;;25.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"DSCN3230.JPG";"mars16-begB4sup";0.0;;3.0;2;0.0;;0.0;0.0;85.0;"Sable fin";2.0;0;3;0;0;0;0;3;5;4;2;3;340;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSCN3233.JPG";"mars16-begB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.25;0;4;0;0;0;0;2;6;13;4;3;560;0;0;0;0;0;0;;;;;;0.0;4.0;1.0;0.0;0.0;;70.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"DSCN3223.JPG";"mars16-begB5sup";0.0;;0.0;;0.0;;0.0;1.0;75.0;"Sable fin";1.5;0;0;0;0;0;0;14;12;5;8;0;780;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;45.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSCN3224.JPG";"mars16-begB5inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";3.5;0;5;7;0;0;0;0;3;10;6;4;460;0;0;0;0;0;0;;;;;;0.5;0.0;1.25;0.0;2.5;;45.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Blanche-Rouge";"DSCN3249.JPG";"mars16-begB1Q4";0.0;;25.0;2;0.0;;0.0;0.0;75.0;"Sable fin";0.5;0;0;0;0;0;0;;;;;;9;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"DSCN3244.JPG";"mars16-begB8sup";0.0;;15.0;2;0.125;2;0.0;0.0;80.0;"Sable fin";5.0;0;0;0;0;0;0;3;0;0;0;0;60;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSCN3247.JPG";"mars16-begB8inf";0.0;;0.0;;0.25;2;0.0;0.0;0.0;"Sable fin";0.125;0;0;0;0;0;0;18;21;12;15;12;1560;0;0;0;0;0;0;;;;;;0.0;0.0;4.5;0.0;0.0;;10.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"DSCN3256.JPG";"mars16-begB1Q5";0.0;;30.0;2;0.0;;0.0;0.0;50.0;"Sable fin";0.5;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"DSCN3227.JPG";"mars16-begB1Q3";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;1;0;2;0;0;22;17;14;20;13;1720;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Blanche";"DSCN3263.JPG";"mars16-begB1Q1";0.0;;1.0;2;0.0;;0.0;0.0;50.0;"Vase";1.5;0;0;0;3;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Rouge";"DSCN3251.JPG";"mars16-begB10sup";0.0;;12.0;2;0.0;;0.0;0.0;75.0;"Sable fin";3.0;0;0;0;0;0;0;;;;;;27;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;15.0;"Vase";;0;0;0;0;;;0;;0;1;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSCN3254.JPG";"mars16-begB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.5;"Sable fin";0.0;0;0;0;0;0;0;12;17;8;11;13;1220;0;0;0;0;0;0;;;;;;0.0;0.0;2.0;0.0;0.0;;15.0;"Vase";;0;0;0;0;;;0;;0;1;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"DSCN3243.JPG";"mars16-begB7sup";0.0;;40.0;2;0.0;;0.0;0.0;95.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;28;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Vase";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSCN3245.JPG";"mars16-begB7inf";0.0;;0.0;;0.0;;0.0;0.0;40.0;"Sable fin";0.0;0;0;0;0;0;0;0;1;9;6;8;480;0;0;0;0;0;0;;;;;;0.0;0.0;2.0;0.0;0.0;;10.0;"Vase";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Rouge";"DSCN3222.JPG";"mars16-begB6sup";0.0;;10.0;3;0.0;;0.0;3.0;50.0;"Sable fin";3.0;0;0;0;0;0;0;5;6;7;7;5;600;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;3.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSCN3226.JPG";"mars16-begB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";6.0;0;1;1;0;0;0;12;8;10;8;14;1040;0;0;0;0;0;0;;;;;;0.5;0.0;0.5;0.0;0.0;;3.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"DSCN3252.JPG";"mars16-begB9sup";0.0;;50.0;2;0.0;;0.0;0.0;80.0;"Vase";0.5;0;0;0;0;0;0;;;;;;19;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;25.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374005;"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCN3255.JPG";"mars16-begB9inf";0.0;;0.0;;0.0;;0.0;0.0;25.0;"Sable fin";0.0;0;2;0;0;0;0;3;9;11;9;7;780;0;0;0;0;0;0;;;;;;2.5;0.0;6.0;0.0;0.0;;25.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"DSCN1932.JPG";"sept16-begB5sup";0.5;1;4.0;2;1.0;2;0.0;0.0;10.0;"Vase";5.0;0;0;0;0;0;0;0;0;8;0;0;160;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;5.0;;90.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSCN1933.JPG";"sept16-begB5inf";0.0;;0.5;1;0.0;;0.0;0.0;0.5;"Vase";0.5;0;26;1;0;2;0;5;5;13;22;3;960;0;0;0;0;0;0;;;;;;0.0;0.0;3.0;0.0;0.0;;90.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"DSCN1918.JPG";"sept16-begB3sup";0.0;;5.0;2;2.0;2;0.0;0.0;20.0;"Vase";3.0;0;0;0;0;0;0;7;2;6;8;10;660;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Vase";;0;0;1;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCN1922.JPG";"sept16-begB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;4;0;0;0;0;28;20;16;23;38;2500;0;0;0;0;0;0;;;;;;3.0;2.0;1.0;0.0;0.0;;70.0;"Vase";;0;0;1;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"DSCN1928.JPG";"sept16-begB7sup";0.0;;3.0;2;40.0;2;0.0;0.0;20.0;"Vase";0.0;0;0;0;0;0;0;3;7;6;4;3;460;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;1; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSCN1929.JPG";"sept16-begB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;2;0;0;1;0;27;12;18;15;11;1660;0;0;0;0;0;0;;;;;;0.0;3.0;1.5;0.25;0.0;;70.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;1; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"DSCN1930.JPG";"sept16-begB8sup";0.0;;0.0;;45.0;2;0.0;0.0;20.0;"Vase";0.0;0;0;0;0;0;0;8;0;2;1;0;220;0;0;0;0;0;0;;;;;;0.0;0.0;0.5;0.0;0.0;;100.0;"Vase";;0;1;1;0;;;0;;0;0;0;;0;0;4; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSCN1931.JPG";"sept16-begB8inf";0.0;;3.0;2;5.0;2;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;0;0;1;0;21;16;13;32;17;1980;0;0;0;0;0;0;;;;;;0.0;0.5;3.0;0.0;0.0;;100.0;"Vase";;0;1;1;0;;;0;;0;0;0;;0;0;4; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"DSCN1915.JPG";"sept16-begB2sup";0.0;;0.0;;1.5;2;0.0;0.0;30.0;"Vase";0.0;0;0;0;0;0;0;12;11;8;16;12;1180;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCN1917.JPG";"sept16-begB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.5;0;14;2;0;0;0;29;25;52;21;42;3380;0;0;0;0;0;0;;;;;;0.0;2.0;1.0;0.0;0.0;;20.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge-Verte";"DSCN1913.JPG";"sept16-begB1sup";10.0;2;10.0;2;4.0;2;0.0;0.0;50.0;"Vase";0.0;0;0;0;0;0;0;;;;;;;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;1; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCN1914.JPG";"sept16-begB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.5;"Vase";0.0;0;0;0;0;0;0;16;13;9;7;13;1160;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.0;;30.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;1; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Rouge";"DSCN1938.JPG";"sept16-begB10sup";0.0;;15.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;13;10;4;7;5;780;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"DSCN1939.JPG";"sept16-begB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";12.0;0;3;1;0;0;0;11;5;15;25;13;1380;0;0;0;0;0;0;;;;;;1.0;2.25;0.25;0.0;0.0;;20.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche";"DSCN5129.JPG";"sept16-begB9sup";0.0;;0.25;2;1.0;2;0.0;0.0;0.0;"Pas de s�diment";0.5;0;0;0;0;0;0;55;35;11;19;17;2740;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCN5130.JPG";"sept16-begB9inf";0.0;;0.0;;2.0;2;0.0;0.0;0.0;"Pas de s�diment";0.25;0;0;0;0;0;0;8;9;5;8;15;900;0;0;0;0;0;0;;;;;;0.0;0.25;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche";"DSCN5127.JPG";"sept16-begB1Q5";0.0;;19.0;2;0.0;;0.0;0.0;97.0;"Vase";3.0;0;0;0;0;0;0;;;;;;;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Blanche-Rouge";"DSCN5119.JPG";"sept16-begB1Q4";0.0;;9.5;2;0.0;;0.0;0.0;98.0;"Vase";2.0;0;0;0;0;0;0;;;;;;;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche-Rouge";"DSCN5121.JPG";"sept16-begB1Q3";0.0;;4.0;2;1.5;2;0.0;0.0;98.5;"Vase";1.5;0;2;0;1;0;0;;;;;;;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"DSCN5117.JPG";"sept16-begB1Q2";87.5;3;37.5;2;2.0;2;0.0;0.0;54.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge-Verte";"DSCN5115.JPG";"sept16-begB1Q1";12.5;2;17.0;2;3.0;2;2.0;1.25;17.0;"Sable fin";1.0;0;0;0;0;0;0;;;;;;;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;11.0;;;;;;;;;;;;;;;;;;;; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"DSCN1923.JPG";"sept16-begB4sup";0.0;;2.0;2;0.0;;0.0;0.0;10.0;"Vase";4.0;0;0;0;0;0;0;12;6;8;14;9;980;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;1; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSCN1925.JPG";"sept16-begB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.5;0;1;0;0;0;0;40;29;23;12;11;2300;0;0;0;0;0;0;;;;;;0.0;0.0;4.0;0.0;0.0;;20.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;1; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"DSCN1934.JPG";"sept16-begB6sup";0.0;;0.0;;1.5;2;0.0;0.0;15.0;"Vase";0.5;0;1;0;0;0;0;0;0;0;0;8;160;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;15.0;;15.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;0; +374072;"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSCN1935.JPG";"sept16-begB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;12;0;0;0;0;21;21;19;12;6;1580;0;0;0;0;0;0;;;;;;0.0;0.0;1.0;0.0;0.0;;15.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Verte";"DSC00115.JPG";"mars15-PFourB1sup";0.0;;12.0;2;25.0;2;0.0;0.5;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSC00118.JPG";"mars15-PFourB1inf";0.0;;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";35.0;0;0;0;0;0;0;;;;;;50;;;;;;0;;;;;;2.0;0.5;0.5;1.0;0.5;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"DSC00119.JPG";"mars15-PFourB2sup";0.0;;10.0;2;10.0;2;0.0;0.0;1.0;"Sable grossier";0.5;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSC00122.JPG";"mars15-PFourB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;40;;;;;;0;;;;;;5.0;0.0;2.0;0.0;0.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Verte";"P1230485.JPG";"mars15-PFourB3sup";0.0;;1.0;2;5.0;2;0.0;0.0;2.0;"Sable grossier";5.0;0;1;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.5;2.5;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"P1230491.JPG";"mars15-PFourB3inf";0.0;;0.0;;0.5;2;0.0;5.0;0.0;"Pas de s�diment";20.0;0;3;0;0;0;0;;;;;;30;;;;;;0;;;;;;0.5;0.0;0.0;1.0;25.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"P1230499.JPG";"mars15-PFourQ2";1.0;3;15.0;2;1.0;2;1.0;0.0;0.5;"Sable grossier";2.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Verte";"P1230493.JPG";"mars15-PFourB4sup";0.0;;3.5;2;0.5;2;;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;20;;;;;;0;;;;;;0.0;0.0;0.0;0.0;5.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche-Verte";"P1230496.JPG";"mars15-PFourB4inf";0.0;;0.0;;0.5;2;0.0;5.0;0.0;"Pas de s�diment";0.5;0;6;0;0;0;0;;;;;;15;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.5;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Rouge";"P1230464.JPG";"mars15-PFourB5sup";0.0;;25.0;2;0.5;2;0.5;0.0;0.5;"Sable grossier";0.5;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"P1230467.JPG";"mars15-PFourB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";75.0;0;0;0;0;0;0;;;;;;15;;;;;;0;;;;;;0.0;0.0;1.0;0.0;0.5;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge-Verte";"P1230477.JPG";"mars15-PFourQ3";0.0;;10.0;2;2.0;2;0.5;0.0;0.0;"Pas de s�diment";1.5;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"P1230470.JPG";"mars15-PFourB6sup";0.0;;1.0;2;0.5;2;0.5;0.0;0.5;"Sable grossier";1.0;0;1;0;0;0;0;;;;;;22;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;"P1230475.JPG";"mars15-PFourB6inf";0.0;;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;6;0;0;0;0;;;;;;1;;;;;;0;;;;;;0.0;0.0;0.0;6.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374139;"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"P1230528.JPG";"avril15-PFourQ2";0.0;;70.0;2;0.5;;0.0;0.0;7.5;"Sable grossier";1.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune-Rouge";"DSC00175.JPG";"avril15-PFourB1sup";1.0;2;90.0;2;0.5;2;0.0;0.5;2.0;"Sable grossier";8.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.5;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSC00176.JPG";"avril15-PFourB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;75;0;0;0;0;0;0;;;;;;0.0;0.0;1.0;0.0;0.5;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"P1230511.JPG";"avril15-PFourB3sup";0.5;1;35.0;2;80.0;2;0.0;3.0;9.0;"D�bris coquilliers";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.25;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"P1230517.JPG";"avril15-PFourB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.5;0;0;0;0;0;0;;;;;;50;0;0;0;0;0;0;;;;;;3.5;3.5;1.0;0.125;35.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"P1230519.JPG";"avril15-PFourB4sup";0.0;;50.0;2;50.0;2;0.0;1.25;5.0;"D�bris coquilliers";0.5;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;1.0;0.0;0.0;0.25;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"P1230526.JPG";"avril15-PFourB4inf";0.0;;0.0;;0.0;;0.0;0.25;0.0;"Pas de s�diment";0.5;0;0;1;1;0;0;;;;;;39;0;0;0;0;0;0;;;;;;1.125;0.75;0.0;0.125;3.5;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"DSC01713.JPG";"avril15-PFourB6sup";0.0;;7.5;2;25.0;2;30.0;0.0;2.0;"Vase";0.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;15;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSC01719.JPG";"avril15-PFourB6inf";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.5;0;0;7;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;11.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;15;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"DSC00203.JPG";"avril15-PFourQ1";0.5;2;50.0;2;0.5;2;0.0;0.0;5.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune";"IMG_2247.JPG";"avril15-PFourQ3";1.0;3;3.5;2;0.5;2;0.5;0.0;0.0;"Pas de s�diment";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;5.0;0.0;;;;;;;;;;;;;;;;;;;; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"P1230552.JPG";"avril15-PFourQ4";0.0;;70.0;2;0.5;2;0.0;0.0;10.0;"Sable grossier";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche";"DSC01762.JPG";"avril15-PFourQ5";0.0;;0.5;2;0.0;;5.0;0.0;5.0;"Sable grossier";8.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge-Verte";"DSC00186.JPG";"avril15-PFourB2sup";0.0;;24.0;2;25.0;2;0.0;1.0;0.0;"Sable grossier";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;1.0;0.5;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSC00192.JPG";"avril15-PFourB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;30;;;;;;14;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Verte";"DSC01690.JPG";"avril15-PFourB5sup";0.0;;7.0;2;30.0;2;0.5;0.0;2.0;"Sable grossier";5.0;0;0;0;0;0;0;;;;;;5;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.1;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;17;;0;0;0;;0;0;1; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSC01698.JPG";"avril15-PFourB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;4;0;0;0;;;;;;130;0;0;0;0;0;0;;;;;;2.5;0.0;1.0;0.0;0.5;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;17;;0;0;0;;0;0;1; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"P1230540.JPG";"avril15-PFourB7sup";0.0;;15.0;2;80.0;2;0.0;1.5;1.0;"Sable grossier";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"P1230543.JPG";"avril15-PFourB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";50.0;0;0;0;0;0;0;;;;;;50;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;5.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"P1230545.JPG";"avril15-PFourB8sup";0.0;;60.0;2;10.0;2;0.0;0.0;5.0;"Sable grossier";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"P1230550.JPG";"avril15-PFourB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";90.0;0;0;0;0;0;0;;;;;;30;0;0;0;0;0;0;;;;;;0.0;1.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Verte";"DSC01727.JPG";"avril15-PFourB9sup";0.5;2;2.0;2;0.5;2;5.0;0.0;0.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Vase";;0;0;0;0;;;5;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSC01732.JPG";"avril15-PFourB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.5;"Pas de s�diment";8.0;0;0;0;0;0;0;;;;;;45;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;2.0;;60.0;"Vase";;0;0;0;0;;;5;;0;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Verte";"DSC01740.JPG";"avril15-PFourB10sup";0.0;;5.0;2;90.0;2;50.0;0.0;5.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;85.0;"Vase";;0;0;0;0;;;10;;4;0;0;;0;0;0; +374194;"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSC01754.JPG";"avril15-PFourB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;13;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;0.125;;85.0;"Vase";;0;0;0;0;;;10;;4;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Brune-Rouge";"DSCN3883.JPG";"sept15-PFourB7sup";70.0;2;10.0;2;5.0;2;0.0;0.0;10.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.25;0.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;15;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSCN3894.JPG";"sept15-PFourB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";70.0;0;0;0;0;0;0;;;;;;40;;;;;;0;;;;;;2.0;0.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;15;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune-Rouge";"DSCN3933.JPG";"sept15-PFourB4sup";20.0;2;10.0;2;20.0;2;0.0;0.0;10.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;3.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSCN3939.JPG";"sept15-PFourB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;1;0;0;0;0;;;;;;47;;;;;;0;;;;;;1.0;0.0;0.0;0.5;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune-Rouge";"DSCN3921.JPG";"sept15-PFourB3sup";10.0;2;10.0;2;0.0;;0.0;0.0;15.0;"Sable grossier";0.0;0;0;1;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;1;2;0;0;;;8;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCN3927.JPG";"sept15-PFourB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.5;0;0;0;0;0;0;;;;;;30;;;;;;0;;;;;;3.0;0.0;0.0;1.0;1.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;1;2;0;0;;;8;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Rouge";"DSC03518.JPG";"sept15-PFourB2sup";30.0;2;15.0;2;11.0;2;0.0;2.0;60.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;2;;;;;;0;;;;;;0.5;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;1; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSC03520.JPG";"sept15-PFourB2inf";0.0;;0.0;;0.25;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;3;0;0;0;0;;;;;;104;;;;;;0;;;;;;3.0;0.5;1.0;0.25;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;1; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune-Rouge";"DSC03511.JPG";"sept15-PFourB1sup";55.0;2;4.0;2;3.0;2;0.0;2.5;75.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;1;;;;;;0;;;;;;1.5;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSC03514.JPG";"sept15-PFourB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;6.0;0.5;1.0;1.5;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune-Rouge";"DSCN3900.JPG";"sept15-PFourB8sup";0.0;;60.0;2;10.0;2;0.0;0.0;5.0;"Sable grossier";1.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSCN3909.JPG";"sept15-PFourB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";90.0;0;0;0;0;0;0;;;;;;55;;;;;;0;;;;;;0.0;1.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune-Rouge";"DSC03505.JPG";"sept15-PFourQ1";60.0;2;6.0;2;5.0;2;0.0;5.0;75.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;6;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune-Rouge";"DSC03543.JPG";"sept15-PFourB10sup";25.0;2;1.0;2;25.0;2;0.0;0.0;60.0;"Sable grossier";0.0;0;2;1;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Vase";;0;0;0;1;;;0;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSC03544.JPG";"sept15-PFourB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;0;0;0;0;;;;;;27;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Vase";;0;0;0;1;;;0;;0;0;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune-Rouge";"DSCN3918.JPG";"sept15-PFourQ4";70.0;2;10.0;2;0.0;;0.0;0.0;20.0;"Sable grossier";10.0;0;0;0;0;0;0;;;;;;10;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche-Verte";"DSC03529.JPG";"sept15-PFourQ5";0.0;;0.0;;20.0;2;0.0;0.0;11.0;"Sable grossier";25.0;0;0;0;0;0;0;;;;;;4;;;;;;0;;;;;;0.0;0.0;0.0;0.0;4.0;;;;;;;;;;;;;;;;;;;; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"DSCN3945.JPG";"sept15-PFourQ2";10.0;2;10.0;2;10.0;2;0.0;0.0;10.0;"Sable grossier";10.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Verte";"DSC03531.JPG";"sept15-PFourB9sup";0.0;;0.0;;30.0;2;0.0;0.0;5.5;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;0;;0;1;0;;0;0;0; +374268;"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSC03534.JPG";"sept15-PFourB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;2;0;0;0;0;;;;;;74;;;;;;4720;;;;;;5.0;0.0;0.0;0.25;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;0;;0;1;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche-Verte";"P1400800.JPG";"avr16-PFourQ5ref";0.25;2;10.0;2;7.5;2;0.0;0.0;3.0;"D�bris coquilliers";40.0;0;0;0;0;0;0;;;;;;4;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"P1230691.JPG";"avr16-PFourB4sup";0.0;;100.0;2;0.0;;0.0;0.0;5.0;"Sable grossier";0.0;0;0;1;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.25;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"P1230697.JPG";"avr16-PFourB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;100;0;0;0;0;0;0;;;;;;0.0;0.0;0.25;0.0;0.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"DSC_0013.JPG";"avr16-PFourB7sup";10.0;2;70.0;2;5.0;2;0.0;0.0;25.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSC_0020.JPG";"avr16-PFourB7inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";90.0;0;0;2;0;0;0;;;;;;10;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"DSC_0023.JPG";"avr16-PFourB8sup";0.5;2;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";95.0;0;0;0;4;0;0;;;;;;7;0;0;0;0;0;0;;;;;;0.25;0.0;0.0;0.0;0.5;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche-Rouge";"DSC_0033.JPG";"avr16-PFourB8inf";0.5;2;7.0;2;1.5;2;0.0;1.0;0.5;"D�bris coquilliers";60.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"P1230648.JPG";"avr16-PFourQ1ref";0.0;;80.0;2;0.0;;0.0;0.0;20.0;"Sable grossier";30.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"DSC_0036.JPG";"avr16-PFourQ4ref";5.0;2;70.0;2;0.0;;0.0;0.0;30.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge-Verte";"P1230664.JPG";"avr16-PFourQ3ref";0.25;2;35.0;2;10.0;2;3.0;0.0;40.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"P1230699.JPG";"avr16-PFourQ2ref";40.0;2;60.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge-Verte";"P1400771.JPG";"avr16-PFourB10sup";3.0;2;20.0;2;15.0;2;15.0;0.0;20.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.75;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"P1400792.JPG";"avr16-PFourB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;8;0;0;0;0;0;0;;;;;;0.0;1.5;0.0;0.0;0.25;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge-Verte";"P1400740.JPG";"avr16-PFourB9sup";0.0;;30.0;2;15.0;2;30.0;0.0;9.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.75;0.0;0.0;0.0;0.75;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;2;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"P1400752.JPG";"avr16-PFourB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";4.5;0;0;0;0;0;0;;;;;;6;0;0;0;0;0;0;;;;;;0.5;0.0;1.5;0.0;0.75;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;2;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"DSC_0053.JPG";"avr16-PFourB6sup";0.0;;30.0;2;40.0;2;0.0;0.0;20.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;0.0;;60.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSC_0058.JPG";"avr16-PFourB6inf";0.0;;0.0;;0.0;;0.0;7.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;21;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;0.25;;60.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge-Verte";"DSC_0042.JPG";"avr16-PFourB5sup";1.0;2;40.0;2;20.0;2;30.0;0.0;7.5;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSC_0048.JPG";"avr16-PFourB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;4;0;0;0;0;0;0;;;;;;0.0;0.0;0.25;0.0;0.125;;20.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"P1230680.JPG";"avr16-PFourB3sup";0.0;;70.0;2;20.0;2;30.0;0.0;10.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"P1230686.JPG";"avr16-PFourB3inf";0.0;;5.0;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";30.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.125;0.0;0.5;0.0;2.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge-Verte";"P1230641.JPG";"avr16-PFourB2sup";1.0;2;60.0;2;30.0;2;0.0;0.0;30.0;"D�bris coquilliers";30.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"P1230645.JPG";"avr16-PFourB2inf";0.0;;0.0;;0.0;;0.0;10.0;0.0;"Pas de s�diment";40.0;0;0;0;0;0;0;;;;;;68;0;0;0;0;0;0;;;;;;0.25;0.0;1.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge-Verte";"P1230633.JPG";"avr16-PFourB1sup";0.0;;80.0;2;10.0;2;0.0;0.0;60.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374335;"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"P1230635.JPG";"avr16-PFourB1inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";20.0;0;1;0;0;0;0;;;;;;5;0;0;0;0;0;0;;;;;;0.0;1.0;3.0;10.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge-Verte";"DSC_0206.JPG";"juin16-PFourQ2ref";0.0;;80.0;2;60.0;2;5.0;0.5;20.0;"D�bris coquilliers";0.0;0;0;0;3;0;0;;;;;;3;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge-Verte";"P1230801.JPG";"juin16-PFourQ4ref";20.0;2;75.0;2;10.0;2;2.0;0.0;5.0;"D�bris coquilliers";0.0;0;0;1;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Verte";"DSC_0226.JPG";"juin16-PFourQ5ref";0.0;;2.0;2;10.0;2;10.0;2.0;20.0;"D�bris coquilliers";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"DSC_0196.JPG";"juin16-PFourB4sup";10.0;2;50.0;2;25.0;2;10.0;0.0;40.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"DSC_0203.JPG";"juin16-PFourB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";30.0;0;1;3;4;0;0;;;;;;18;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;5.0;2.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"DSC_0151.JPG";"juin16-PFourB5sup";10.0;2;65.0;2;2.0;2;0.5;0.0;20.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSC_0160.JPG";"juin16-PFourB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";95.0;0;0;0;1;0;0;;;;;;5;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;5.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"P1230746.JPG";"juin16-PFourB6sup";10.0;2;50.0;2;18.75;2;5.0;0.5;30.0;"D�bris coquilliers";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"P1230753.JPG";"juin16-PFourB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;1;2;0;0;;;;;;10;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;25.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"P1230766.JPG";"juin16-PFourB7sup";10.0;2;75.0;2;7.5;2;1.0;5.0;20.0;"D�bris coquilliers";0.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Rouge-Verte";"P1230772.JPG";"juin16-PFourB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";75.0;0;0;0;2;0;0;;;;;;78;0;0;0;0;0;0;;;;;;0.0;0.0;0.25;1.0;0.125;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune-Rouge";"P1230781.JPG";"juin16-PFourB8sup";0.0;;95.0;2;0.0;;5.0;0.25;5.0;"Sable grossier";1.0;0;0;1;20;0;0;;;;;;13;0;0;0;0;0;0;;;;;;0.5;0.0;0.25;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;1;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"P1230792.JPG";"juin16-PFourB8inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";30.0;0;0;1;1;0;0;5;4;5;7;5;520;0;0;0;0;0;0;;;;;;5.0;0.0;0.25;0.0;0.25;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;1;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"DSC_0182.JPG";"juin16-PFourB3sup";2.5;2;20.0;2;35.0;2;5.0;5.0;20.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"DSC_0189.JPG";"juin16-PFourB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";65.0;0;0;0;0;0;0;;;;;;30;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.5;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge-Verte";"P1230736.JPG";"juin16-PFourB2sup";5.0;2;70.0;2;25.0;2;2.5;5.0;60.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"P1230740.JPG";"juin16-PFourB2inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";50.0;0;0;1;0;0;0;;;;;;53;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.5;3.75;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Verte";"P1230715.JPG";"juin16-PFourB1sup";2.5;2;30.0;2;25.0;2;10.0;1.0;20.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"P1230726.JPG";"juin16-PFourB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";37.5;0;0;0;0;0;0;;;;;;12;0;0;0;0;0;0;;;;;;5.0;0.0;1.0;0.5;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Verte";"DSC_0212.JPG";"juin16-PFourB9sup";0.0;;20.0;2;50.0;2;10.0;10.0;20.0;"D�bris coquilliers";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"DSC_0219.JPG";"juin16-PFourB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;3.0;2.5;0.5;5.0;1.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Verte";"DSC_0232.JPG";"juin16-PFourB10sup";0.0;;1.0;2;75.0;2;5.0;0.0;10.0;"D�bris coquilliers";0.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"DSC_0238.JPG";"juin16-PFourB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";40.0;0;0;0;0;0;0;;;;;;5;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.5;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune-Rouge";"DSC_0144.JPG";"juin16-PFourQ1ref";10.0;2;50.0;2;10.0;2;0.0;0.5;20.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374402;"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Verte";"P1230756.JPG";"juin16-PFourQ3ref";0.0;;1.0;2;90.0;;0.0;0.0;10.0;"D�bris coquilliers";50.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"DSC_0370.JPG";"sept16-PFourB7sup";0.0;;50.0;2;15.0;2;0.0;0.5;3.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;4;;2;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSC_0378.JPG";"sept16-PFourB7inf";0.0;;0.25;;0.0;;0.0;0.0;0.0;"Pas de s�diment";30.0;1;0;0;4;0;0;;;;;;100;0;0;0;0;0;0;;;;;;1.0;0.0;0.125;0.0;0.25;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;4;;2;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Color�e";"DSC_0362.JPG";"sept16-PFourQ5ref";18.75;2;25.0;2;45.0;2;0.5;1.5;3.0;"D�bris coquilliers";0.0;0;2;0;0;0;0;;;;;;6;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"DSC_0403.JPG";"sept16-PFourQ4ref";0.0;;87.5;2;5.0;2;0.0;15.0;15.0;"D�bris coquilliers";0.0;0;3;0;3;0;0;;;;;;60;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.125;;;;;;;;;;;;;;;;;;;; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Verte";"P1230908.JPG";"sept16-PFourQ3ref";0.0;;2.0;2;17.5;;0.0;0.0;10.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;1.5;0.0;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"P1230949.JPG";"sept16-PFourQ2ref";50.0;2;37.5;2;7.5;2;0.0;0.5;20.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;3;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;5.0;;;;;;;;;;;;;;;;;;;; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune-Rouge";"P1230877.JPG";"sept16-PFourQ1ref";15.0;2;20.0;2;4.0;2;0.0;0.0;5.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;12.5;0.0;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"P1230925.JPG";"sept16-PFourB3sup";10.0;2;43.75;2;20.0;2;0.0;0.0;55.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;5;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.25;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;0;0;0;;0;0;1; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"P1230933.JPG";"sept16-PFourB3inf";0.0;;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;3;0;0;4;0;0;10;6;10;6;4;720;0;0;0;0;0;0;;;;;;10.0;0.5;0.75;0.5;5.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;0;0;0;;0;0;1; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Verte";"DSC_0335.JPG";"sept16-PFourB9sup";2.0;2;8.0;2;75.0;2;1.5;1.25;0.0;"Pas de s�diment";1.0;0;1;0;0;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;3.5;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSC_0340.JPG";"sept16-PFourB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";80.0;0;0;0;0;0;0;;;;;;30;0;0;0;0;0;0;;;;;;0.0;0.0;0.125;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge-Verte";"DSC_0343.JPG";"sept16-PFourB10sup";11.0;2;35.0;2;35.0;2;0.0;2.0;5.0;"D�bris coquilliers";0.0;0;5;0;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;65.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;5;;3;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSC_0353.JPG";"sept16-PFourB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;1;2;0;10;0;0;;;;;;15;0;0;0;0;0;0;;;;;;0.0;0.0;0.5;0.0;0.0;;65.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;5;;3;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"DSC_0382.JPG";"sept16-PFourB8sup";2.0;2;100.0;2;3.75;2;0.0;0.5;10.0;"D�bris coquilliers";0.0;1;0;0;10;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSC_0402.JPG";"sept16-PFourB8inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";10.0;0;0;0;1;0;0;;;;;;40;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"P1230902.JPG";"sept16-PFourB6sup";0.0;2;9.0;2;12.0;2;0.0;0.0;10.0;"Sable grossier";3.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;2;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"P1230905.JPG";"sept16-PFourB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;4;0;0;0;;;;;;108;0;0;0;0;0;0;;;;;;1.5;0.0;0.0;0.0;2.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;2;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge-Verte";"P1230885.JPG";"sept16-PFourB5sup";0.0;2;15.0;2;14.0;2;0.0;0.0;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;3;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"P1230898.JPG";"sept16-PFourB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";30.0;0;0;1;0;0;0;;;;;;50;0;0;0;0;0;0;;;;;;5.0;5.0;0.0;0.0;0.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;3;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"P1230936.JPG";"sept16-PFourB4sup";5.0;2;50.0;2;7.5;2;0.0;2.0;70.0;"D�bris coquilliers";0.0;0;1;0;5;0;0;;;;;;17;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;10;;0;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"P1230946.JPG";"sept16-PFourB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";17.0;0;0;0;1;0;0;6;5;4;15;9;780;0;0;0;0;0;0;;;;;;1.0;0.0;2.5;1.5;0.25;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;10;;0;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Rouge";"P1230871.JPG";"sept16-PFourB2sup";12.5;2;22.5;2;3.0;2;0.0;6.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;4;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.5;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;1;;2;0;0;;0;0;2; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"P1230866.JPG";"sept16-PFourB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;2;0;0;0;0;;;;;;82;0;0;0;0;0;0;;;;;;0.5;0.0;0.75;0.75;2.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;1;;2;0;0;;0;0;2; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge-Verte";"P1230850.JPG";"sept16-PFourB1sup";0.0;;32.5;2;2.5;2;0.0;1.5;70.0;"D�bris coquilliers";1.0;0;0;1;0;0;0;;;;;;3;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.75;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374469;"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"P1230853.JPG";"sept16-PFourB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;2;1;0;0;;;;;;59;0;0;0;0;0;0;;;;;;1.5;0.0;1.0;0.5;5.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";;"DSC_1578.JPG";"oct14-GdcCB4sup";0.0;;0.0;;24.4;2;0.0;0.97;0.0;"Pas de s�diment";13.18;0;0;0;9;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.19;4.78;;98.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;"DSC_1589.JPG";"oct14-GdcB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";34.17;0;0;0;1;0;0;;;;;;21;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;12.0;;98.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"Tranche_08102014_Q1_BM2_sup_2.JPG";"oct14-GdcB2sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.5;0;0;0;3;0;0;;;;;;3;0;0;0;0;0;0;0;0;80.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"Tranche_08102014_Q1_BM2_inf_2.JPG";"oct14-GdcB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";18.5;0;0;0;2;0;0;;;;;;289;0;0;0;0;0;0;0;0;15.0;0.0;12.0;0.0;0.0;0.0;0.0;6.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"Tranche_08102014_Q5_BM9_sup.JPG";"oct14-GdcB9sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";25.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;2;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;75.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"Tranche_08102014_Q5_BM9_inf.JPG";"oct14-GdcB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";90.0;0;0;0;2;0;0;;;;;;1;0;0;0;0;0;0;2;0;0.0;0.0;0.0;1.0;7.0;0.0;0.25;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;"Tranche_08102014_Q5_BM10_sup.JPG";"oct14-GdcB10sup";0.0;;0.0;;10.0;2;0.0;0.0;0.0;"Pas de s�diment";80.0;0;2;2;15;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;10.0;0.0;0.0;0.0;0.0;0.0;20.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;"Tranche_08102014_Q5_BM10_inf.JPG";"oct14-GdcB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";40.0;2;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;60.0;0.0;0.0;0.0;0.0;5.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;"Tranche_08102014_Q1_bfixe.JPG";"oct14-GdcQ1";0.0;;0.0;;4.5;2;0.0;0.0;4.0;"D�bris coquilliers";14.0;0;0;1;22;0;0;;;;;;0;0;0;0;0;0;0;0;0;81.5;0.5;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Roche en place";"4";"face sup�rieure";;"PA070049.JPG";"oct14-GdcQ4";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;100.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;"Tranche_08102014_Q3_bfixe.JPG";"oct14-GdcQ3";0.0;;10.0;1;5.0;2;0.0;5.0;15.0;"D�bris coquilliers";20.0;0;0;0;5;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.125;;;;;;;;;;;;;;;;;;;; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";;"DSC_1569.JPG";"oct14-GdcQ2";0.0;;0.0;;10.74;2;0.0;4.9;3.51;"D�bris coquilliers";3.8;0;0;0;18;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.2;;;;;;;;;;;;;;;;;;;; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"PA070031.JPG";"oct14-GdcB8sup";0.0;;0.0;;3.5;2;0.0;2.5;2.5;"D�bris coquilliers";5.5;0;0;0;9;0;0;;;;;;0;0;0;0;0;0;0;0;0;50.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;23.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;2;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"PA070036.JPG";"oct14-GdcB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";21.0;0;1;0;3;0;0;;;;;;122;0;0;0;0;0;0;0;0;0.0;0.0;5.0;0.0;0.0;0.0;0.0;12.0;;23.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;2;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"PA070042.JPG";"oct14-GdcB7sup";0.0;;0.0;;1.0;2;0.0;0.0;4.5;"D�bris coquilliers";23.0;0;0;0;8;0;0;;;;;;11;0;0;0;0;0;0;0;0;55.0;8.0;0.0;0.0;0.0;0.0;0.0;0.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"PA070045.JPG";"oct14-GdcB7inf";0.0;;0.0;;0.0;;0.0;0.0;3.0;"D�bris coquilliers";38.0;0;1;0;5;0;0;;;;;;103;0;0;0;0;0;0;0;0;0.0;0.0;8.0;0.0;9.0;0.0;0.0;9.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"Tranche_08102014_Q3_BM6_sup.JPG";"oct14-GdcB6sup";0.0;;0.0;;0.5;2;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;29;0;0;0;0;0;0;0;0;0.0;0.0;50.0;0.0;0.0;0.0;0.0;1.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;"Tranche_08102014_Q3_BM6_inf.JPG";"oct14-GdcB6inf";0.0;;0.25;1;32.0;2;0.0;10.0;0.0;"Pas de s�diment";5.0;0;0;0;6;0;0;;;;;;9;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;"Tranche_08102014_Q3_BM5_sup.JPG";"oct14-GdcB5sup";0.0;;0.25;2;25.0;2;0.0;0.0;1.0;"D�bris coquilliers";8.0;0;0;1;2;0;0;;;;;;10;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.125;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;"Tranche_08102014_Q3_BM5_inf.JPG";"oct14-GdcB5inf";0.0;;0.0;;0.0;;0.0;0.0;10.0;"D�bris coquilliers";5.0;0;1;0;3;0;0;;;;;;86;0;0;0;0;0;0;0;0;0.0;0.0;0.0;6.0;0.0;0.0;0.0;0.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";;"DSC_1539.JPG";"oct14-GdcB3sup";0.0;;0.0;;0.0;;0.0;0.0;0.78;"D�bris coquilliers";5.56;0;0;0;0;0;0;;;;;;39;0;0;0;0;0;0;0;0;0.0;0.0;11.32;0.0;0.0;0.0;0.0;10.74;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;"DSC_1556.JPG";"oct14-GdcB3inf";0.0;;0.0;;12.7;2;0.0;1.66;0.0;"Pas de s�diment";23.24;0;0;0;3;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;19.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"Tranche_08102014_Q1_BM1_sup_1.JPG";"oct14-GdcB1sup";0.0;;0.0;;5.5;1;0.0;0.0;0.0;"Pas de s�diment";9.5;0;0;0;8;0;0;;;;;;7;0;0;0;0;0;0;0;0;48.0;0.0;0.0;0.0;0.0;0.0;0.0;0.1;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +374536;"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;"Tranche_08102014_Q1_BM1_inf.JPG";"oct14-GdcB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";12.0;0;0;0;0;0;0;;;;;;89;0;0;0;0;0;0;0;0;0.0;0.0;23.0;0.0;0.0;0.0;0.0;4.8;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche-Verte";"Q2B3sup.JPG";"mars15-GdcB3sup";0.0;;0.0;;15.0;2;0.0;1.0;7.0;"Sable grossier";17.0;0;0;0;22;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;2.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"Q2B3inf.JPG";"mars15-GdcB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";40.0;0;0;1;0;0;0;;;;;;50;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;15.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"Q2B4sup.JPG";"mars15-GdcB4sup";0.0;;0.5;2;0.0;;0.0;0.0;0.5;"Sable grossier";75.0;0;0;0;4;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;1.5;0.0;0.0;0.0;0.0;0.0;6.0;;25.0;"Blocs";;0;0;1;2;0;0;0;0;1;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"Q2B4inf.JPG";"mars15-GdcB4inf";0.0;;0.0;;15.0;2;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;2;0;0;;;;;;37;0;0;0;0;0;0;4;0;0.0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;;25.0;"Blocs";;0;0;1;2;0;0;0;0;1;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Blanche";"Q4.JPG";"mars15-GdcQ4";0.0;;0.0;;0.5;2;0.0;0.0;7.0;"Sable grossier";20.0;0;0;0;7;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"Q3.JPG";"mars15-GdcQ3";0.5;2;0.0;;5.0;2;0.0;1.0;5.0;"Sable grossier";10.0;0;0;4;12;0;0;;;;;;0;0;0;0;0;0;0;1;0;0.0;10.0;0.0;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";"Q1.JPG";"mars15-GdcQ1";0.0;;0.0;;8.0;2;0.0;1.0;11.0;"Sable grossier";14.0;0;0;0;3;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"Q5B10sup.JPG";"mars15-GdcB10sup";0.0;;0.0;;0.0;;0.0;0.0;1.0;"Sable grossier";75.0;0;0;0;21;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;5.0;0.0;0.0;0.0;0.0;0.0;1.5;;1.0;"Blocs";;0;0;0;55;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Q5B10inf.JPG";"mars15-GdcB10inf";0.0;;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;13;0;0;;;;;;55;0;0;0;0;0;0;1;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;0.5;;1.0;"Blocs";;0;0;0;55;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche";"Q5B9sup.JPG";"mars15-GdcB9sup";0.0;;0.0;;0.5;2;0.0;0.0;10.0;"Sable grossier";10.0;0;0;2;71;0;0;;;;;;70;0;0;0;0;0;0;3;0;0.0;10.0;0.0;6.0;5.5;0.0;0.0;10.0;;5.0;"Blocs";;0;0;0;9;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";;"mars15-GdcB9inf";0.0;;1.0;2;0.0;;0.0;0.0;5.0;"Sable grossier";50.0;0;1;0;16;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;5.0;0.0;0.0;0.0;0.0;0.0;10.0;;5.0;"Blocs";;0;0;0;9;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"Q4B8sup.JPG";"mars15-GdcB8sup";0.0;;0.0;;0.5;2;0.0;0.0;4.5;"D�bris coquilliers";30.0;0;0;0;8;0;0;;;;;;12;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;40.0;"Vase";;0;0;0;3;0;0;0;0;1;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"Q4B8inf.JPG";"mars15-GdcB8inf";0.0;;0.0;;0.5;2;0.0;15.0;8.0;"D�bris coquilliers";8.5;0;0;0;3;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;3.0;0.0;0.0;0.5;;40.0;"Vase";;0;0;0;3;0;0;0;0;1;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"Q4B7sup.JPG";"mars15-GdcB7sup";0.0;;0.0;;0.125;2;0.0;6.0;10.0;"Sable fin";23.0;0;0;3;13;0;0;;;;;;82;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;3.0;0.0;0.0;10.0;;60.0;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"Q4B7inf.JPG";"mars15-GdcB7inf";0.0;;0.0;;0.5;2;0.0;0.0;6.0;"Sable grossier";25.0;0;1;6;11;0;0;;;;;;9;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;12.0;;60.0;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"Q3B6sup.JPG";"mars15-GdcB6sup";0.0;;0.0;;1.0;2;0.0;0.0;0.0;"Sable grossier";50.0;0;0;0;16;0;0;;;;;;36;0;0;0;0;0;0;0;0;0.0;1.0;0.0;0.0;0.5;0.0;0.0;5.0;;75.0;"Blocs";;0;0;0;18;0;0;0;0;1;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"Q3B6inf.JPG";"mars15-GdcB6inf";0.0;;0.0;;0.0;;0.0;0.5;25.0;"Sable grossier";25.0;0;1;1;1;0;0;;;;;;3;0;0;0;0;0;0;0;0;0.0;1.0;0.0;0.0;0.0;0.0;0.0;0.5;;75.0;"Blocs";;0;0;0;18;0;0;0;0;1;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche";"Q2.JPG";"mars15-GdcQ2";0.0;;0.0;;1.0;2;0.0;0.0;0.5;"Sable grossier";25.0;0;0;0;15;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;11.0;0.0;0.0;0.0;0.0;0.0;5.0;;;;;;;;;;;;;;;;;;;; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche";"Q5.JPG";"mars15-GdcQ5";0.0;;0.0;;0.0;;0.0;0.0;1.0;"Sable grossier";50.0;0;0;3;16;0;0;;;;;;0;0;0;0;0;0;0;2;0;0.0;6.0;0.0;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"Q1B1sup.JPG";"mars15-GdcB1sup";0.0;;0.0;;0.0;;0.0;3.0;1.5;"D�bris coquilliers";13.0;0;0;0;6;0;0;;;;;;44;0;0;0;0;0;0;0;0;0.0;0.0;0.0;1.5;0.125;0.0;0.0;5.0;;50.0;"Vase";;0;0;0;5;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"Q1B1inf.JPG";"mars15-GdcB1inf";0.0;;0.0;;0.5;1;0.0;3.0;5.0;"Sable grossier";15.0;0;0;1;12;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.125;0.0;0.0;1.0;;50.0;"Vase";;0;0;0;5;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"Q3B5sup.JPG";"mars15-GdcB5sup";0.0;;0.5;2;0.5;2;0.0;25.0;2.0;"Sable grossier";25.0;0;0;0;9;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;5.0;0.0;0.0;0.0;0.0;0.0;5.0;;20.0;"Blocs";;0;0;0;29;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"Q3B5inf.JPG";"mars15-GdcB5inf";0.0;;0.5;2;0.5;2;0.0;10.0;5.0;"Sable grossier";50.0;0;0;5;3;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Blocs";;0;0;0;29;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"Q1B2sup.JPG";"mars15-GdcB2sup";0.0;;0.0;;1.0;1;0.0;1.5;1.5;"D�bris coquilliers";13.0;0;0;0;13;0;0;;;;;;65;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;1.0;0.0;0.0;8.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;0;0;0;0;0;0;0;0;0;0;0; +374599;"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Q1B2inf.JPG";"mars15-GdcB2inf";0.0;;0.0;;1.5;1;0.0;2.0;0.5;"D�bris coquilliers";31.0;0;0;5;10;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche-Verte";"Tranche_01102015_Q3_BF_3.JPG";"oct15-GdcQ3";0.0;;0.0;;2.5;1;0.0;0.25;6.5;"D�bris coquilliers";18.0;0;0;0;25;0;0;;;;;;0;0;0;0;0;0;0;1;0;0.25;1.5;0.0;0.0;0.0;0.0;0.0;3.0;;;;;;;;;;;;;;;;;;;; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche-Verte";"Tranche_01102015_Q2_BM3_sup_1.JPG";"oct15-GdcB3sup";0.0;;0.0;;11.0;2;0.0;0.0;0.5;"D�bris coquilliers";2.5;0;0;0;7;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.5;0.0;0.0;0.0;0.0;5.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"Tranche_01102015_Q2_BM3_inf_1.JPG";"oct15-GdcB3inf";0.0;;0.0;;0.0;;0.0;0.25;0.0;"Pas de s�diment";15.0;0;1;0;9;0;0;;;;;;23;0;0;0;0;0;0;2;0;0.0;0.0;2.5;0.5;0.0;0.0;12.0;2.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Verte";"Tranche_01102015_Q2_BM4_sup_1.JPG";"oct15-GdcB4sup";0.0;;0.0;;6.0;2;0.0;0.0;3.0;"Sable grossier";0.5;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;1;0;15.0;0.0;0.0;0.0;0.0;0.0;0.0;11.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;5;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"Tranche_01102015_Q2_BM4_inf_1.JPG";"oct15-GdcB4inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";11.0;0;1;1;33;0;0;;;;;;19;0;0;0;0;0;0;0;0;0.0;0.0;4.0;0.0;0.0;0.0;11.5;1.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;5;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"Tranche_01102015_Q3_BM5_sup_1.JPG";"oct15-GdcB5sup";0.0;;0.0;;0.0;;0.0;0.25;1.0;"Sable grossier";16.0;0;0;0;0;0;0;;;;;;16;0;0;0;0;0;0;0;0;1.0;0.0;3.0;0.0;0.0;0.0;0.0;2.0;;11.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"Tranche_01102015_Q3_BM5_inf_1.JPG";"oct15-GdcB5inf";0.0;;0.0;;0.0;;0.0;1.5;15.0;"D�bris coquilliers";55.0;0;2;4;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;11.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche";"Tranche_01102015_Q5_B9_sup_1.JPG";"oct15-GdcB9sup";0.0;;0.0;;0.0;;0.0;0.0;0.5;"D�bris coquilliers";6.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;1;0;4.0;2.0;0.0;0.0;0.0;0.0;0.0;55.5;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"Tranche_01102015_Q5_BM9_inf_1.JPG";"oct15-GdcB9inf";0.0;;0.25;1;0.25;1;0.0;0.0;0.0;"Pas de s�diment";30.0;0;1;0;22;0;0;;;;;;40;0;0;0;0;0;0;9;0;0.75;4.0;0.0;0.0;0.0;0.0;8.0;10.5;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"Tranche_01102015_Q5_BM10_sup_1.JPG";"oct15-GdcB10sup";0.0;;0.0;;0.0;;0.0;0.0;0.5;"Sable grossier";3.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;13;0;0.75;0.0;0.0;0.0;0.0;0.0;0.0;31.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Tranche_01102015_Q5_BM10_inf_1.JPG";"oct15-GdcB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.5;"Sable grossier";7.5;0;0;0;17;0;0;;;;;;71;0;0;0;0;0;0;0;0;0.0;0.0;1.0;0.0;0.0;0.0;6.5;1.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";"Tranche_30092015_Q1_BF_1.JPG";"oct15-GdcQ1";0.0;;0.0;;1.25;1;0.0;0.0;3.0;"D�bris coquilliers";5.0;0;0;0;6;0;0;;;;;;0;0;0;0;0;0;0;0;0;60.5;0.75;5.0;0.0;0.0;0.0;0.0;4.25;;;;;;;;;;;;;;;;;;;; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche-Verte";"Tranche_01102015_Q2_BF_2.JPG";"oct15-GdcQ2";0.0;;0.25;2;15.0;2;0.0;0.0;1.75;"D�bris coquilliers";1.0;0;0;1;18;0;0;;;;;;0;0;0;0;0;0;0;1;0;0.0;3.0;0.0;0.0;0.0;0.0;0.0;15.0;;;;;;;;;;;;;;;;;;;; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche";;"oct15-GdcQ5";0.0;;0.0;;1.5;2;0.0;0.0;1.5;"D�bris coquilliers";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;3;0;2.5;14.0;0.0;0.0;0.0;0.0;0.0;35.0;;;;;;;;;;;;;;;;;;;; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Blanche";"Tranche_02102015_Q4_BF_4.JPG";"oct15-GdcQ4";0.0;;0.0;;0.0;;0.0;0.0;4.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;90.0;0.0;0.0;0.0;0.0;0.0;0.0;2.0;;;;;;;;;;;;;;;;;;;; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Verte";"Tranche_30092015_Q1_BM1_sup_1.JPG";"oct15-GdcB1sup";0.0;;0.0;;20.0;2;0.0;0.0;6.0;"Sable grossier";10.0;0;0;0;4;0;0;;;;;;0;0;0;0;0;0;0;0;0;21.5;0.0;0.0;0.0;0.0;0.0;0.0;1.75;;19.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"Tranche_30092015_Q1_BM1_inf_1.JPG";"oct15-GdcB1inf";0.0;;0.0;;0.0;;0.0;1.0;6.0;"D�bris coquilliers";62.5;0;2;3;12;0;0;;;;;;62;0;0;0;0;0;0;0;0;0.5;0.0;7.0;0.0;0.0;0.0;0.0;12.0;;19.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche-Verte";"Tranche_30092015_Q1_BM2_sup_2.JPG";"oct15-GdcB2sup";0.0;;0.0;;47.0;2;0.0;0.0;4.0;"D�bris coquilliers";10.0;0;0;0;3;0;0;;;;;;0;0;0;0;0;0;0;0;0;14.0;0.0;3.5;0.0;0.0;0.0;0.0;10.0;;56.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Tranche_30092015_Q1_BM2_inf_2.JPG";"oct15-GdcB2inf";0.0;;0.0;;0.0;;0.0;0.625;0.0;"Pas de s�diment";47.5;0;0;0;14;0;0;;;;;;44;0;0;0;0;0;0;0;0;1.5;0.0;45.0;0.0;0.0;0.0;0.0;0.0;;56.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"Tranche_01102015_Q3_BM6_sup_1.JPG";"oct15-GdcB6sup";0.0;;0.0;;1.25;2;0.0;0.0;4.0;"Sable grossier";38.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;5.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;21;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"Tranche_01102015_Q3_BM6_inf_1.JPG";"oct15-GdcB6inf";0.0;;0.0;;0.0;;0.0;1.5;0.5;"Sable grossier";9.0;0;4;4;13;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;6.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;21;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Verte";"Tranche_02102015_Q4_BM7_sup_1.JPG";"oct15-GdcB7sup";0.0;;0.0;;11.0;2;0.0;0.0;0.25;"D�bris coquilliers";0.75;0;0;0;12;0;0;;;;;;0;0;0;0;0;0;0;0;0;20.0;0.0;0.0;0.0;0.0;0.0;0.0;15.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"Tranche_02102015_Q4_BM7_inf_1.JPG";"oct15-GdcB7inf";0.0;;0.0;;3.0;2;0.0;0.0;1.0;"D�bris coquilliers";4.0;0;0;0;21;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;5.0;2.0;0.0;0.0;0.0;0.0;21.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"Tranche_02102015_Q4_BM8_sup_1.JPG";"oct15-GdcB8sup";0.0;;0.0;;0.25;1;0.0;0.5;1.0;"D�bris coquilliers";25.0;0;0;0;13;0;0;;;;;;1;0;0;0;0;0;0;0;0;35.0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;;8.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;2;0;0;0;0;1;0;1;0;0;2;0;0; +374666;"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"Tranche_02102015_Q4_BM8_inf_1.JPG";"oct15-GdcB8inf";0.0;;0.0;;1.0;2;0.0;1.5;0.0;"Pas de s�diment";7.0;0;1;0;11;0;0;;;;;;5;0;0;0;0;0;0;1;0;0.0;0.25;0.5;0.0;0.0;0.0;0.0;12.5;;8.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;2;0;0;0;0;1;0;1;0;0;2;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"DSCF7950.JPG";"avr16-GroinB5sup";0.0;;8.0;2;0.0;;0.0;4.0;0.0;"Pas de s�diment";12.0;0;1;0;21;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.5;35.0;0.0;0.0;0.0;0.0;0.0;12.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;6;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSCF7951.JPG";"avr16-GroinB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;6;7;6;6;7;640;0;0;0;0;0;0;0;0;0.0;0.0;21.0;0.0;5.0;0.0;0.0;22.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;6;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"DSCF7977.JPG";"avr16-GroinB4sup";0.0;;0.5;1;0.0;;0.0;0.0;10.0;"Sable fin";45.0;0;0;1;23;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;5.0;0.0;0.0;0.0;0.0;0.0;1.5;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSCF7981.JPG";"avr16-GroinB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";60.0;0;4;0;7;0;0;;;;;;32;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"DSCF7534.JPG";"avr16-GroinB3sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";93.0;0;0;1;12;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.25;0.0;0.0;0.0;1.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;15;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCF7535.JPG";"avr16-GroinB3inf";0.0;;0.0;;0.75;2;0.0;0.0;0.0;"Pas de s�diment";17.0;0;4;0;13;0;0;10;1;5;0;1;340;0;0;0;0;0;0;0;0;0.0;1.5;0.0;0.05;0.0;0.0;0.0;8.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;15;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"DSCF7525.JPG";"avr16-GroinB2sup";0.0;;0.0;;0.0;;0.0;0.0;1.0;"Sable grossier";47.5;0;0;1;16;0;0;;;;;;191;0;0;0;0;0;0;0;0;0.0;0.125;0.0;0.25;0.0;0.0;0.0;0.0;;15.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;50;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCF7526.JPG";"avr16-GroinB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";45.0;0;0;3;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;16.0;4.0;0.0;0.0;0.0;0.0;0.5;;15.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;50;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"DSCF7958.JPG";"avr16-GroinB1sup";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";18.0;0;0;2;27;0;0;;;;;;37;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.5;0.0;0.0;0.0;16.0;;35.0;"Blocs";;0;0;0;50;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCF7960.JPG";"avr16-GroinB1inf";0.0;;0.0;;0.0;;0.0;0.5;1.0;"Sable grossier";10.0;0;0;0;4;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;15.0;0.0;0.0;0.0;0.0;2.0;;35.0;"Blocs";;0;0;0;50;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche";"DSCF9334.JPG";"avr16-GroinQ5";0.0;;0.0;;0.0;;0.0;1.0;1.5;"Sable grossier";20.0;0;0;0;52;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;30.0;0.0;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";"DSCF9318.JPG";"avr16-GroinQ1";0.0;;0.0;;0.0;;0.0;0.25;0.0;"Pas de s�diment";25.0;0;0;0;40;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;20.0;0.0;0.5;0.0;0.0;0.0;4.0;;;;;;;;;;;;;;;;;;;; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Blanche";"DSCF9323.JPG";"avr16-GroinQ4";0.0;;0.0;;0.0;;0.0;0.0;4.5;"D�bris coquilliers";63.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;15.0;0.0;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"P1010092.JPG";"avr16-GroinQ3";0.0;;2.0;2;1.0;2;0.0;4.0;0.0;"Pas de s�diment";30.0;0;0;0;23;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;4.5;0.0;0.0;0.0;0.0;0.0;7.0;;;;;;;;;;;;;;;;;;;; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche";"DSCF9332.JPG";"avr16-GroinQ2";0.0;;0.0;;1.0;2;0.0;3.0;2.0;"Sable grossier";25.0;0;0;10;30;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;7.0;0.0;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"DSCF7971.JPG";"avril16-GroinB7sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Sable grossier";98.0;0;0;1;5;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;1;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSCF7973.JPG";"avril16-GroinB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";21.0;0;0;7;5;0;0;;;;;;25;0;0;0;0;0;0;0;0;0.0;0.0;10.0;0.0;0.0;0.0;0.0;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;1;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"DSCF7527.JPG";"avril16-GroinB8sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";40.0;0;0;1;9;0;0;;;;;;4;0;0;0;0;0;0;1;0;0.0;1.0;0.0;0.0;0.0;0.0;0.0;0.25;;65.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;6;0;0;0;0;0;0;0;0;0;1;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSCF7530.JPG";"avril16-GroinB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";40.0;0;0;2;1;0;0;;;;;;5;0;0;0;0;0;0;0;0;0.0;0.25;0.0;0.0;0.0;0.0;0.0;0.0;;65.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;6;0;0;0;0;0;0;0;0;0;1;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche";"DSCF7991.JPG";"avr16-GroinB9sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Sable grossier";6.0;0;0;0;34;0;0;;;;;;0;0;0;0;0;0;0;1;0;0.0;14.0;0.0;0.0;0.0;0.0;0.0;45.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;12;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCF7992.JPG";"avr16-GroinB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;2;5;0;0;;;;;;7;0;0;0;0;0;0;1;0;0.0;0.0;0.0;6.0;1.0;0.0;0.0;35.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;12;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"DSCF7519.JPG";"avr16-GroinB6sup";0.125;1;0.05;1;0.0;;0.0;0.0;0.0;"Sable grossier";21.0;0;0;5;8;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;4.0;0.0;0.0;0.0;0.0;0.0;7.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;3;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSCF7522.JPG";"avr16-GroinB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";75.0;0;0;6;3;0;0;;;;;;56;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;3;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"DSCF7537.JPG";"avr16-GroinB10sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";8.0;0;0;0;18;0;0;;;;;;0;0;0;0;0;0;0;2;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;6.5;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;6;0;0;0;0;0;0;0;0;0;0;0; +374733;"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSCF7538.JPG";"avr16-GroinB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";9.0;0;0;1;2;0;0;;;;;;47;0;0;0;0;0;0;2;0;0.0;0.0;0.0;0.0;0.5;0.0;0.0;6.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;6;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Verte";"Tranche_18102016_Q2_BF.JPG";"oct16-GroinQ2";0.0;;0.0;;6.0;2;0.0;0.0;1.5;"D�bris coquilliers";0.0;0;0;0;13;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;14.0;0.0;0.0;0.0;0.0;0.0;14.0;;;;;;;;;;;;;;;;;;;; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Verte";"Tranche_18102016_Q4_BF.JPG";"oct16-GroinQ4";0.0;;0.0;;3.0;2;0.0;0.5;0.0;"Pas de s�diment";4.0;0;0;0;12;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;60.0;;;;;;;;;;;;;;;;;;;; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";"Tranche_16102016_Q1_BF.JPG";"oct16-GroinQ1";0.0;;0.0;;0.25;2;0.0;0.0;30.0;"D�bris coquilliers";5.0;0;0;6;24;0;0;;;;;;0;0;0;0;0;0;0;0;0;25.0;0.0;0.0;0.0;0.0;0.0;0.0;18.0;;;;;;;;;;;;;;;;;;;; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche";"Tranche_16102016_Q5_BM9_sup.JPG";"oct16-GroinB9sup";0.0;;0.0;;1.0;2;0.0;0.0;0.25;"Sable grossier";4.0;0;0;2;45;0;0;;;;;;0;0;0;0;0;0;0;0;1;0.25;0.0;0.0;0.0;0.0;0.0;0.0;70.0;;2.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"Tranche_16102016_Q5_BM9_inf.JPG";"oct16-GroinB9inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";1.0;0;0;0;1;0;0;;;;;;25;0;0;0;0;0;0;0;0;0.25;0.25;16.5;0.0;0.25;0.0;0.0;60.0;;2.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"Tranche_18102016_Q4_BM8_sup.JPG";"oct16-GroinB8sup";0.125;1;0.0;;0.0;;0.0;0.0;4.5;"Sable grossier";7.0;0;0;0;16;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;85.0;;50.0;"Sable grossier";;0;0;0;3;0;0;0;0;1;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"Tranche_18102016_Q4_BM8_inf.JPG";"oct16-GroinB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;3;0;6;0;0;;;;;;30;0;0;0;0;0;0;1;0;0.0;0.25;26.0;14.0;2.5;0.0;0.0;1.0;;50.0;"Sable grossier";;0;0;0;3;0;0;0;0;1;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"Tranche_18102016_Q4_BM7_sup.JPG";"oct16-GroinB7sup";0.0;;0.0;;0.5;2;0.0;0.0;1.0;"Sable grossier";3.0;0;0;5;1;0;0;;;;;;0;0;0;0;0;0;0;1;0;0.0;1.5;0.0;0.0;0.0;0.0;0.0;40.0;;50.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"Tranche_18102016_Q4_BM7_inf.JPG";"oct16-GroinB7inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;4;0;2;0;0;;;;;;55;0;0;0;0;0;0;0;0;0.0;0.0;20.0;30.0;0.0;0.0;0.0;25.0;;50.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"Tranche_18102016_Q3_BM6_sup.JPG";"oct16-GroinB6sup";0.0;;0.0;;1.0;2;0.0;0.0;9.0;"Sable grossier";8.0;0;0;0;5;0;0;;;;;;17;0;0;0;0;0;0;0;0;0.0;0.25;35.0;0.0;0.0;0.0;0.0;16.0;;20.0;"Blocs";;0;0;0;1;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Verte";"Tranche_18102016_Q3_BM6_inf.JPG";"oct16-GroinB6inf";0.0;;0.0;;9.0;2;0.0;0.125;0.0;"Pas de s�diment";50.0;0;0;8;2;0;0;;;;;;21;0;0;0;0;0;0;0;0;0.125;3.0;7.0;0.0;0.0;0.0;0.0;2.0;;20.0;"Blocs";;0;0;0;1;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Verte";"Tranche_18102016_Q3_BM5_sup.JPG";"oct16-GroinB5sup";0.0;;0.125;2;1.5;2;0.0;0.0;1.5;"Sable grossier";7.0;0;0;2;0;0;0;;;;;;9;0;0;0;0;0;0;0;0;0.0;0.0;40.0;0.25;0.0;0.0;0.0;10.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;0;0;0;0;1;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche-Verte";"Tranche_18102016_Q3_BM5_inf.JPG";"oct16-GroinB5inf";0.0;;0.0;;3.0;2;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;2;0;0;;;;;;20;0;0;0;0;0;0;0;0;0.0;0.125;25.0;1.0;0.0;0.0;0.0;15.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;0;0;0;0;1;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"Tranche_18102016_Q2_BM4_sup.JPG";"oct16-GroinB4sup";0.0;;0.0;;56.0;1;0.0;0.0;5.0;"Sable grossier";1.0;0;0;0;20;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.25;0.0;0.0;16.0;0.0;0.0;0.0;5.0;;25.0;"Blocs";;0;0;0;6;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"Tranche_18102016_Q2_BM4_inf.JPG";"oct16-GroinB4inf";0.0;;0.0;;0.25;2;0.0;2.5;0.0;"Pas de s�diment";26.0;0;0;0;10;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;2.5;23.0;4.0;2.5;0.0;0.0;1.0;;25.0;"Blocs";;0;0;0;6;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"Tranche_18102016_Q2_BM3_sup.JPG";"oct16-GroinB3sup";0.0;;0.0;;1.5;2;0.0;0.0;1.0;"Sable grossier";2.0;0;0;0;9;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;50.0;;15.0;"Sable grossier";;0;0;0;2;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"Tranche_18102016_Q2_BM3_inf.JPG";"oct16-GroinB3inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";1.0;0;0;4;2;0;0;;;;;;72;0;0;0;0;0;0;0;0;0.0;2.0;40.0;5.0;0.0;0.0;0.0;0.5;;15.0;"Sable grossier";;0;0;0;2;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"Tranche_16102016_Q1_BM2_sup.JPG";"oct16-GroinB1sup";1.0;2;0.0;;17.5;2;0.0;0.0;12.0;"D�bris coquilliers";1.0;0;0;1;8;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.0;0.25;0.0;0.0;0.0;0.0;0.0;1.0;;35.0;"Blocs";;0;0;0;2;0;0;0;0;1;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Tranche_16102016_Q1_BM2_inf.JPG";"oct16-GroinB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";8.0;0;0;0;0;0;0;;;;;;112;0;0;0;0;0;0;0;0;0.0;0.0;15.0;0.0;1.75;0.0;0.0;8.0;;35.0;"Blocs";;0;0;0;2;0;0;0;0;1;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"Tranche_16102016_Q1_BM1_sup.JPG";"oct16-GroinB1sup";0.0;;0.0;;1.0;2;0.0;0.0;4.0;"Sable grossier";26.0;0;0;1;1;0;0;;;;;;180;0;0;0;0;0;0;0;0;0.5;0.25;12.5;0.0;0.0;0.0;0.0;0.5;;40.0;"Blocs";;0;0;0;4;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Verte";"Tranche_16102016_Q1_BM1_inf.JPG";"oct16-GroinB1inf";0.0;;0.0;;10.0;2;0.0;0.0;2.5;"Sable grossier";16.0;0;0;0;13;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.25;0.0;4.5;0.0;0.0;0.0;0.0;3.5;;40.0;"Blocs";;0;0;0;4;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"Tranche_16102016_Q5_BM10_sup.JPG";"oct16-GroinB10sup";0.0;;0.0;;0.0;;0.0;0.0;5.0;"Sable fin";3.0;0;0;0;0;0;0;;;;;;11;0;0;0;0;0;0;0;0;0.0;0.0;41.0;0.5;0.0;0.0;0.0;1.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;4;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Tranche_16102016_Q5_BM10_inf.JPG";"oct16-GroinB10inf";0.0;;0.0;;0.25;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;0;1;0;0;;;;;;2;0;0;0;0;0;0;2;0;0.0;1.0;0.0;0.0;0.0;0.0;0.75;60.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;4;0;0;0;0;0;0;0;0;0;0;0; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Verte";"Tranche_18102016_Q3_BF.JPG";"oct16-GroinQ3";0.0;;0.0;;50.0;2;0.0;0.0;1.5;"Sable grossier";3.0;0;0;0;3;0;0;;;;;;51;0;0;0;0;0;0;0;0;0.0;0.25;0.0;0.0;0.0;0.0;0.0;4.0;;;;;;;;;;;;;;;;;;;; +374800;"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche";"Tranche_16102016_Q5_BF.JPG";"oct16-GroinQ5";0.0;;0.0;;0.5;2;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;0;12;0;0;;;;;;0;0;0;0;0;0;0;1;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;50.0;;;;;;;;;;;;;;;;;;;; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"Q2_B4SUP.JPG";"oct15-EnsB4sup";0.0;;105.0;2;3.0;2;0.0;18.0;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;3.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"Q2_B4INF.JPG";"oct15-EnsB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";50.0;0;0;5;0;0;0;;;;;;16;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;3.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"Q2_B3SUP.JPG";"oct15-EnsB3sup";0.0;;140.0;2;12.0;2;0.0;8.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"Q2_B3INF.JPG";"oct15-EnsB3inf";0.0;;0.5;2;0.0;;0.0;27.0;0.0;"Pas de s�diment";3.0;0;0;1;0;0;0;;;;;;18;0;0;0;0;0;0;0;0;0.0;0.0;0.0;2.0;8.5;0.5;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"Q1_B2SUP.JPG";"oct15-EnsB2sup";0.0;;50.0;2;5.0;2;0.0;3.0;2.5;"Sable fin";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;1.0;0.0;0.5;0.0;0.0;0.0;0.0;;9.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Q1_B2INF.JPG";"oct15-EnsB2inf";0.0;;0.5;2;0.5;2;0.0;11.5;0.0;"Pas de s�diment";3.0;0;1;0;0;0;0;;;;;;25;0;0;0;0;0;0;0;0;0.0;2.0;9.0;4.0;1.0;0.0;0.0;0.0;;9.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"Q1_B1SUP.JPG";"oct15-EnsB1sup";0.0;;100.0;2;1.0;2;0.0;5.0;12.0;"Sable fin";16.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.5;0.0;0.0;0.0;0.0;;12.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"Q1_B1INF.JPG";"oct15-EnsB1inf";0.0;;0.5;2;0.5;2;0.0;6.0;0.0;"Pas de s�diment";30.0;0;3;0;0;0;0;;;;;;5;0;0;0;0;0;0;0;0;0.0;0.0;20.0;0.0;0.0;0.0;0.0;0.5;;12.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Color�e";"Q5_BLOCREF.JPG";"oct15-EnsQ5";0.0;;47.0;2;19.5;2;0.0;1.5;0.0;"Pas de s�diment";0.5;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;13.5;0.0;2.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge";"Q4_BLOCREF.JPG";"oct15-EnsQ4";0.0;;60.0;2;8.0;2;0.0;0.0;15.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;3.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge";"Q3_BLOCREF.JPG";"oct15-EnsQ3";0.0;;59.0;2;6.5;2;0.0;14.5;5.0;"D�bris coquilliers";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"Q2_BLOCREF.JPG";"oct15-EnsQ2";0.0;;95.0;2;0.0;;0.0;15.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge-Verte";"Q1_BLOCREF.JPG";"oct15-EnsQ1";0.0;;75.0;2;1.0;2;0.0;2.0;5.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Verte";"Q5_B10SUP.JPG";"oct15-EnsB10sup";0.0;;20.0;2;11.0;2;0.0;7.0;0.0;"Pas de s�diment";2.5;0;0;2;16;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;6.0;0.0;3.5;0.0;0.0;0.0;3.5;;;;;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Q5_B10INF.JPG";"oct15-EnsB10inf";0.0;;0.0;;0.5;2;0.0;12.5;0.0;"Pas de s�diment";1.0;0;0;0;1;0;0;;;;;;9;0;0;0;0;0;0;0;0;0.0;23.0;0.0;2.5;0.0;0.0;0.0;0.5;;;;;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Verte";"Q5_B9SUP.JPG";"oct15-EnsB9sup";0.0;;58.0;2;34.0;2;0.0;4.0;0.0;"Pas de s�diment";2.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;21.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche-Rouge";"Q5_B9INF.JPG";"oct15-EnsB9inf";0.0;;0.0;;0.0;;0.0;1.0;10.0;"Sable grossier";11.0;0;1;0;0;0;0;;;;;;60;0;0;0;0;0;0;0;0;0.0;10.0;0.0;8.0;1.0;0.0;0.0;0.0;;;;;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche-Verte";"Q4_B8SUP.JPG";"oct15-EnsB8sup";0.0;;13.0;2;23.0;2;0.0;20.0;0.5;"Sable fin";1.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;2.0;0.5;0.0;1.0;0.0;0.0;0.0;;;;;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"Q4_B8INF.JPG";"oct15-EnsB8inf";0.0;;1.5;2;0.0;;0.0;21.0;7.0;"Sable fin";0.0;0;1;0;0;0;0;;;;;;41;0;0;0;0;0;0;0;0;0.0;5.0;0.0;6.0;3.0;0.0;0.0;0.0;;;;;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"Q4_B7SUP.JPG";"oct15-EnsB7sup";0.0;;2.5;2;0.5;1;0.0;60.0;0.0;"Pas de s�diment";0.5;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;5.0;9.0;6.0;0.0;0.0;0.0;0.0;;;;;0;0;0;0;0;0;0;0;0;1;0;0;0;2;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche-Rouge";"Q4_B7INF.JPG";"oct15-EnsB7inf";0.0;;16.0;2;5.0;2;0.0;35.0;0.0;"Pas de s�diment";2.0;0;5;4;0;0;0;;;;;;20;0;0;0;0;0;0;0;0;0.0;1.5;0.5;14.5;0.0;0.0;0.0;0.0;;;;;0;0;0;0;0;0;0;0;0;1;0;0;0;2;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"Q3_B6SUP.JPG";"oct15-EnsB6sup";0.0;;48.0;2;2.0;2;0.0;9.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"Q3_B6INF.JPG";"oct15-EnsB6inf";0.0;;0.5;2;0.0;;0.0;6.0;0.0;"Pas de s�diment";50.0;0;0;0;0;0;0;;;;;;17;0;0;0;0;0;0;0;0;0.0;0.0;0.0;7.0;6.0;0.0;0.0;0.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"Q3_B5SUP.JPG";"oct15-EnsB5sup";0.0;;110.0;2;5.0;2;0.0;10.0;2.0;"Sable fin";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;6.0;"Blocs";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +374867;"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"Q3_B5INF.JPG";"oct15-EnsB5inf";0.0;;0.0;;0.0;;0.0;6.0;0.0;"Pas de s�diment";8.0;0;0;3;0;0;0;;;;;;85;0;0;0;0;0;0;0;0;0.0;0.0;0.0;15.0;13.5;0.0;0.0;0.0;;6.0;"Blocs";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"DSC02678.JPG";"mars16-EnsB9sup";0.0;;4.0;2;0.5;1;0.0;6.0;0.0;"Pas de s�diment";7.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;0.0;;25.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSC02679.JPG";"mars16-EnsB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";6.0;0;0;1;0;0;0;;;;;;14;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;25.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"DSC06118.JPG";"mars16-EnsQ1";0.0;;50.0;2;2.0;1;0.0;3.0;20.0;"Sable grossier";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;1.0;0.0;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Blanche";"DSC06099.JPG";"mars16-EnsQ4";0.0;;5.0;2;1.5;1;1.0;5.0;6.0;"Sable grossier";5.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche";"DSC02684.JPG";"mars16-EnsQ5";0.0;;12.0;2;0.5;1;0.0;0.0;0.0;"Sable grossier";2.0;0;0;1;4;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;5.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"DSC06110.JPG";"mars16-EnsB1sup";0.0;;50.0;2;4.0;1;0.0;5.0;2.0;"Sable grossier";1.5;0;1;1;0;0;0;;;;;;10;0;0;0;0;0;0;0;0;0.0;3.0;0.5;1.5;0.0;0.0;0.0;0.0;;15.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSC06111.JPG";"mars16-EnsB1inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";17.0;0;1;0;0;0;0;;;;;;120;0;0;0;0;0;0;0;0;0.0;1.0;20.0;1.5;3.5;0.0;0.0;0.0;;15.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"DSC06102.JPG";"mars16-EnsB3sup";0.0;;0.0;;0.0;;0.0;16.0;0.0;"Pas de s�diment";13.0;0;0;1;0;0;0;;;;;;27;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.5;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;2; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Rouge";"DSC06103.JPG";"mars16-EnsB3inf";0.0;;38.0;2;1.5;1;0.0;20.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.5;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;2; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"DSC06104.JPG";"mars16-EnsB4sup";0.0;;11.0;1;2.5;1;0.0;15.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;1.0;1.0;1.0;0.0;0.0;0.0;0.0;;15.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSC06106.JPG";"mars16-EnsB4inf";0.0;;0.0;;0.0;;0.0;20.0;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;35;0;0;0;0;0;0;0;0;0.0;0.0;0.0;5.0;0.5;0.0;0.0;0.0;;15.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"DSC02670.JPG";"mars16-EnsB5sup";0.0;;35.0;2;6.5;2;0.0;6.5;1.5;"Sable fin";17.5;0;0;6;0;0;0;;;;;;35;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;5;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSC02671.JPG";"mars16-EnsB5inf";0.0;;0.5;2;0.0;;0.0;14.5;0.0;"Sable grossier";0.0;0;0;0;0;0;0;8;2;2;8;3;460;0;0;0;0;0;0;0;4;0.0;0.0;5.0;2.0;3.0;0.0;0.0;3.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;5;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"DSC02675.JPG";"mars16-EnsB6sup";0.0;;4.0;2;3.5;1;0.0;6.0;0.5;"Sable fin";1.0;0;0;4;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;7.0;0.0;6.0;0.0;0.0;0.0;0.0;;10.0;"Sable grossier";;0;0;1;0;0;0;0;0;6;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSC02676.JPG";"mars16-EnsB6inf";0.0;;0.5;1;0.0;;0.0;12.5;13.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;23;0;0;0;0;0;0;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;0.0;;10.0;"Sable grossier";;0;0;1;0;0;0;0;0;6;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"DSC06095.JPG";"mars16-EnsB7sup";0.0;;0.5;1;0.0;;0.0;15.0;0.0;"Pas de s�diment";7.0;0;0;1;0;0;0;;;;;;13;0;0;0;0;0;0;0;0;0.0;2.5;0.0;8.0;0.0;0.0;0.0;0.0;;1.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Rouge";"DSC06096.JPG";"mars16-EnsB7inf";0.0;;8.0;2;3.5;2;0.0;75.0;0.0;"Pas de s�diment";0.0;0;0;4;0;0;0;;;;;;78;0;0;0;0;0;0;0;0;0.0;6.0;30.0;0.5;0.0;0.0;0.0;0.0;;1.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"DSC06097.JPG";"mars16-EnsB8sup";0.0;;20.0;2;2.0;1;0.0;15.0;1.0;"Sable grossier";5.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;0.0;;50.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSC06098.JPG";"mars16-EnsB8inf";0.0;;0.0;;0.0;;0.0;10.0;0.0;"Pas de s�diment";15.0;0;2;1;0;0;0;;;;;;45;0;0;0;1;0;40;1;0;0.0;0.0;0.0;1.5;0.5;2.0;0.0;0.0;;50.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"DSC06114.JPG";"mars16-EnsB2sup";0.0;;50.0;2;50.0;1;0.0;4.0;3.0;"Sable grossier";0.0;0;2;3;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;4.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSC06116.JPG";"mars16-EnsB2inf";0.0;;0.5;2;0.0;;0.0;5.0;1.0;"Sable grossier";10.0;0;0;0;0;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;3.0;30.0;3.0;0.5;0.0;0.0;0.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"DSC02680.JPG";"mars16-EnsB10sup";0.0;;7.0;2;0.0;;0.0;22.0;2.0;"Sable grossier";2.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;5.0;0.0;0.0;0.0;0.0;0.0;0.5;;16.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSC02681.JPG";"mars16-EnsB10inf";0.0;;0.0;;0.0;;0.0;8.0;0.0;"Pas de s�diment";2.0;0;0;2;4;0;0;5;10;6;3;6;600;0;0;0;0;0;0;0;0;0.0;3.0;0.0;5.0;1.0;0.0;0.0;6.0;;16.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche";"DSC06107.JPG";"mars16-EnsQ2";0.0;;0.5;1;0.0;;0.0;10.0;0.0;"Pas de s�diment";2.0;0;2;0;0;0;0;;;;;;110;0;0;0;0;0;0;0;0;0.0;0.0;15.0;1.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +374934;"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge";"DSC02672.JPG";"mars16-EnsQ3";0.0;;3.0;2;0.5;1;0.0;14.0;3.0;"Sable fin";2.5;0;0;10;0;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"DSC02998.JPG";"oct16-EnsQ1";0.0;;85.0;2;0.5;2;0.0;0.0;10.0;"Sable fin";0.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche-Verte";"DSC06352.JPG";"oct16-EnsQ5";0.0;;23.0;2;29.0;2;0.0;2.5;7.5;"Sable fin";2.5;0;0;0;5;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;1.5;;;;;;;;;;;;;;;;;;;; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"DSC06358.JPG";"oct16-EnsB8sup";0.0;;15.0;2;30.0;;0.0;11.0;2.0;"Sable fin";1.0;0;0;3;0;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;6.0;0.5;1.0;0.0;0.0;0.0;1.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"DSC06360.JPG";"oct16-EnsB8inf";0.0;;0.0;;0.0;;0.0;3.5;0.0;"Pas de s�diment";0.5;0;0;4;0;0;0;18;19;16;5;31;1780;0;0;0;0;0;0;0;0;0.0;7.5;31.0;14.0;2.5;0.5;0.0;2.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche-Rouge";"DSC02993.JPG";"oct16-EnsB2sup";0.0;;35.0;1;1.0;2;0.0;0.5;0.0;"Pas de s�diment";25.0;0;0;0;0;0;0;;;;;;7;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;0.5;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"DSC02995.JPG";"oct16-EnsB2inf";0.0;;10.0;2;0.0;;0.0;30.0;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;;;;;;14;0;0;0;0;0;0;0;0;0.0;0.0;15.0;6.0;0.5;0.0;0.0;0.5;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"DSC02983.JPG";"oct16-EnsB6sup";0.0;;0.0;;2.0;1;0.0;10.0;0.0;"Pas de s�diment";1.0;0;0;4;0;0;0;10;9;12;6;11;960;0;0;0;0;0;0;0;0;0.0;0.0;0.0;3.0;0.5;0.0;0.0;1.0;;20.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Rouge";"DSC02984.JPG";"oct16-EnsB6inf";0.0;;25.0;2;2.0;2;0.0;4.0;0.0;"Pas de s�diment";3.5;0;10;9;0;0;0;;;;;;19;0;0;0;0;0;0;0;0;0.0;0.0;0.0;2.0;0.0;0.0;0.0;0.0;;20.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge-Verte";"DSC02981.JPG";"oct16-EnsB5sup";0.0;;35.5;2;21.0;2;0.0;0.0;10.0;"Sable fin";10.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"DSC02982.JPG";"oct16-EnsB5inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";1.0;0;1;0;0;0;0;25;44;16;10;17;2240;0;0;0;0;0;0;0;0;0.0;0.5;0.0;3.0;2.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"DSC02989.JPG";"oct16-EnsB3sup";0.0;;15.0;2;60.0;2;0.0;5.0;2.0;"Sable fin";2.0;0;0;0;0;0;0;;;;;;15;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;;2.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;2; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"DSC02990.JPG";"oct16-EnsB3inf";0.0;;2.0;2;5.0;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;14;12;44;10;9;1780;0;0;0;0;0;0;0;0;0.0;0.0;15.0;4.0;0.5;0.0;0.0;0.0;;2.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;2; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Verte";"DSC02994.JPG";"oct16-EnsB1sup";0.0;;5.0;1;20.0;2;0.0;25.0;0.0;"Pas de s�diment";8.0;0;0;1;0;0;0;;;;;;11;0;0;0;0;0;0;0;0;0.0;1.5;2.0;0.0;0.0;0.0;0.0;1.0;;10.0;"Blocs";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSC02997.JPG";"oct16-EnsB1inf";0.0;;12.0;2;0.5;2;0.0;9.5;0.0;"Pas de s�diment";6.0;0;4;0;0;0;0;;;;;;33;0;0;0;0;0;0;1;0;0.0;0.5;5.0;5.0;2.5;0.0;0.0;0.0;;10.0;"Blocs";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"DSC02987.JPG";"oct16-EnsB4sup";0.0;;15.0;2;45.0;2;0.0;10.0;0.0;"Pas de s�diment";7.0;0;0;0;0;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.0;0.5;0.0;5.0;0.5;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"DSC02988.JPG";"oct16-EnsB4inf";0.0;;7.0;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.0;0.0;7.0;4.0;6.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"DSC06355.JPG";"oct16-EnsB7sup";0.0;;30.0;2;17.0;2;0.0;10.0;3.0;"Sable grossier";2.5;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;7.0;0.0;1.5;0.0;0.0;0.0;2.5;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"DSC06357.JPG";"oct16-EnsB7inf";0.0;;4.0;2;0.5;2;0.0;2.5;5.0;"Sable grossier";1.0;0;3;0;0;0;0;8;5;23;10;9;1100;0;0;0;0;0;0;0;0;0.0;1.0;4.0;11.0;4.0;0.5;0.0;0.5;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Verte";"DSC06343.JPG";"oct16-EnsB9sup";0.0;;8.5;2;34.0;2;0.0;4.5;10.0;"Sable fin";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;58.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSC06347.JPG";"oct16-EnsB9inf";0.0;;3.0;2;0.5;2;0.0;1.0;0.0;"Pas de s�diment";3.5;0;0;0;0;0;0;12;5;6;19;15;1140;0;0;0;0;0;0;0;0;0.0;25.0;0.5;2.0;0.5;0.0;0.0;0.0;;58.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Verte";"DSC06349.JPG";"oct16-EnsB10sup";0.0;;27.5;2;24.5;2;0.0;6.0;0.0;"Pas de s�diment";7.5;0;0;2;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;10.0;0.0;0.5;0.0;0.0;0.0;6.5;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;5;0;0;0;0;0;1; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"DSC06351.JPG";"oct16-EnsB10inf";0.0;;0.0;;0.5;2;0.0;5.5;2.5;"Sable fin";5.0;0;0;0;0;0;0;;;;;;316;0;0;0;0;0;0;0;0;0.0;14.0;0.5;6.0;1.5;0.5;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;5;0;0;0;0;0;1; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Verte";"DSC02978.JPG";"oct16-EnsQ3";0.0;;20.0;2;45.0;2;0.0;5.0;1.0;"Sable fin";0.0;0;0;4;0;0;0;;;;;;13;0;0;0;0;0;0;0;0;0.0;4.0;0.0;1.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge-Verte";"DSC02991.JPG";"oct16-EnsQ2";0.0;;25.0;1;10.0;2;0.0;7.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375001;"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge-Verte";"DSC06361.JPG";"oct16-EnsQ4";0.0;;29.0;2;9.0;2;0.0;6.5;5.0;"Sable grossier";1.0;0;0;1;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;6.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"La Bree Oct 2014 Q1 BM1 superieure.JPG";"oct14-BreeB1sup";0.0;;2.0;2;0.0;;0.0;20.0;0.0;"Pas de s�diment";28.0;0;0;0;11;0;0;;;;;;11;;;;;;1480;0;0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;0.75;;1.5;"Blocs";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"La Bree Oct 2014 Q1 BM1 inferieure.JPG";"oct14-BreeB1inf";0.0;;2.5;2;2.5;2;0.0;10.0;0.0;"Pas de s�diment";21.0;0;0;11;0;0;0;;;;;;14;;;;;;360;0;0;0.0;0.0;0.0;10.0;0.0;0.0;0.0;0.005;;1.5;"Blocs";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune-Rouge";"La Bree Oct 2014 Q5 Bloc fixe face superieure.JPG";"oct14-BreeQ5";0.0;;20.0;2;0.5;2;0.0;0.5;55.0;"Sable fin";3.0;0;0;1;0;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune-Rouge";"La Bree Oct 2014 Q4 Bloc fixe face superieure.JPG";"oct14-BreeQ4";0.0;;40.0;2;0.5;2;0.0;1.0;15.0;"Vase";25.0;0;0;1;2;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.5;0.0;0.0;0.0;24.0;;;;;;;;;;;;;;;;;;;; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche-Brune";"La Bree Oct 2014 Q3 Bloc fixe face superieure.JPG";"oct14-BreeQ3";0.0;;19.0;2;2.5;2;0.0;8.0;6.0;"Sable grossier";16.0;0;0;6;3;0;0;;;;;;0;;;;;;0;0;0;0.0;;0.0;0.75;0.0;0.0;0.0;6.5;;;;;;;;;;;;;;;;;;;; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Color�e";"La Bree Oct 2014 Q5 BM9 superieure.JPG";"oct14-BreeB9sup";0.0;;1.5;2;0.0;;0.0;6.5;7.0;"Sable fin";6.0;0;0;8;2;0;0;;;;;;32;;;;;;3320;0;0;0.0;0.0;0.0;11.0;0.0;0.0;0.0;0.125;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche-Verte";"La Bree Oct 2014 Q5 BM9 inferieure.JPG";"oct14-BreeB9inf";0.0;;7.0;2;18.5;2;0.0;12.0;1.0;"Sable fin";7.0;0;0;10;2;0;0;;;;;;9;;;;;;400;0;0;0.0;0.0;0.0;5.5;0.0;0.0;0.0;0.005;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"La Bree Oct 2014 Q4 BM7 superieure.JPG";"oct14-BreeB7sup";0.0;;40.0;2;18.0;2;0.0;6.0;1.0;"Vase";15.0;0;0;3;0;0;0;;;;;;6;;;;;;1160;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;1;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"La Bree Oct 2014 Q4 BM7 inferieure.JPG";"oct14-BreeB7inf";0.0;;1.0;2;0.0;;0.0;20.0;0.0;"Pas de s�diment";5.0;0;2;1;0;0;0;;;;;;53;;;;;;4640;0;0;0.0;0.0;0.0;7.0;3.0;1.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;1;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Color�e";"La Bree Oct 2014 Q4 BM8 superieure.JPG";"oct14-BreeB8sup";0.0;;0.5;2;0.0;;0.0;20.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;46;;;;;;2720;0;0;0.0;0.0;0.0;15.0;1.0;0.0;0.0;23.0;;15.0;"Blocs";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Brune-Rouge";"La Bree Oct 2014 Q4 BM8 inferieure.JPG";"oct14-BreeB8inf";0.0;;40.0;2;5.0;2;0.0;25.0;0.0;"Pas de s�diment";5.0;0;0;8;0;0;0;;;;;;45;;;;;;0;0;0;0.0;0.5;0.0;1.0;0.0;0.0;0.0;0.0;;15.0;"Blocs";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche";"La Bree Oct 2014 Q2 Bloc fixe face superieure.JPG";"oct14-BreeQ2";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";36.0;0;0;1;0;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;17.0;;;;;;;;;;;;;;;;;;;; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune-Rouge";"La Bree Oct 2014 Q1 Bloc fixe face superieure.JPG";"oct14-BreeQ1";0.0;;12.0;2;0.5;2;0.0;11.0;3.5;"D�bris coquilliers";12.0;0;0;0;4;0;0;;;;;;1;;;;;;280;0;0;0.0;0.0;0.0;2.5;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge-Verte";"La Bree Oct 2014 Q5 BM10 superieure.JPG";"oct14-BreeB10sup";0.0;;8.0;2;4.0;2;0.0;3.5;1.0;"D�bris coquilliers";36.0;0;0;7;0;0;0;;;;;;8;;;;;;840;0;0;0.0;0.0;0.0;0.25;0.0;0.0;0.0;10.5;;1.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"La Bree Oct 2014 Q5 BM10 inferieure.JPG";"oct14-BreeB10inf";0.0;;0.5;2;0.0;;0.0;2.5;0.0;"Pas de s�diment";0.0;0;1;1;0;0;0;;;;;;29;;;;;;2440;0;0;0.0;0.0;0.0;28.0;2.25;2.0;1.0;0.0;;1.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Rouge";"La Bree Oct 2014 Q3 BM6 superieure.JPG";"oct14-BreeB6sup";0.0;;0.25;1;0.0;;0.0;24.0;1.0;"Sable grossier";21.0;0;0;8;5;0;0;;;;;;13;;;;;;0;0;0;0.25;0.0;0.0;2.0;0.0;0.0;0.0;7.5;;2.0;"Blocs";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"La Bree Oct 2014 Q3 BM6 inferieure.JPG";"oct14-BreeB6inf";0.0;;0.0;;0.0;;0.0;18.0;0.0;"Pas de s�diment";10.0;0;8;0;1;0;0;;;;;;28;;;;;;600;0;0;0.0;0.16;4.5;6.5;0.0;0.08;0.0;0.0;;2.0;"Blocs";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Rouge";"La Bree Oct 2014 Q3 BM5 superieure.JPG";"oct14-BreeB5sup";0.0;;24.0;2;5.0;2;0.0;8.5;10.5;"D�bris coquilliers";6.5;0;0;1;2;0;0;;;;;;8;;;;;;0;0;0;0.25;0.0;0.0;1.5;0.0;0.0;0.0;6.5;;0.5;"Blocs";;0;0;0;0;0;0;0;1;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"La Bree Oct 2014 Q3 BM5 inferieure.JPG";"oct14-BreeB5inf";0.0;;0.5;;0.75;2;0.0;5.0;1.0;"Vase";2.5;0;1;2;0;0;0;;;;;;43;;;;;;720;0;0;0.0;0.0;0.0;9.0;8.0;0.08;0.0;0.5;;0.5;"Blocs";;0;0;0;0;0;0;0;1;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"La Bree Oct 2014 Q2 BM4 superieure.JPG";"oct14-BreeB4sup";0.0;;33.0;2;6.0;2;0.0;4.0;1.25;"Vase";0.0;0;1;8;1;0;0;;;;;;2;;;;;;18;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;0.75;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"La Bree Oct 2014 Q2 BM4 inferieure.JPG";"oct14-BreeB4inf";0.0;;0.125;2;0.0;;0.0;12.0;0.0;"Pas de s�diment";0.875;0;1;1;0;0;0;;;;;;20;;;;;;2920;0;0;0.0;0.0;0.0;2.5;0.0;0.0;0.5;1.25;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"La Bree Oct 2014 Q2 BM3 superieure.JPG";"oct14-BreeB3sup";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";60.0;0;0;0;0;0;0;;;;;;28;;;;;;720;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;6.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;1;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"La Bree Oct 2014 Q2 BM3 inferieure.JPG";"oct14-BreeB3inf";0.0;;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;3;8;0;0;0;;;;;;5;;;;;;12080;0;0;0.0;0.0;0.0;0.0;8.0;0.0;0.0;1.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;1;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Color�e";"La Bree Oct 2014 Q1 BM2 superieure.JPG";"oct14-BreeB2sup";0.0;;0.33;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";18.25;0;0;0;4;0;0;;;;;;52;;;;;;9640;0;0;0.0;0.0;0.0;6.5;0.0;0.0;0.0;0.5;;1.0;"Blocs";;0;0;0;0;0;0;0;1;0;0;0;0;0;0;0; +375082;"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche-Rouge";"La Bree Oct 2014 Q1 BM2 inferieure.JPG";"oct14-BreeB2inf";0.0;;7.0;2;2.0;2;0.0;10.0;0.0;"Pas de s�diment";33.0;0;0;1;2;0;0;;;;;;2;;;;;;320;0;0;0.0;0.0;0.0;4.0;0.0;0.0;0.0;0.75;;1.0;"Blocs";;0;0;0;0;0;0;0;1;0;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Rouge";"La Bree Mars15-Q5 B9 FSup (1).JPG";"mars15-BreeB9sup";0.0;;6.25;2;0.375;2;0.0;1.0;15.0;"D�bris coquilliers";25.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.0;0.55;0.0;0.125;0.0;0.0;0.0;4.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"La Bree Mars15-Q5 B9 FInf (1).JPG";"mars15-BreeB9inf";0.0;;0.05;2;0.0;;0.0;3.625;0.0;"Pas de s�diment";8.0;0;0;0;0;0;0;;;;;;26;181;21;47;69;41;14360;0;0;0.0;0.0;2.0;15.0;0.125;0.0;0.0;0.25;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"La Bree Mars15-Q1 B1 Fsup 2.JPG";"mars15-BreeB1sup";0.0;;0.5;2;0.0;;0.0;25.0;1.0;"Sable fin";15.0;0;0;1;1;0;0;;;;;;6;0;0;0;0;0;0;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;1.25;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;3;0;0;0;0;0;2;3;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"La Bree Mars15-Q1 B1 Finf 2.JPG";"mars15-BreeB1inf";0.0;;0.5;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;49;0;2;1;1;6;400;0;0;0.0;0.25;0.0;10.0;0.0;0.0;0.0;0.05;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;3;0;0;0;0;0;2;3;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"La Bree Mars15-Q1 B2 FSup (2).JPG";"mars15-BreeB2sup";0.0;;1.0;1;0.05;2;0.0;5.75;0.0;"Pas de s�diment";7.5;0;0;0;1;0;0;;;;;;113;1;26;42;40;0;8320;0;0;0.0;0.0;6.0;2.25;0.0;0.0;0.0;2.25;;0.25;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;4;0;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche-Rouge";"La Bree Mars15-Q1 B2 FInf (2).JPG";"mars15-BreeB2inf";0.0;;19.0;2;2.5;2;0.0;15.0;0.0;"Pas de s�diment";12.5;0;1;0;0;0;0;;;;;;7;0;0;0;0;0;0;0;0;0.0;0.0;0.0;1.875;0.0;0.0;0.0;0.25;;0.25;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;4;0;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"La Bree Mars15-Q2 B3 FSup 1.JPG";"mars15-BreeB3sup";0.0;;3.0;1;0.0;;0.0;7.0;0.0;"Pas de s�diment";23.0;0;0;1;6;0;0;;;;;;44;0;3;0;0;0;120;0;0;0.0;0.25;0.0;4.0;0.0;0.0;0.0;0.05;;1.375;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"La Bree Mars15-Q2 B3 FInf (1).JPG";"mars15-BreeB3inf";0.0;;0.0;;0.0;;0.0;3.0;0.25;"Sable fin";40.0;0;2;5;1;0;0;;;;;;3;0;0;0;0;0;0;0;0;0.0;0.0;2.0;0.125;0.0;0.0;0.0;5.5;;1.375;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"La Bree Mars15-Q2 B4 Fsup.JPG";"mars15-BreeB4sup";0.0;;0.0;;0.0;;0.0;3.5;0.5;"Sable grossier";30.0;0;0;2;0;0;0;;;;;;384;38;36;4;3;3;3360;0;0;0.0;0.0;10.0;0.0;0.0;0.0;0.0;0.0;;1.5;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"La Bree Mars15-Q2 B4 Finf.JPG";"mars15-BreeB4inf";0.0;;0.0;;0.0;;0.0;21.0;0.0;"Pas de s�diment";32.0;0;5;7;2;0;0;;;;;;9;0;0;0;0;0;0;0;0;0.0;0.0;2.5;1.0;0.0;0.0;0.0;0.0;;1.5;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"La Bree Mars15-Q3 B6 Fsup 1.JPG";"mars15-BreeB6sup";0.0;;0.25;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";90.0;0;0;0;0;0;0;;;;;;5;0;0;0;2;0;80;0;0;0.0;0.0;0.0;0.125;0.0;0.0;0.0;9.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;1; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"La Bree Mars15-Q3 B6 Finf 1.JPG";"mars15-BreeB6inf";0.0;;0.25;2;0.0;;0.0;50.0;0.0;"Pas de s�diment";30.0;0;4;3;2;0;0;;;;;;0;0;1;0;0;0;40;0;0;0.0;0.5;30.0;5.0;0.0;0.0;0.0;3.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;1; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Rouge";"La Bree Mars15-Q5 B10 FSup (2).JPG";"mars15-BreeB10sup";0.0;;27.0;2;4.0;2;0.0;5.0;30.0;"Sable fin";7.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.25;0.0;0.0;0.0;2.5;;2.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"La Bree Mars15-Q5 B10 Finf.JPG";"mars15-BreeB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";22.5;0;0;1;8;0;0;;;;;;23;33;12;6;21;2;2960;0;0;0.0;0.0;10.0;2.5;0.0;0.5;0.0;5.0;;2.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"La Bree Mars15-Q1 BFix 1.JPG";"mars15-BreeQ1";0.0;;25.0;2;15.0;2;0.0;0.0;50.0;"Sable fin";20.0;0;0;0;0;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.5;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;;; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"La Bree Mars15-Q2 Bfix.JPG";"mars15-BreeQ2";0.0;;55.0;2;0.65;2;0.0;10.5;8.0;"Sable fin";4.0;0;0;0;0;0;0;;;;;;3;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.125;0.0;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"La Bree Mars15-Q4 Bfix.JPG";"mars15-BreeQ4";0.0;;50.0;2;0.0;;0.0;5.0;40.0;"Sable fin";25.0;0;2;0;4;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;3.5;0.0;0.5;0.0;0.0;0.0;5.5;;;;;;;;;;;;;;;;;;;; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"La Bree Mars15-Q5 BFix 1.JPG";"mars15-BreeQ5";0.0;;80.0;2;0.0;;0.0;0.0;95.0;"Vase";5.0;0;0;1;0;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Blanche";"La Bree Mars15-Q3 BFix 1.JPG";"mars15-BreeQ3";0.0;;6.0;2;0.5;;0.0;11.0;5.0;"Sable fin";0.0;0;0;2;5;0;0;;;;;;3;0;0;0;0;0;0;0;0;0.0;0.25;0.0;0.0;0.0;0.0;0.0;0.375;;;;;;;;;;;;;;;;;;;; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"La Bree Mars15-Q4 B8 Fsup 1.JPG";"mars15-BreeB8sup";0.0;;50.0;2;1.0;;0.0;3.0;75.0;"Sable grossier";25.0;0;1;3;4;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;0.25;0.0;3.0;0.0;0.0;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"La Bree Mars15-Q4 B8 Finf 1.JPG";"mars15-BreeB8inf";0.0;;1.0;2;0.0;;0.0;50.0;0.0;"Pas de s�diment";5.0;0;2;2;4;0;0;;;;;;23;0;0;0;0;0;0;0;0;0.0;0.0;0.0;4.0;0.0;0.0;0.5;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"La Bree Mars15-Q4 B7 Fsup 1.JPG";"mars15-BreeB7sup";0.0;;50.0;2;0.0;;0.0;0.5;10.0;"Sable grossier";10.5;0;1;6;0;0;0;;;;;;3;0;1;0;0;0;40;0;0;0.0;0.75;0.0;0.0;0.0;0.0;0.0;0.25;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"La Bree Mars15-Q4 B7 Finf 1.JPG";"mars15-BreeB7inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";50.0;0;2;1;1;0;0;;;;;;65;40;64;19;43;3;4360;0;0;0.0;0.0;0.0;0.0;0.0;0.0;10.0;0.625;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"La Bree Mars15-Q3 B5 Fsup 1.JPG";"mars15-BreeB5sup";0.0;;10.0;2;0.0;;0.0;20.0;0.0;"Pas de s�diment";75.0;0;0;0;0;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.05;0.0;0.0;0.0;0.75;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;1; +375149;"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"La Bree Mars15-Q3 B5 Finf 1.JPG";"mars15-BreeB5inf";0.0;;0.0;;0.0;;0.0;10.0;0.0;"Pas de s�diment";10.0;0;2;4;1;0;0;;;;;;56;4;14;1;4;0;920;0;0;0.0;0.0;0.5;10.0;5.0;0.0;1.0;1.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;1; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Color�e";"La Bree Oct 2015 Q4 BM8 face superieure (bloc retourne) (2).JPG";"oct15-Br�eB8sup";0.0;;1.0;2;0.0;;0.0;6.0;0.0;"Pas de s�diment";0.1;0;2;0;0;0;0;;;;;;86;6;2;1;6;2;680;0;0;0.0;0.0;7.5;9.0;8.2;0.0;0.0;1.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;4; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche-Rouge";"La Bree Oct 2015 Q4 BM8 face inferieure (bloc retourne) (1).JPG";"oct15-Br�eB8inf";0.0;;15.0;2;0.05;1;0.0;24.0;0.0;"Pas de s�diment";5.0;1;1;27;10;0;0;;;;;;3;0;0;0;0;0;0;0;0;0.05;0.0;3.5;2.0;0.0;0.0;0.0;4.5;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;4; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"La Bree Oct 2015 Q4 BM7 superieure (2).JPG";"oct15-Br�eB7sup";0.0;;80.0;2;0.5;2;0.0;1.5;5.0;"Vase";1.0;0;0;0;4;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;2.5;0.0;0.0;0.0;;9.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"La Bree Oct 2015 Q4 BM7 inferieure (2).JPG";"oct15-Br�eB7inf";0.0;;0.5;2;0.0;;0.0;3.5;0.0;"Pas de s�diment";0.0;0;0;0;20;0;0;;;;;;43;2;0;0;0;20;880;0;0;0.0;0.0;0.0;5.0;26.0;0.5;0.0;0.05;;9.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"La Bree Oct 2015 Q3 BM5 face superieure (1).JPG";"oct15-Br�eB5sup";0.0;;0.15;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";22.0;0;0;10;11;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;21.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";;"oct15-Br�eB5inf";0.0;;0.15;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";18.0;0;3;16;4;0;0;;;;;;10;8;7;9;13;20;2280;0;0;0.0;0.0;1.5;6.0;1.0;0.0;0.0;17.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Rouge";"La Bree Oct 2015 Q2 BM4 face superieure (1).JPG";"oct15-Br�eB4sup";0.0;;25.0;2;1.0;2;0.0;0.0;0.0;"Pas de s�diment";25.0;0;0;7;12;0;0;;;;;;2;2;4;3;0;1;400;0;0;0.0;0.0;0.0;4.0;0.0;0.0;0.0;30.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"La Bree Oct 2015 Q2 BM4 face inferieure (1).JPG";"oct15-Br�eB4inf";0.0;;0.05;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;1;7;0;0;0;;;;;;7;3;0;1;2;2;320;0;0;0.0;0.0;10.0;30.0;0.0;0.0;0.0;15.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"La Bree Oct 2015 Q2 BM3 face superieure.JPG";"oct15-Br�eB3sup";0.0;;15.5;2;4.5;2;0.0;5.0;0.0;"Pas de s�diment";12.0;0;0;6;9;0;0;;;;;;2;1;1;0;0;0;80;0;0;0.05;0.05;0.0;6.5;0.0;0.0;0.0;0.8;;0.5;"Blocs";;0;3;0;0;0;0;0;0;0;0;0;0;0;0;1; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"La Bree Oct 2015 Q2 BM3 face inferieure.JPG";"oct15-Br�eB3inf";0.0;;0.05;2;0.0;;0.0;2.5;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;18;11;4;16;0;0;1240;0;0;0.0;0.0;6.0;26.5;3.0;0.0;0.0;0.25;;0.5;"Blocs";;0;3;0;0;0;0;0;0;0;0;0;0;0;0;1; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"La Bree Oct 2015 Q5 BF910.JPG";"oct14-Br�eQ5";0.0;;22.5;2;1.0;2;0.0;10.0;0.0;"Pas de s�diment";4.0;0;0;35;3;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.0;0.5;0.5;0.0;0.0;0.0;0.0;25.0;;;;;;;;;;;;;;;;;;;; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"La Bree Oct 2015 Q3 BF56 (2).JPG";"oct14-Br�eQ3";0.0;;20.5;2;2.0;2;0.0;4.0;8.0;"Sable grossier";3.0;0;0;11;1;0;0;;;;;;3;0;0;0;0;0;0;0;0;0.0;0.0;0.0;2.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"La Bree Oct 2015 Q2 BF34.JPG";"oct14-Br�eQ2";0.0;;7.0;2;0.05;2;0.0;14.0;3.0;"Vase";0.0;0;0;17;14;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.05;0.0;0.0;0.0;25.0;;;;;;;;;;;;;;;;;;;; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Rouge";"La Bree Oct 2015 Q5 BM10 face superieure.JPG";"oct15-Br�eB10sup";0.0;;30.0;2;0.5;2;0.0;0.5;30.0;"Vase";22.5;0;0;45;8;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;17.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"La Bree Oct 2015 Q5 BM10 face inferieure.JPG";"oct15-Br�eB10inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";3.0;0;3;2;1;0;0;;;;;;23;31;46;49;16;6;4720;0;0;0.0;0.0;0.0;3.0;5.0;0.0;0.0;10.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche";"La Bree Oct 2015 Q5 BM9 face superieure.JPG";"oct15-Br�eB9sup";0.0;;10.0;2;1.0;;0.0;6.0;5.0;"Vase";6.0;0;0;6;4;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;25.0;;15.0;"Blocs";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"La Bree Oct 2015 Q5 BM9 face inferieure.JPG";"oct15-Br�eB9inf";0.0;;0.05;2;0.0;;0.0;3.5;0.0;"Pas de s�diment";4.0;0;1;7;1;0;0;;;;;;6;13;7;4;36;19;3160;0;0;0.0;0.0;0.5;1.0;0.5;0.0;0.0;35.0;;15.0;"Blocs";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche-Rouge";"La Bree Oct 2015 Q1 BM2 face superieure (1).JPG";"oct15-Br�eB2sup";0.0;;3.0;2;0.0;;0.0;6.0;0.0;"Pas de s�diment";20.0;0;0;0;39;54;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;2.0;0.0;0.0;0.0;20.0;;25.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"La Bree Oct 2015 Q1 BM2 face inferieure.JPG";"oct15-Br�eB2inf";0.0;;3.0;2;0.0;;0.0;15.0;0.0;"Pas de s�diment";2.0;0;0;2;12;13;0;;;;;;29;3;45;21;41;27;5480;0;0;0.0;0.0;0.0;0.5;4.0;0.05;0.0;25.0;;25.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Verte";"La Bree Oct 2015 Q1 BM1 face superieure (2).JPG";"oct15-Br�eB1sup";0.0;;6.0;2;11.0;2;0.0;20.0;0.0;"Pas de s�diment";16.0;0;0;0;51;61;0;;;;;;56;0;0;1;1;7;360;0;0;0.0;0.05;0.0;2.0;0.0;0.0;0.0;9.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"La Bree Oct 2015 Q1 BM1 face inferieure.JPG";"oct15-Br�eB1inf";0.0;;0.5;2;0.0;;0.0;15.0;0.0;"Pas de s�diment";10.0;0;0;6;2;0;0;;;;;;31;26;43;4;31;18;4880;0;0;0.0;0.05;9.0;11.0;0.0;0.0;0.0;0.05;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"La Bree Oct 2015 Q3 BM6 superieure (2).JPG";"oct15-Br�eB6sup";0.0;;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;0;11;21;0;0;;;;;;8;2;2;6;0;0;400;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;25.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche-Rouge";"La Bree Oct 2015 Q3 BM6 inferieure (2).JPG";"oct15-Br�eB6inf";0.0;;20.0;2;0.0;;0.0;6.0;0.0;"Pas de s�diment";25.0;0;5;8;1;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;0.0;0.0;3.5;0.0;0.0;0.0;3.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"La Bree Oct 2015 Q4 BF78 (1).JPG";"oct14-Br�eQ4";0.0;;71.0;2;1.0;2;0.0;3.0;7.0;"Sable grossier";5.0;0;0;26;20;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.025;2.0;0.0;2.75;0.0;0.0;0.0;0.045;;;;;;;;;;;;;;;;;;;; +375216;"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"La Bree Oct 2015 Q1 BF12.JPG";"oct14-Br�eQ1";0.0;;1.0;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";4.0;0;0;2;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"La br�e Avr16 Q3 B5 face sup.JPG";"avr16-LaBreeB5sup";0.0;;0.05;2;0.0;;0.0;1.5;25.0;"Vase";40.0;0;0;3;3;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.5;1.0;0.0;0.0;0.0;10.0;;0.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"La br�e Avr16 Q3 B5 face inf.JPG";"avr16-LaBreeB5inf";0.0;;0.0;;0.0;;0.0;20.0;0.0;"Pas de s�diment";15.0;0;9;17;2;0;0;;;;;;24;4;4;13;0;3;960;0;1;0.0;0.0;10.0;1.0;0.0;0.0;0.0;50.0;;0.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"La br�e Avr16 Q2 B4 face sup.JPG";"avr16-LaBreeB4sup";0.0;;0.05;2;0.0;;0.0;0.0;25.0;"Sable fin";62.5;0;0;5;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;1.5;0.0;0.0;0.0;30.0;;;;;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"La br�e Avr16 Q2 B4 face inf.JPG";"avr16-LaBreeB4inf";0.0;;0.5;2;0.0;;0.0;25.0;0.0;"Pas de s�diment";50.0;0;6;0;0;0;0;0;1;1;0;1;60;0;0;0;0;0;0;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;25.0;;;;;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"La br�e Avr16 Q2 B3 face sup.JPG";"avr16-LaBreeB3sup";0.0;;1.0;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";15.0;0;0;8;12;0;0;;;;;;39;0;0;0;4;2;240;0;0;0.0;0.0;0.0;7.5;0.0;0.0;0.0;0.05;;0.0;"Blocs";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"La br�e Avr16 Q2 B3 face inf.JPG";"avr16-LaBreeB3inf";0.0;;23.0;2;1.0;1;0.0;0.0;0.0;"Pas de s�diment";15.0;0;1;1;0;0;0;;;;;;28;0;0;0;0;0;0;0;0;0.0;0.0;15.0;5.0;0.0;0.0;0.0;2.0;;0.0;"Blocs";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"La br�e Avr16 Q5 BFix.JPG";"avr16-LaBreeQ5";0.0;;23.0;2;0.15;2;0.0;2.5;35.0;"Sable grossier";5.0;0;0;4;20;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Color�e";"La br�e Avr16 Q4 BFix.JPG";"avr16-LaBreeQ4";0.0;;25.0;2;0.05;2;0.0;3.5;37.0;"D�bris coquilliers";16.0;0;2;1;6;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.0;2.0;0.0;0.0;0.0;0.0;0.0;4.0;;;;;;;;;;;;;;;;;;;; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"La br�e Avr16 Q1 BFix.JPG";"avr16-LaBreeQ1";0.0;;40.0;2;0.05;2;0.0;5.0;22.0;"Sable grossier";7.0;0;0;5;4;0;0;;;;;;3;0;0;0;0;0;0;0;0;0.0;0.0;0.0;3.0;0.0;0.0;0.0;0.17;;;;;;;;;;;;;;;;;;;; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche-Rouge";"La br�e Avr16 Q5 B10 face sup.JPG";"avr16-LaBreeB10sup";0.0;;25.0;2;0.0;;0.0;7.0;1.0;"Sable fin";1.0;0;3;3;5;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.5;2.0;0.0;0.0;0.0;50.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"La br�e Avr16 Q5 B10 face inf.JPG";"avr16-LaBreeB10inf";0.0;;0.05;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";1.0;0;3;0;0;0;0;;;;;;9;8;10;9;0;4;1240;0;0;0.0;0.05;0.5;2.0;1.0;0.0;0.5;97.5;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Color�e";"La br�e Avr16 Q4 B8 face sup.JPG";"avr16-LaBreeB8sup";0.0;;2.0;2;0.0;;0.0;11.5;3.5;"Sable grossier";35.0;0;2;4;11;0;0;;;;;;85;3;8;1;3;0;600;0;0;0.0;0.75;0.0;0.15;0.0;0.0;0.0;1.9;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche-Rouge";"La br�e Avr16 Q4 B8 face inf.JPG";"avr16-LaBreeB8inf";0.0;;11.0;2;0.0;;0.0;4.5;0.0;"Pas de s�diment";36.0;0;5;0;3;0;0;;;;;;59;0;0;0;0;0;0;0;0;0.0;7.0;0.0;5.0;0.0;0.0;0.0;0.1;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"La br�e Avr16 Q1 B2 face sup.JPG";"avr16-LaBreeB2sup";0.0;;57.0;2;0.0;;0.0;5.75;6.5;"D�bris coquilliers";22.0;0;1;1;6;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.05;0.0;0.0;0.0;2.25;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"La br�e Avr16 Q1 B2 face inf.JPG";"avr16-LaBreeB2inf";0.0;;0.15;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";12.5;0;0;1;4;0;0;;;;;;15;16;61;26;5;43;6040;0;0;0.0;0.0;3.0;1.0;9.0;0.0;0.0;31.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"La br�e Avr16 Q1 B1 Face sup.JPG";"avr16-LaBreeB1sup";0.0;;1.0;2;0.2;2;0.0;24.0;0.75;"D�bris coquilliers";30.5;0;0;6;59;0;0;;;;;;33;0;0;0;0;0;0;0;0;0.0;1.0;0.0;6.5;0.0;0.0;0.0;0.1;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;3;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"La br�e Avr16 Q1 B1 Face inf.JPG";"avr16-LaBreeB1inf";0.0;;2.0;2;0.0;;0.0;11.5;0.0;"Pas de s�diment";13.0;0;1;0;0;0;0;;;;;;25;2;3;0;13;0;720;0;0;0.0;0.0;5.0;3.2;0.0;0.0;0.0;2.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;3;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"La br�e Avr16 Q3 BFix.JPG";"avr16-LaBreeQ3";0.0;;0.0;;0.0;;0.0;5.0;3.0;"Sable fin";75.0;0;0;16;6;0;0;;;;;;3;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;25.0;;;;;;;;;;;;;;;;;;;; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche-Rouge";"La br�e Avr16 Q2 BFix.JPG";"avr16-LaBreeQ2";0.0;;20.0;2;0.5;2;0.0;0.0;0.0;"Pas de s�diment";37.5;0;0;14;14;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;37.5;;;;;;;;;;;;;;;;;;;; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"La br�e Avr16 Q5 B9 face sup.JPG";"avr16-LaBreeB9sup";0.0;;2.0;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";75.0;0;12;35;17;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.05;0.0;0.0;0.0;0.0;0.0;20.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"La br�e Avr16 Q5 B9 face inf.JPG";"avr16-LaBreeB9inf";0.0;;0.05;2;0.0;;0.0;0.05;50.0;"Sable fin";13.0;0;0;4;23;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;75.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"La br�e Avr16 Q4 B7 face sup.JPG";"avr16-LaBreeB7sup";0.0;;45.0;2;1.0;2;0.0;3.0;50.0;"Sable grossier";4.5;0;0;0;1;0;0;;;;;;7;0;0;2;0;0;80;0;0;0.0;1.0;0.0;50.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"La br�e Avr16 Q4 B7 face inf.JPG";"avr16-LaBreeB7inf";0.0;;0.2;2;0.0;;0.0;18.0;0.0;"Pas de s�diment";27.0;0;0;0;1;0;0;;;;;;18;1;0;0;0;0;40;0;0;0.0;0.0;1.0;10.0;4.5;0.0;0.0;0.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"La br�e Avr16 Q3 B6 face sup.JPG";"avr16-LaBreeB6sup";0.0;;1.0;2;0.0;;0.0;75.0;0.05;"Sable grossier";10.0;0;1;13;15;0;0;0;0;0;0;1;20;0;0;0;0;0;0;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;10.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375283;"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"La br�e Avr16 Q3 B6 face inf.JPG";"avr16-LaBreeB6inf";0.0;;5.0;2;0.25;2;0.0;25.0;0.0;"Pas de s�diment";5.0;0;0;1;0;0;0;0;0;0;0;1;20;0;0;0;0;0;0;0;0;0.0;0.0;11.0;25.0;0.05;0.0;0.0;5.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"La br�e Oct16 Q5 BFix 2.JPG";"oct16-LaBreeQ5";0.0;;35.0;2;16.0;2;0.0;0.0;73.0;"D�bris coquilliers";10.0;0;1;23;6;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"La br�e Oct16 Q4 BFix.JPG";"oct16-LaBreeQ4";0.0;;60.0;2;18.0;2;0.0;0.25;95.0;"D�bris coquilliers";1.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;2.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge";"La br�e Oct16 Q3 BFix.JPG";"oct16-LaBreeQ3";0.0;;60.0;2;2.0;2;0.0;0.0;6.0;"Sable fin";6.0;0;0;8;0;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.5;0.0;0.0;0.0;0.05;;;;;;;;;;;;;;;;;;;; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche-Rouge";"La br�e Oct16 Q2 BFix.JPG";"oct16-LaBreeQ2";0.0;;35.0;2;2.0;2;0.0;3.0;0.0;"Pas de s�diment";3.0;0;1;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;7.0;0.0;0.0;0.0;25.0;;;;;;;;;;;;;;;;;;;; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"La br�e Oct16 Q1 BFix.JPG";"oct16-LaBreeQ1";0.0;;50.0;2;4.0;2;0.0;0.0;5.0;"Sable grossier";1.0;0;0;6;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;4.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Verte";"La br�e Oct16 Q5 B10 Face sup.JPG";"oct16-LaBreeB10sup";0.0;;11.0;2;34.0;2;0.0;0.5;;"D�bris coquilliers";12.0;0;0;12;28;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;0.0;;0.75;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;5;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"La br�e Oct16 Q5 B10 Face inf.JPG";"oct16-LaBreeB10inf";0.0;;2.0;2;0.0;;0.0;14.0;0.0;"Pas de s�diment";8.0;0;0;0;0;0;0;;;;;;13;2;0;0;0;0;80;0;0;0.0;0.05;5.75;10.5;1.5;0.0;0.0;3.5;;0.75;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;5;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Verte";"La br�e Oct16 Q5 B9 Face sup.JPG";"oct16-LaBreeB9sup";0.0;;1.5;2;14.0;2;0.0;0.0;1.25;"D�bris coquilliers";37.0;0;0;7;11;0;0;;;;;;0;0;0;0;0;0;0;1;0;0.0;0.0;0.0;2.0;0.0;0.0;0.0;33.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"La br�e Oct16 Q5 B9 Face inf.JPG";"oct16-LaBreeB9inf";0.0;;0.0;;0.5;2;0.0;0.6;0.0;"Pas de s�diment";45.0;0;7;1;2;0;0;;;;;;1;7;23;24;9;11;2960;0;0;0.0;0.0;0.0;0.25;0.0;0.0;0.0;7.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Verte";"La br�e Oct16 Q3 B6 Face sup.JPG";"oct16-LaBreeB6sup";0.0;;1.0;2;3.0;2;0.0;0.0;0.0;"Pas de s�diment";35.0;0;8;0;16;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.5;0.0;0.0;0.0;0.0;0.0;0.0;17.5;;;;;0;0;0;0;0;0;0;0;0;2;0;0;0;0;6; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"La br�e Oct16 Q3 B6 Face inf.JPG";"oct16-LaBreeB6inf";0.0;;0.5;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";2.0;0;5;4;2;0;0;5;6;0;8;4;460;5;0;49;8;32;3760;0;0;0.0;0.0;0.0;3.5;0.75;0.125;0.0;0.5;;;;;0;0;0;0;0;0;0;0;0;2;0;0;0;0;6; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Rouge";"La br�e Oct16 Q3 B5 Face sup.JPG";"oct16-LaBreeB5sup";0.0;;25.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";45.0;0;1;5;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.25;0.0;0.0;0.0;0.0;0.0;0.5;;5.0;"Sable grossier";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"La br�e Oct16 Q3 B5 Face inf.JPG";"oct16-LaBreeB5inf";0.0;;3.0;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";4.0;0;10;4;0;0;0;1;3;3;5;0;240;8;1;12;4;12;1480;0;0;0.0;0.0;0.0;1.0;10.0;0.0;0.0;8.0;;5.0;"Sable grossier";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Rouge";"La br�e Oct16 Q2 B4 Face sup.JPG";"oct16-LaBreeB4sup";0.0;;7.0;2;0.5;2;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;0;6;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.25;0.0;0.0;0.0;0.0;0.0;0.0;30.0;;20.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;4;0;0;0;2;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche-Rouge";"La br�e Oct16 Q2 B4 Face Inf.JPG";"oct16-LaBreeB4inf";0.0;;15.0;2;3.0;2;0.0;6.0;0.0;"Pas de s�diment";10.0;0;3;6;1;0;0;;;;;;19;36;58;23;4;21;5680;0;0;0.0;0.0;5.0;0.0;2.5;0.0;0.0;4.0;;20.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;4;0;0;0;2;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge-Verte";"La br�e Oct16 Q1 B1 Face sup.JPG";"oct16-LaBreeB1sup";0.0;;20.0;2;25.0;2;0.0;6.0;30.0;"Sable grossier";5.0;0;0;9;3;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;;11.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"La br�e Oct16 Q1 B1 Face inf 2.JPG";"oct16-LaBreeB1inf";0.0;;2.0;2;0.0;;0.0;4.0;0.0;"Pas de s�diment";1.0;0;2;0;0;0;0;3;1;2;0;4;200;5;0;7;0;1;520;0;0;0.0;0.0;8.0;16.0;8.0;0.0;0.0;9.0;;11.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"La br�e Oct16 Q1 B2 Face sup.JPG";"oct16-LaBreeB2sup";0.0;;5.0;2;26.0;2;0.0;4.0;1.0;"Sable fin";5.0;0;16;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.25;1.0;0.0;0.0;0.0;0.0;;1.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"La br�e Oct16 Q1 B2 Face inf.JPG";"oct16-LaBreeB2inf";0.0;;0.05;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;74;0;0;2;3;0;200;0;0;0.0;0.0;15.0;10.0;5.0;1.0;0.0;4.0;;1.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche-Verte";"La br�e Oct16 Q2 B3 Face sup.JPG";"oct16-LaBreeB3sup";0.0;;2.0;2;6.0;2;0.0;0.0;0.0;"Pas de s�diment";75.0;0;0;8;12;0;0;;;;;;6;0;0;0;10;3;520;0;0;0.0;0.0;0.0;3.0;0.0;0.0;0.0;3.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;4;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche-Rouge";"La br�e Oct16 Q2 B3 Face inf.JPG";"oct16-LaBreeB3inf";0.0;;20.0;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";13.0;0;3;1;0;0;0;;;;;;16;7;2;15;0;3;1080;0;0;0.0;0.5;0.0;1.0;0.25;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;4;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"La br�e Oct16 Q4 B7 face Sup.JPG";"oct16-LaBreeB7sup";0.0;;45.0;2;11.0;2;0.0;0.0;100.0;"Sable grossier";1.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;8.0;0.0;0.0;0.0;0.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;1;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"La br�e Oct16 Q4 B7 face Inf.JPG";"oct16-LaBreeB7inf";0.0;;5.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.5;0;1;0;0;0;0;;;;;;47;0;8;0;1;0;360;0;0;0.0;0.0;1.0;5.0;1.5;0.0;0.0;0.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;1;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"La br�e Oct16 Q4 B8 face Sup.JPG";"oct16-LaBreeB8sup";0.0;;85.0;2;15.0;2;0.0;0.0;63.0;"D�bris coquilliers";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.05;0.0;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375350;"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"La br�e Oct16 Q4 B8 face Inf.JPG";"oct16-LaBreeB8inf";0.0;;3.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";21.0;0;0;0;0;0;0;;;;;;93;3;1;1;3;1;360;0;0;0.0;0.0;17.0;11.0;2.25;0.0;0.0;0.2;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Brune-Verte";"Antioche Oct 2014 Q4 BM7 sup�rieure.JPG";"oct14-AntB7sup";0.0;;3.0;2;11.0;2;0.0;1.0;9.0;"Sable grossier";0.0;0;0;0;1;0;0;;;;;;22;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.25;0.0;0.0;0.0;0.0;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"Antioche Oct 2014 Q4 BM7 inf�rieure.JPG";"oct14-AntB7inf";0.0;;5.5;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";0.0;0;0;0;4;0;0;;;;;;6;;;;;;1320;0;0;0.0;0.0;0.0;1.0;1.0;0.0;0.0;0.0;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune-Rouge";;"oct14-AntQ5";0.0;;1.5;2;5.0;2;0.0;0.5;20.0;"Sable fin";3.25;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;4.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune-Rouge";;"oct14-AntQ4";0.0;;27.5;2;1.0;2;0.0;4.0;9.0;"Sable grossier";0.0;0;0;1;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;8.0;0.0;1.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune-Rouge";;"oct14-AntQ3";0.0;;8.0;2;8.0;2;0.0;0.5;5.0;"Sable grossier";3.0;0;0;3;9;0;0;;;;;;0;0;0;0;0;0;0;0;0;10.0;6.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche-Brune";;"oct14-AntQ2";0.0;;3.5;2;1.0;2;0.0;14.0;4.5;"Sable grossier";8.0;0;0;0;10;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;5.5;0.0;0.5;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";;"oct14-AntQ1";0.0;;0.0;;0.0;;0.0;0.0;0.5;"D�bris coquilliers";0.0;0;0;1;3;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.125;;;;;;;;;;;;;;;;;;;; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche-Rouge";"Antioche Oct 2014 Q2 BM3 sup�rieure.JPG";"oct14-AntB3sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";86.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;11.0;;2.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"Antioche Oct 2014 Q2 BM3 inf�rieure.JPG";"oct14-AntB3inf";0.0;;0.75;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";10.5;0;0;9;3;0;0;;;;;;116;;;;;;5360;0;0;0.0;0.0;0.0;0.0;10.0;0.0;0.0;3.5;;2.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Verte";"Antioche Oct 2014 Q1 BM1 superieure.JPG";"oct14-AntB1sup";0.0;;3.0;1;5.0;2;0.0;8.0;0.0;"Pas de s�diment";45.0;0;0;0;15;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.25;1.0;0.0;1.5;0.0;0.0;0.0;0.0;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"Antioche Oct 2014 Q1 BM1inferieure.JPG";"oct14-AntB1inf";0.0;;2.0;1;0.25;2;0.0;10.0;0.0;"Pas de s�diment";3.75;0;1;0;2;0;0;;;;;;41;;;;;;2600;0;0;0.0;0.0;0.0;12.0;0.0;0.0;2.5;4.0;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Verte";"Antioche Oct 2014 Q5 BM10 sup�rieure.JPG";"oct14-AntB10sup";0.0;;1.5;2;11.0;2;0.0;17.0;3.0;"Sable grossier";2.0;0;0;0;13;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;0.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;13;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"Antioche Oct 2014 Q5 BM10 inf�rieure.JPG";"oct14-AntB10inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;0;4;2;0;0;;;;;;313;;;;;;1120;0;0;0.0;0.0;0.0;0.0;1.0;1.0;0.0;1.0;;0.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;13;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune-Rouge";"Antioche Oct 2014 Q5 BM9 sup�rieure.JPG";"oct14-AntB9sup";0.0;;20.0;2;1.0;2;0.0;10.0;10.0;"Sable grossier";0.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;0.0;"Blocs";;0;0;0;0;0;0;0;0;0;21;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"Antioche Oct 2014 Q5 BM9 inferieure.JPG";"oct14-AntB9inf";0.0;;1.0;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";8.0;0;0;0;0;0;0;;;;;;81;;;;;;960;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;0.5;;0.0;"Blocs";;0;0;0;0;0;0;0;0;0;21;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Color�e";"Antioche Oct 2014 Q4 BM8 sup�rieure.JPG";"oct14-AntB8sup";0.0;;4.0;2;0.375;2;0.0;13.0;0.0;"Pas de s�diment";14.0;0;0;8;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;10.0;0.0;0.0;0.0;0.0;0.0;0.0;;3.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Brune-Verte";"Antioche Oct 2014 Q4 BM8 inf�rieure.JPG";"oct14-AntB8inf";0.0;;4.0;2;4.0;2;0.0;4.0;0.0;"Pas de s�diment";0.0;0;4;3;0;0;0;;;;;;48;0;0;0;0;0;0;0;0;0.05;0.0;0.0;0.5;0.0;0.0;1.0;0.0;;3.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"Antioche Oct 2014 Q1 BM2 superieure.JPG";"oct14-AntB2sup";0.0;;0.05;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";80.0;0;0;0;0;0;0;;;;;;3;;;;;;1320;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;11.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"Antioche Oct 2014 Q1 BM2 inferieure.JPG";"oct14-AntB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";7.0;0;1;12;5;0;0;;;;;;98;;;;;;5040;0;0;0.0;0.0;0.0;6.0;0.0;0.0;0.0;0.0;;11.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"Antioche Oct 2014 Q2 BM4 sup�rieure.JPG";"oct14-AntB4sup";0.0;;12.0;2;1.0;2;0.0;5.5;0.0;"Pas de s�diment";55.0;0;0;0;9;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;2.0;0.0;0.0;0.0;0.0;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"Antioche Oct 2014 Q2 BM4 inf�rieure.JPG";"oct14-AntB4inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";2.5;0;1;5;2;0;0;;;;;;125;;;;;;6000;0;0;0.0;0.0;0.0;3.0;0.0;0.0;0.0;2.0;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Verte";"Antioche Oct 2014 Q3 BM5 sup�rieure.JPG";"oct14-AntB5sup";0.0;;10.0;2;60.0;2;0.0;0.5;25.0;"Sable grossier";0.0;0;0;0;1;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;5;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"Antioche Oct 2014 Q3 BM5 inf�rieure.JPG";"oct14-AntB5inf";0.0;;0.5;2;2.5;2;0.0;4.0;0.0;"Pas de s�diment";12.0;0;0;0;0;0;0;;;;;;124;;;;;;2240;0;0;0.0;10.0;0.0;5.0;1.0;0.25;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;5;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Brune-Verte";"Antioche Oct 2014 Q3 BM6 sup�rieure.JPG";"oct14-AntB6sup";0.0;;5.0;2;15.0;2;0.0;1.0;5.0;"D�bris coquilliers";3.0;0;0;3;3;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;9.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375417;"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"Antioche Oct 2014 Q3 BM6 inf�rieure.JPG";"oct14-AntB6inf";0.0;;0.0;;0.0;;0.0;0.0;10.0;"Sable grossier";2.0;0;0;0;0;0;0;;;;;;128;;;;;;3120;0;0;0.0;0.0;1.0;30.0;6.0;0.25;0.0;0.0;;10.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"Perret Avr15 Q2 b3 Fsup 1.JPG";"avr15-AntB3sup";0.0;;7.5;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";50.0;0;1;8;7;0;0;;;;;;165;0;0;0;0;0;0;0;0;0.0;25.0;0.0;2.0;0.0;0.0;0.0;0.0;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"Perret Avr15 Q2 b3 Finf 1.JPG";"avr15-AntB3inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";10.0;0;0;5;0;0;0;;;;;;143;4;6;1;2;8;840;0;0;0.0;1.0;17.0;2.0;5.0;1.0;5.0;1.5;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"Perret Avr15 Q5 b10 Fsup 1.JPG";"avr15-AntB10sup";0.0;;8.0;2;1.0;2;0.0;5.0;8.0;"Sable grossier";6.0;0;2;6;0;0;0;;;;;;66;0;0;0;0;0;0;0;0;0.15;0.0;0.0;10.0;0.0;0.0;0.0;0.0;;;;;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"Perret Avr15 Q5 b10 Finf 1.JPG";"avr15-AntB10inf";0.0;;4.0;2;1.0;2;0.0;4.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;32;0;0;0;0;0;0;0;0;0.0;0.0;25.0;6.0;0.0;0.0;0.0;0.0;;;;;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Rouge";"Perret Avr15 Q5 b9 Fsup 1.JPG";"avr15-AntB9sup";0.0;;10.0;2;3.0;2;0.0;9.0;3.5;"Sable grossier";15.0;0;0;12;4;0;0;;;;;;19;0;0;1;0;0;40;0;0;0.1;2.0;0.0;2.0;0.0;0.0;0.0;0.0;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;2;0;0;0;0;0;2;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"Perret Avr15 Q5 b9 Finf 1.JPG";"avr15-AntB9inf";0.0;;0.5;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";0.0;0;2;2;0;0;0;;;;;;108;9;0;23;0;3;1400;0;0;0.25;0.0;20.0;2.0;1.0;0.5;10.0;0.125;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;2;0;0;0;0;0;2;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"Perret Avr15 Q4 b7 Fsup 1.JPG";"avr15-AntB7sup";0.0;;55.0;2;20.0;1;0.0;0.0;5.0;"Sable grossier";3.0;0;0;2;1;0;0;;;;;;95;0;0;0;0;0;0;0;0;0.0;6.0;0.0;0.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"Perret Avr15 Q4 b7 Finf 1.JPG";"avr15-AntB7inf";0.0;;0.0;;0.0;;0.0;10.0;0.0;"Pas de s�diment";3.75;0;0;1;0;0;0;;;;;;191;73;52;16;11;5;6280;0;0;0.0;0.5;0.0;0.5;0.0;1.0;0.5;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"Perret Avr15 Q3 b5 Fsup 1.JPG";"avr15-AntB5sup";0.0;;5.0;2;6.5;2;0.0;7.5;7.0;"Sable grossier";17.5;0;0;0;4;2;0;;;;;;17;0;0;0;0;0;0;0;0;0.05;0.0;4.0;0.0;0.0;0.0;0.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;3;0;0;1;0;1; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"Perret Avr15 Q3 b5 Finf 1.JPG";"avr15-AntB5inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;176;2;5;6;0;16;1160;0;0;0.0;6.5;50.0;0.25;1.15;0.75;1.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;3;0;0;1;0;1; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"Perret Avr15 Q2 b4 Fsup 1.JPG";"avr15-AntB4sup";0.0;;4.0;1;0.0;;0.0;9.0;1.5;"D�bris coquilliers";15.0;0;0;3;23;0;0;;;;;;90;0;0;1;0;0;40;0;0;0.0;35.0;0.0;2.0;0.0;0.0;0.0;0.25;;1.0;"Blocs";;0;0;0;34;0;0;0;0;0;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"Perret Avr15 Q2 b4 Finf 1.JPG";"avr15-AntB4inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";16.0;0;0;2;0;0;0;;;;;;234;9;1;1;4;0;600;0;0;0.0;3.0;2.0;5.0;11.0;1.0;2.0;0.15;;1.0;"Blocs";;0;0;0;34;0;0;0;0;0;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"Perret Avr15 Q3 b6 Fsup 1.JPG";"avr15-AntB6sup";0.0;;5.5;2;0.0;;0.0;8.75;1.5;"Sable grossier";27.0;0;0;7;1;0;0;;;;;;63;0;0;0;0;0;0;0;0;0.0;0.05;2.0;0.0;0.25;0.0;0.0;0.0;;0.5;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"Perret Avr15 Q3 b6 Finf 1.JPG";"avr15-AntB6inf";0.0;;0.0;;0.0;;0.0;6.0;0.0;"Pas de s�diment";25.0;0;1;2;0;0;0;;;;;;76;1;17;4;3;0;1000;0;0;0.0;0.0;5.0;0.0;1.0;0.0;0.75;0.0;;0.5;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"Perret Avr15 Q4 b8 Fsup 1.JPG";"avr15-AntB8sup";0.0;;75.0;2;25.0;2;0.0;0.0;35.0;"Sable grossier";0.0;0;0;6;0;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.5;0.0;0.0;0.0;0.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"Perret Avr15 Q4 b8 Finf 1.JPG";"avr15-AntB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;38;1;3;3;0;0;280;0;0;0.0;0.0;20.0;15.0;0.5;0.0;0.5;0.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";"Perret Avr15 Q1 bfixe 3.JPG";"avr15-AntQ1";0.0;;5.0;2;8.75;2;0.0;2.0;6.0;"Sable grossier";45.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;5.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche";"Perret Avr15 Q2 bfixe 1.JPG";"avr15-AntQ2";0.0;;2.5;1;1.0;2;0.0;9.0;2.0;"D�bris coquilliers";6.0;0;0;2;13;0;0;;;;;;59;0;0;0;0;0;0;0;0;2.5;27.0;0.0;1.25;0.0;0.0;0.0;0.05;;;;;;;;;;;;;;;;;;;; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"Perret Avr15 Q3 bfixe 1.JPG";"avr15-AntQ3";0.0;;1.75;2;0.15;1;0.0;4.0;5.0;"D�bris coquilliers";13.0;0;0;0;12;0;0;;;;;;101;0;0;0;0;0;0;0;0;0.25;22.0;0.0;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"Perret Avr15 Q4 bfixe 1.JPG";"avr15-AntQ4";0.0;;30.0;2;5.0;2;0.0;0.0;75.0;"Sable grossier";10.0;0;0;0;0;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"Perret Avr15 Q5 bfixe 1.JPG";"avr15-AntQ5";0.0;;75.0;2;0.0;;0.0;5.0;25.0;"Sable grossier";0.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"Perret Avr15 Q1 b1 Fsup 1.JPG";"avr15-AntB1sup";0.0;;0.5;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";10.0;0;1;0;5;0;0;;;;;;51;0;0;0;0;0;0;0;0;0.0;10.0;0.0;0.0;0.0;0.0;0.0;0.125;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"Perret Avr15 Q1 b1 Finf 1.JPG";"avr15-AntB1inf";0.0;;0.0;;0.0;;0.0;5.0;0.0;"Pas de s�diment";2.5;0;0;0;0;0;0;;;;;;413;35;3;12;41;54;5800;0;0;0.0;5.0;0.0;0.0;1.5;0.0;0.5;0.1;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"Perret Avr15 Q1 b2 Fsup 1.JPG";"avr15-AntB2sup";0.0;;0.4;2;0.1;1;0.0;1.5;4.5;"Sable fin";80.0;0;0;2;29;0;0;;;;;;141;2;0;1;0;0;120;0;0;0.5;1.0;0.0;0.0;0.0;0.0;0.0;0.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;0;0;0;0;0;0;0;0;0;0;0; +375484;"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Perret Avr15 Q1 b2 Finf 1.JPG";"avr15-AntB2inf";0.0;;3.0;2;0.125;2;0.0;10.0;1.0;"Sable fin";19.0;0;2;0;0;0;0;;;;;;37;0;0;3;0;1;160;0;0;0.0;15.0;0.5;2.0;0.0;0.0;0.875;0.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";;"oct15-AntB10sup";0.0;;1.0;2;1.5;2;0.0;17.5;1.0;"Sable fin";27.0;0;0;17;7;0;0;;;;;;29;0;0;0;0;0;0;0;0;0.05;0.0;0.0;2.75;0.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Rouge";"Antiochat Oct 2015 Q5 BM10 face inf�rieure.JPG";"oct15-AntB10inf";0.0;;1.0;2;0.0;;0.0;22.0;0.0;"Pas de s�diment";10.0;0;3;13;0;0;0;;;;;;16;21;27;19;42;15;4960;0;0;0.05;1.0;5.0;3.75;1.0;0.0;0.0;0.1;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"Antiochat Oct 2015 Q2 BM4 face sup�rieure.JPG";"oct15-AntB4sup";0.0;;2.0;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";15.0;0;0;0;41;0;0;;;;;;8;0;0;0;0;0;0;0;0;0.25;6.0;0.0;2.0;0.0;0.0;0.0;15.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"Antiochat Oct 2015 Q2 BM4 face inf�rieure.JPG";"oct15-AntB4inf";0.0;;1.0;2;0.0;;0.0;8.0;1.0;"Sable grossier";3.0;0;2;9;8;0;0;;;;;;42;3;0;0;2;0;200;0;0;0.0;7.0;13.0;0.5;6.0;0.0;0.0;5.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"Antiochat Oct 2015 Q1 BM2 face sup�rieure.JPG";"oct15-AntB2sup";0.0;;8.5;2;1.75;2;0.0;8.0;5.0;"D�bris coquilliers";9.0;0;0;19;9;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.05;15.0;0.0;0.6;0.0;0.0;0.0;1.0;;5.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;4; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Antiochat Oct 2015 Q1 BM2 face inf�rieure.JPG";"oct15-AntB2inf";0.0;;0.0;;0.0;;0.0;1.25;0.0;"Pas de s�diment";11.5;0;1;5;0;0;0;;;;;;478;21;8;4;12;5;2000;0;0;0.0;11.0;0.0;0.0;0.1;0.0;0.0;0.0;;5.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;4; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge-Verte";"Antiochat Oct 2015 Q1 BM1 face sup�rieure.JPG";"oct15-AntB1sup";0.0;;30.0;2;10.0;2;0.0;7.0;10.0;"Sable fin";5.0;0;0;7;0;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.05;14.0;0.0;0.0;0.0;0.0;0.0;0.0;;1.5;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"Antiochat Oct 2015 Q1 BM1 face inf�rieure.JPG";"oct15-AntB1inf";0.0;;0.0;;0.0;;0.0;8.5;0.0;"Pas de s�diment";17.0;0;1;25;0;0;0;;;;;;103;17;8;13;23;4;2600;0;0;0.0;1.0;0.0;0.1;0.45;0.0;0.0;0.5;;1.5;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"Antiochat Oct 2015 Q4 BM7 face sup�rieure.JPG";"oct15-AntB7sup";0.0;;71.0;2;4.0;2;0.0;2.0;15.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.0;0.5;0.0;1.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"Antiochat Oct 2015 Q4 BM7 face inf�rieure.JPG";"oct15-AntB7inf";0.0;;1.5;2;0.0;;0.0;11.0;0.0;"Pas de s�diment";3.0;0;0;3;0;0;0;;;;;;47;16;11;10;24;3;2560;0;0;0.0;0.0;0.0;6.0;1.5;0.0;0.0;0.05;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"Antiochat Oct 2015 Q5 BF910.JPG";"oct14-AntQ5";0.0;;30.0;2;3.5;;0.0;1.5;27.0;"D�bris coquilliers";15.0;0;1;55;13;0;0;;;;;;3;0;1;0;0;1;80;0;0;0.0;1.0;0.0;0.1;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Blanche-Rouge";"Antiochat Oct 2015 Q4 BF78.JPG";"oct14-AntQ4";0.0;;50.0;2;2.5;;0.0;40.0;20.0;"Sable fin";0.0;0;0;4;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.25;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"Antiochat Oct 2015 Q3 BMF56 (1).JPG";"oct14-AntQ3";0.0;;36.0;2;2.0;2;0.0;1.5;7.0;"D�bris coquilliers";3.0;0;0;4;2;0;0;;;;;;5;0;0;0;0;0;0;0;0;1.0;40.0;0.0;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche";"Antiochat Oct 2015 Q2 BF34.JPG";"oct14-AntQ2";0.0;;3.0;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";15.0;0;0;8;23;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;20.0;0.0;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"Antiochat Oct 2015 Q1 BF12.JPG";"oct14-AntQ1";0.0;;34.0;2;17.0;;0.0;0.0;57.0;"Sable fin";1.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;10.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Rouge";"Antiochat Oct 2015 Q5 BM9 face sup.JPG";"oct15-AntB9sup";0.0;;28.0;2;3.0;2;0.0;5.25;13.0;"D�bris coquilliers";20.0;0;0;3;33;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.125;0.0;0.0;2.0;0.0;0.0;0.0;0.25;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;9; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"Antiochat Oct 2015 Q5 BM9 face inf�rieure (2).JPG";"oct15-AntB9inf";0.0;;0.25;2;0.0;;0.0;13.0;0.0;"Pas de s�diment";10.0;0;1;0;0;0;0;;;;;;211;12;10;8;6;33;2760;0;0;0.0;0.25;0.375;10.0;2.875;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;9; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"Antiochat Oct 2015 Q4 BM8 face sup�rieure (1).JPG";"oct15-AntB8sup";0.0;;31.0;2;16.0;2;0.0;2.5;55.0;"D�bris coquilliers";0.0;0;0;5;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.1;0.0;0.0;0.0;0.0;0.0;0.0;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"Antiochat Oct 2015 Q4 BM8 face inf�rieure (1).JPG";"oct15-AntB8inf";0.0;;2.0;1;0.0;;0.0;6.0;0.0;"Pas de s�diment";0.0;0;7;6;0;0;0;;;;;;24;4;0;3;10;7;960;0;0;0.0;0.0;3.0;7.0;4.5;0.6;0.0;0.0;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"Antiochat Oct 2015 Q3 BM6 face sup�rieure.JPG";"oct15-AntB6sup";0.0;;62.0;2;8.0;2;0.0;0.05;45.0;"D�bris coquilliers";1.5;0;0;5;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.05;11.0;0.0;0.05;0.0;0.0;0.0;0.05;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;1; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"Antiochat Oct 2015 Q3 BM6 face inf�rieure.JPG";"oct15-AntB6inf";0.0;;1.0;2;0.1;2;0.0;2.25;0.0;"Pas de s�diment";18.0;0;0;7;2;0;0;;;;;;209;0;14;13;4;0;1240;0;0;0.0;1.25;0.0;9.0;7.0;0.0;0.0;0.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;1; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Rouge";"Antiochat Oct 2015 Q3 BM5 face sup�rieure (2).JPG";"oct15-AntB5sup";0.0;;20.0;2;3.0;2;0.0;7.0;7.0;"Sable grossier";8.0;0;0;37;17;0;0;;;;;;21;0;0;0;0;0;0;0;0;1.75;22.0;0.0;0.0;0.0;0.0;0.0;0.05;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;1;0;0;0;0;0;1;0;0;0;1;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"Antiochat Oct 2015 Q3 BM5 face inf�rieure.JPG";"oct15-AntB5inf";0.0;;0.0;;0.0;;0.0;7.0;0.0;"Pas de s�diment";16.0;0;1;2;0;0;0;;;;;;102;13;0;1;11;8;1320;0;0;0.0;7.0;9.0;21.0;8.0;0.05;0.0;0.0;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;1;0;0;0;0;0;1;0;0;0;1;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"Antiochat Oct 2015 Q2 BM3 face sup�rieure.JPG";"oct15-AntB3sup";0.0;;7.0;2;0.25;2;0.0;9.0;0.0;"Pas de s�diment";16.0;0;0;0;40;0;0;;;;;;0;0;0;0;0;0;0;1;0;0.05;15.0;0.0;0.0;0.0;0.0;0.0;18.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375551;"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"Antiochat Oct 2015 Q2 BM3 face inf�rieure.JPG";"oct15-AntB3inf";0.0;;0.25;2;0.0;;0.0;2.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;138;0;0;1;0;1;80;0;0;0.0;0.0;1.0;21.0;24.0;0.0;0.0;0.5;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"Antiochat Avr16 Q4 B8 Face sup.JPG";"avr16-PerAntB8sup";0.0;;8.0;2;0.0;;0.0;20.0;9.0;"Sable grossier";0.0;0;0;15;0;0;0;4;10;7;0;5;520;0;0;0;0;0;0;0;0;0.0;3.0;0.05;1.5;0.0;0.0;0.05;0.05;;0.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;4;1; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"Antiochat Avr16 Q4 B8 Face inf.JPG";"avr16-PerAntB8inf";0.0;;3.0;2;0.0;;0.0;7.0;0.0;"Pas de s�diment";13.0;0;1;2;0;0;0;3;2;3;0;0;160;0;0;0;0;0;0;0;0;0.0;1.0;0.0;0.17;0.0;0.0;0.0;0.0;;0.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;4;1; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Color�e";"Antiochat Avr16 Q2 B4 Face sup.JPG";"avr16-PerAntB4sup";0.0;;0.0;;0.0;;0.0;5.0;13.0;"Sable grossier";20.0;0;0;1;5;0;0;3;0;0;2;3;160;0;1;0;0;0;40;0;0;0.0;20.0;4.0;8.5;0.0;0.0;0.5;5.0;;7.0;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"Antiochat Avr16 Q2 B4 Face inf.JPG";"avr16-PerAntB4inf";0.0;;0.0;;0.0;;0.0;5.0;0.0;"Pas de s�diment";20.0;0;2;4;5;0;0;;;;;;6;0;0;0;0;0;0;0;0;0.0;4.0;2.0;1.5;0.0;0.0;0.0;8.5;;7.0;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"Antiochat Avr16 Q3 B5 Face sup.JPG";"avr16-PerAntB5sup";0.0;;36.0;2;0.25;1;0.0;11.0;4.0;"Sable fin";10.0;0;0;3;7;0;0;;;;;;21;0;0;0;0;0;0;0;0;0.05;14.0;0.0;0.75;0.0;0.0;0.0;0.0;;4.0;"Sable grossier";;0;0;0;0;0;0;0;0;9;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";;"avr16-PerAntB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";40.0;0;0;0;0;0;0;5;0;5;10;3;460;17;5;16;13;5;2240;0;0;0.0;2.0;1.0;2.0;0.0;0.0;0.0;0.0;;4.0;"Sable grossier";;0;0;0;0;0;0;0;0;9;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Color�e";"Antiochat Avr16 Q4 B7 Face sup.JPG";"avr16-PerAntB7sup";0.0;;10.0;2;0.5;2;0.0;6.0;17.0;"Sable grossier";12.0;0;0;1;0;0;0;3;4;0;6;0;260;0;0;0;0;0;0;0;0;0.0;1.5;0.0;5.0;0.0;0.0;0.0;0.0;;75.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"Antiochat Avr16 Q4 B7 Face inf.JPG";"avr16-PerAntB7inf";0.0;;1.0;2;0.0;;0.0;15.0;0.0;"Pas de s�diment";3.5;0;1;6;0;0;0;0;3;0;0;0;60;2;2;8;0;9;840;0;0;0.05;5.0;0.0;6.0;0.0;0.0;0.5;0.0;;75.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Color�e";"Antiochat Avr16 Q5 Bfix.JPG";"avr16-PerAntQ5";0.0;;5.0;2;0.05;2;0.0;10.0;12.5;"Sable grossier";20.0;0;0;9;0;0;0;;;;;;15;0;0;0;0;0;0;0;0;0.0;0.25;0.0;2.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"Antiochat Avr16 Q4 BFix.JPG";"avr16-PerAntQ4";0.0;;17.0;2;0.05;2;0.0;0.0;45.0;"Sable fin";0.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Color�e";"Antiochat Avr16 Q3 BFix.JPG";"avr16-PerAntQ3";0.0;;20.0;2;2.25;2;0.0;1.0;17.0;"Sable grossier";0.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;45.0;0.0;0.05;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Color�e";"Antiochat Avr16 Q2 BFix.JPG";"avr16-PerAntQ2";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";13.0;0;0;3;11;0;0;;;;;;6;0;0;0;0;0;0;0;0;0.0;50.0;0.0;1.25;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Color�e";"Antiochat Avr16 Q1 BFix.JPG";"avr16-PerAntQ1";0.0;;28.0;2;8.5;2;0.0;0.1;22.0;"Sable grossier";1.5;0;0;1;3;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;23.0;0.0;0.05;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Rouge";"Antiochat Avr16 Q5 B10 Face sup.JPG";"avr16-PerAntB10sup";0.0;;92.5;2;0.5;2;1.0;1.0;75.0;"Sable fin";1.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;3;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Antiochat Avr16 Q5 B10 Face inf.JPG";"avr16-PerAntB10inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";10.0;0;0;2;0;0;0;1;0;0;3;0;80;12;9;4;1;20;1840;0;0;0.5;0.0;0.0;5.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;3;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"Antiochat Avr16 Q5 B9 Face sup.JPG";"avr16-PerAntB9sup";0.0;;0.0;;0.0;;0.0;20.0;0.0;"Pas de s�diment";15.0;0;2;0;4;0;0;;;;;;24;0;0;0;0;0;0;0;0;0.05;1.5;0.0;3.0;0.0;0.0;0.0;0.05;;5.0;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"Antiochat Avr16 Q5 B9 Face inf.JPG";"avr16-PerAntB9inf";0.0;;3.0;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";4.0;0;2;1;0;0;0;;;;;;20;39;55;8;14;15;5240;0;0;0.0;0.17;2.5;8.0;0.0;0.0;2.0;0.05;;5.0;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"Antiochat Avr16 Q3 B6 Face sup.JPG";"avr16-PerAntB6sup";0.0;;60.0;2;30.0;2;0.0;8.0;5.0;"Sable grossier";6.5;0;0;1;3;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.0;30.0;0.0;0.1;0.0;0.0;0.0;0.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;7;0;0;0;0;2;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"Antiochat Avr16 Q3 B6 Face inf.JPG";"avr16-PerAntB6inf";0.0;;0.0;;0.0;;0.0;5.0;0.0;"Pas de s�diment";50.0;0;0;0;0;0;0;7;8;7;8;3;660;0;0;5;16;0;840;0;0;0.0;1.0;1.25;3.0;0.1;0.05;0.0;0.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;7;0;0;0;0;2;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Color�e";"Antiochat Avr16 Q2 B3 Face sup.JPG";"avr16-PerAntB3sup";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";45.0;0;0;0;8;0;0;;;;;;8;0;0;0;0;0;0;0;0;0.05;20.0;0.0;0.5;0.0;0.0;0.5;5.0;;50.0;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;5;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"Antiochat Avr16 Q2 B3 Face inf.JPG";"avr16-PerAntB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;1;1;1;0;0;0;1;1;0;0;40;1;0;2;0;0;120;0;0;0.0;0.0;10.0;0.0;0.0;0.0;10.0;0.0;;50.0;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;5;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Color�e";"Antiochat Avr16 Q1 B2 Face sup.JPG";"avr16-PerAntB2sup";0.0;;23.0;2;0.75;1;0.0;8.5;1.0;"Sable grossier";1.5;0;0;0;10;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;34.0;0.0;0.4;0.0;0.0;0.0;0.0;;7.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"Antiochat Avr16 Q1 B2 Face inf.JPG";"avr16-PerAntB2inf";0.0;;0.0;;0.0;;0.0;7.5;0.0;"Pas de s�diment";8.0;0;0;0;0;0;0;7;7;2;9;3;560;2;4;0;0;13;760;0;0;0.0;3.0;11.0;14.0;1.125;0.0;0.0;0.5;;7.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Color�e";"Antiochat Avr16 Q1 B1 Face sup.JPG";"avr16-PerAntB1sup";0.0;;11.0;2;4.0;2;0.0;1.1;7.0;"Sable grossier";12.5;0;0;2;11;0;0;5;2;1;8;0;320;0;0;0;0;0;0;0;0;0.0;13.0;0.0;2.5;0.0;0.0;0.0;0.0;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375618;"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"Antiochat Avr16 Q1 B1 Face inf.JPG";"avr16-PerAntB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";12.0;0;1;0;0;0;0;17;15;3;14;2;1020;6;29;28;45;29;5480;0;0;0.0;1.75;0.05;0.5;0.17;0.0;0.0;1.25;;2.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"Perre Oct 16 Q4 B8 Face sup.JPG";"oct16-PerAntB8sup";0.0;;80.0;2;6.0;2;0.0;0.0;;"Sable grossier";0.0;0;0;0;7;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.25;0.0;0.0;0.0;0.0;;3.75;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;4;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche-Rouge";"Perre Oct 16 Q4 B8 Face inf.JPG";"oct16-PerAntB8inf";0.0;;4.0;2;4.0;2;0.0;5.0;0.0;"Pas de s�diment";0.0;0;12;3;5;0;0;2;3;2;1;1;180;9;4;0;4;3;800;0;0;0.0;0.125;0.0;1.25;0.0;0.0;0.0;0.0;;3.75;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;4;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge-Verte";"Perre Oct 16 Q1 B1 Face Sup.JPG";"oct16-PerAntB1sup";0.0;;30.0;2;25.0;2;0.0;2.0;3.0;"Sable grossier";4.0;0;0;2;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;4.0;85.0;0.0;10.0;0.0;0.0;0.0;1.0;;15.0;"Roche en place";;0;0;0;0;0;0;0;0;0;1;0;0;0;3;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"Perre Oct 16 Q1 B1 Face inf.JPG";"oct16-PerAntB1inf";0.0;;1.0;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";15.0;0;0;0;0;0;0;9;0;4;4;1;360;7;5;10;5;0;1080;0;0;0.0;1.0;3.0;3.0;7.0;0.25;0.0;0.0;;15.0;"Roche en place";;0;0;0;0;0;0;0;0;0;1;0;0;0;3;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"Perre Oct 16 Q1 B2 Face sup.JPG";"oct16-PerAntB2sup";0.0;;40.0;2;15.0;2;0.0;0.0;10.0;"Sable grossier";30.0;0;0;1;7;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;4.0;0.0;1.0;0.0;0.0;0.0;4.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"Perre Oct 16 Q1 B2 Face inf.JPG";"oct16-PerAntB2inf";0.0;;0.0;;0.0;;0.0;3.0;0.0;"Pas de s�diment";3.0;0;1;3;6;0;0;9;21;3;6;1;800;52;39;9;0;113;8520;0;0;0.0;35.0;3.0;4.5;1.0;0.0;0.0;1.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"Perre Oct 16 Q3 B5 Face sup.JPG";"oct16-PerAntB5sup";0.0;;15.0;2;10.0;2;0.0;25.0;5.0;"Sable grossier";10.0;0;0;1;16;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;20.0;0.0;2.0;0.0;0.0;0.0;2.0;;3.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"Perre Oct 16 Q3 B5 Face inf.JPG";"oct16-PerAntB5inf";0.0;;0.0;;0.0;;0.0;6.0;0.0;"Pas de s�diment";11.0;0;0;1;0;0;0;;;;;;37;2;1;3;2;3;440;0;0;0.0;9.0;1.0;20.0;4.5;0.0;0.0;2.0;;3.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"Perre Oct 16 Q3 B6 Face sup.JPG";"oct16-PerAntB6sup";0.0;;0.5;2;1.0;2;0.0;0.0;0.0;"Pas de s�diment";90.0;0;0;0;14;0;0;;;;;;5;0;0;0;0;0;0;0;0;0.5;9.0;0.0;0.0;0.0;0.0;0.0;5.5;;2.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"Perre Oct 16 Q3 B6 Face inf.JPG";"oct16-PerAntB6inf";0.0;;0.0;;0.0;;0.0;9.0;0.0;"Pas de s�diment";2.0;0;1;8;3;0;0;0;5;1;5;9;400;1;0;0;3;2;240;0;0;0.0;7.0;1.0;8.0;11.0;0.0;0.0;11.0;;2.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge-Verte";"Perre Oct 16 Q1 BFix.JPG";"oct16-PerAntQ1";0.0;;30.0;2;20.0;2;0.0;0.0;60.0;"Sable grossier";0.0;0;0;9;2;0;0;;;;;;1;0;0;0;0;0;0;0;0;5.0;5.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"Perre Oct 16 Q2 BFix.JPG";"oct16-PerAntQ2";0.0;;17.5;2;4.0;2;0.0;2.0;4.0;"Sable grossier";0.5;0;0;0;19;0;0;;;;;;0;0;0;0;0;0;0;1;0;2.0;12.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge";"Perre Oct 16 Q3 BFix.JPG";"oct16-PerAntQ3";0.0;;50.0;2;20.0;2;0.0;0.0;100.0;"Sable grossier";0.0;0;0;6;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.05;2.0;0.0;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge-Verte";"Perre Oct 16 Q5 BFix.JPG";"oct16-PerAntQ5";0.0;;40.0;2;15.0;2;0.0;0.05;7.5;"Sable grossier";2.0;0;1;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"Perre Oct 16 Q4 BFix.JPG";"oct16-PerAntQ4";0.0;;50.0;2;0.0;;0.0;0.25;18.5;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;1.0;0.0;0.05;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"Perre Oct 16 Q4 B7 Face sup.JPG";"oct16-PerAntB7sup";0.0;;45.0;2;5.5;2;0.0;0.125;90.0;"Sable grossier";15.0;;0;2;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.05;0.0;0.0;0.0;0.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"Perre Oct 16 Q4 B7 Face inf.JPG";"oct16-PerAntB7inf";0.0;;5.0;2;0.05;2;0.0;6.0;0.0;"Pas de s�diment";0.0;0;4;1;0;0;0;3;1;2;6;0;240;5;12;14;0;20;2040;0;0;0.0;0.5;2.5;10.0;11.0;0.125;0.0;0.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Rouge";"Perre Oct 16 Q2 B4 Face sup.JPG";"oct16-PerAntB4sup";0.0;;17.5;2;2.0;2;0.0;0.0;0.0;"Pas de s�diment";35.0;0;0;4;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.05;;0.0;0.0;0.0;0.0;0.0;3.0;;7.5;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"Perre Oct 16 Q2 B4 Face inf.JPG";"oct16-PerAntB4inf";0.0;;4.0;2;1.0;2;;;0.5;"Sable grossier";4.0;0;0;2;2;0;0;7;3;7;0;4;420;5;0;35;21;9;2800;0;0;0.0;3.0;1.0;0.0;1.5;0.25;0.0;0.5;;7.5;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"Perre Oct 16 Q2 B3 Face sup.JPG";"oct16-PerAntB3sup";0.0;;50.0;2;3.0;2;0.0;3.0;3.0;"Sable grossier";5.0;0;0;0;14;0;0;;;;;;1;0;0;0;0;0;0;0;0;2.5;12.0;0.0;15.0;0.0;0.0;0.0;0.5;;3.75;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"Perre Oct 16 Q2 B3 Face Inf.JPG";"oct16-PerAntB3inf";0.0;;7.0;2;1.0;2;0.0;2.0;1.25;"Sable grossier";1.0;0;0;0;0;0;0;11;10;7;1;5;680;0;0;0;0;0;0;0;0;0.0;2.0;0.5;10.0;3.0;0.0;0.0;1.0;;3.75;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"Perre Oct 16 Q5 B10 Face sup.JPG";"oct16-PerAntB10sup";0.0;;13.5;2;4.0;2;0.0;9.0;2.0;"Sable grossier";2.5;0;0;13;1;0;0;;;;;;9;11;15;5;3;16;2000;0;0;0.05;2.0;0.0;3.0;0.0;0.0;0.0;0.125;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche-Rouge";"Perre Oct 16 Q5 B10 Face inf.JPG";"oct16-PerAntB10inf";0.0;;15.0;2;0.5;2;0.0;6.5;0.0;"Pas de s�diment";5.0;0;0;13;4;0;0;1;7;2;2;3;300;18;1;1;0;3;920;0;0;0.0;0.75;0.0;2.5;0.0;0.0;0.0;0.125;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"Perre Oct 16 Q5 B9 Face Sup.JPG";"oct16-PerAntB9sup";0.0;;6.0;2;0.05;2;0.0;1.5;1.0;"Sable grossier";8.0;0;1;4;0;0;0;;;;;;13;17;6;3;10;0;1440;0;0;0.0;2.5;0.0;2.5;0.25;0.0;0.0;0.0;;0.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375685;"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Verte";"Perre Oct 16 Q5 B9 Face inf.JPG";"oct16-PerAntB9inf";0.0;;0.0;;20.0;2;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;23;0;0;0;;;;;;8;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.25;0.0;0.0;0.0;0.0;;0.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"Chassiron Avr15 Q5 b9 Fsup 1.JPG";"avr15-ChasB9sup";0.0;;65.0;2;5.0;2;0.0;1.5;15.0;"Sable grossier";0.0;0;1;1;3;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Blocs";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"Chassiron Avr15 Q5 b9 Finf 1.JPG";"avr15-ChasB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;520;0;0;0;0;0;0;0;0;0.0;0.25;35.0;0.375;0.5;0.0;6.0;0.0;;10.0;"Blocs";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"Chassiron Avr15 Q5 bfixe 1.JPG";"avr15-ChasQ5";0.0;;100.0;2;2.0;2;0.0;0.75;100.0;"D�bris coquilliers";0.125;0;0;0;4;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"Chassiron Avr15 Q3 bfixe 1.JPG";"avr15-ChasQ3";0.0;;11.0;2;3.0;2;0.0;4.5;0.75;"Sable grossier";6.0;0;0;0;4;0;0;;;;;;3;0;0;0;0;0;0;0;0;38.0;2.0;0.0;0.15;0.0;0.0;0.0;0.05;;;;;;;;;;;;;;;;;;;; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"Chassiron Avr15 Q2 bfixe 1.JPG";"avr15-ChasQ2";0.0;;27.0;2;6.5;2;0.0;3.1;10.0;"D�bris coquilliers";2.5;0;0;0;3;0;0;;;;;;3;0;0;0;0;0;0;0;0;1.5;4.0;0.0;1.375;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge-Verte";"Chassiron Avr15 Q1 bfixe 1.JPG";"avr15-ChasQ1";0.0;;25.0;2;30.0;2;0.0;0.0;0.35;"Sable grossier";25.0;0;0;0;0;0;0;;;;;;13;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge-Verte";"Chassiron Avr15 Q5 b10 Fsup 1.JPG";"avr15-ChasB10sup";1.0;2;25.0;2;2.5;2;0.0;0.0;25.0;"Sable grossier";0.0;0;2;0;0;0;0;;;;;;2;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;1;0;0;0;2;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Chassiron Avr15 Q5 b10 Finf 1.JPG";"avr15-ChasB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;54;10;0;1;0;2;520;0;0;0.0;0.0;5.0;0.0;0.0;0.0;0.125;0.0;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;1;0;0;0;2;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"Chassiron Avr15 Q4 b7 Fsup 1.JPG";"5avr15-ChasB7sup";0.0;;15.0;2;25.0;2;0.0;0.0;35.0;"Sable grossier";0.5;0;0;2;1;0;0;;;;;;12;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;1.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"Chassiron Avr15 Q4 b7 Finf 1.JPG";"avr15-ChasB7inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;560;0;5;1;6;0;480;0;0;0.0;1.5;15.0;0.25;0.625;0.0;3.0;0.0;;1.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"Chassiron Avr15 Q3 b6 Fsup 1.JPG";"avr15-ChasB6sup";0.0;;10.0;2;5.0;2;0.0;0.5;3.0;"Sable grossier";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;35.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;1;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"Chassiron Avr15 Q3 b6 Finf 1.JPG";"avr15-ChasB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;925;0;0;0;0;0;0;0;0;0.05;0.56;75.0;2.5;1.75;0.0;1.25;0.05;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;1;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"Chassiron Avr15 Q3 b5 Fsup 1.JPG";"avr15-ChasB3sup";0.0;;12.0;2;4.5;2;0.0;0.55;1.5;"D�bris coquilliers";5.5;0;0;0;5;0;0;;;;;;6;0;0;0;0;0;0;0;0;43.75;2.5;0.0;0.0;0.0;0.0;0.0;0.0;;4.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"Chassiron Avr15 Q3 b5 Finf 1.JPG";"avr15-ChasB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.25;0;0;0;0;0;0;;;;;;752;0;1;0;2;4;280;0;0;0.1;0.0;18.0;20.75;1.0;9.0;0.125;0.05;;4.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge-Verte";"Chassiron Avr15 Q1 b2 Fsup 1.JPG";"avr15-ChasB2sup";0.0;;17.0;2;40.0;2;0.0;0.05;70.0;"D�bris coquilliers";1.75;0;0;0;0;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;7.0;"Blocs";;0;1;0;0;0;0;0;0;1;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Chassiron Avr15 Q1 b2 Finf 1.JPG";"avr15-ChasB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;182;0;0;0;0;0;0;0;0;0.0;0.0;31.0;0.3;11.0;0.125;2.25;0.0;;7.0;"Blocs";;0;1;0;0;0;0;0;0;1;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"Chassiron Avr15 Q1 b1 Fsup 1.JPG";"avr15-ChasB1sup";1.5;2;20.0;2;0.75;2;0.0;0.875;3.0;"Sable grossier";7.5;0;0;0;0;0;0;;;;;;4;0;0;0;0;0;0;0;0;1.0;0.75;0.0;0.0;0.0;0.0;0.0;0.125;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;1;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"Chassiron Avr15 Q1 b1 Finf 1.JPG";"avr15-ChasB1inf";0.0;;0.125;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;522;0;0;0;0;0;0;0;0;0.0;0.0;2.0;2.5;5.0;0.25;0.5;0.05;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;1;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"Chassiron Avr15 Q2 b3 Fsup 1.JPG";"avr15-ChasB3sup";0.0;;12.0;2;15.0;2;0.0;0.0;1.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;212;0;0;0;0;0;0;0;0;6.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;"Roche en place";;0;1;0;0;0;0;0;0;1;10;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"Chassiron Avr15 Q2 b3 Finf 1.JPG";"avr15-ChasB3inf";0.0;;20.0;2;0.0;;0.0;8.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;2;0;0;2;0;0;80;0;0;0.0;0.0;6.0;0.0;0.0;0.0;0.0;0.0;;;"Roche en place";;0;1;0;0;0;0;0;0;1;10;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"Chassiron Avr15 Q2 b4 Fsup 1.JPG";"avr15-ChasB4sup";0.0;;18.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;358;0;0;0;0;0;0;0;0;0.0625;0.0;0.0;0.0;0.0;0.0;0.0;0.1;;;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Rouge-Verte";"Chassiron Avr15 Q2 b4 Finf 1.JPG";"avr15-ChasB4inf";0.0;;15.0;2;50.0;2;0.0;5.0;15.0;"D�bris coquilliers";25.0;0;0;0;0;0;0;;;;;;20;0;1;2;0;0;120;0;0;2.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"Chassiron Avr15 Q4 b8 Fsup 1.JPG";"avr15-ChasB8sup";0.0;;3.0;2;100.0;2;0.0;0.0;70.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;4.0;"Blocs";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"Chassiron Avr15 Q4 b8 Finf 1.JPG";"avr15-ChasB8inf";0.0;;1.0;2;0.0;;0.0;40.0;0.0;"Pas de s�diment";10.5;0;0;0;1;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.25;0.5;10.5;0.05;0.0;0.0;0.0;0.1;;4.0;"Blocs";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +375752;"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune-Rouge";"Chassiron Avr15 Q4 bfixe 1.JPG";"avr15-ChasQ4";0.0;;30.75;2;4.5;2;0.0;6.25;30.75;"Sable grossier";8.0;0;0;0;5;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.15;0.1;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"Chassiron_Oct2015_Q1_bfixe (3).JPG";"oct14-ChasQ1";15.0;3;33.0;2;7.0;2;0.0;4.15;29.0;"D�bris coquilliers";2.1;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;9.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"Chassiron_Oct2015_Q5_bfixe (2).JPG";"oct14-ChasQ5";0.0;;75.0;2;5.0;2;0.0;0.0;12.0;"Sable grossier";1.0;0;0;0;6;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Blanche-Rouge";"Chassiron_Oct2015_Q4_bfixe (1).JPG";"oct14-ChasQ4";0.0;;19.0;2;0.2;2;0.0;61.5;7.5;"D�bris coquilliers";19.0;0;0;9;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.05;0.25;0.0;0.0;0.0;0.0;0.0;11.0;;;;;;;;;;;;;;;;;;;; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"Chassiron_Oct2015_Q2_bfixe (1).JPG";"oct14-ChasQ2";0.0;;70.0;2;3.0;2;0.0;0.0;10.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.05;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";;"oct14-ChasQ3";0.0;;18.0;2;0.75;2;0.0;4.0;3.5;"D�bris coquilliers";16.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;8.5;1.25;0.0;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge-Verte";"Chassiron_Oct2015_Q1_b1_faceSup.JPG";"oct15-ChasB1sup";0.0;;5.0;2;25.0;2;0.0;5.0;16.0;"D�bris coquilliers";2.0;0;0;0;0;0;0;;;;;;18;0;0;0;0;0;0;0;0;16.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;11.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;3;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"Chassiron_Oct2015_Q1_b1_FaceInf.JPG";"oct15-ChasB1inf";0.0;;4.0;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;264;1;0;0;9;0;400;0;0;0.05;0.05;0.5;3.0;4.0;8.0;0.0;0.0;;11.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;3;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"Chassiron_Oct2015_Q1_b2_FaceSup.JPG";"oct15-ChasB2sup";0.0;;7.0;2;30.0;2;0.0;3.5;10.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;7;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.125;0.0;0.0;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Chassiron_Oct2015_Q1_b2_FaceInf.JPG";"oct15-ChasB2inf";0.0;;0.125;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";45.0;0;0;0;0;0;0;;;;;;122;13;0;0;0;0;520;0;0;0.0;0.0;4.0;1.5;3.0;0.25;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Verte";"Chassiron_Oct2015_Q2_b3_FaceSup.JPG";"oct15-ChasB3sup";0.0;;0.5;2;65.0;2;0.0;12.0;50.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.05;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Blocs";;0;1;0;0;0;0;0;0;0;1;0;0;0;1;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"Chassiron_Oct2015_Q2_b3_FaceInf.JPG";"oct15-ChasB3inf";0.0;;0.0;;0.0;;0.0;20.0;0.0;"Pas de s�diment";85.0;0;0;0;0;0;0;;;;;;82;2;5;0;2;1;400;0;0;0.05;0.5;4.0;1.0;0.0;0.0;0.0;0.0;;10.0;"Blocs";;0;1;0;0;0;0;0;0;0;1;0;0;0;1;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"Chassiron_Oct2015_Q4_b7_faceSup (2).JPG";"oct15-ChasB7sup";0.0;;21.0;2;10.0;2;0.0;;13.0;"Sable grossier";7.0;0;0;4;7;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.05;0.3;0.0;0.0;0.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"Chassiron_Oct2015_Q4_b7_FaceInf (2).JPG";"oct15-ChasB7inf";0.0;;0.0;;0.0;;0.0;0.75;0.0;"Pas de s�diment";8.0;0;0;0;0;0;0;;;;;;164;3;10;8;6;2;1160;0;0;0.0;0.0;11.0;6.5;2.75;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"Chassiron_Oct2015_Q4_b8_faceSup (2).JPG";"oct15-ChasB8sup";0.0;;;2;1.5;2;0.0;11.0;2.0;"Sable grossier";25.0;0;0;5;21;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.75;1.5;0.0;0.0;0.0;0.0;0.0;0.1;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"Chassiron_Oct2015_Q4_b8_FaceInf (1).JPG";"oct15-ChasB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;283;4;0;9;14;2;1160;0;0;0.0;0.0;0.5;4.0;21.0;0.0;0.0;2.0;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Verte";"Chassiron_Oct2015_Q5_b9_faceSup.JPG";"oct15-ChasB9sup";0.0;;4.0;2;20.0;2;0.0;16.0;3.0;"Sable grossier";0.0;0;0;2;2;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"Chassiron_Oct2015_Q5_b9_faceInf.JPG";"oct15-ChasB9inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";0.0;0;0;0;1;0;0;;;;;;91;3;6;15;3;4;1240;0;0;0.0;0.5;5.0;20.0;4.0;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Verte";"Chassiron_Oct2015_Q5_b10_faceSup.JPG";"oct15-ChasB10sup";0.0;;0.0;;100.0;2;0.0;0.0;20.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;22;9;5;0;3;5;880;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;1;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Chassiron_Oct2015_Q5_b10_FaceInf.JPG";"oct15-ChasB10inf";0.0;;0.5;;0.0;;0.0;15.0;0.0;"Pas de s�diment";3.0;0;2;5;0;0;0;;;;;;0;10;19;11;10;9;2360;0;0;0.5;3.0;0.0;0.0;1.0;0.0;0.0;10.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;1;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"Chassiron_Oct2015_Q3_b6_faceSup.JPG";"oct15-ChasB6sup";0.0;;15.0;2;2.0;2;0.0;25.0;1.5;"D�bris coquilliers";30.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;5.5;2.25;0.0;0.0;0.0;0.0;0.0;0.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"Chassiron_Oct2015_Q3_b6_faceInf (1).JPG";"oct15-ChasB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;121;41;33;20;12;15;4840;0;0;0.0;0.0;1.5;25.0;4.0;0.0;0.0;0.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Rouge";"Chassiron_Oct2015_Q3_b5_faceSup.JPG";"oct15-ChasB5sup";0.0;;22.5;2;5.0;2;0.0;;8.5;"D�bris coquilliers";17.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;0;0;5.0;1.0;0.0;0.0;0.0;0.0;0.0;0.1;;;"Sable grossier";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"Chassiron_Oct2015_Q3_b5_faceInf.JPG";"oct15-ChasB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";9.0;0;0;0;0;0;0;;;;;;217;36;40;5;9;2;3680;0;0;0.0;1.3;0.5;7.5;4.5;0.0;0.0;0.0;;;"Sable grossier";;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"Chassiron_Oct2015_Q2_b4_FaceSup.JPG";"oct15-ChasB4sup";0.0;;35.0;2;20.0;2;0.0;0.0;20.0;"Pas de s�diment";0.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;0.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375819;"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"Chassiron_Oct2015_Q2_b4_FaceInf.JPG";"oct15-ChasB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;57;0;0;0;7;0;280;0;0;5.0;0.05;15.0;19.0;7.0;0.5;2.0;0.0;;0.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"Chassiron Mar16 Q3 B6 face sup.JPG";"mars16-ChasB6sup";0.0;;12.5;2;2.15;2;0.0;4.625;5.5;"Sable grossier";7.0;0;0;0;0;0;0;;;;;;8;0;0;0;0;0;0;0;0;5.5;2.5;0.0;3.0;0.0;0.0;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"Chassiron Mar16 Q3 B6 face inf.JPG";"mars16-ChasB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;154;21;16;5;13;22;3080;0;0;0.0;0.025;4.0;12.0;0.0;1.5;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"Chassiron Mar16 Q2 B4 face sup.JPG";"mars16-ChasB4sup";0.0;;0.0;;0.0;;0.0;0.0;2.0;"Sable grossier";0.0;0;0;0;0;0;0;9;9;6;6;9;780;0;0;0;6;0;240;0;0;0.05;6.5;0.5;0.0;0.0;0.0;0.05;0.05;;10.0;"Sable grossier";;0;2;0;0;0;0;0;0;0;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"Chassiron Mar16 Q2 B4 face inf.JPG";"mars16-ChasB4inf";0.0;;9.0;2;6.0;2;0.0;13.0;0.0;"Pas de s�diment";25.0;0;0;0;0;0;0;;;;;;55;0;0;0;0;0;0;0;0;0.0;4.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Sable grossier";;0;2;0;0;0;0;0;0;0;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"Chassiron Mar16 Q4 B7 face sup.JPG";"mars16-ChasB7sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;1;0;0;0;12;4;7;4;7;680;24;16;18;21;7;3440;0;0;0.0;4.0;0.125;0.0;0.0;0.0;0.5;1.5;;75.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Rouge";"Chassiron Mar16 Q4 B7 face inf.JPG";"mars16-ChasB7inf";0.0;;30.0;2;2.5;2;0.0;3.5;0.5;"Sable grossier";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;75.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"Chassiron Mar16 Q5 B9 face sup.JPG";"mars16-ChassB9sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;1;0;0;0;10;12;16;1;6;900;7;9;5;10;5;1440;0;0;0.0;5.0;0.05;0.0;0.0;0.0;0.0;0.05;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"Chassiron Mar16 Q5 B9 face inf.JPG";"mars16-ChasB9inf";0.0;;1.5;2;0.0;;0.0;20.0;0.0;"Pas de s�diment";25.0;0;0;2;2;0;0;;;;;;3;0;0;0;0;0;0;0;0;0.0;4.5;0.0;0.0;0.0;0.0;0.0;3.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"Chassiron Mar16 Q2 Bfix.JPG";"mars16-ChasQ2";0.0;;18.0;2;1.0;2;0.0;15.0;15.0;"Sable grossier";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;4.0;0.0;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge";"Chassiron Mar16 Q3 BFix.JPG";"mars16-ChasQ3";0.0;;23.0;2;2.75;2;0.0;6.0;2.25;"Sable grossier";5.0;0;0;0;0;0;0;;;;;;5;0;0;0;0;0;0;0;0;2.5;7.5;0.0;0.6;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"Chassiron Mar16 Q4 Bfix.JPG";"mars16-ChasQ4";0.0;;40.0;2;3.0;2;0.0;10.0;10.0;"Sable grossier";6.5;0;0;0;2;0;0;;;;;;3;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.125;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"Chassiron Mar16 Q1 B1 face sup.JPG";"mars16-ChasB1sup";0.0;;15.0;2;28.0;2;0.0;10.0;10.0;"Sable grossier";4.0;0;0;0;0;0;0;8;6;4;6;2;520;0;0;0;0;0;0;0;0;0.0;1.0;0.0;0.5;0.0;0.0;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;4;0;0;0;0;0;0;0;0;0;0;0;2;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"Chassiron Mar16 Q1 B1 face inf.JPG";"mars16-ChasB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.6;0;0;0;0;0;0;9;6;5;4;8;640;0;0;0;0;0;0;0;0;0.0;1.15;7.0;11.0;1.0;0.5;5.5;0.05;;;"Petits blocs, sable grossier, d�bris coquillers";;0;4;0;0;0;0;0;0;0;0;0;0;0;2;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"Chassiron Mar16 Q1 B2 face sup.JPG";"mars16-ChasB2sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;1;0;0;0;0;;;;;;28;0;0;0;0;0;0;0;0;0.0;0.0;1.5;3.5;0.5;0.0;0.0;0.0;;15.0;"Roche en place";;0;1;1;0;0;0;0;0;0;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Chassiron Mar16 Q1 B2 face inf.JPG";"mars16-ChasB2inf";0.0;;2.0;2;0.0;;0.0;15.0;0.0;"Pas de s�diment";35.0;0;0;0;1;0;0;;;;;;17;0;0;0;0;0;0;0;0;0.0;3.0;0.05;4.0;0.0;0.0;0.5;0.0;;15.0;"Roche en place";;0;1;1;0;0;0;0;0;0;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"Chassiron Mar16 Q2 B3 face sup.JPG";"mars16-ChasB3sup";0.0;;17.0;2;0.0;;0.0;60.0;0.0;"Pas de s�diment";11.0;0;2;0;0;0;0;;;;;;1;0;0;0;0;0;0;0;0;0.5;4.0;0.0;0.0;0.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;5;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"Chassiron Mar16 Q2 B3 face inf.JPG";"mars16-Chas3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;9;6;11;12;1;780;19;7;6;2;6;1600;0;0;0.0;11.0;1.0;1.0;0.0;0.0;0.5;2.5;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;5;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Color�e";"Chassiron Mar16 Q3 B5 face sup.JPG";"mars16-ChasB5sup";0.0;;8.5;2;1.5;2;0.0;5.0;3.5;"Sable grossier";4.0;0;0;0;0;0;0;;;;;;8;0;0;0;0;0;0;0;0;1.5;2.25;0.0;0.0;0.0;0.0;0.0;0.0;;2.0;"Blocs";;0;3;0;0;0;0;0;2;1;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"Chassiron Mar16 Q3 B5 face inf.JPG";"mars16-ChasB5inf";0.0;;0.0;;0.0;;0.0;2.5;0.0;"Pas de s�diment";3.5;0;0;0;0;0;0;;;;;;148;5;12;7;15;12;2040;0;0;0.0;0.0;8.5;2.5;0.0;0.0;0.0;0.025;;2.0;"Blocs";;0;3;0;0;0;0;0;2;1;0;0;0;0;0;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";;"mars16-ChasB8sup";0.0;;52.0;2;2.5;2;0.0;0.05;28.0;"Sable grossier";2.25;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;4.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"Chassiron Mar16 Q4 B8 face inf.JPG";"mars16-ChasB8inf";0.0;;0.0;;0.0;;0.0;0.1;0.0;"Pas de s�diment";0.05;0;0;0;0;0;0;;;;;;344;0;0;3;0;0;120;0;0;0.0;0.125;5.5;0.0;0.0;0.0;0.0;0.0;;4.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Rouge";"Chassiron Mar16 Q5 B10 face sup.JPG";"mars16-ChasB10sup";0.0;;30.0;2;0.0;;0.0;6.0;1.0;;15.0;0;0;0;6;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;2.5;0.0;0.0;0.0;0.0;0.0;5.5;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;0;0;0;0;2;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Chassiron Mar16 Q5 B10 face inf.JPG";"mars16-ChasB10inf";0.0;;2.0;2;0.0;;0.0;1.25;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;12;13;11;4;2;840;7;4;0;2;6;760;0;0;0.0;5.0;8.0;0.0;0.0;0.0;0.0;0.0;;1.5;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;0;0;0;0;2;0; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Rouge";"Chassiron Mar16 Q1 Bfix.JPG";"mars16-ChasQ1";0.0;;50.0;2;5.5;2;0.0;2.0;10.0;"D�bris coquilliers";6.5;0;0;0;0;0;0;;;;;;21;0;0;0;0;0;0;0;0;0.0;5.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375886;"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"Chassiron Mar16 Q5 Bfix.JPG";"mars16-ChasQ5";0.0;;76.0;2;1.0;2;0.0;6.0;16.5;"Sable grossier";6.0;0;0;0;23;0;0;;;;;;4;0;0;0;0;0;0;0;0;0.05;0.3;0.0;0.1;0.0;0.0;0.0;0.15;;;;;;;;;;;;;;;;;;;; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"Chassiron Sept16 Q4B8 Fsup.JPG";"sept16-ChasB8sup";0.0;;3.0;1;50.0;2;0.0;5.0;25.0;"Sable grossier";4.0;2;0;0;17;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;2.0;0.0;0.0;0.0;0.0;0.0;0.0;;4.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"Chassiron Sept16 Q4B8 Finf.JPG";"sept16-ChasB8inf";0.0;;0.0;;0.0;;0.0;7.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;3;3;1;6;11;480;6;0;0;0;11;680;0;0;0.05;1.0;0.5;0.0;0.25;0.0;0.5;1.0;;4.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Rouge";"Chassiron Sept 16 Q1BFix.JPG";"sept16-ChasQ1";0.0;;43.0;2;5.0;2;0.0;1.5;18.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;5.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Rouge";"Chassiron Sept16 Q2B4 Fsup.JPG";"sept16-ChasB4sup";0.0;;1.0;2;3.0;2;0.0;9.0;3.5;"Sable grossier";35.0;0;0;0;0;0;0;0;0;0;0;2;40;0;0;0;0;0;0;0;0;6.0;1.5;0.0;0.0;0.0;0.0;0.0;0.25;;0.0;"Sable grossier";;0;1;0;0;0;0;0;0;0;0;0;0;0;2;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"Chassiron Sept16 Q2B4 Finf.JPG";"sept16-ChasB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;0;0;1;1;0;40;0;0;0;0;0;0;0;0;0.0;0.0;25.0;21.0;4.5;1.5;3.0;0.0;;0.0;"Sable grossier";;0;1;0;0;0;0;0;0;0;0;0;0;0;2;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"Chassiron Sept16 Q2B3 Fsup.JPG";"sept16-ChasB3sup";0.0;;8.0;2;19.0;2;0.0;0.5;85.0;"Sable grossier";0.0;0;0;0;0;0;0;0;0;3;0;0;60;0;0;0;0;0;0;0;0;50.0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;;2.0;"Sable grossier";;0;0;0;0;0;0;0;5;0;0;0;0;0;1;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"Chassiron Sept16 Q2B3 Finf.JPG";"sept16-ChasB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;6;11;1;1;0;380;1;1;2;0;7;440;0;0;0.0;0.0;15.0;8.0;10.5;2.0;0.5;0.125;;2.0;"Sable grossier";;0;0;0;0;0;0;0;5;0;0;0;0;0;1;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Verte";"Chassiron Sept16 Q5B10 Fsup.JPG";"sept16-ChasB10sup";0.0;;2.5;2;6.5;2;0.0;6.0;1.5;"Sable grossier";80.0;0;0;0;25;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Chassiron Sept16 Q5B10 Finf.JPG";"sept16-ChasB10inf";0.0;;0.05;2;1.5;2;0.0;11.5;0.5;"D�bris coquilliers";7.0;0;0;0;0;0;0;7;3;6;7;11;680;17;21;24;12;13;3480;0;0;0.0;1.25;0.0;0.05;0.0;0.0;0.0;1.75;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"Chassiron Sept 16 Q1B2 Fsup.JPG";"sept16-ChasB2sup";0.0;;4.0;2;40.0;2;0.0;2.0;7.0;"Sable grossier";0.0;0;0;0;0;0;0;2;1;0;1;13;340;0;0;0;0;0;0;0;0;0.0;17.0;0.0;0.0;0.0;0.0;0.0;0.0;;0.0;"Sable grossier";;0;1;0;0;0;0;0;0;0;0;0;0;0;1;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"Chassiron Sept 16 Q1B2 Finf.JPG";"sept16-ChasB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;3;13;1;0;1;360;0;0;0;0;0;0;0;0;0.0;0.0;4.0;11.0;9.0;0.0;6.0;0.0;;0.0;"Sable grossier";;0;1;0;0;0;0;0;0;0;0;0;0;0;1;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"Chassiron Sept 16 Q1B1 Fsup.JPG";"sept16-ChasB1sup";0.0;;0.0;;0.0;;0.0;3.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;0;15;3;2;4;480;0;0;0;0;0;0;0;0;0.0;0.0;7.5;26.0;1.5;0.5;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Verte";"Chassiron Sept 16 Q1B1 Finf.JPG";"sept16-ChasB1inf";0.0;;0.5;1;55.0;2;0.0;8.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;0;12;13;0;8;660;0;0;0;0;0;0;0;0;0.0;3.0;0.0;2.5;0.5;0.0;0.5;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"Chassiron Sept16 Q2BFix.JPG";"sept16-ChasQ2";0.0;;50.0;2;5.0;2;0.0;0.0;40.0;"Sable grossier";2.0;0;0;0;0;0;0;0;0;1;0;0;20;0;0;0;0;0;0;0;0;3.0;2.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche-Rouge";"Chassiron Sept16 Q3BFix.JPG";"sept16-ChasQ3";0.0;;13.0;2;10.0;2;0.0;7.5;30.0;"D�bris coquilliers";7.0;0;0;0;0;0;0;;;;;;2;0;0;0;0;0;0;0;0;3.0;8.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"Chassiron Sept16 Q4BFix.JPG";"sept16-ChasQ4";0.0;;17.0;1;2.5;1;0.0;2.0;17.0;"D�bris coquilliers";10.0;0;0;0;20;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.05;2.75;0.0;0.0;0.0;0.0;0.0;2.75;;;;;;;;;;;;;;;;;;;; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche";"Chassiron Sept16 Q5BFix.JPG";"sept16-ChasQ5";0.0;;13.0;2;7.0;2;0.0;0.5;65.0;"Sable grossier";5.0;0;0;0;6;0;0;;;;;;0;0;0;0;0;0;0;1;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge-Verte";"Chassiron Sept16 Q3B5 Fsup.JPG";"sept16-ChasB5sup";0.0;;25.0;2;13.0;2;0.0;6.0;24.0;"D�bris coquilliers";13.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;6.25;1.0;0.0;0.05;0.0;0.0;0.0;0.05;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"Chassiron Sept16 Q3B5 Finf.JPG";"sept16-ChasB5inf";0.0;;4.0;2;0.75;2;0.0;1.5;1.0;"Sable grossier";9.0;0;0;0;0;0;0;5;15;0;3;8;620;13;15;1;1;12;1680;0;0;0.1;1.25;0.0;18.5;1.5;0.0;0.75;0.25;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Rouge";"Chassiron Sept16 Q3B6 Fsup.JPG";"sept16-ChasB6sup";0.0;;25.0;2;20.0;2;0.0;7.0;14.0;"D�bris coquilliers";5.5;0;0;0;0;0;0;;;;;;31;0;0;0;0;0;0;0;0;5.5;3.0;0.0;3.0;0.0;0.0;0.0;0.0;;0.0;"Sable grossier";;0;0;0;0;0;0;0;0;6;0;0;0;0;0;1; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"Chassiron Sept16 Q3B6 Finf.JPG";"sept16-ChasB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";7.0;0;0;0;0;0;0;9;6;8;14;4;820;0;17;8;29;6;2400;0;0;0.0;1.25;6.0;5.5;5.0;0.15;1.5;0.25;;0.0;"Sable grossier";;0;0;0;0;0;0;0;0;6;0;0;0;0;0;1; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche";"Chassiron Sept16 Q5B9 Fsup.JPG";"sept16-ChasB9sup";0.0;;1.5;2;8.5;1;0.0;5.0;1.5;"Sable grossier";37.0;0;0;0;45;0;0;;;;;;9;0;0;0;0;0;0;0;0;0.65;10.0;0.15;1.6;0.0;0.0;0.0;2.75;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"Chassiron Sept16 Q5B9 Finf.JPG";"sept16-ChasB9inf";0.0;;0.5;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";1.5;0;0;0;2;0;0;13;8;16;17;11;1300;11;6;15;4;13;1960;0;0;0.125;6.0;5.0;3.5;5.0;0.0;0.0;2.5;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"Chassiron Sept16 Q4B7 Fsup.JPG";"sept16-ChasB7sup";0.0;;0.0;;0.0;;0.0;19.0;0.0;"Pas de s�diment";15.0;0;1;0;14;0;0;2;0;1;0;1;80;0;0;0;0;0;0;0;0;0.05;5.0;0.0;0.0;0.0;0.0;0.0;0.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;7;0;0;0;0;0; +375953;"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"Chassiron Sept16 Q4B7 Finf.JPG";"sept16-ChasB7inf";0.0;;0.0;;0.0;;0.0;2.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;15;7;9;13;18;1240;33;8;9;29;10;3560;0;0;0.0;4.5;2.0;1.5;1.5;0.0;1.5;0.05;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;7;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"Qref5.JPG";"nov14-STJfbZPQ5";0.0;;70.0;1;0.0;;0.0;1.0;25.0;"D�bris coquilliers";3.0;0;0;0;0;0;0;;;;;;0;;;;;;0;0;0;0.25;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Color�e";"Qref3.JPG";"nov14-STJfbZPQ3";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";65.0;0;0;0;0;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;45.0;;;;;;;;;;;;;;;;;;;; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"BM8_Sup.JPG";"nov14-STJfbZPB8sup";0.0;;50.0;1;0.25;1;0.0;0.125;11.5;"D�bris coquilliers";5.0;0;0;0;6;0;0;;;;;;0;;;;;;0;0;0;1.5;0.0;0.0;0.0;0.0;0.0;0.0;4.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"BM8_Inf.JPG";"nov14-STJfbZPB8inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;0;0;1;0;0;;;;;;23;;;;;;5080;0;0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;0.5;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Color�e";"BM5_Sup.JPG";"nov14-STJfbZPB5sup";0.0;;9.0;1;2.5;1;0.0;0.0;0.0;"Pas de s�diment";16.0;0;0;0;1;0;0;;;;;;0;;;;;;0;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;9.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"BM5_Inf.JPG";"nov14-STJfbZPB5inf";0.0;;2.5;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";2.5;0;0;0;6;0;0;;;;;;4;;;;;;9840;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;3.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Color�e";"BM4_Sup.JPG";"nov14-STJfbZPB4sup";0.0;;21.0;1;14.0;1;0.0;5.0;0.0;"Pas de s�diment";8.0;0;0;1;4;0;0;;;;;;0;;;;;;1720;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;5.5;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"BM4_Inf.JPG";"nov14-STJfbZPB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;2;3;0;0;;;;;;29;;;;;;3920;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"Qref4.JPG";"nov14-STJfbZPQ4";0.0;;90.0;1;5.0;1;0.0;0.0;25.0;"D�bris coquilliers";0.5;0;0;0;1;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;3.0;;;;;;;;;;;;;;;;;;;; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge-Verte";"Qref2.JPG";"nov14-STJfbZPQ2";0.0;;23.0;1;18.0;1;0.0;0.0;0.5;"D�bris coquilliers";2.0;0;0;0;1;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;9.0;;;;;;;;;;;;;;;;;;;; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"Qref1.JPG";"nov14-STJfbZPQ1";0.0;;42.0;1;5.0;1;0.0;0.0;9.0;"D�bris coquilliers";10.0;0;0;0;0;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;8.0;;;;;;;;;;;;;;;;;;;; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"BM10_Sup.JPG";"nov14-STJfbZPB10sup";0.0;;60.0;1;2.0;1;0.0;2.0;85.0;"D�bris coquilliers";9.0;0;0;0;0;0;0;;;;;;0;;;;;;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;1;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"BM10_Inf.JPG";"nov14-STJfbZPB10inf";0.0;;1.5;2;0.75;1;0.0;1.5;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;33;;;;;;1520;0;0;0.0;0.0;9.5;1.5;0.0;0.0;0.0;0.5;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;1;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"BM9_Sup.JPG";"nov14-STJfbZPB9sup";0.0;;25.0;1;0.25;1;0.0;15.0;25.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;1;0;0;0;0;0;0;0;0;1;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"BM9_Inf.JPG";"nov14-STJfbZPB9inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;71;;;;;;2120;0;0;0.0;0.0;0.0;2.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;1;0;0;0;0;0;0;0;0;1;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"BM7_Sup.JPG";"nov14-STJfbZPB7sup";0.0;;0.0;;45.0;1;0.0;0.0;0.0;"Pas de s�diment";20.0;0;0;3;6;0;0;;;;;;0;;;;;;1480;0;0;0.25;0.0;0.0;0.0;0.0;0.0;0.0;3.0;;3.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf.JPG";"nov14-STJfbZPB7inf";0.0;;2.0;1;0.0;;0.0;1.5;0.0;"Pas de s�diment";22.0;0;0;2;8;0;0;;;;;;0;;;;;;1840;0;0;4.0;0.0;0.0;0.0;0.0;0.0;0.0;10.0;;3.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"BM6_Sup.JPG";"nov14-STJfbZPB6sup";0.0;;7.0;1;7.0;1;0.0;0.5;4.5;"D�bris coquilliers";3.0;0;0;0;0;0;0;;;;;;0;;;;;;240;0;0;3.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"BM6_Inf.JPG";"nov14-STJfbZPB6inf";0.0;;0.125;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.5;0;0;0;0;0;0;;;;;;11;;;;;;7280;0;1;0.0;0.0;0.0;0.0;0.125;0.0;0.0;0.5;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"BM3_Sup.JPG";"nov14-STJfbZPB3sup";0.0;;25.0;2;0.5;1;0.0;1.0;15.0;"D�bris coquilliers";0.5;0;0;0;0;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"BM3_Inf.JPG";"nov14-STJfbZPB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;18;;;;;;2240;0;0;0.0;0.0;1.5;1.25;0.5;0.0;0.0;0.5;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge-Verte";"BM2_Sup.JPG";"nov14-STJfbZPB2sup";0.0;;35.0;1;35.0;1;0.0;0.0;4.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"BM2_Inf.JPG";"nov14-STJfbZPB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;;;;;;23;;;;;;69800;0;0;1.0;0.0;0.0;0.0;0.0;0.0;1.5;2.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"BM1_Sup.JPG";"nov14-STJfbZPB1sup";0.0;;29.0;1;11.0;1;0.0;0.0;2.0;"D�bris coquilliers";11.0;0;0;2;3;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;15.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376020;"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"BM1_Inf.JPG";"nov14-STJfbZPB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;23;;;;;;10080;0;0;0.0;0.0;3.0;0.5;0.0;0.0;0.0;1.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"QRef3 DSC_2863.JPG";"mars15-STJfbZPQ3";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";18.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;40.0;;;;;;;;;;;;;;;;;;;; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge-Verte";"QRef2 DSC_2786.JPG";"mars15-STJfbZPQ2";0.0;;40.0;1;9.0;1;0.0;0.0;75.0;"Sable fin";8.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";"QRef1 DSC_2689.JPG";"mars15-STJfbZPQ1";0.0;;5.0;1;1.0;1;0.0;0.0;3.0;"Sable fin";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;65.0;;;;;;;;;;;;;;;;;;;; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge-Verte";"BM10_Sup DSC_2813.JPG";"mars15-STJfbZPB10sup";0.0;;15.0;1;15.0;1;0.0;0.5;75.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;15.0;"Blocs";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"BM10_Inf DSC_2818.JPG";"mars15-STJfbZPB10inf";0.0;;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;8;22;9;19;5;15;2800;0;0;0.5;0.0;6.0;0.0;3.0;0.0;0.0;0.0;;15.0;"Blocs";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"BM9_Sup DSC_2797.JPG";"mars15-STJfbZPB9sup";0.0;;25.0;1;9.0;1;0.0;0.125;5.0;"Sable fin";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"BM9_Inf DSC_2801.JPG";"mars15-STJfbZPB9inf";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;4;17;13;0;3;16;1960;0;0;0.0;0.0;20.0;2.0;1.0;6.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"BM8_Sup DSC_3033.JPG";"mars15-STJfbZPB8sup";0.0;;5.5;1;13.0;1;0.0;0.0;25.0;"Sable fin";0.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.5;0.0;0.0;0.0;0.5;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;7;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"BM8_Inf DSC_3056.JPG";"mars15-STJfbZPB8inf";0.0;;4.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;7;7;4;28;8;13;2400;0;0;0.0;0.25;1.5;0.125;1.5;0.0;0.0;4.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;7;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Rouge";"BM7_Sup DSC_3001.JPG";"mars15-STJfbZPB7sup";0.0;;10.0;1;0.5;2;0.0;0.5;25.0;"Sable fin";5.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.5;0.0;0.0;0.25;0.0;0.0;0.0;;;2.0;"Blocs";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_3020.JPG";"mars15-STJfbZPB7inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;1;22;4;46;28;20;4800;0;0;3.0;1.5;6.0;1.0;1.0;1.5;0.0;17.0;;2.0;"Blocs";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"6";"face sup�rieure";"Verte";"BM6_Sup DSC_2844.JPG";"mars15-STJfbZPB6sup";0.0;;1.0;1;30.0;1;0.0;0.0;15.0;"Sable fin";0.5;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;4.5;;2.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;3;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"BM6_Inf DSC_2854.JPG";"mars15-STJfbZPB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;4.0;0.0;0.0;0.0;0.0;0.0;0.0;16.0;;2.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;3;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"5";"face sup�rieure";"Verte";"BM5_Sup DSC_2820.JPG";"mars15-STJfbZPB5sup";0.0;;1.5;1;50.0;1;0.0;0.0;19.0;"Sable fin";1.0;0;0;2;1;0;0;;;;;;0;0;0;0;0;0;0;3;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;7.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"BM5_Inf DSC_2827.JPG";"mars15-STJfbZPB5inf";0.0;;4.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;1;20;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.5;0.0;0.0;0.0;0.0;0.0;0.0;3.0;;7.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"BM4_Sup DSC_2758.JPG";"mars15-STJfbZPB4sup";0.0;;4.0;1;1.0;1;0.0;0.25;100.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;3.0;0.0;0.0;0.0;0.0;;15.0;"Blocs";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"BM4_Inf DSC_2779.JPG";"mars15-STJfbZPB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;14;23;6;9;17;5;2400;0;0;0.0;0.0;15.0;6.5;5.0;0.0;0.0;0.0;;15.0;"Blocs";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"BM3_Sup DSC_2727.JPG";"mars15-STJfbZPB3sup";0.0;;15.0;1;15.0;1;0.0;0.5;80.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;75.0;"Blocs";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"BM3_Inf DSC_2738.JPG";"mars15-STJfbZPB3inf";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;15;10;6;28;3;7;2160;0;0;0.0;0.0;9.0;4.0;1.0;0.0;0.0;0.125;;75.0;"Blocs";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"BM2_Sup DSC_2675.JPG";"mars15-STJfbZPB2sup";0.0;;4.0;1;70.0;1;0.0;0.0;2.0;"Sable fin";0.5;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;15.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"BM2_Inf DSC_2686.JPG";"mars15-STJfbZPB2inf";0.0;;5.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";35.0;0;0;1;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;5.0;0.0;0.0;0.0;0.0;0.0;0.0;1.5;;15.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Rouge";"BM1_Sup DSC_2669.JPG";"mars15-STJfbZPB1sup";0.0;;16.0;1;9.0;1;0.0;0.0;17.0;"Sable fin";20.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;6.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;3;0;0;0;0;0;0;0;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"BM1_Inf DSC_2673.JPG";"mars15-STJfbZPB1inf";0.0;;0.0;;0.0;;0.0;5.0;0.0;"Pas de s�diment";2.0;0;0;2;2;0;0;;;;;;5;26;24;7;16;3;3040;0;0;0.0;0.0;1.0;0.5;0.0;0.0;0.0;2.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;3;0;0;0;0;0;0;0;0;0;0;0;0; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Roche en place";"5";"face sup�rieure";"Blanche";"QRef5 DSC_2980.JPG";"mars15-STJfbZPQ5";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;30.0;;;;;;;;;;;;;;;;;;;; +376087;"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"QRef4 DSC_3076.JPG";"mars15STJfbZPQ4";0.0;;30.0;1;10.0;1;0.0;0.0;8.0;"Sable fin";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.5;0.0;0.0;0.0;0.0;0.0;0.0;25.0;;;;;;;;;;;;;;;;;;;; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Verte";"BM7_Sup DSC_3483.JPG";"mai15-STJfbZPB7sup";0.0;;6.0;1;35.0;1;0.0;1.0;45.0;"Sable fin";13.0;0;0;0;1;0;0;;;;;;1;0;0;0;0;0;0;0;0;1.5;0.0;0.0;1.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_3485.JPG";"mai15-STJfbZPB7inf";0.0;;2.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";6.0;0;0;0;2;0;0;;;;;;22;44;38;9;32;16;5560;0;28;0.125;0.0;4.0;2.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche-Rouge";"BM8_Sup DSC_3487.JPG";"mai15-STJfbZPB8sup";0.0;;50.0;1;1.0;2;0.0;0.0;30.0;"Sable fin";8.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.5;0.0;0.0;0.0;0.0;0.0;0.0;3.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"BM8_Inf DSC_3491.JPG";"mai15-STJfbZPB8inf";0.0;;0.5;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";4.0;0;0;0;22;0;0;;;;;;14;10;22;0;9;35;3040;0;3;0.0;0.0;7.0;2.5;0.0;0.0;0.0;1.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge-Verte";"BM9_Sup DSC_3499.JPG";"mai15-STJfbZPB9sup";0.0;;20.0;1;35.0;1;0.0;1.0;85.0;"Sable fin";1.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"BM9_Inf DSC_3507.JPG";"mai15-STJfbZPB9inf";0.0;;7.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;41;29;4;38;21;5;3880;0;0;0.0;0.0;14.0;1.0;2.5;0.0;16.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge-Verte";"BM10_Sup DSC_3510.JPG";"mai15-STJfbZPB10sup";0.0;;11.0;1;14.0;1;0.0;1.5;100.0;"Sable fin";1.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;4;0;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"BM10_Inf DSC_3519.JPG";"mai15-STJfbZPB10inf";0.0;;6.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;32;0;23;11;0;53;3480;0;0;0.0;0.0;25.0;10.0;20.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;4;0;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche-Verte";"QRef1 DSC_3408.JPG";"mai15-STJfbZPQ1";0.0;;5.0;1;85.0;1;0.0;0.0;70.0;"Sable fin";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge-Verte";"BM1_Sup DSC_3393.JPG";"mai15-STJfbZPB1sup";0.0;;85.0;1;2.5;1;0.0;0.0;55.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;7;0;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"BM1_Inf DSC_3396.JPG";"mai15-STJfbZPB1inf";0.0;;4.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";6.0;0;0;0;1;0;0;;;;;;31;21;0;26;6;24;3080;0;10;0.0;0.0;8.0;7.0;4.5;2.0;0.0;1.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;7;0;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge-Verte";"QRef4 DSC_3492.JPG";"mai15STJfbZPQ4";0.0;;12.0;1;35.0;1;0.0;0.0;60.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;2.0;;;;;;;;;;;;;;;;;;;; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge-Verte";"QRef5 DSC_3522.JPG";"mai15-STJfbZPQ5";0.0;;25.0;1;30.0;1;0.0;0.5;75.0;"Sable fin";6.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge-Verte";"BM5_Sup DSC_3433.JPG";"mai15-STJfbZPB5sup";0.0;;11.0;1;15.0;1;0.0;0.0;7.0;"Sable fin";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;1;2;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"BM5_Inf DSC_3434.JPG";"mai15-STJfbZPB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;16;56;19;28;15;39;6280;1;1;0.0;0.0;2.5;11.0;1.0;0.0;0.0;1.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;1;2;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"BM4_Sup DSC_3423.JPG";"mai15-STJfbZPB4sup";0.0;;12.0;1;6.5;1;0.0;0.5;62.5;"Sable fin";0.0;0;0;0;1;0;0;;;;;;3;0;0;0;0;0;0;0;0;3.0;0.0;0.0;2.0;0.0;0.0;0.0;0.5;;15.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"BM4_Inf DSC_3425.JPG";"mai15-STJfbZPB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;1;0;0;0;;;;;;48;24;0;0;46;5;3000;0;0;0.5;0.0;10.0;0.5;10.0;0.0;0.0;1.0;;15.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Verte";"BM3_Sup DSC_3417.JPG";"mai15-STJfbZPB3sup";0.0;;5.0;1;75.0;1;0.0;0.0;17.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche-Rouge";"BM3_Inf DSC_3420.JPG";"mai15-STJfbZPB3inf";0.0;;20.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";23.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;0.0;6.0;0.0;0.0;0.0;0.0;9.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"BM2_Sup DSC_3404.JPG";"mai15-STJfbZPB2sup";0.0;;1.0;1;30.0;1;0.0;0.5;20.0;"Sable fin";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;2;4.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;2;0;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"BM2_Inf DSC_3406.JPG";"mai15-STJfbZPB2inf";0.0;;1.5;1;0.0;;0.0;1.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;19;7;38;26;31;20;4880;0;2;0.0;0.0;0.0;0.5;0.0;0.0;0.0;0.5;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;2;0;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche";"QRef2 DSC_3427.JPG";"mai15-STJfbZPQ2";0.0;;6.0;1;9.0;1;0.0;0.0;8.0;"Sable fin";30.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.0;0.0;0.0;0.0;0.0;0.0;0.0;15.0;;;;;;;;;;;;;;;;;;;; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"QRef3 DSC_3445.JPG";"mai15-STJfbZPQ3";0.0;;6.0;1;10.0;1;0.0;0.0;8.0;"Sable fin";25.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;20.0;;;;;;;;;;;;;;;;;;;; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"BM6_Sup DSC_3437.JPG";"mai15-STJfbZPB6sup";0.0;;1.5;1;15.0;1;0.0;0.0;35.0;"Sable fin";35.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;6.0;;7.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376154;"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"BM6_Inf DSC_3442.JPG";"mai15-STJfbZPB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;3;0;0;;;;;;1;67;35;19;83;60;10560;0;3;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;7.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"QRef5 DSC_3642.JPG";"aout15-STJfbZPQ5";0.0;;70.0;1;1.0;1;0.0;0.0;70.0;"Sable fin";6.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"BM8_Sup DSC_3562.JPG";"aout15-STJfbZPB8sup";0.0;;17.0;1;3.5;1;0.0;0.0;1.5;"D�bris coquilliers";2.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;1;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"BM8_Inf DSC_3571.JPG";"aout15-STJfbZPB8inf";0.0;;2.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;15;22;33;19;14;6;3760;2;0;0.0;0.0;8.0;1.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Verte";"BM3_Sup DSC_3662.JPG";"aout15-STJfbZPB3sup";0.0;;6.0;1;63.0;1;0.0;0.0;14.0;"D�bris coquilliers";14.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"BM3_Inf DSC_3664.JPG";"aout15-STJfbZPB3inf";0.0;;1.5;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";7.0;0;0;0;0;0;0;;;;;;6;31;43;66;22;32;7760;13;0;0.5;0.0;0.0;3.0;0.5;0.0;0.0;3.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Verte";"BM1_Sup DSC_3645.JPG";"aout15-STJfbZPB1sup";0.0;;10.0;1;22.0;1;0.0;0.0;1.0;"Sable fin";5.0;4;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;6.0;0.0;0.0;0.0;0.0;0.0;0.0;2.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche-Rouge";"BM1_Inf DSC_3650.JPG";"aout15-STJfbZPB1inf";0.0;;11.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";5.0;2;0;0;1;0;0;;;;;;28;16;22;23;10;29;4000;0;0;1.5;0.0;0.0;15.0;0.0;0.0;0.0;5.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche-Verte";"BM2_Sup DSC_3651.JPG";"aout15-STJfbZPB2sup";0.0;;15.0;1;16.0;1;0.0;0.0;15.0;"Sable fin";20.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;9.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;22;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"BM2_Inf DSC_3656.JPG";"aout15-STJfbZPB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;26;24;12;7;20;25;3520;0;0;0.0;0.0;0.5;1.5;1.0;0.0;0.0;0.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;22;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"BM4_Sup DSC_3665.JPG";"aout15-STJfbZPB4sup";0.0;;0.5;1;15.0;1;0.0;0.0;0.0;"Pas de s�diment";13.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;1;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"BM4_Inf DSC_3668.JPG";"aout15-STJfbZPB4inf";0.0;;0.0;;0.5;1;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;0;1;0;0;;;;;;17;19;13;6;28;23;3560;10;0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;10.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"BM5_Sup DSC_3579.JPG";"aout15-STJfbZPB5sup";0.0;;25.0;1;6.0;1;0.0;1.0;100.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.25;;10.0;"Blocs";;0;0;0;0;0;0;0;4;1;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"BM5_Inf DSC_3593.JPG";"aout15-STJfbZPB5inf";0.0;;0.0;;4.0;1;0.0;1.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;40;18;8;48;24;28;5040;0;0;0.0;0.0;1.0;4.5;20.0;0.0;0.0;0.5;;10.0;"Blocs";;0;0;0;0;0;0;0;4;1;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Verte";"BM6_Sup DSC_3594.JPG";"aout15-STJfbZPB6sup";0.0;;4.0;1;95.0;1;0.0;0.0;7.0;"Sable fin";1.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;10.0;"Blocs";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche-Rouge";"BM6_Inf DSC_3598.JPG";"aout15-STJfbZPB6inf";0.0;;15.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";6.0;0;0;0;4;0;0;;;;;;0;29;3;20;26;21;3960;0;0;3.0;0.0;2.0;0.0;0.0;0.0;0.0;10.0;;10.0;"Blocs";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"BM7_Sup DSC_3558.JPG";"aout15-STJfbZPB7sup";0.0;;0.0;;95.0;1;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;44.0;;23.0;"Blocs";;0;0;0;0;0;0;0;6;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_3561.JPG";"aout15-STJfbZPB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";21.0;0;0;0;4;0;0;;;;;;0;36;34;103;15;26;8560;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.25;;23.0;"Blocs";;0;0;0;0;0;0;0;6;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"BM9_Sup DSC_3607.JPG";"aout15-STJfbZPB9sup";0.0;;35.0;1;0.0;;0.0;0.0;100.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;15.0;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"BM9_Inf DSC_3622.JPG";"aout15-STJfbZPB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;32;23;10;32;2;18;3400;1;0;0.0;0.0;6.0;5.5;5.0;0.0;0.0;0.0;;15.0;"Roche en place";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"BM10_Sup DSC_3625.JPG";"aout15-STJfbZPB10sup";0.0;;60.0;1;3.0;2;0.0;0.0;80.0;"Sable fin";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"BM10_Inf DSC_3640.JPG";"aout15-STJfbZPB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;38;0;23;12;2;7;1760;0;0;0.0;0.0;0.5;10.0;3.0;0.0;0.0;0.0;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";"QRef1 DSC_3658.JPG";"aout15-STJfbZPQ1";0.0;;5.0;1;20.0;1;0.0;0.0;0.0;"Pas de s�diment";24.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;28.0;;;;;;;;;;;;;;;;;;;; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche";"QRef2 DSC_3673.JPG";"aout15-STJfbZPQ2";0.0;;0.0;;0.5;1;0.0;0.0;5.0;"Sable fin";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;10.0;0.0;0.0;0.0;0.0;0.0;0.0;60.0;;;;;;;;;;;;;;;;;;;; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge-Verte";"QRef3 DSC_3603.JPG";"aout15-STJfbZPQ3";0.0;;30.0;1;17.0;1;0.0;0.0;85.0;"Sable fin";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376221;"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Blanche";"QRef4 DSC_3577.JPG";"aout15STJfbZPQ4";0.0;;5.0;1;0.25;1;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;9.0;0.0;0.0;0.0;0.0;0.0;0.0;60.0;;;;;;;;;;;;;;;;;;;; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";;"sep15-STJfbZPB3sup";0.0;;40.0;1;4.0;1;0.0;0.0;0.0;"Pas de s�diment";6.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;8.0;;15.0;"Blocs";;0;0;0;1;0;0;0;0;1;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Rouge";;"sep15-STJfbZPB3inf";0.0;;7.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;10;38;13;6;22;16;3800;3;0;0.0;0.0;5.0;3.0;2.0;0.0;0.0;0.5;;15.0;"Blocs";;0;0;0;1;0;0;0;0;1;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"BM5_Sup DSC_3975.JPG";"sep15-STJfbZPB5sup";0.0;;25.0;1;4.0;1;0.0;0.0;25.0;"D�bris coquilliers";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;50.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"BM5_Inf DSC_3978.JPG";"sep15-STJfbZPB5inf";0.0;;4.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";3.0;0;0;0;9;0;0;;;;;;10;75;19;3;23;19;5560;0;17;0.5;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;50.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"BM4_Sup DSC_3946.JPG";"sep15-STJfbZPB4sup";0.0;;30.0;1;9.0;1;0.0;0.0;100.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"BM4_Inf DSC_3949.JPG";"sep15-STJfbZPB4inf";0.0;;1.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;19;14;17;36;15;16;3920;0;0;0.0;0.0;4.5;50.0;2.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche-Rouge";"BM2_Sup DSC_4068.JPG";"sep15-STJfbZPB2sup";0.0;;15.0;1;8.0;1;0.0;0.0;20.0;"D�bris coquilliers";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.5;0.0;0.0;0.0;0.0;0.0;0.0;10.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"BM2_Inf DSC_4070.JPG";"sep15-STJfbZPB2inf";0.0;;0.5;1;0.0;;0.0;3.5;0.0;"Pas de s�diment";0.0;0;0;1;1;0;0;;;;;;16;47;13;11;12;9;3680;3;0;0.0;0.0;0.5;2.0;6.0;0.0;0.0;7.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"BM1_Sup DSC_4054.JPG";"sep15-STJfbZPB1sup";0.0;;9.0;1;7.0;1;0.0;0.0;5.0;"D�bris coquilliers";9.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.5;0.0;0.0;0.0;0.0;0.0;0.0;20.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"BM1_Inf DSC_4060.JPG";"sep15-STJfbZPB1inf";0.0;;1.0;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;34;40;24;14;26;21;5000;6;0;0.0;0.0;6.0;3.0;0.125;0.0;0.0;1.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge-Verte";"QRef5 DSC_4053.JPG";"sep15-STJfbZPQ5";0.0;;35.0;1;17.0;2;0.0;0.0;100.0;"D�bris coquilliers";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Blanche";"QRef4 DSC_3970.JPG";"sep15-STJfbZPQ4";0.0;;20.0;1;0.5;1;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;60.0;;;;;;;;;;;;;;;;;;;; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"QRef3 DSC_3987.JPG";"sep15-STJfbZPQ3";0.0;;42.0;1;3.0;1;0.0;0.0;55.0;"D�bris coquilliers";11.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Blanche-Verte";"QRef2 DSC_3953.JPG";"sep15-STJfbZPQ2";0.0;;8.0;1;12.0;1;0.0;0.0;11.0;"Sable fin";32.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;4.0;;;;;;;;;;;;;;;;;;;; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Verte";"QRef1 DSC_4071.JPG";"sep15-STJfbZPQ1";0.0;;20.0;1;45.0;1;0.0;0.0;40.0;"D�bris coquilliers";11.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;32.5;;;;;;;;;;;;;;;;;;;; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge-Verte";"BM10_Sup DSC_4050.JPG";"sep15-STJfbZPB10sup";0.0;;40.0;1;20.0;2;0.0;0.5;85.0;"Sable fin";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"BM10_Inf DSC_4052.JPG";"sep15-STJfbZPB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.5;0;0;0;0;0;0;;;;;;13;38;3;18;6;14;3160;0;0;0.0;0.0;7.0;15.0;4.0;0.0;0.0;0.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"BM9_Sup DSC_4026.JPG";"sep15-STJfbZPB9sup";0.0;;60.0;1;6.0;1;0.0;0.0;100.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"BM9_Inf DSC_4043.JPG";"sep15-STJfbZPB9inf";0.0;;3.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;8;26;0;13;4;17;2400;0;0;0.0;0.0;10.0;30.0;3.5;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"BM8_Sup DSC_3961.JPG";"sep15-STJfbZPB8sup";0.0;;1.0;1;99.0;1;0.0;0.0;60.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.25;0.0;0.0;0.0;0.0;0.0;0.0;0.25;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"BM8_Inf DSC_3963.JPG";"sep15-STJfbZPB8inf";0.0;;1.5;1;0.0;;0.0;5.0;0.0;"Pas de s�diment";10.0;0;0;1;9;0;0;;;;;;0;12;8;43;16;32;4440;0;0;2.0;0.0;0.0;6.0;0.0;0.0;0.0;0.5;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Rouge";"BM7_Sup DSC_3955.JPG";"sep15-STJfbZPB7sup";0.0;;23.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";55.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;5.5;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_3957.JPG";"sep15-STJfbZPB7inf";0.0;;4.0;1;0.0;;0.0;2.0;0.0;"Pas de s�diment";0.5;0;0;1;3;0;0;;;;;;2;10;20;28;36;21;4600;17;0;0.0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Rouge";"BM6_Sup DSC_3984.JPG";"sep15-STJfbZPB6sup";0.0;;20.0;1;1.0;1;0.0;0.0;15.0;"D�bris coquilliers";18.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;2.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376288;"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"BM6_Inf DSC_3986.JPG";"sep15-STJfbZPB6inf";0.0;;0.5;1;0.0;;0.0;5.0;0.0;"Pas de s�diment";4.0;0;0;4;5;0;0;;;;;;0;48;6;33;37;17;5640;3;0;1.5;0.0;0.5;6.0;0.0;0.0;0.0;3.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Blanche";"QRef4 DSC_4506.JPG";"mars16-STJfbZPQ4";0.0;;0.5;1;5.0;1;0.0;0.0;0.0;"Pas de s�diment";6.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;9.0;0.0;0.0;0.0;0.0;0.0;0.0;80.0;;;;;;;;;;;;;;;;;;;; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"BM5_Sup DSC_4545.JPG";"mars16-STJfbZPB5sup";0.0;;7.0;1;3.0;1;0.0;0.0;3.0;"D�bris coquilliers";25.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;10.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;2;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"BM5_Inf DSC_4547.JPG";"mars16-STJfbZPB5inf";0.0;;1.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";4.0;0;0;3;10;0;0;;;;;;0;12;35;4;1;4;2240;0;35;6.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;2;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Verte";"BM6_Sup DSC_4548.JPG";"mars16-STJfbZPB6sup";0.0;;6.0;1;45.0;1;0.0;0.0;6.0;"D�bris coquilliers";7.0;0;0;0;1;0;0;;;;;;0;56;18;81;32;44;9240;0;6;3.0;0.0;0.0;0.0;0.0;0.0;0.0;2.0;;3.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"BM6_Inf DSC_4554.JPG";"mars16-STJfbZPB6inf";0.0;;0.0;;0.0;;0.0;3.0;0.0;"Pas de s�diment";5.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.0;0.0;0.0;0.0;0.0;0.0;0.0;10.0;;3.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"BM7_Sup DSC_4494.JPG";"mars16-STJfbZPB7sup";0.0;;15.0;1;9.0;1;0.0;0.0;2.0;"Sable fin";9.0;0;0;2;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;11.0;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"BM7_Inf DSC_4497.JPG";"mars16-STJfbZPB7inf";0.0;;0.5;1;0.0;;0.0;3.0;0.0;"Pas de s�diment";2.0;0;0;0;2;0;0;;;;;;5;38;12;10;7;15;3280;0;3;0.125;0.0;2.0;2.0;1.25;0.0;0.0;3.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"BM8_Sup DSC_4498.JPG";"mars16-STJfbZPB8sup";0.0;;60.0;2;15.0;1;0.0;5.0;50.0;"D�bris coquilliers";2.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;3;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"BM8_Inf DSC_4504.JPG";"mars16-STJfbZPB8inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;9;8;9;0;12;0;1160;0;1;0.0;0.0;0.0;6.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;3;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge-Verte";"BM9_Sup DSC_4508.JPG";"mars16-STJfbZPB9sup";0.0;;10.0;2;75.0;1;0.0;2.0;100.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;5;6;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"BM9_Inf DSC_4521.JPG";"mars16-STJfbZPB9inf";0.0;;7.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;10;23;12;13;14;17;3160;0;0;0.0;0.0;0.5;4.0;3.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;5;6;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge-Verte";"BM1_Sup DSC_4533.JPG";"mars16-STJfbZPB1sup";0.0;;30.0;1;50.0;1;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"BM1_Inf DSC_4536.JPG";"mars16-STJfbZPB1INF";0.0;;1.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;31;29;8;21;7;3840;0;8;0.0;0.0;0.5;5.0;0.5;0.0;0.0;4.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"BM2_Sup DSC_4537.JPG";"mars16-STJfbZPB2sup";0.0;;9.0;1;75.0;1;0.0;0.5;6.0;"D�bris coquilliers";2.0;0;0;0;0;0;0;;;;;;6;3;10;2;0;0;600;0;0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;3.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"BM2_Inf DSC_4542.JPG";"mars16-STJfbZPB2inf";0.0;;30.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;20.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Verte";"BM3_Sup DSC_4469.JPG";"mars16-STJfbZPB3sup";0.0;;8.0;1;13.0;1;0.0;0.0;5.0;"Sable fin";3.0;0;0;0;0;0;0;;;;;;0;11;0;0;3;5;760;0;3;0.0;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Rouge";"BM3_Inf DSC_4471.JPG";"mars16-STJfbZPB3inf";0.0;;30.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"BM4_Sup DSC_4476.JPG";"mars16-STJfbZPB4sup";0.0;;50.0;1;40.0;1;0.0;0.0;10.0;"Sable fin";20.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;3;0;0;0;0;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"BM4_Inf DSC_4479.JPG";"mars16-STJfbZPB4inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;12;81;16;3;0;9;4360;0;1;0.5;0.0;2.0;10.0;5.0;0.125;1.5;1.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;3;0;0;0;0;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge-Verte";"BM10_Sup DSC_4524.JPG";"mars16-STJfbZPB10sup";0.0;;30.0;1;15.0;1;0.0;4.0;60.0;"D�bris coquilliers";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"BM10_Inf DSC_4530.JPG";"mars16-STJfbZPB10inf";0.0;;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;27;11;15;24;33;13;3840;0;1;0.0;0.0;1.5;1.0;0.5;0.125;0.25;0.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Verte";"QRef1 DSC_4543.JPG";"mars16-STJfbZPQ1";0.0;;12.0;1;50.0;1;0.0;0.0;70.0;"Sable fin";8.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.25;0.0;0.0;0.0;0.0;0.0;0.0;15.0;;;;;;;;;;;;;;;;;;;; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Rouge";"QRef2 DSC_4475.JPG";"mars16-STJfbZPQ2";0.0;;55.0;1;15.0;1;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Blanche";"QRef3 DSC_4555.JPG";"mars16-STJfbZPQ3";0.0;;2.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.5;0.0;0.0;0.0;0.0;0.0;0.0;85.0;;;;;;;;;;;;;;;;;;;; +376355;"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Blanche";"QRef5 DSC_4531.JPG";"mars16-STJfbZPQ5";0.0;;2.0;1;1.5;1;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;70.0;;;;;;;;;;;;;;;;;;;; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"BM8_Sup DSC_4648.JPG";"mai16-STJfbZPB8sup";0.0;;30.0;1;10.0;2;0.0;0.0;50.0;"D�bris coquilliers";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;25.0;"Blocs";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"BM8_Inf DSC_4651.JPG";"mai16-STJfbZPB8inf";0.0;;30.0;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;21;38;1;12;17;3;2840;0;0;0.0;0.0;3.0;0.0;30.0;0.0;0.0;0.0;;25.0;"Blocs";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge-Verte";"QRef5 DSC_4680.JPG";"mai16-STJfbZPQ5";0.0;;50.0;1;4.0;1;0.0;0.0;75.0;"D�bris coquilliers";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"BM7_Sup DSC_4638.JPG";"mai16-STJfbZPB7sup";0.0;;2.0;1;5.0;2;0.0;0.0;10.0;"D�bris coquilliers";40.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.5;0.0;0.0;0.0;0.0;0.0;0.0;1.5;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;1;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_4644.JPG";"mai16-STJfbZPB7inf";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;6;0;0;;;;;;7;16;12;29;0;14;2840;0;10;0.5;2.0;0.0;0.25;0.0;0.0;0.0;10.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;1;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"BM10_Sup DSC_4675.JPG";"mai16-STJfbZPB10sup";0.0;;0.0;;0.0;;0.0;0.0;40.0;"Sable fin";2.0;0;0;0;0;0;0;;;;;;38;5;13;6;3;8;1400;0;0;0.0;0.0;1.0;0.5;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Verte";"BM10_Inf DSC_4677.JPG";"mai16-STJfbZPB10inf";0.0;;5.0;2;50.0;2;0.0;7.0;20.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge-Verte";"BM9_Sup DSC_4668.JPG";"mai16-STJfbZPB9sup";0.0;;15.0;1;25.0;2;0.0;1.0;60.0;"D�bris coquilliers";9.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;0.0;0.0;0.5;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;2;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"BM9_Inf DSC_4673.JPG";"mai16-STJfbZPB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;73;21;2;6;4;3;1440;0;0;0.0;0.0;15.0;50.0;8.0;0.5;4.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;2;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge-Verte";"BM1_Sup DSC_4679.JPG";"mai16-STJfbZPB1sup";0.0;;18.0;1;3.0;1;0.0;0.0;50.0;"D�bris coquilliers";30.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;1;6.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"BM1_Inf DSC_4682.JPG";"mai16-STJfbZPB1INF";0.0;;3.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;16;36;5;29;7;2;3160;0;6;0.125;0.0;5.0;0.5;0.0;0.0;3.0;2.5;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge-Verte";"Qref4 DSC_4652.JPG";"mai16-STJfbZPQ4";0.0;;70.0;1;25.0;2;0.0;0.0;90.0;"D�bris coquilliers";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;;;;;;;;;;;;;;;;;;; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Blanche";"Qref3 DSC_4634.JPG";"mai16-STJfbZPQ3";0.0;;5.0;1;0.0;;0.0;0.0;3.0;"D�bris coquilliers";17.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;12.0;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;;;;;;;;;;;;;;;;;;; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Blanche-Rouge";"QRef2 DSC_4664.JPG";"mai16-STJfbZPQ2";0.0;;20.0;2;5.0;2;0.0;0.0;25.0;"D�bris coquilliers";20.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;20.0;;;;;;;;;;;;;;;;;;;; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Verte";"QRef1 DSC_4688.JPG";"mai16-STJfbZPQ1";0.0;;3.0;1;60.0;1;0.0;0.0;57.0;"D�bris coquilliers";23.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;3.0;;;;;;;;;;;;;;;;;;;; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"BM2_Sup DSC_4683.JPG";"mai16-STJfbZPB2sup";0.0;;29.0;1;50.0;1;0.0;0.0;100.0;"D�bris coquilliers";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;5;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"BM2_Inf DSC_4687.JPG";"mai16-STJfbZPB2inf";0.0;;3.0;2;1.0;2;0.0;0.0;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;;;;;;21;30;8;15;25;14;3680;0;3;0.0;0.0;4.0;0.5;4.0;0.0;0.0;3.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;5;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche-Verte";"BM3_Sup DSC_4654.JPG";"mai16-STJfbZPB3sup";0.0;;0.0;;60.0;2;0.0;0.0;60.0;"D�bris coquilliers";25.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;2.0;;45.0;"Blocs";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"BM3_Inf DSC_4658.JPG";"mai16-STJfbZPB3inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";10.0;0;0;0;5;0;0;;;;;;36;4;7;10;6;7;1360;0;1;3.0;0.0;5.0;0.0;0.0;0.0;0.0;4.0;;45.0;"Blocs";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"BM4_Sup DSC_4659.JPG";"mai16-STJfbZPB4sup";0.0;;15.0;1;45.0;2;0.0;1.5;100.0;"D�bris coquilliers";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;1.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;4;0;1;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"BM4_Inf DSC_4663.JPG";"mai16-STJfbZPB4inf";0.0;;0.0;;0.25;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;175;30;14;6;4;22;3040;0;0;0.0;0.0;0.0;0.0;0.0;0.0;8.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;4;0;1;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Verte";"BM6_Sup DSC_4622.JPG";"mai16-STJfbZPB6sup";0.0;;0.0;;40.0;1;0.0;0.0;40.0;"D�bris coquilliers";18.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"BM6_Inf DSC_4633.JPG";"mai16-STJfbZPB6inf";0.0;;0.5;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";18.0;0;0;0;0;0;0;;;;;;3;4;6;0;3;4;680;0;3;0.5;0.0;0.0;0.0;0.0;0.0;0.0;30.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"BM5_Sup DSC_4601.JPG";"mai16-STJfbZPB5sup";0.0;;0.0;;1.5;1;0.0;0.0;0.0;"Pas de s�diment";60.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;1;0.5;0.0;0.0;0.0;0.0;0.0;0.0;4.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376422;"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"BM5_Inf DSC_4604.JPG";"mai16-STJfbZPB5inf";0.0;;0.5;2;0.5;2;0.0;0.5;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;;;;;;6;31;6;17;2;7;2520;0;12;0.5;0.0;2.5;0.0;0.0;0.0;0.0;3.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Blanche-Verte";"QRef1 DSC_4955.JPG";"ao�t16-STJfbZPQ1";0.0;;10.0;1;15.0;1;0.0;0.0;30.0;"D�bris coquilliers";9.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;12.5;;;;;;;;;;;;;;;;;;;; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Blanche-Verte";"QRef2 DSC_4895.JPG";"ao�t16-STJfbZPQ2";0.0;;15.0;1;20.0;1;0.0;0.0;35.0;"D�bris coquilliers";20.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;10.0;;;;;;;;;;;;;;;;;;;; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Verte";"QRef3 DSC_4934.JPG";"ao�t16-STJfbZPQ3";0.0;;2.0;1;45.0;1;0.0;0.0;30.0;"D�bris coquilliers";8.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge";"QRef4 DSC_4875.JPG";"ao�t16-STJfbZPQ4";0.0;;37.5;1;15.0;1;0.0;0.0;45.0;"D�bris coquilliers";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;9.0;;;;;;;;;;;;;;;;;;;; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"QRef5 DSC_4917.JPG";"ao�t16-STJfbZPQ5";0.0;;60.0;1;5.0;1;0.0;0.0;70.0;"D�bris coquilliers";11.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Verte";"BM4_Sup DSC_4881.JPG";"ao�t16-STJfbZPB4sup";0.0;;15.0;1;11.0;1;0.0;0.0;20.0;"D�bris coquilliers";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;12.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"BM4_Inf DSC_4886.JPG";"ao�t16-STJfbZPB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";9.0;0;0;0;0;0;0;;;;;;8;16;3;19;21;20;3160;12;0;7.0;0.0;0.0;0.0;0.0;0.0;0.0;15.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"BM3_Sup DSC_4877.JPG";"ao�t16-STJfbZPB3sup";0.0;;60.0;1;20.0;2;0.0;0.5;100.0;"Sable fin";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;6.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;1;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"BM3_Inf DSC_4880.JPG";"ao�t16-STJfbZPB3inf";0.0;;0.5;2;0.0;;0.0;0.25;0.0;"Pas de s�diment";0.0;0;0;1;1;0;0;;;;;;33;5;34;19;12;14;3360;7;0;0.0;0.0;0.0;10.0;3.0;0.125;0.0;0.25;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;1;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"BM2_Sup DSC_4951.JPG";"ao�t16-STJfbZPB2sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;0;0;0;0;;;;;;8;13;3;0;18;37;2840;2;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche-Rouge";"BM2_Inf DSC_4954.JPG";"ao�t16-STJfbZPB2inf";0.0;;20.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";30.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Rouge";"BM1_Sup DSC_4939.JPG";"ao�t16-STJfbZPB1sup";0.0;;20.0;1;12.0;1;0.0;0.0;30.0;"D�bris coquilliers";30.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;5.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;4;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"BM1_Inf DSC_4950.JPG";"ao�t16-STJfbZPB1INF";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;19;12;19;26;0;30;3480;12;0;0.0;0.0;0.0;20.0;5.0;0.0;0.0;3.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;4;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge-Verte";"BM9_Sup DSC_4907.JPG";"ao�t16-STJfbZPB9sup";0.0;;25.0;1;20.0;1;0.0;0.5;100.0;"D�bris coquilliers";2.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;1;0;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"BM9_Inf DSC_4912.JPG";"ao�t16-STJfbZPB9inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";2.5;0;0;0;0;0;0;;;;;;10;19;35;9;24;55;5680;0;0;0.0;0.0;0.5;10.0;5.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;1;0;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Verte";"BM5_Sup DSC_4919.JPG";"ao�t16-STJfbZPB5sup";0.0;;4.5;1;7.5;1;0.0;0.0;6.0;"D�bris coquilliers";30.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;12.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"BM5_Inf DSC_4922.JPG";"ao�t16-STJfbZPB5inf";0.0;;1.0;1;0.0;;0.0;3.0;0.0;"Pas de s�diment";6.0;0;0;0;0;0;0;;;;;;0;52;57;53;27;56;9800;0;0;1.5;0.0;0.0;0.0;0.0;0.0;0.0;15.0;;12.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Verte";"BM6_Sup DSC_4923.JPG";"ao�t16-STJfbZPB6sup";0.0;;1.0;1;15.0;1;0.0;0.0;6.0;"D�bris coquilliers";15.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;4;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;3.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"BM6_Inf DSC_4925.JPG";"ao�t16-STJfbZPB6inf";0.0;;0.5;1;0.5;1;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;0;25;43;21;22;27;5520;3;0;0.0;0.0;1.0;0.5;3.0;0.0;0.0;30.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"BM7_Sup DSC_4857.JPG";"ao�t16-STJfbZPB7sup";0.0;;0.5;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";65.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"BM7_Inf DSC_4861.JPG";"ao�t16-STJfbZPB7inf";0.0;;0.5;1;0.0;;0.0;2.5;0.0;"Pas de s�diment";1.5;0;0;4;8;0;0;;;;;;1;86;59;46;37;64;11680;0;0;1.5;0.0;0.0;0.0;20.0;0.0;0.0;2.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"BM8_Sup DSC_4862.JPG";"ao�t16-STJfbZPB8sup";0.0;;95.0;1;0.5;1;0.0;0.0;8.0;"Sable fin";0.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;3;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"BM8_Inf DSC_4867.JPG";"ao�t16-STJfbZPB8inf";0.0;;3.0;1;0.0;;0.0;5.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;9;16;5;40;11;31;4120;0;0;2.0;0.0;0.0;30.0;1.0;0.0;0.0;3.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;3;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Verte";"BM10_Sup DSC_4913.JPG";"ao�t16-STJfbZPB10sup";0.0;;0.5;1;85.0;2;0.0;0.0;35.0;"D�bris coquilliers";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;15.0;"Roche en place";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376489;"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"BM10_Inf DSC_4916.JPG";"ao�t16-STJfbZPB10inf";0.0;;5.0;2;0.25;1;0.0;1.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;0;28;32;37;34;29;6400;0;0;0.0;0.0;0.0;1.0;13.0;0.0;0.0;0.0;;15.0;"Roche en place";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Rouge";"QRef2 DSC_5081.JPG";"sept16-STJfbZPQ2";0.0;;45.0;2;15.0;2;0.0;0.0;75.0;"D�bris coquilliers";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;2.0;;;;;;;;;;;;;;;;;;;; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge-Verte";"BM10_Sup DSC_5098.JPG";"sept16-STJfbZPB10sup";0.0;;75.0;2;30.0;2;0.0;0.0;100.0;"D�bris coquilliers";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"BM10_Inf DSC_5100.JPG";"sept16-STJfbZPB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;10;21;18;8;11;17;3000;0;4;0.0;0.0;3.0;20.0;18.0;0.0;1.0;0.5;;50.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"BM4_Sup DSC_5077.JPG";"sept16-STJfbZPB4sup";0.0;;2.5;1;98.0;1;0.0;0.0;5.0;"D�bris coquilliers";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;1;0.25;0.0;0.0;0.0;0.0;0.0;0.0;2.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche-Rouge";"BM4_Inf DSC_5080.JPG";"sept16-STJfbZPB4inf";0.0;;5.0;1;1.0;1;0.0;0.0;0.0;"Pas de s�diment";25.0;0;0;0;2;0;0;;;;;;0;18;22;0;28;27;3800;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;3.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"BM3_Sup DSC_5073.JPG";"sept16-STJfbZPB3sup";0.0;;45.0;1;3.0;1;0.0;0.0;45.0;"D�bris coquilliers";11.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;6.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"BM3_Inf DSC_5076.JPG";"sept16-STJfbZPB3inf";0.0;;7.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;7;36;21;7;19;14;3880;0;3;0.0;0.0;3.0;1.0;0.5;0.0;0.25;2.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"BM2_Sup DSC_5127.JPG";"sept16-STJfbZPB2sup";0.0;;80.0;1;1.0;1;0.0;0.0;30.0;"D�bris coquilliers";15.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;7.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;50.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"BM2_Inf DSC_5133.JPG";"sept16-STJfbZPB2inf";0.0;;4.0;1;0.0;;0.0;2.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;11;38;21;15;30;4;4320;0;3;3.0;0.0;1.0;15.0;0.25;0.0;0.0;7.0;;50.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"BM1_Sup DSC_5118.JPG";"sept16-STJfbZPB1sup";0.0;;5.0;1;50.0;1;0.0;0.0;80.0;"D�bris coquilliers";7.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;3.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;13;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"BM1_Inf DSC_5120.JPG";"sept16-STJfbZPB1INF";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;4;40;20;26;29;47;6480;0;2;0.5;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;13;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Rouge";"BM5_Sup DSC_5159.JPG";"sept16-STJfbZPB5sup";0.0;;20.0;1;4.0;1;0.0;0.0;25.0;"D�bris coquilliers";30.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;8.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"BM5_Inf DSC_5162.JPG";"sept16STJfbZPB5inf";0.0;;1.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;7;37;48;51;16;43;7800;0;8;0.5;0.0;0.5;10.0;0.0;0.0;0.0;5.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"BM6_Sup DSC_5142.JPG";"sept16-STJfbZPB6sup";0.0;;5.0;1;2.0;1;0.0;0.0;2.0;"D�bris coquilliers";60.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;5;2.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;1;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"BM6_Inf DSC_5156.JPG";"sept16-STJfbZPB6inf";0.0;;1.0;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";0.0;0;0;1;6;0;0;;;;;;0;36;42;18;9;21;5040;0;2;2.5;0.0;0.0;0.0;0.0;0.0;0.0;35.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;1;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"BM7_Sup DSC_5083.JPG";"sept16-STJfbZPB7sup";0.0;;60.0;2;3.0;1;0.0;0.0;55.0;"D�bris coquilliers";7.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_5087.JPG";"sept16-STJfbZPB7inf";0.0;;1.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";9.0;0;0;2;6;0;0;;;;;;0;45;17;0;9;31;4080;0;6;0.25;0.0;0.0;0.0;0.0;0.0;0.0;7.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"BM8_Sup DSC_5088.JPG";"sept16-STJfbZPB8sup";0.0;;0.5;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";70.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;3.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"BM8_Inf DSC_5091.JPG";"sept16-STJfbZPB8inf";0.0;;0.5;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;4;7;0;0;;;;;;1;97;53;70;62;46;13120;0;0;1.0;0.0;0.0;5.0;0.0;0.0;0.0;7.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"BM9_Sup DSC_5095.JPG";"sept16-STJfbZPB9sup";0.0;;70.0;2;5.0;1;0.0;0.0;80.0;"D�bris coquilliers";17.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;40.0;"Blocs";;0;0;0;0;1;0;0;0;2;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche-Rouge";"BM9_Inf DSC_5097.JPG";"sept16-STJfbZPB9inf";0.0;;1.0;1;0.0;;0.0;1.0;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;43;19;42;26;35;31;6120;0;10;0.0;0.0;3.0;3.0;0.5;0.0;0.0;0.5;;40.0;"Blocs";;0;0;0;0;1;0;0;0;2;0;0;0;0;0;0; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge-Verte";"QRef5 DSC_5108.JPG";"sept16-STJfbZPQ5";0.0;;80.0;2;20.0;1;0.0;0.0;85.0;"D�bris coquilliers";15.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge-Verte";"QRef4 DSC_5092.JPG";"sept16-STJfbZPQ4";0.0;;50.0;1;23.0;1;0.0;0.0;50.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;25.0;;;;;;;;;;;;;;;;;;;; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Blanche-Rouge";"QRef3 DSC_5166.JPG";"sept16-STJfbZPQ3";0.0;;25.0;1;10.0;1;0.0;0.0;50.0;"D�bris coquilliers";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;50.0;;;;;;;;;;;;;;;;;;;; +376556;"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Verte";"QRef1 DSC_5138.JPG";"sept16-STJfbZPQ1";0.0;;15.0;1;40.0;1;0.0;0.0;60.0;"D�bris coquilliers";25.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";"QRef1 DSC_3136.JPG";"mars15-STJfbZFZPQ1";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";25.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.5;0.0;0.0;0.0;0.0;0.0;0.0;25.0;;;;;;;;;;;;;;;;;;;; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"BM3_Sup DSC_3160.JPG";"mars15-STJfbZFB3sup";0.0;;0.0;;0.0;;0.0;0.125;16.0;"Sable fin";2.5;0;0;0;0;0;0;;;;;;19;21;16;7;18;14;3040;0;0;3.0;0.0;2.0;0.5;0.0;0.5;0.0;1.5;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Rouge-Verte";"BM3_Inf DSC_3168.JPG";"mars15-STJfbZFB3inf";0.0;;27.0;2;10.0;1;0.0;0.0;7.0;"Sable fin";3.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.5;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"QRef3 DSC_3224.JPG";"mars15-STJfbZFQ3";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;22.0;;;;;;;;;;;;;;;;;;;; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge";"QRef4 DSC_3304.JPG";"mars15-STJfbZFQ4";0.0;;80.0;1;4.0;2;0.0;0.0;100.0;"Sable fin";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge-Verte";"QRef5 DSC_3356.JPG";"mars15-STJfbZFQ5";0.0;;34.0;1;25.0;1;0.0;0.0;35.0;"Sable fin";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"BM1_Sup DSC_3110.JPG";"mars15-STJfbZFB1sup";0.0;;0.0;;4.5;1;0.0;0.0;0.0;"Pas de s�diment";8.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;45.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"BM1_Inf DSC_3122.JPG";"mars15-STJfbZFB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";8.0;0;0;13;9;0;0;;;;;;0;8;6;0;0;27;1640;3;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;15.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"BM2_Sup DSC_3125.JPG";"mars15-STJfbZFB2sup";0.0;;4.0;1;1.5;1;0.0;10.0;0.0;"Pas de s�diment";8.0;0;0;0;0;0;0;;;;;;0;3;0;0;12;0;600;0;0;4.0;0.0;0.0;0.5;0.0;0.0;0.0;50.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche-Verte";"BM2_Inf DSC_3135.JPG";"mars15-STJfbZFB2inf";0.0;;2.0;1;15.0;1;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;4;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.5;0.0;0.0;0.0;0.0;0.0;0.0;4.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"BM4_Sup DSC_3170.JPG";"mars15-STJfbZFB4sup";0.0;;20.0;1;50.0;1;0.0;0.0;35.0;"Sable fin";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"BM4_Inf DSC_3173.JPG";"mars15-STJfbZFB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;12;5;4;8;7;18;2120;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge-Verte";"BM5_Sup DSC_3199.JPG";"mars15-STJfbZFB5sup";0.0;;20.0;1;20.0;1;0.0;0.5;25.0;"Sable fin";6.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;2;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"BM5_Inf DSC_3212.JPG";"mars15-STJfbZFB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;5;24;9;17;31;3440;9;0;0.0;0.0;5.0;20.0;10.0;0.0;0.0;1.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;2;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Verte";"BM7_Sup DSC_3281.JPG";"mars15-STJfbZFB7sup";0.0;;2.5;1;45.0;1;0.0;0.0;100.0;"Sable grossier";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;30.0;"Blocs";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_3292.JPG";"mars15-STJfbZFB7inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";3.0;0;0;0;1;0;0;;;;;;1;26;38;37;47;14;6480;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;30.0;"Blocs";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"BM8_Sup DSC_3294.JPG";"mars15-STJfbZFB8sup";0.0;;25.0;1;55.0;1;0.0;0.0;35.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"BM8_Inf DSC_3301.JPG";"mars15-STJfbZFB8inf";0.0;;1.5;1;0.5;1;0.0;0.0;0.0;"Pas de s�diment";0.5;0;0;0;0;0;0;;;;;;0;28;7;52;24;25;5440;2;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.25;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge-Verte";"BM9_Sup DSC_3325.JPG";"mars15-STJfbZFB9sup";0.0;;35.0;1;11.0;1;0.0;0.0;75.0;"Sable fin";4.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;1;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"BM9_Inf DSC_3335.JPG";"mars15-STJfbZFB9inf";0.0;;5.0;1;0.0;;0.0;3.0;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;19;21;52;16;15;36;5600;0;0;0.0;0.0;2.0;0.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;1;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"BM10_Sup DSC_3342.JPG";"mars15-STJfbZFB10sup";0.0;;6.0;1;5.0;1;0.0;1.0;0.0;"Pas de s�diment";9.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;10.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"BM10_Inf DSC_3353.JPG";"mars15-STJfbZFB10inf";0.0;;3.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;1;0;0;;;;;;8;22;3;38;12;0;3000;0;0;0.0;0.0;15.0;25.0;1.5;0.0;0.0;0.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;2;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Rouge";"QRef2 DSC_3175.JPG";"mars15-STJfbZFQ2";0.0;;60.0;1;5.0;1;0.0;0.0;30.0;"Sable fin";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"BM6_Sup DSC_3213.JPG";"mars15-STJfbZFB6sup";0.0;;3.0;1;50.0;1;0.0;4.0;5.0;"Sable fin";1.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376623;"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"BM6_Inf DSC_3221.JPG";"mars15-STJfbZFB6inf";0.0;;0.0;;0.0;;0.0;8.0;0.0;"Pas de s�diment";20.0;0;0;0;0;0;0;;;;;;37;21;36;22;12;17;4320;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"BM4_Sup DSC_3770.JPG";"aou15-STJfbZFB4sup";0.0;;20.0;1;45.0;1;0.0;0.0;20.0;"Sable fin";0.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"BM4_Inf DSC_3771.JPG";"aou15-STJfbZFB4inf";0.0;;6.0;1;0.0;;0.0;3.0;0.0;"Pas de s�diment";1.0;0;0;2;0;0;0;;;;;;26;16;15;9;36;14;3600;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"BM2_Sup DSC_3685.JPG";"aou15-STJfbZFB2sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;2;7.0;0.0;0.0;0.0;0.0;0.0;7.0;0.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"BM2_Inf DSC_3686.JPG";"aou15-STJfbZFB2inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";13.0;0;0;12;8;0;0;;;;;;0;5;14;0;31;20;2800;0;1;8.0;0.0;0.0;0.0;0.0;0.0;0.0;3.0;;10.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Rouge";"BM1_Sup DSC_3681.JPG";"aou15-STJfbZFB1sup";0.0;;11.0;1;1.5;1;0.0;0.0;0.0;"Pas de s�diment";8.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.5;0.0;0.0;0.0;0.0;0.0;0.0;25.0;;40.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"BM1_Inf DSC_3683.JPG";"aou15-STJfbZFB1inf";0.0;;0.5;1;0.0;;0.0;3.0;0.0;"Pas de s�diment";20.0;0;0;8;14;0;0;;;;;;0;43;2;34;41;16;5440;0;1;2.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;40.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge-Verte";"QRef5 DSC_3805.JPG";"aou15-STJfbZFQ5";0.0;;12.5;1;30.0;1;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge-Verte";"QRef4 DSC_3703.JPG";"aou15-STJfbZFBQ4";0.0;;23.0;1;27.0;1;0.0;0.0;100.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge-Verte";"QRef3 DSC_3789.JPG";"aou15-STJfbZFQ3";0.0;;45.0;1;25.0;1;0.0;0.0;30.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge-Verte";"QRef2 DSC_3774.JPG";"aou15-STJfbZFQ2";0.0;;50.0;1;10.0;1;0.0;0.0;35.0;"Sable fin";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;4.0;;;;;;;;;;;;;;;;;;;; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Blanche";"QRef1 DSC_3689.JPG";"aou15-STJfbZFQ1";0.0;;1.0;1;4.0;1;0.0;0.0;2.0;"Sable grossier";40.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;20.0;;;;;;;;;;;;;;;;;;;; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Verte";"BM10_Sup DSC_3802.JPG";"aou15-STJfbZFB10sup";0.0;;10.0;1;75.0;1;0.0;0.0;0.0;"Pas de s�diment";1.5;0;0;0;0;0;0;;;;;;0;39;18;8;0;6;2840;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.125;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"BM10_Inf DSC_3803.JPG";"aou15-STJfbZFB10inf";0.0;;10.0;1;0.5;1;0.0;13.0;0.0;"Pas de s�diment";25.0;0;0;1;3;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.25;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Rouge";"BM9_Sup DSC_3794.JPG";"aou15-STJfbZFB9sup";0.0;;45.0;1;25.0;1;0.0;1.0;6.0;"Sable fin";7.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;20.0;;40.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"BM9_Inf DSC_3796.JPG";"aou15-STJfbZFB9inf";0.0;;3.0;1;1.0;1;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;18;23;48;13;38;25;5880;0;0;0.0;0.0;1.0;0.0;0.0;4.0;0.0;0.0;;40.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"BM8_Sup DSC_3697.JPG";"aou15-STJfbZFB8sup";0.0;;0.0;;100.0;1;0.0;100.0;0.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;2;4;6;0;9;0;760;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"BM8_Inf DSC_3700.JPG";"aou15-STJfbZFB8inf";0.0;;6.0;1;0.0;;0.0;12.0;0.0;"Pas de s�diment";8.0;0;0;0;0;0;0;;;;;;0;0;18;10;2;11;1640;0;0;45.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"BM7_Sup DSC_3694.JPG";"aou15-STJfbZFB7sup";0.0;;20.0;1;25.0;1;0.0;0.0;15.0;"Sable fin";11.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_3696.JPG";"aou15-STJfbZFB7inf";0.0;;20.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";1.5;0;0;0;2;0;0;;;;;;0;128;48;46;32;169;16920;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"BM6_Sup DSC_3786.JPG";"aou15-STJfbZFB6sup";0.0;;40.0;1;12.5;1;0.0;0.25;0.0;"Sable fin";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;5.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;2.0;"Blocs";;0;0;1;0;1;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"BM6_Inf DSC_3788.JPG";"aou15-STJfbZFB6inf";0.0;;3.0;2;0.0;;0.0;1.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;20;28;12;42;22;6;4400;0;0;0.0;0.0;0.0;2.0;5.0;0.0;0.5;0.5;;2.0;"Blocs";;0;0;1;0;1;0;0;0;0;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Verte";"BM5_Sup DSC_3778.JPG";"aou15-STJfbZFB5sup";0.0;;11.0;1;45.0;1;0.0;2.0;0.0;"Sable fin";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;7.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;12;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"BM5_Inf DSC_3781.JPG";"aou15-STJfbZFB5inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;15;39;7;64;12;81;8120;0;0;0.25;0.0;0.5;8.0;10.0;0.0;0.5;0.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;12;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"BM3_Sup DSC_3765.JPG";"aou15-STJfbZFB3sup";0.0;;55.0;1;1.5;1;0.0;0.0;100.0;"Sable fin";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;10.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376690;"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"BM3_Inf DSC_3768.JPG";"aou15-STJfbZFB3inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;54;25;9;40;24;14;4480;0;0;0.0;0.0;0.5;5.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"BM3_Sup DSC_4109.JPG";"oct15-STJfbZFB3sup";0.0;;100.0;1;2.0;1;0.0;0.0;100.0;"Sable fin";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;25.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"BM3_Inf DSC_4112.JPG";"oct15-STJfbZFB3inf";0.0;;9.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;25;4;2;0;15;8;1160;0;0;0.0;0.0;0.5;30.0;6.0;0.0;2.0;0.5;;25.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge-Verte";"QRef5 DSC_4278.JPG";"oct15-STJfbZFQ5";0.0;;25.0;1;45.0;1;0.0;0.0;60.0;"Sable fin";20.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge-Verte";"QRef4 DSC_4104.JPG";"oct15-STJfbZFQ4";0.0;;34.0;1;40.0;1;0.0;0.0;85.0;"D�bris coquilliers";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;4.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"QRef3 DSC_4270.JPG";"oct15-STJfbZFQ3";0.0;;100.0;1;5.0;1;0.0;1.0;50.0;"Sable grossier";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Rouge";"QRef2 DSC_4149.JPG";"oct15-STJfbZFQ2";0.0;;60.0;1;10.0;1;0.0;0.0;75.0;"D�bris coquilliers";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Blanche";"Qref1 DSC_4082.JPG";"oct15-STJfbZFQ1";0.0;;0.25;1;15.0;1;0.0;0.25;0.0;"Pas de s�diment";30.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;3;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;10.0;;;;;;;;;;;;;;;;;;;; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"BM10Sup DSC_4275.JPG";"oct15-STJfbZFB10sup";0.0;;10.0;1;0.0;;0.0;0.0;2.0;"Sable fin";35.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;8.0;;30.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"BM10_Inf DSC_4277.JPG";"oct15-STJfbZFB10inf";0.0;;4.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;15;36;22;17;8;51;5360;0;0;0.0;0.0;0.5;2.0;0.0;20.0;0.0;0.125;;30.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Verte";"BM9_Sup DSC_4272.JPG";"oct15-STJfbZFB9sup";0.0;;7.0;1;70.0;1;0.0;0.0;85.0;"Sable fin";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Sable grossier";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"BM9_Inf DSC_4274.JPG";"oct15-STJfbZFB9inf";0.0;;6.0;1;0.0;;0.0;12.0;0.0;"Pas de s�diment";1.5;0;0;1;5;0;0;;;;;;29;49;32;21;28;24;6160;1;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Sable grossier";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"BM8_Sup DSC_4092.JPG";"oct15-STJfbZFB8sup";0.0;;2.0;1;100.0;1;0.0;1.0;100.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.25;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;75.0;"Sable grossier";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"BM8_Inf DSC_4094.JPG";"oct15-STJfbZFB8inf";0.0;;2.5;1;0.0;;0.0;15.0;0.0;"Pas de s�diment";4.5;0;0;0;0;0;0;;;;;;0;36;65;11;43;40;7800;0;0;75.0;0.0;0.0;0.25;0.0;0.0;0.0;0.0;;75.0;"Sable grossier";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"BM7_Sup DSC_4086.JPG";"oct15-STJfbZFB7sup";0.0;;7.0;1;87.5;1;0.0;0.0;100.0;"D�bris coquilliers";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;80.0;"Sable grossier";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_4089.JPG";"oct15-STJfbZFB7inf";0.0;;2.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;0;109;124;75;147;107;22480;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;80.0;"Sable grossier";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"BM6_Sup DSC_4216.JPG";"oct15-STJfbZFB6sup";0.0;;100.0;1;3.5;1;0.0;0.5;100.0;"D�bris coquilliers";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.25;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Sable grossier";;0;0;0;0;0;0;1;0;1;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"BM6_Inf DSC_4234.JPG";"oct15-STJfbZFB6inf";0.0;;3.0;1;0.0;;0.0;4.0;0.0;"Pas de s�diment";0.5;0;0;0;0;0;0;;;;;;11;27;11;22;16;20;3840;0;0;0.0;0.0;0.0;2.0;1.0;0.0;0.0;0.5;;50.0;"Sable grossier";;0;0;0;0;0;0;1;0;1;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"BM5_Sup DSC_4179.JPG";"oct15-STJfbZFB5sup";0.0;;85.0;1;7.0;1;0.0;0.0;85.0;"D�bris coquilliers";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.25;0.0;0.0;0.0;0.0;0.0;0.0;0.125;;50.0;"Sable grossier";;0;0;0;0;1;0;0;0;2;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"BM5_Inf DSC_4198.JPG";"oct15-STJfbZFB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;10;40;5;25;18;17;4200;0;7;0.0;0.0;0.5;20.0;0.0;0.0;0.0;1.0;;50.0;"Sable grossier";;0;0;0;0;1;0;0;0;2;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"BM4_Sup DSC_4113.JPG";"oct15-STJfbZFB4sup";0.0;;47.0;1;16.0;1;0.0;0.25;90.0;"Sable fin";2.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;75.0;"Sable grossier";;0;0;0;2;4;0;0;0;0;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"BM4_Inf DSC_4115.JPG";"oct15-STJfbZFB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;39;18;0;6;7;16;1880;3;0;0.0;0.0;1.5;30.0;3.0;0.0;1.0;1.0;;75.0;"Sable grossier";;0;0;0;2;4;0;0;0;0;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"BM2_Sup DSC_4078.JPG";"oct15-STJfbZFB2sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";35.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;9.0;;10.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"BM2_Inf DSC_4081.JPG";"oct15-STJfbZFB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;22;8;0;0;;;;;;0;0;0;0;0;0;0;0;0;40.0;0.0;0.0;0.0;0.0;0.0;0.0;20.0;;10.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Verte";"BM1_Sup DSC_4073.JPG";"oct15-STJfbZFB1sup";0.0;;0.0;;60.0;1;0.0;0.0;0.0;"Pas de s�diment";25.0;0;0;3;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;25.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376757;"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"BM1_Inf DSC_4077.JPG";"oct15-STJfbZFB1sinf";0.0;;5.0;1;7.0;1;0.0;5.0;0.0;"Pas de s�diment";5.0;0;0;29;18;0;0;;;;;;0;0;0;0;0;0;0;0;0;3.5;0.0;0.0;0.0;0.0;0.0;0.0;70.0;;25.0;"Sable grossier";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"BM8_Sup DSC_4566.JPG";"mars16-STJfbZFB8sup";0.0;;85.0;1;5.0;1;0.0;0.0;15.0;"D�bris coquilliers";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;1;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"BM8_Inf DSC_4569.JPG";"mars16-STJfbZFB8inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";1.0;0;0;0;2;0;0;;;;;;3;12;23;14;15;16;3200;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;1;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"BM1_Sup DSC_4416.JPG";"mars16-STJfbZFB1sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";70.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;2.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"BM1_Inf DSC_4418.JPG";"mars16-STJfbZFB1INF";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";20.0;0;0;9;5;0;0;10;0;0;0;0;200;0;9;9;3;0;840;0;0;2.0;0.0;0.0;0.0;0.0;0.0;0.0;5.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Verte";"BM2_Sup DSC_4419.JPG";"mars16-STJfbZFB2sup";0.0;;0.0;;30.0;1;0.0;0.0;0.0;"Pas de s�diment";12.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;10.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche-Verte";"BM2_Inf DSC_4459.JPG";"mars16-STJfbZFB2inf";0.0;;0.0;;30.0;1;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;7;2;0;0;;;;;;10;0;0;0;0;0;0;0;14;0.25;0.0;0.0;0.0;0.0;0.0;0.0;40.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"BM3_Sup DSC_4393.JPG";"mars16-STJfbZFB3sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;;;;;;43;10;5;3;0;7;1000;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Rouge";"BM3_Inf DSC_4404.JPG";"mars16-STJfbZFB3inf";0.0;;75.0;2;0.5;1;0.0;2.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;3.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"BM4_Sup DSC_4405.JPG";"mars16-STJfbZFB4sup";0.0;;60.0;1;30.0;1;0.0;4.0;70.0;"Sable fin";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;15.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"BM4_Inf DSC_4410.JPG";"mars16-STJfbZFB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;20;7;2;22;20;33;3360;0;0;0.0;0.0;0.0;1.0;1.5;0.0;6.0;5.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Verte";"BM10_Sup DSC_4302.JPG";"mars16-STJfbZFB10sup";0.0;;20.0;1;50.0;1;0.0;0.0;75.0;"Sable fin";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.25;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"BM10_Inf DSC_4306.JPG";"mars16-STJfbZFB10inf";0.0;;4.0;1;0.0;;0.0;5.5;0.0;"Pas de s�diment";25.0;0;0;0;1;0;0;;;;;;0;24;33;39;16;51;6520;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.25;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Blanche";"QRef1 DSC_4463.JPG";"mars16-STJfbZFQ1";0.0;;0.0;;0.0;;0.0;0.25;0.0;"Pas de s�diment";6.0;0;0;3;6;0;0;;;;;;0;0;0;0;0;0;0;0;3;1.0;0.0;0.0;0.0;0.0;0.0;0.0;15.0;;;;;;;;;;;;;;;;;;;; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Rouge";"QRef2 DSC_4411.JPG";"mars16-STJfbZFQ2";0.0;;100.0;1;1.0;1;0.0;0.0;100.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge-Verte";"QRef3 DSC_4371.JPG";"mars16-STJfbZFQ3";0.0;;30.0;1;30.0;1;0.0;0.0;100.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge";"QRef4 DSC_4571.JPG";"mars16-STJfbZFQ4";0.0;;75.0;1;6.0;1;0.0;1.5;20.0;"D�bris coquilliers";7.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.5;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Verte";"QRef5 DSC_4333.JPG";"mars16-STJfbZFQ5";0.0;;30.0;1;40.0;1;0.0;0.0;0.0;"Pas de s�diment";1.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"BM5_Sup DSC_4350.JPG";"mars16-STJfbZFB5sup";0.0;;35.0;2;6.0;2;0.0;2.5;35.0;"Sable grossier";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"BM5_Inf DSC_4357.JPG";"mars16-STJfbZFB5inf";0.0;;1.0;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;11;16;0;0;8;5;1160;0;0;0.0;0.0;0.0;1.5;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"BM6_Sup DSC_4358.JPG";"mars16-STJfbZFB6sup";0.0;;70.0;2;2.0;1;0.0;4.0;75.0;"Sable grossier";3.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"BM6_Inf DSC_4367.JPG";"mars16-STJfbZFB6inf";0.0;;4.0;2;0.0;;0.0;6.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;16;29;7;12;14;2;2560;0;0;0.0;0.0;3.0;5.0;0.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;4;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"BM7_Sup DSC_4557.JPG";"mars16-STJfbZFB7sup";0.0;;3.0;1;97.0;1;0.0;1.0;100.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;4;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_4564.JPG";"mars16-STJfbZFB7inf";0.0;;1.0;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";100.0;0;0;0;0;0;0;;;;;;3;11;19;6;6;9;2040;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;4;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Verte";"BM9_Sup DSC_4298.JPG";"mars16-STJfbZFB9sup";0.0;;7.0;1;9.0;1;0.0;0.0;2.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;2.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376824;"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"BM9_Inf DSC_4301.JPG";"mars16-STJfbZFB9inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;14;16;14;4;0;10;1760;0;0;0.0;0.0;2.0;17.0;2.0;0.0;0.0;0.25;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge-Verte";"QRef4 DSC_4828.JPG";"ao�t16-STJfbZFQ4";0.0;;50.0;1;10.0;2;0.0;0.25;35.0;"D�bris coquilliers";6.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;30.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge-Verte";"BM3_Sup DSC_4760.JPG";"ao�t16-STJfbZFB3sup";0.0;;30.0;2;25.0;2;0.0;0.0;87.5;"Sable grossier";1.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"BM3_Inf DSC_4764.JPG";"ao�t16-STJfbZFB3inf";0.0;;2.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;0;0;0;0;0;0;9;22;1;11;13;2240;7;0;0.0;0.0;0.0;2.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"BM4_Sup DSC_4765.JPG";"ao�t16-STJfbZFB4sup";0.0;;8.0;1;75.0;2;0.0;0.0;80.0;"D�bris coquilliers";4.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"BM4_Inf DSC_4778.JPG";"ao�t16-STJfbZFB4inf";0.0;;0.5;1;0.0;;0.0;3.0;0.0;"Pas de s�diment";0.0;0;0;0;3;0;0;0;0;0;0;0;0;17;20;7;4;9;2280;3;0;0.25;0.0;0.0;2.0;15.0;0.0;0.0;3.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge-Verte";"BM5_Sup DSC_4780.JPG";"ao�t16-STJfbZFB5sup";0.0;;60.0;2;10.0;2;0.0;1.0;100.0;"Sable grossier";2.5;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;2.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"BM5_Inf DSC_4786.JPG";"ao�t16-STJfbZFB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;0;0;0;0;0;0;27;13;12;4;6;2480;1;0;0.0;0.0;0.0;3.0;0.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"BM6_Sup DSC_4788.JPG";"ao�t16-STJfbZFB6sup";0.0;;50.0;1;10.0;2;0.0;0.0;100.0;"Sable grossier";1.5;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;4.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"BM6_Inf DSC_4791.JPG";"ao�t16-STJfbZFB6inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;0;0;0;0;0;0;23;10;35;11;7;3440;2;0;0.0;0.0;0.0;22.5;0.0;0.0;0.0;1.5;;20.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"BM7_Sup DSC_4819.JPG";"ao�t16-STJfbZFB7sup";0.0;;4.0;1;95.0;1;0.0;0.0;60.0;"D�bris coquilliers";2.0;0;0;0;0;0;0;0;0;0;0;0;0;31;0;6;4;0;1640;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_4821.JPG";"ao�t16-STJfbZFB7inf";0.0;;4.0;1;9.0;1;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;2;0;0;0;0;0;0;0;0;0;66;24;49;37;35;8440;0;0;;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"BM8_Sup DSC_4822.JPG";"ao�t16-STJfbZFB8sup";0.0;;1.0;1;75.0;1;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Sable fin";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"BM8_Inf DSC_4824.JPG";"ao�t16-STJfbZFB8inf";0.0;;10.0;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";20.0;0;0;4;3;0;0;0;0;0;0;0;0;66;26;15;36;34;7080;3;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Sable fin";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche";"BM9_Sup DSC_4800.JPG";"ao�t16-STJfbZFB9sup";0.0;;20.0;1;0.0;;0.0;0.0;15.0;"Sable fin";15.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;2.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;2;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"BM9_Inf DSC_4802.JPG";"ao�t16-STJfbZFB9inf";0.0;;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;0;0;0;0;0;0;40;20;32;21;65;7120;0;0;0.0;0.0;0.0;0.0;5.0;0.0;0.0;5.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;2;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"BM10_Sup DSC_4803.JPG";"ao�t16-STJfbZFB10sup";0.0;;6.0;1;0.5;1;0.0;0.0;0.0;"Pas de s�diment";25.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;7.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"BM10_Inf DSC_4806.JPG";"ao�t16-STJfbZFB10inf";0.0;;1.0;2;0.0;;0.0;0.25;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;0;0;0;0;0;0;17;28;11;21;6;3320;0;0;0.0;0.0;0.0;10.0;4.0;0.0;0.0;1.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Blanche";"QRef1 DSC_4755.JPG";"ao�t16-STJfbZFQ1";0.0;;7.0;1;0.25;2;0.0;0.5;3.5;"Sable fin";10.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;35.0;;;;;;;;;;;;;;;;;;;; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Rouge";"QRef2 DSC_4779.JPG";"ao�t16-STJfbZFQ2";0.0;;100.0;1;1.0;1;0.0;0.0;100.0;"Sable fin";0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;15.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge-Verte";"QRef3 DSC_4793.JPG";"ao�t16-STJfbZFQ3";0.0;;43.0;1;40.0;2;0.0;0.0;100.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;3.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"BM2_Sup DSC_4750.JPG";"ao�t16-STJfbZFB2sup";0.0;;5.0;1;0.0;;0.0;0.5;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;4;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;10.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"BM2_Inf DSC_4754.JPG";"ao�t16-STJfbZFB2inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";40.0;0;0;12;2;0;0;0;0;0;0;0;0;0;51;28;26;15;4800;0;0;4.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge-Verte";"QRef5 DSC_4813.JPG";"ao�t16-STJfbZFQ5";0.0;;40.0;1;32.0;1;0.0;0.0;100.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"BM1_Sup DSC_4735.JPG";"ao�t16-STJfbZFB1sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";25.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0;0.25;0.0;0.0;0.0;0.0;0.0;0.0;10.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376891;"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"BM1_Inf DSC_4749.JPG";"ao�t16-STJfbZFB1INF";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;19;2;0;0;0;0;0;0;0;0;0;0;0;0;0;0;1;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;40.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;1;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"BM8_Sup DSC_5001.JPG";"sept16-STJfbZFB8sup";0.0;;0.0;;100.0;1;0.0;0.0;100.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"BM8_Inf DSC_5004.JPG";"sept16-STJfbZFB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;33;26;30;29;7;5000;0;0;4.0;0.0;0.0;5.0;26.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Verte";"BM9_Sup DSC_5046.JPG";"sept16-STJfbZFB9sup";0.0;;0.0;;100.0;1;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;11;19;20;17;28;12;3840;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche-Rouge";"BM9_Inf DSC_5056.JPG";"sept16-STJfbZFB9inf";0.0;;18.0;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";31.0;0;0;0;1;0;0;;;;;;0;15;24;23;11;15;3520;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;4.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"BM10_Sup DSC_5063.JPG";"sept16-STJfbZFB10sup";0.0;;5.0;1;0.5;1;0.0;0.0;0.0;"Pas de s�diment";6.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.5;0.0;0.0;0.0;0.0;0.0;0.0;20.0;;30.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"BM10_Inf DSC_5065.JPG";"sept16-STJfbZFB10inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";15.0;0;0;0;0;0;0;;;;;;6;15;27;25;14;29;4400;0;0;0.0;0.0;3.0;10.0;15.0;0.0;0.0;4.0;;30.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Blanche";"QRef1 DSC_4993.JPG";"sept16-STJfbZFQ1";0.0;;0.0;;5.0;1;0.0;0.0;2.0;"Sable fin";7.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;5;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.5;;;;;;;;;;;;;;;;;;;; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Rouge";"QRef2 DSC_5019.JPG";"sept16-STJfbZFQ2";0.0;;50.0;1;15.0;1;0.0;0.0;100.0;"D�bris coquilliers";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;6.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"QRef3 DSC_5043.JPG";"sept16-STJfbZFQ3";0.0;;85.0;1;5.0;1;0.0;0.0;70.0;"D�bris coquilliers";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge";"QRef4 DSC_5006.JPG";"sept16-STJfbZFQ4";0.0;;40.0;1;12.0;1;0.0;0.0;50.0;"D�bris coquilliers";8.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;0;0;6.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge-Verte";"QRef5 DSC_5066.JPG";"sept16-STJfbZFQ5";0.0;;60.0;1;50.0;1;0.0;0.0;30.0;"D�bris coquilliers";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"BM6_Sup DSC_5029.JPG";"sept16-STJfbZFB6sup";0.0;;65.0;1;0.0;;0.0;0.0;50.0;"D�bris coquilliers";15.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;1.5;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"BM6_Inf DSC_5031.JPG";"sept16-STJfbZFB6inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.5;0;0;0;0;0;0;;;;;;24;43;4;14;8;19;3520;0;8;0.0;0.0;6.0;10.0;1.0;0.0;0.0;1.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Verte";"BM5_Sup DSC_5022.JPG";"sept16-STJfbZFB5sup";0.0;;15.0;1;70.0;1;0.0;0.0;25.0;"Sable fin";6.0;0;0;0;0;0;0;;;;;;1;3;4;0;0;0;280;0;0;1.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"BM5_Inf DSC_5024.JPG";"sept16-STJfbZFB5inf";0.0;;5.0;1;0.0;;0.0;2.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;5;21;15;26;9;29;4000;0;0;0.0;0.0;9.0;30.0;5.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;1;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"BM4_Sup DSC_5014.JPG";"sept16-STJfbZFB4sup";0.0;;65.0;2;10.0;1;0.0;0.5;100.0;"D�bris coquilliers";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"BM4_Inf DSC_5018.JPG";"sept16-STJfbZFB4inf";0.0;;6.0;2;0.0;;0.0;0.25;0.0;"Pas de s�diment";;0;0;0;0;0;0;;;;;;7;5;0;3;0;7;600;0;2;0.0;0.0;9.0;45.0;14.0;0.0;0.0;0.5;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Verte";"BM3_Sup DSC_5012.JPG";"sept16-STJfbZFB3sup";0.0;;0.0;;100.0;1;0.0;0.0;15.0;"Sable fin";0.5;0;0;0;0;0;0;;;;;;11;17;8;2;0;14;1640;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;2.0;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Rouge";"BM3_Inf DSC_5013.JPG";"sept16-STJfbZFB3inf";0.0;;9.0;2;10.0;1;0.0;35.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;8;0;0;0;0;0;0;0;0;15.0;0.0;0.0;10.0;0.0;0.0;0.0;0.5;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"BM2_Sup DSC_4973.JPG";"sept16-STJfbZFB2sup";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";14.0;0;0;3;0;0;0;;;;;;0;0;0;0;0;0;0;0;1;5.0;0.0;0.0;0.0;0.0;0.0;0.0;6.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"BM2_Inf DSC_4976.JPG";"sept16-STJfbZFB2inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";5.0;0;0;18;7;0;0;;;;;;0;0;0;0;0;0;0;0;0;4.0;0.0;0.0;0.0;0.0;0.0;0.0;4.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"BM1_Sup DSC_4968.JPG";"sept16-STJfbZFB1sup";0.0;;1.5;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";17.0;0;0;1;1;0;0;;;;;;0;0;0;0;0;0;0;0;1;3.0;0.0;0.0;0.0;0.0;0.0;0.0;9.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"BM1_Inf DSC_4970.JPG";"sept16-STJfbZFB1INF";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";16.0;0;0;6;4;0;0;;;;;;0;58;38;25;51;21;7720;0;5;0.5;0.0;0.0;0.0;0.0;0.0;0.0;9.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"BM7_Sup DSC_4996.JPG";"sept16-STJfbZFB7sup";0.0;;5.0;1;35.0;1;0.0;0.0;10.0;"D�bris coquilliers";6.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;2.0;0.0;0.0;0.0;0.0;0.0;0.0;0.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +376958;"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"BM7_Inf DSC_4999.JPG";"sept16-STJfbZFB7inf";0.0;;1.5;1;0.5;1;0.0;1.5;0.0;"Pas de s�diment";0.0;0;0;2;0;0;0;;;;;;0;46;7;34;51;2;5600;0;0;0.5;0.0;0.0;2.5;3.0;0.0;0.0;2.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune-Rouge";;"oct14-ErqB3sup";50.0;3;25.0;2;0.5;1;5.0;0.0;90.0;"Sable fin";5.0;0;0;3;0;0;11;;;;;;30;;;;;;120;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;2;0;;0;0;0; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;;"oct14-ErqB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;0;0;0;0;0;;;;;;3;;;;;;4000;;;;;;3.5;3.0;0.0;1.75;5.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;2;0;;0;0;0; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";;"oct14-ErqQ2";25.0;3;40.0;2;5.0;2;5.0;0.0;70.0;"Sable fin";30.0;4;0;15;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;5.0;;;;;;;;;;;;;;;;;;;; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"PA090036.JPG";"oct14-ErqB10sup";100.0;3;5.0;1;0.0;;0.0;0.0;40.0;"Vase";10.0;0;0;11;0;0;0;;;;;;4;;;;;;2160;;;;;;0.0;0.0;0.0;0.0;2.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;2;2;0;0;;;3;;0;1;0;;0;0;0; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;;"oct14-ErqB10sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;1;10;8;0;0;0;;;;;;21;;;;;;4680;;;;;;7.5;20.0;0.125;0.0;5.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;2;2;0;0;;;3;;0;1;0;;0;0;0; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune";"PA090034.JPG";"oct14-ErqB9sup";90.0;3;2.0;1;0.0;;0.0;0.0;5.0;"Sable fin";20.0;0;0;5;0;0;0;;;;;;8;;;;;;2960;;;;;;0.0;0.25;0.0;0.0;1.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;1;0;;0;0;0; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;;"oct14-ErqB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;2;2;0;0;0;;;;;;17;;;;;;8080;;;;;;15.0;0.5;0.5;0.0;2.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;1;0;;0;0;0; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune";"PA090037.JPG";"oct14-ErqB4sup";60.0;2;50.0;2;0.25;1;0.25;0.0;5.0;"Sable fin";20.0;0;0;8;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;65.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;3;0;;0;0;0; +377025;"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;;"oct14-ErqB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;4;0;0;0;;;;;;4;;;;;;2640;;;;;;7.0;2.5;0.0;3.0;3.0;;65.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;3;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune-Rouge";"Q4_B_Ref.JPG";"avr15-ErqQ4";100.0;2;15.0;2;5.0;2;0.0;0.0;50.0;"Sable fin";0.0;0;0;7;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune-Rouge";"Q2_BM3_sup.JPG";"avr15-ErqB3sup";97.0;2;10.0;2;7.0;2;0.0;1.0;16.5;"Sable grossier";0.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;4.5;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"Q2_BM3_inf.JPG";"avr15-ErqB3inf";0.0;;0.0;;0.0;;0.0;3.0;0.25;"D�bris coquilliers";60.0;0;0;1;0;0;0;;;;;;3;3;14;10;1;7;1400;;;;;;0.0;0.125;0.0;0.0;4.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune-Verte";"Q2_BM4_sup.JPG";"avr15-ErqB4sup";45.0;2;4.5;2;29.0;2;0.0;0.75;31.0;"Sable fin";0.5;0;0;5;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche-Rouge";"Q2_BM4_inf.JPG";"avr15-ErqB4inf";0.25;2;2.0;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";9.0;0;0;0;0;0;0;;;;;;3;8;5;14;5;4;1440;;;;;;2.0;1.0;0.0;0.0;10.75;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Rouge";"Q3_BM5_sup.JPG";"avr15-ErqB5sup";40.0;2;32.5;2;15.0;2;0.0;1.5;40.0;"Sable fin";11.0;0;1;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"Q3_BM5_inf.JPG";"avr15-ErqB5inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;1;63;27;25;24;26;6600;;;;;;0.0;2.5;0.0;0.0;6.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"Q3_BM6_sup.JPG";"avr15-ErqB6sup";0.0;;20.0;2;60.0;2;0.0;0.0;35.0;"Sable fin";3.5;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"Q3_BM6_inf.JPG";"avr15-ErqB6inf";0.0;;0.0;;0.0;;0.0;5.0;0.0;"Pas de s�diment";19.0;0;0;1;0;0;0;;;;;;1;6;8;22;4;8;1920;;;;;;0.0;4.0;2.0;1.75;3.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"Q4_BM7_sup.JPG";"avr15-ErqB7sup";0.0;;30.0;2;7.5;2;0.0;0.0;12.5;"Sable fin";1.0;0;0;5;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;2;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"Q4_BM7_inf.JPG";"avr15-ErqB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;3;0;0;0;0;;;;;;3;6;10;5;12;5;1520;;;;;;0.0;11.0;0.0;0.5;35.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;2;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"Q4_BM8_sup.JPG";"avr15-ErqB8sup";0.0;;25.0;2;15.0;2;0.0;0.25;7.0;"Sable fin";0.0;0;1;2;0;0;0;;;;;;3;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"Q4_BM8_inf.JPG";"avr15-ErqB8inf";0.0;;0.0;;0.0;;0.0;1.25;0.0;"Pas de s�diment";15.0;0;4;0;0;0;0;;;;;;7;5;17;26;20;9;3080;;;;;;0.0;5.0;0.0;0.5;2.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Verte";"Q5_BM9_sup.JPG";"avr15-ErqB9sup";1.25;2;2.0;2;100.0;2;0.0;0.0;20.0;"Sable fin";2.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;9.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Rouge";"Q5_BM9_inf.JPG";"avr15-ErqB9inf";0.25;2;11.0;2;0.0;;4.5;30.0;0.5;"D�bris coquilliers";7.5;0;2;0;0;0;0;;;;;;27;8;16;5;6;10;1800;;;;;;0.0;0.0;0.0;0.0;9.5;;9.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune-Rouge";"Q1_BM1_sup.JPG";"avr15-ErqB1sup";46.0;3;5.0;2;5.5;2;0.25;3.5;16.0;"Sable fin";0.0;0;0;3;0;0;0;;;;;;5;0;0;0;0;2;2;;;;;;0.0;0.0;0.0;0.0;1.5;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"Q1_BM1_inf.JPG";"avr15-ErqB1inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";7.0;0;4;1;0;0;0;;;;;;8;55;55;43;18;19;7600;;;;;;2.0;10.0;0.0;0.0;34.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Rouge";"Q1_BM2_sup.JPG";"avr15-ErqB2sup";40.0;3;18.5;2;4.0;2;0.0;10.0;0.0;"Pas de s�diment";23.0;0;0;3;0;0;0;;;;;;0;2;3;19;0;4;1120;;;;;;0.0;0.0;0.0;0.0;21.0;;28.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Q1_BM2_inf.JPG";"avr15-ErqB2inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"D�bris coquilliers";15.0;0;2;0;0;0;0;;;;;;4;7;31;41;20;23;4880;;;;;;0.125;1.5;0.0;0.0;36.0;;28.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"Q5_BM10_sup.JPG";"avr15-ErqB10sup";65.0;3;0.25;2;4.5;2;0.0;27.0;2.0;"Sable fin";1.0;0;0;9;0;0;0;;;;;;1;0;0;0;0;20;20;;;;;;0.0;0.0;0.0;0.0;0.125;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Q5_BM10_inf.JPG";"avr15-ErqB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;2;0;0;0;0;;;;;;2;2;50;3;15;130;4200;;;;;;5.0;2.5;0.0;0.0;9.5;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Brune-Rouge";"Q1_B_Ref.JPG";"avr15-ErqQ1";100.0;3;85.0;2;2.0;2;2.0;0.0;30.0;"Sable fin";5.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Brune-Rouge";"Q2_B_Ref.JPG";"avr15-ErqQ2";90.0;3;75.0;2;2.0;2;3.0;0.0;65.0;"Sable fin";5.0;0;0;4;0;0;0;;;;;;4;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Brune-Rouge";"Q3_B_Ref.JPG";"avr15-ErqQ3";8.0;2;90.0;2;15.0;2;0.0;15.0;30.0;"Sable fin";20.0;0;0;5;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +377052;"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune-Rouge";"Q5_B_Ref.JPG";"avr15-ErqQ5";75.0;3;20.0;2;1.0;2;10.0;12.0;20.0;"Sable fin";25.0;0;0;10;0;0;0;;;;;;12;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.5;;;;;;;;;;;;;;;;;;;; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Brune";"Q1_BM1_sup.JPG";"oct15-ErqB1sup";75.0;3;25.0;2;0.0;;0.0;2.0;2.0;"Sable fin";40.0;0;2;10;1;0;0;;;;;;0;3;4;2;0;1;400;;;;;;0.0;0.0;0.0;0.0;12.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;2;0;0;;;1;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"Q1_BM1_inf.JPG";"oct15-ErqB1inf";0.0;;0.0;;0.0;;0.0;12.5;1.0;"D�bris coquilliers";1.0;1;0;0;0;0;0;;;;;;2;45;40;23;37;13;6320;;;;;;4.0;2.0;1.5;0.0;5.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;2;0;0;;;1;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune-Rouge";"Q4_Blocref.JPG";"oct15-ErqQ4";50.0;3;10.0;2;5.0;2;0.0;5.0;40.0;"Sable fin";5.0;0;0;9;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune-Rouge";"Q3_Blocref.JPG";"oct15-ErqQ3";30.0;2;25.0;2;1.0;1;0.0;0.5;80.0;"Sable fin";3.0;0;0;1;0;0;0;;;;;;0;9;8;10;3;0;1200;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"Q4_BM8_sup.JPG";"oct15-ErqB8sup";10.0;2;15.0;2;10.0;2;0.0;4.0;80.0;"Sable fin";2.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Sable fin";;0;1;0;0;;;0;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"Q4_BM8_inf.JPG";"oct15-ErqB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;2;10;0;0;0;;;;;;3;29;10;9;11;25;3360;;;;;;0.0;0.5;0.0;0.0;7.5;;70.0;"Sable fin";;0;1;0;0;;;0;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune-Rouge";"Q5_Blocref.JPG";"oct15-ErqQ5";40.0;3;20.0;2;0.0;;5.0;7.5;3.0;"Sable fin";1.5;0;0;12;0;0;0;;;;;;1;5;2;7;3;0;680;;;;;;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche-Verte";"Q2_Blocref.JPG";"oct15-ErqQ2";10.0;2;0.0;;15.0;2;0.0;0.0;30.0;"Sable fin";5.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"Q5_BM10_sup.JPG";"oct15-ErqB10sup";90.0;3;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;1;0;0;0;;;;;;85;17;12;27;13;25;3760;;;;;;0.0;0.0;0.0;0.0;4.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Q5_BM10_inf.JPG";"oct15-ErqB10inf";0.0;;0.0;;0.0;;0.0;1.5;5.0;"D�bris coquilliers";0.0;0;3;0;0;0;0;;;;;;17;43;18;8;24;16;4360;;;;;;0.0;1.5;0.125;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Brune";"Q5_BM9_sup.JPG";"oct15-ErqB9sup";6.5;2;2.0;2;0.0;;0.0;0.25;0.0;"Pas de s�diment";14.0;0;0;1;0;0;0;;;;;;5;7;4;0;0;3;560;;;;;;0.0;0.0;0.0;0.0;4.5;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;1;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"Q5_BM9-inf.JPG";"oct15-ErqB9inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";25.0;0;0;1;0;0;0;;;;;;4;62;39;12;14;16;5720;;;;;;0.0;0.25;0.0;0.0;2.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;1;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune-Rouge";"Q1_Blocref.JPG";"oct15-ErqQ1";70.0;3;25.0;2;2.0;2;0.0;20.0;2.0;"Sable fin";5.0;0;0;3;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"Q4_BM7_sup.JPG";"oct15-ErqB7sup";10.0;2;10.0;2;0.0;;0.0;7.0;0.0;"Pas de s�diment";50.0;0;3;3;1;0;0;;;;;;4;1;4;6;0;3;560;;;;;;0.0;0.0;0.0;0.0;1.0;;20.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"Q4_BM7_inf.JPG";"oct15-ErqB7inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";3.5;0;1;6;0;0;0;;;;;;7;60;8;23;13;2;4240;;;;;;0.0;0.0;0.125;0.0;10.0;;20.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Brune";"Q3_BM6_sup.JPG";"oct15-ErqB6sup";20.0;2;6.0;2;2.0;2;0.0;0.0;25.0;"Sable fin";10.0;0;0;5;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;97.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;2;;0;7;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"Q3_BM6_inf.JPG";"oct15-ErqB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;19;2;0;0;0;;;;;;3;46;16;34;10;25;5240;;;;;;0.0;0.0;0.25;0.0;1.0;;97.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;2;;0;7;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Rouge";"Q3_BM5_sup.JPG";"oct15-ErqB5sup";5.0;2;25.0;2;0.0;;0.0;0.0;100.0;"Sable fin";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"Q3_BM5_inf.JPG";"oct15-ErqB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";4.5;0;11;3;0;0;0;;;;;;3;13;22;24;32;18;4360;;;;;;1.5;0.5;0.5;0.125;0.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune-Rouge";"Q2_BM4_sup.JPG";"oct15-ErqB4sup";15.0;2;50.0;2;3.0;2;0.0;0.0;100.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"Q2_BM4_inf.JPG";"oct15-ErqB4inf";0.0;;0.0;;0.0;;0.0;2.75;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;4;47;7;19;6;16;3800;;;;;;0.0;2.25;0.0;0.0;2.5;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"Q2_BM3_sup.JPG";"oct15-ErqB3sup";0.0;;1.0;2;2.0;1;0.0;0.25;5.0;"Sable fin";75.0;0;0;0;1;0;0;;;;;;4;36;20;2;5;6;2760;;;;;;0.0;0.0;0.0;0.0;2.5;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Brune";"Q2_BM3_inf.JPG";"oct15-ErqB3inf";10.0;2;2.0;2;0.0;;0.0;0.5;40.0;"Sable grossier";7.0;0;0;3;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"Q1_BM2_sup.JPG";"oct15-ErqB2sup";10.0;2;0.5;1;2.0;2;0.0;0.0;0.0;"Pas de s�diment";25.0;0;0;1;0;0;0;;;;;;3;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;17.5;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377119;"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Q1_BM2_inf.JPG";"oct15-ErqB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";16.0;0;1;3;0;0;0;;;;;;3;19;36;10;14;4;3320;;;;;;0.0;2.0;0.25;0.0;10.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge-Verte";"Q1_BM1_Sup.JPG";"mai16-ErqB1sup";3.0;2;30.0;2;35.0;2;0.0;0.0;95.0;"Sable fin";0.25;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.25;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Brune-Rouge";"Q1_BM1_Inf.JPG";"mai16-ErqB1inf";40.0;3;5.0;2;0.0;;0.0;20.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;23;8;10;4;3;6;1240;;;;;;0.0;0.125;0.0;0.0;4.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Rouge";"Q1_BM2_Sup.JPG";"mai16-ErqB2sup";30.0;2;20.0;2;25.0;2;0.0;0.0;25.0;"Sable fin";10.0;0;0;0;0;0;0;;;;;;10;0;0;0;3;0;120;;;;;;0.0;0.0;0.0;0.0;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche-Rouge";"Q1_BM2_Inf.JPG";"mai16-ErqB2inf";0.0;;1.0;2;0.0;;0.0;6.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;15;18;14;22;27;20;4040;;;;;;0.0;0.25;0.0;0.0;2.5;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"Q2_BM3_Sup.JPG";"mai16-ErqB3sup";0.0;;1.5;2;0.0;;0.0;20.0;1.0;"Sable fin";32.0;0;0;4;0;0;0;;;;;;3;2;0;4;0;5;440;;;;;;0.0;0.0;0.0;0.0;4.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche-Rouge";"Q2_BM3_Inf.JPG";"mai16-ErqB3inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";6.0;0;0;0;0;0;0;;;;;;5;18;13;14;14;19;3120;;;;;;0.5;7.0;0.0;0.0;6.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Verte";"Q2_BM4_Sup.JPG";"mai16-ErqB4sup";0.0;;0.5;2;44.0;2;0.0;4.0;45.0;"Sable fin";7.0;0;0;0;0;0;0;;;;;;1;6;0;1;0;6;520;;;;;;0.0;0.0;0.0;0.0;0.5;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Rouge";"Q2_BM4_Inf.JPG";"mai16-ErqB4inf";25.0;3;1.0;2;0.0;;0.0;80.0;0.0;"Pas de s�diment";7.0;0;0;0;0;0;0;;;;;;17;12;4;3;0;38;2280;;;;;;0.0;0.0;0.0;0.0;0.5;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Rouge";"Q3_BM5_Sup.JPG";"mai16-ErqB5sup";35.0;3;40.0;2;5.0;2;0.0;0.0;80.0;"Sable fin";1.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;3;;0;1;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"Q3_BM5_Inf.JPG";"mai16-ErqB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;0;1;2;0;0;;;;;;10;6;19;16;10;21;2880;;;;;;0.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;3;;0;1;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Brune";"Q3_BM6_Sup.JPG";"mai16-ErqB6sup";2.0;2;90.0;2;4.0;2;0.0;0.0;80.0;"Sable fin";0.0;0;0;12;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;6;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Brune";"Q3_BM6_Inf.JPG";"mai16-ErqB6inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";2.5;0;0;0;0;0;0;;;;;;9;16;65;14;8;12;4600;;;;;;1.0;4.5;0.0;0.0;0.05;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;6;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"Q4_BM8_Sup.JPG";"mai16-ErqB8sup";0.5;2;75.0;2;15.0;2;0.0;0.0;85.0;"D�bris coquilliers";0.0;0;0;3;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;2;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche-Rouge";"Q4_BM8_Inf.JPG";"mai16-ErqB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";25.0;0;0;0;0;0;0;;;;;;5;17;72;29;4;13;5400;;;;;;0.125;1.0;0.0;0.0;20.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;2;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune-Rouge";"Q5_BM9_Sup.JPG";"mai16-ErqB9sup";15.0;3;1.0;2;0.125;1;0.0;65.0;0.0;"Pas de s�diment";4.0;0;0;2;0;0;0;;;;;;0;13;8;17;4;1;1720;;;;;;0.0;0.0;0.0;0.0;3.5;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche-Rouge";"Q5_BM9_Inf.JPG";"mai16-ErqB9inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";5.0;0;1;0;0;0;0;;;;;;10;10;7;4;10;8;1560;;;;;;3.25;1.5;0.0;0.0;1.5;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"Q5_BM10_Sup.JPG";"mai16-ErqB10sup";85.0;3;3.0;2;0.125;2;0.0;19.5;0.0;"Pas de s�diment";20.0;0;0;1;1;0;0;;;;;;13;1;6;4;1;0;480;;;;;;0.0;0.125;0.0;0.0;16.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;3;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"Q5_BM10_Inf.JPG";"mai16-ErqB10inf";0.0;;1.0;2;0.0;;0.0;15.0;0.0;"Pas de s�diment";2.5;0;2;0;0;0;0;;;;;;5;16;6;24;8;8;2480;;;;;;2.0;2.25;0.0;0.0;1.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;3;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge-Verte";"Q3_Blocref.JPG";"mai16-ErqQ3";75.0;2;40.0;2;17.5;2;0.0;0.0;70.0;"Sable fin";0.0;0;0;6;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Brune-Rouge";"Q4_Blocref.JPG";"mai16-ErqQ4";20.0;3;35.0;2;7.0;2;0.0;0.0;20.0;"Sable fin";35.0;0;0;1;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune-Rouge";"Q5_Blocref.JPG";"mai16-ErqQ5";10.0;2;25.0;2;2.0;2;0.0;3.0;0.0;"Pas de s�diment";40.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;11.0;;;;;;;;;;;;;;;;;;;; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"Q2_Blocref.JPG";"mai16-ErqQ2";10.0;3;70.0;2;3.0;2;0.0;20.0;6.0;"D�bris coquilliers";10.0;0;0;5;0;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune";"Q1_Blocref.JPG";"mai16-ErqQ1";75.0;3;35.0;2;3.0;2;0.0;7.0;75.0;"Sable fin";5.0;0;0;0;0;0;0;;;;;;1;0;0;0;3;0;120;;;;;;0.0;0.0;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"Q4_BM7_Sup.JPG";"mai16-ErqB7sup";0.0;;2.0;2;70.0;2;0.0;0.0;50.0;"Sable fin";20.0;0;0;3;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;15.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377186;"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Rouge-Verte";"Q4_BM7_Inf.JPG";"mai16-ErqB7inf";0.0;;0.0;;5.0;2;0.0;0.0;0.0;"Pas de s�diment";70.0;0;1;1;1;0;0;;;;;;3;0;10;11;12;5;1520;;;;;;0.0;0.0;0.0;0.0;2.0;;15.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune-Rouge";"PA170190.JPG";"oct16-ErqB3sup";20.0;3;30.0;2;0.0;;0.0;2.0;25.0;"Vase";0.5;0;0;1;0;0;0;;;;;;1;5;0;0;1;0;240;;;;;;0.0;0.0;0.0;0.0;0.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche-Rouge";"PA170195.JPG";"oct16-ErqB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;3;0;0;0;0;;;;;;0;18;27;10;28;20;4120;;;;;;1.0;3.0;0.0;0.0;2.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"PA170099.JPG";"oct16-ErqB4sup";0.0;;0.0;;85.0;2;0.0;0.0;85.0;"Sable fin";1.0;0;0;0;0;0;0;;;;;;0;;;;;;12;;;;;;0.0;0.0;0.0;0.0;0.25;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;3;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche-Rouge";"PA170102.JPG";"oct16-ErqB4inf";0.5;3;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";20.0;0;2;2;0;0;0;;;;;;1;23;25;22;32;26;5120;;;;;;0.0;0.25;1.0;0.0;5.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;3;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune-Rouge";"PA180216.JPG";"oct16-ErqQ1";7.0;3;7.0;2;2.0;2;0.5;0.0;10.0;"Vase";5.0;0;0;2;0;0;0;;;;;;0;0;0;4;1;2;280;;;;;;0.0;0.0;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"PA170188.JPG";"oct16-ErqQ5";75.0;3;0.0;;0.0;;0.0;85.0;0.0;"Pas de s�diment";0.5;0;0;2;0;0;0;;;;;;0;3;6;0;1;0;400;;;;;;0.0;0.5;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"PA170196.JPG";"oct16-ErqQ2";35.0;3;10.0;2;0.0;;0.0;5.5;11.5;"Vase";5.0;0;0;1;0;0;0;;;;;;0;0;6;3;0;0;360;;;;;;0.0;0.0;0.0;0.0;0.125;;;;;;;;;;;;;;;;;;;; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Verte";"PA170094.JPG";"oct16-ErqB6sup";0.0;;0.0;;75.0;2;0.0;0.0;10.0;"Sable fin";0.0;0;1;4;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche-Rouge";"PA170095.JPG";"oct16-ErqB6inf";0.0;;2.0;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";5.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;1.0;0.0;0.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Rouge";"PA170090.JPG";"oct16-ErqB5sup";6.0;2;30.0;2;2.0;2;0.0;0.0;35.0;"Vase";0.0;0;1;0;0;1;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;1;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche-Rouge";"PA170092.JPG";"oct16-ErqB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;3;0;0;1;0;;;;;;6;18;30;35;82;11;7040;;;;;;5.0;5.0;0.25;0.0;0.25;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;1;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"PA180104.JPG";"oct16-ErqB7sup";0.0;;2.0;2;45.0;2;0.0;0.0;30.0;"Sable fin";3.0;0;0;3;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche-Rouge";"PA180113.JPG";"oct16-ErqB7inf";0.0;;0.0;;0.0;;0.0;20.0;0.0;"Pas de s�diment";20.0;0;0;2;1;1;0;;;;;;1;23;27;34;17;25;5040;;;;;;0.0;1.0;0.0;0.0;0.25;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune-Rouge";"PA180117.JPG";"oct16-ErqB8sup";87.5;3;10.0;2;0.5;2;0.0;5.0;2.5;"Sable fin";7.5;0;0;0;0;0;0;;;;;;3;26;19;13;4;0;2480;;;;;;0.0;0.0;0.0;0.0;0.25;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche-Rouge";"PA180122.JPG";"oct16-ErqB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;1;0;0;0;0;;;;;;2;24;17;20;30;1;3680;;;;;;3.0;0.75;0.5;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Blanche-Rouge";"PA180123.JPG";"oct16-ErqQ4";5.0;2;40.0;2;0.0;;0.0;0.0;77.5;"Sable fin";5.0;0;0;3;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"PA170173.JPG";"oct16-ErqB10sup";85.0;3;3.0;2;0.0;;0.0;85.0;10.0;"Vase";1.0;0;0;0;0;0;0;;;;;;0;4;2;8;0;2;640;;;;;;0.0;0.0;0.25;0.0;0.25;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"PA170180.JPG";"oct16-ErqB10inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;2;1;0;0;0;;;;;;1;34;18;12;33;16;4520;;;;;;0.75;1.5;0.0;0.5;3.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"PA170158.JPG";"oct16-ErqB9sup";35.0;3;5.0;2;1.0;2;0.0;50.0;10.0;"Vase";20.0;0;0;3;0;0;0;;;;;;0;5;7;4;3;0;760;;;;;;0.0;0.0;0.0;0.0;0.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;2;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche-Rouge";"PA170167.JPG";"oct16-ErqB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;4;3;0;0;0;;;;;;0;57;13;37;12;27;5840;;;;;;5.0;0.5;0.0;0.0;1.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;2;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune-Rouge";"PA170096.JPG";"oct16-ErqQ3";50.0;3;50.0;2;0.0;;0.0;0.0;20.0;"Vase";20.0;0;0;1;0;0;0;;;;;;0;22;15;2;8;0;1880;;;;;;0.0;0.5;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune-Rouge";"PA180199.JPG";"oct16-ErqB1sup";30.0;3;5.0;2;0.0;;0.0;30.0;0.0;"Pas de s�diment";15.0;0;0;1;0;0;0;;;;;;0;10;8;3;13;1;1400;;;;;;0.0;0.0;0.0;0.0;1.5;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;2;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"PA180203.JPG";"oct16-ErqB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.5;0;2;1;0;0;0;;;;;;0;81;87;20;93;13;11760;;;;;;0.0;1.5;0.5;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;2;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge-Verte";"PA180209.JPG";"oct16-ErqB2sup";0.5;2;10.0;2;20.0;2;0.0;2.0;3.0;"Sable fin";25.0;0;0;0;0;0;0;;;;;;1;0;5;1;3;0;360;;;;;;0.0;0.5;0.0;0.0;2.5;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +377253;"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"PA180215.JPG";"oct16-ErqB2inf";1.0;2;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;9;18;0;0;0;;;;;;0;60;41;77;91;10;11160;;;;;;0.0;0.5;0.75;0.0;0.25;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"P9300008.JPG";;25.0;3;100.0;2;5.0;2;;100.0;;;;2;1;;5;;;;;;;;;80;50;30;50;80;;;;;;;;;;;;;0.5;"Sable grossier";;;2;;;;;2;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"P9300010.JPG";;;;;;;;;25.0;;;25.0;;5;;;;;;;;;;;50;40;50;30;40;;;;;;;10.0;2.0;;;;;0.5;"Sable grossier";;;2;;;;;2;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"P9300006.JPG";;1.0;2;70.0;2;5.0;2;;50.0;50.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"P9300012.JPG";;13.0;2;40.0;2;5.0;1;;100.0;80.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;1.0;;;;;;;;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"P9300034.JPG";;25.0;2;6.0;2;;;;100.0;;;5.0;;;;1;;;1;;;;;;5;7;0;0;0;;;;;;;;;2.0;;;;;;;;;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;"P9300043.JPG";;3.0;2;45.0;2;3.0;2;;12.0;50.0;"Sable fin";;2;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"P9300049.JPG";;8.0;2;75.0;2;1.5;2;;2.0;75.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"P9300045.JPG";;5.0;2;35.0;2;6.0;2;;75.0;3.0;"Sable fin";0.5;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;5.0;"Sable grossier";;;2;;;;;3;;;;;;;1;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"P9300046.JPG";;;;;;;;;;;;2.0;;1;;3;;;;;;;;;44;30;44;22;31;;;;;;;3.0;0.5;;;;;5.0;"Sable grossier";;;2;;;;;3;;;;;;;1;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"P9300039.JPG";;2.5;2;50.0;2;10.0;2;;100.0;;;;;;;1;;;;;;;;;33;10;4;5;20;;;;;;;;;;0.5;;;;"Sable grossier";;;1;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"P9300040.JPG";;;;;;;;;5.0;;;50.0;;;;;;;;;;;;;27;32;20;21;32;;;;;;;5.0;0.5;;;;;;"Sable grossier";;;1;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"P9300036.JPG";;3.0;2;25.0;2;20.0;2;;;;;5.0;3;;;;;;;;;;;;17;4;0;0;0;;;;;;;;;;;;;0.5;"Sable grossier";;;1;;;;;1;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"P9300038.JPG";;;;;;;;;;;;;;;;1;;;1;;;;;;33;46;37;40;38;;;;;;;3.0;6.5;;;;;0.5;"Sable grossier";;;1;;;;;1;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"P9300027.JPG";;8.0;2;25.0;2;30.0;2;;100.0;5.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.5;"Sable grossier";;;1;;;;;2;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"P9300028.JPG";;;;;;;;;25.0;;;;;;;;;;1;;;;;;31;33;39;23;37;;;;;;;;5.5;2.0;;;;0.5;"Sable grossier";;;1;;;;;2;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"P9300025.JPG";;30.0;3;15.0;2;0.5;1;;80.0;;;5.0;;;;1;;;;;;;;;1;1;0;1;0;;;;;;;;0.5;;;;;;"Sable grossier";;;1;;;;;3;;;;;;;2;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"P9300026.JPG";;;;;;;;;0.5;;;5.0;;2;;1;;;;;;;;;10;31;22;18;25;;;;;;;36.0;;;;;;;"Sable grossier";;;1;;;;;3;;;;;;;2;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"P9300009.JPG";;5.0;2;25.0;2;10.0;2;;2.0;12.0;"Sable fin";;;2;;;;;;;;;;;;;;;;;;;;;;;;;;;;1.5;;;;;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"P9300011.JPG";;;;;;;;;;;;6.0;;;;;;;;;;;;;37;30;34;41;60;;;;;;;;;;;;;1.5;;;;;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"P9300003.JPG";;15.0;2;50.0;2;;;;;100.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.0;"Sable grossier";;;;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"P9300004.JPG";;;;;;;;;;;;;;;;;;;;;;;;;28;18;19;27;32;;;;;;;2.0;5.0;;;;;0.0;"Sable grossier";;;;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"P9300001.JPG";;3.0;1;80.0;2;1.5;;0.0;0.0;100.0;"Sable fin";0.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1.0;"Sable grossier";;;1;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"P9300002.JPG";;;;0.0;;0.0;;;0.0;;;0.5;;;;;;;;;;;;;80;50;40;30;25;;;;;;;4.0;;;;;;1.0;"Sable grossier";;;1;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"P9300047.JPG";;0.5;1;50.0;2;0.5;2;;75.0;;;5.0;;;1;;;;1;;;;;;0;8;14;27;14;;;;;;;;;;;;;2.0;"Sable grossier";;;;;;;;;;;;;;;;; +377387;"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"P9300048.JPG";;;;;;;;;5.0;;;5.0;;;;;;;3;;;;;;29;15;34;33;43;;;;;;;2.0;;;;;;2.0;"Sable grossier";;;;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;"P4070026.JPG";;3.0;2;45.0;2;3.0;2;;12.0;50.0;"Sable fin";;2;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"P4070035.JPG";;8.0;2;75.0;2;1.5;2;;2.0;75.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"P4070009.JPG";;25.0;;100.0;2;5.0;2;;25.0;;;;2;1;;5;;;;;;;;;80;50;30;50;80;;;;;;;;;;;;;0.5;"Sable grossier";;;2;;;;;2;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"P4070010.JPG";;;;;;;;;25.0;;;25.0;;5;;;;;;;;;;;50;40;50;30;40;;;;;;;10.0;2.0;;;;;0.5;"Sable grossier";;;2;;;;;2;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"P4070012.JPG";;5.0;2;25.0;2;10.0;2;;2.0;12.0;"Sable fin";;;2;;;;;;;;;;;;;;;;;;;;;;;;;;;;1.5;;;;;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"P4070013.JPG";;;;;;;;;;;;6.0;;;;;;;;;;;;;37;30;34;41;60;;;;;;;;;;;;;1.5;;;;;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"P4070004.JPG";;15.0;2;50.0;2;;;;;100.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.0;"Sable grossier";;;;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"P4070005.JPG";;;;;;;;;;;;;;;;;;;;;;;;;28;18;19;27;32;;;;;;;2.0;5.0;;;;;0.0;"Sable grossier";;;;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"P4070002.JPG";;3.0;;80.0;;1.5;;0.0;0.0;100.0;"Sable fin";0.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1.0;"Sable grossier";;;1;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"P4070003.JPG";;;;0.0;;0.0;;;0.0;;;0.5;;;;;;;;;;;;;80;50;40;30;25;;;;;;;4.0;;;;;;1.0;"Sable grossier";;;1;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"P4070016.JPG";;30.0;3;15.0;2;0.5;1;;80.0;;;5.0;;;;1;;;;;;;;;1;1;0;1;0;;;;;;;;0.5;;;;;;"Sable grossier";;;1;;;;;3;;;;;;;2;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"P4070017.JPG";;;;;;;;;;;;5.0;;2;;1;;;;;;;;;10;31;22;18;25;;;;;;;36.0;;;;;;;"Sable grossier";;;1;;;;;3;;;;;;;2;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"P4070018.JPG";;9.5;2;25.0;2;30.0;2;;100.0;5.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.5;"Sable grossier";;;1;;;;;2;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"P4070019.JPG";;;;;;;;;25.0;;;;;;;;;;;;;;;;31;33;39;23;37;;;;;;;;5.5;2.0;;;;0.5;"Sable grossier";;;1;;;;;2;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"P4070022.JPG";;3.0;2;5.0;2;20.0;2;;;;;5.0;3;;;;;;;;;;;;17;4;0;0;0;;;;;;;;;;;;;0.5;"Sable grossier";;;1;;;;;1;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"P4070023.JPG";;;;;;;;;;;;;;;;1;;;;;;;;;33;46;37;40;38;;;;;;;3.0;6.5;;;;;0.5;"Sable grossier";;;1;;;;;1;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"P4070024.JPG";;2.5;2;50.0;2;10.0;2;;100.0;;;;;;;1;;;;;;;;;33;10;4;5;20;;;;;;;;;;0.5;;;;"Sable grossier";;;1;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"P4070025.JPG";;;;;;;;;5.0;;;50.0;;;;;;;;;;;;;27;32;20;21;32;;;;;;;5.0;0.5;;;;;;"Sable grossier";;;1;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"P4070028.JPG";;10.0;2;35.0;2;6.0;2;;75.0;0.5;"Sable fin";0.5;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;5.0;"Sable grossier";;;2;;;;;3;;;;;;;1;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"P4070029.JPG";;;;;;;;;;;;2.0;;1;;3;;;;;;;;;44;30;44;22;31;;;;;;;3.0;0.5;;;;;5.0;"Sable grossier";;;2;;;;;3;;;;;;;1;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"P4070032.JPG";;0.5;1;50.0;2;0.5;2;;75.0;;;5.0;;;1;;;;;;;;;;0;8;14;27;14;;;;;;;;;;;;;2.0;"Sable grossier";;;;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"P4070033.JPG";;;;;;;;;5.0;;;5.0;;;;;;;;;;;;;29;15;34;33;43;;;;;;;2.0;;;;;;2.0;"Sable grossier";;;;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"P4070007.JPG";;1.0;2;70.0;2;5.0;2;;50.0;50.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"P4070014.JPG";;13.0;2;40.0;2;;;;100.0;80.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;1.0;;;;;;;;;;;;;;;;;;;;; +377454;"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"P4070020.JPG";;25.0;2;6.0;2;;;;100.0;;;5.0;;;;1;;;;;;;;;5;7;0;0;0;;;;;;;;;2.0;;;;;;;;;;;;;;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"P9170019.JPG";;25.0;3;70.0;3;5.0;2;;50.0;30.0;"Sable fin";;2;2;;;;;;;;;;;12;7;8;5;14;;;;;;;;;;;;;15.0;"Sable grossier";;1;;;;;;;;1;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"P9170021.JPG";;;;;;;;;5.0;;;5.0;;;;;;;;;;;;;37;43;17;15;7;;;;;;;10.0;;1.0;;;;15.0;"Sable grossier";;1;;;;;;;;1;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune";"P9170016.JPG";;90.0;3;10.0;3;0.0;;5.0;15.0;85.0;"Sable fin";0.0;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1.0;"Sable grossier";;;;;;;;;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"P9170017.JPG";;;;0.0;;0.0;;;3.0;;;50.0;;;;;;;;;;;;;44;55;60;40;37;;;;;;;5.0;;;0.5;;;1.0;"Sable grossier";;;;;;;;;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Verte";"P9170022.JPG";;0.0;;25.0;3;70.0;3;;;85.0;"Sable fin";15.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"P9170023.JPG";;;;5.0;2;;;;70.0;;;30.0;;;;;;;;;;;;;23;27;19;32;19;;;;;;;1.0;2.0;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"P9170024.JPG";;;;100.0;3;;;;20.0;80.0;"Sable fin";;;7;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"P9170025.JPG";;;;;;;;;20.0;;;30.0;1;;;1;;;;;;;;7;27;32;37;23;16;;;;;;;0.5;0.5;;;;;;;;;;;;;;1;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"P9170027.JPG";;10.0;3;50.0;3;5.0;2;;90.0;15.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"P9170028.JPG";;;;;;;;;5.0;;;;;12;;;;;;;;;;;16;23;27;14;32;;;;;;;0.5;;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"P9170029.JPG";;10.0;3;70.0;3;;;;60.0;;"Sable fin";;;3;;1;;;;;;;;;;;;;;;;;;;;;;;;;;15.0;"Sable grossier";;;;;;;;2;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"P9170030.JPG";;;;;;;;;5.0;;;;;1;;;;;;;;;;1;40;27;33;18;23;;;;;;;1.0;1.0;;;;;15.0;"Sable grossier";;;;;;;;2;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"P9170033.JPG";;15.0;3;70.0;2;10.0;2;;60.0;40.0;"Sable fin";;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;3.0;"Sable grossier";;;1;;;;;;;1;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"P9170034.JPG";;;;;;;;;10.0;;;;;5;;;;;;;;;;;60;63;57;65;50;;;;;;;2.0;3.0;;;;;3.0;"Sable grossier";;;1;;;;;;;1;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"P9170035.JPG";;;;30.0;2;80.0;2;;40.0;60.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;0.5;;;;;5.0;"Sable grossier";;;;;;;;;;1;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"P9170036.JPG";;;;;;;;;60.0;;;;;;;;;;;;;;;1;18;25;23;16;14;;;;;;;2.0;;1.0;2.0;;;5.0;"Sable grossier";;;;;;;;;;1;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"P9170018.JPG";;10.0;2;80.0;2;15.0;2;;15.0;85.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"P9170026.JPG";;;;95.0;2;5.0;2;;80.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche";"P9170031.JPG";;;;100.0;3;10.0;2;;70.0;30.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377521;"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;"P9170032.JPG";;;;100.0;2;5.0;2;;15.0;80.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"P4270033.JPG";;5.0;2;25.0;2;;;;2.0;45.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.5;"Sable grossier";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"P4270032.JPG";;;;;;;;;;;;5.0;;;;;;;;;;;;;21;20;21;16;18;;;;;;;;10.0;0.25;;;;0.5;"Sable grossier";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"P4270029.JPG";;10.0;2;60.0;2;;;;;100.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"P4270030.JPG";;;;;;;;;1.0;;;0.25;;1;;;;;;;;;;1;7;12;17;13;15;;;;;;;0.5;5.0;1.0;;;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"P4270025.JPG";;2.0;2;75.0;2;0.5;2;;0.5;100.0;"Sable fin";;;2;;1;;;;;;;;;;;;;;;;;;;;;;;;;;0.5;"Sable grossier";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"P4270026.JPG";;;;;;;;;;;;2.0;;1;;1;;;;;;;;5;27;19;18;25;24;;;;;;;;;;;;;0.5;"Sable grossier";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"P4270023.JPG";;1.0;2;85.0;2;;;;;100.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.25;"Sable grossier";;;;;;;;1;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"P4270024.JPG";;;;0.5;2;;;;1.5;;;1.0;;;;;;;;;;;;;26;24;24;12;9;;;;;;;;20.0;;;;;0.25;"Sable grossier";;;;;;;;1;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"P4270012.JPG";;0.5;1;80.0;2;0.5;1;;10.0;10.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.5;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"P4270013.JPG";;;;;;;;;2.5;;;0.5;;;;1;;;;;;;;;26;38;28;36;34;;;;;;;;1.0;;;;;0.5;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Verte";"P4270010.JPG";;;;5.0;2;100.0;3;;5.0;80.0;"Sable fin";;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;1.0;"Sable grossier";;;;;;;;1;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"P4270011.JPG";;;;0.5;2;;;;20.0;;;;;;;6;;;;;;;;;21;24;30;18;37;;;;;;;1.0;0.5;;;;;1.0;"Sable grossier";;;;;;;;1;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"P4270005.JPG";;3.0;1;50.0;3;0.25;;;5.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"P4270006.JPG";;;;;;;;;;;;;;;;1;;;;;;;;;18;21;13;16;30;;;;;;;0.25;0.75;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Verte";"P4270003.JPG";;1.0;;0.5;2;100.0;2;;;100.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.5;"Sable grossier";;;1;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"P4270004.JPG";;;;2.5;1;;;;4.0;;;2.0;;1;;2;;;;;;;;;26;17;18;24;11;;;;;;;1.5;;;;;;0.5;"Sable grossier";;;1;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"P4270018.JPG";;0.5;2;55.0;2;1.0;2;;3.0;80.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.0;"Sable grossier";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"P4270019.JPG";;;;;;;;;;;;1.0;;;;;;;;;;;;1;10;19;23;23;21;;;;;;;;23.0;;;;;0.0;"Sable grossier";;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"P4270016.JPG";;0.5;2;40.0;2;;;;0.5;100.0;"Sable fin";0.0;;1;;;;;;;;;;;;;;;;;;;;;;;0.25;;;;;0.5;"Sable grossier";;1;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"P4270017.JPG";;;;;;;;;;75.0;"Sable fin";;;;;;;;;;;;;;24;10;10;19;16;;;;;;;;1.5;;;;;0.5;"Sable grossier";;1;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"P4270020.JPG";;85.0;2;;;;;;;100.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;0.5;;;;;;;;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"P4270008.JPG";;10.0;2;20.0;;3.0;;;60.0;1.0;"Sable fin";;;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge";"P4270014.JPG";;1.5;2;75.0;2;;;;15.0;50.0;"Sable fin";;;;;3;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;"P4270027.JPG";;0.5;2;2.0;2;;;;;75.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377576;"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"P4270031.JPG";;0.5;2;100.0;2;;;;;100.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";;"DSCF0435.JPG";;0.25;2;75.0;2;;;;;75.0;"Sable fin";;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"DSCF0415.JPG";;1.0;2;50.0;2;0.25;1;;2.0;80.0;"Sable fin";;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;"DSCF0416.JPG";;;;;;;;;0.5;;;5.0;;;;;;;;;;;;;64;28;23;46;18;;;;;;;1.0;1.0;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"DSCF0419.JPG";;1.5;2;75.0;2;0.25;;0.25;2.0;60.0;"Sable fin";;1;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;10.0;"Sable grossier";;;1;;;;;3;;1;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"DSCF0420.JPG";;;;;;;;;;;;15.0;;;;;;;;;;;;;50;45;18;47;37;;;;;;;2.0;7.0;;;;;10.0;"Sable grossier";;;1;;;;;3;;1;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"DSCF0424.JPG";;3.5;2;50.0;2;2.0;2;;1.0;50.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.1;"Sable grossier";;;;;;;;1;;;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"DSCF0425.JPG";;;;;;;;;;;;10.0;;1;;;;;;;;;;1;37;41;20;26;21;;;;;;;0.25;3.0;;;;;0.1;"Sable grossier";;;;;;;;1;;;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"DSCF0426.JPG";;1.0;2;85.0;2;;;;;75.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1;;;;;;;1;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"DSCF0427.JPG";;;;;;;;;;;;10.0;;2;;;;;;;;;;;64;54;68;64;45;;;;;;;13.0;0.25;;;;;;;;;1;;;;;;;1;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"DSCF0431.JPG";;8.0;2;85.0;;;;;;85.0;"Sable fin";;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"DSCF0432.JPG";;;;;;;;;5.0;;;5.0;1;4;;;;;;;;;;1;42;46;33;27;62;;;;;;;;1.0;;;;;;;;;;;;;;;;;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;"DSCF0433.JPG";;15.0;2;80.0;2;0.5;;;;50.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;10.0;"Sable grossier";;;1;;;;;4;;;;1;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;"DSCF0434.JPG";;;;;;;;;2.0;;;5.0;;1;;;;;;;;;;;37;35;43;47;34;;;;;;;;2.5;;;;;10.0;"Sable grossier";;;1;;;;;4;;;;1;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;"DSCF0422.JPG";;;;95.0;2;;;;2.0;60.0;"Sable fin";;1;2;2;;;;;;;;;;;;;;;;;;;;;;0.5;;;;;;;;;;;;;;;;;;;;;;; +377643;"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;"DSCF0428.JPG";;2.0;2;90.0;2;;;;35.0;10.0;"Sable fin";;2;3;2;;;;;;;;;;;;;;;;;;;;;;2.0;;;;;;;;;;;;;;;;;;;;;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"PA070058.JPG";;1.0;2;10.0;2;;;;2.0;35.0;"Sable fin";;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.5;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"PA070059.JPG";;;;;;;;;;;;1.0;;;;;;;;;;;;;18;27;32;47;36;;;;;;;0.25;;;;;;0.5;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge";"PA070060.JPG";;;2;;2;;;;;;"Sable fin";;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"PA070040.JPG";;1.0;2;30.0;2;0.125;1;0.5;5.0;1.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.5;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;1;;;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"PA070042.JPG";;;;;;;;;;;;4.0;;1;;;;;;;;;;;42;53;36;41;62;;;;;;;0.5;;0.25;;;;0.5;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;1;;;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"PA070043.JPG";;1.0;2;60.0;2;;;;2.0;20.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.25;"Petits blocs, sable grossier, d�bris coquillers";;;2;;;;;4;;;;2;;;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"PA070050.JPG";;;;;;;;;;;;5.0;;1;;;;;;;;;;;37;23;38;32;41;;;;;;;0.25;;0.25;;;;0.25;"Petits blocs, sable grossier, d�bris coquillers";;;2;;;;;4;;;;2;;;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"PA070056.JPG";;5.0;2;1.0;2;;;;;85.0;"Sable fin";;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1;;;;;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"PA070057.JPG";;;;0.125;;;;;;;;0.25;;1;;;;;;;;;;;21;16;18;27;24;;;;;;;;3.0;;;;;;;;;;;;;;;;1;;;;;;; +377686;"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"PA070039.JPG";;;2;;2;;;;;;"Sable fin";;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;"P4080018.JPG";;5.0;2;50.0;2;0.5;2;;8.0;;;1.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"P4080002.JPG";;1.0;2;85.0;2;;;;10.0;3.0;"D�bris coquilliers";;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;2;;1;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;"P4080003.JPG";;;;;;;;;;2.0;;;;;5;;;;;;;;;;10;13;9;5;34;;;;;;;7.0;0.5;;;10.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;2;;1;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"P4080004.JPG";;0.5;2;85.0;2;;;;100.0;;;10.0;;;1;1;;;;;;;;;;;;;;;;;;;;;;;;;;11.0;"Sable grossier";;;;;;;;1;;;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"P4080005.JPG";;;;;;;;;;;;;;;6;;;;;;;;;;23;18;17;12;38;;;;;;;;;;;25.0;;11.0;"Sable grossier";;;;;;;;1;;;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";;"P4080008.JPG";;2.0;2;60.0;2;1.5;2;;1.0;;;2.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;2;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;"P4080009.JPG";;;;;;;;;;;;2.0;;;;;;;;;;;;;46;20;26;18;15;;;;;;;;;;;;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;2;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";;"P4080010.JPG";;1.0;2;25.0;2;1.0;2;;0.5;6.5;"D�bris coquilliers";1.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;4.0;"Sable grossier";;;;;;;;;;;;;;;5;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;"P4080011.JPG";;;;;;;;;;;;7.0;;1;1;;;;;;;;;;;;;;;;;;;;;;1.0;;;0.5;;4.0;"Sable grossier";;;;;;;;;;;;;;;5;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;"P4080014.JPG";;1.0;2;50.0;2;50.0;2;2.0;;20.0;"D�bris coquilliers";;;;;;;;;;;;;;;;;;;;;;;;;2.0;;;;15.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;1;;;;;;;;;;3;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;"P4080015.JPG";;;;;;;;;;;;7.0;;;;1;;;;;;;;;15;17;34;19;42;;;;;;;;;;;;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;1;;;;;;;;;;3;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"P4080016.JPG";;4.0;2;60.0;2;0.5;2;;8.0;2.0;"D�bris coquilliers";4.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;1;;;;;;;;;;4;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;"P4080017.JPG";;;;;;;;;;;;15.0;;2;2;;;;;;;;;;22;32;30;15;25;;;;;;;3.0;1.0;;;;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;1;;;;;;;;;;4;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"P4080020.JPG";;5.0;1;40.0;2;4.5;2;2.5;1.0;75.0;"D�bris coquilliers";1.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;2.0;"Sable grossier";;;;;;;;;;;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"P4080021.JPG";;;;;;;;;;;;4.0;;;;;;;;;;;;;21;22;36;32;27;;;;;;;1.5;1.0;;;10.0;;2.0;"Sable grossier";;;;;;;;;;;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"P4080022.JPG";;1.0;2;30.0;2;2.5;2;1.5;1.0;6.0;"D�bris coquilliers";30.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;"Sable grossier";;;;;2;;;;;;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"P4080023.JPG";;;;;;;;;;;;3.0;;;1;2;;;;;;;;;26;30;29;24;21;;;;;;;2.0;4.0;;;2.0;;;"Sable grossier";;;;;2;;;;;;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"P4080026.JPG";;2.0;2;60.0;2;1.5;2;;4.0;1.0;"D�bris coquilliers";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;1;;;;;;;3;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"P4080027.JPG";;;;;;;;;;;;2.0;;;;;;;;;;;;;23;16;22;33;25;;;;;;;;1.5;;;3.0;;;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;1;;;;;;;3;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;"P4080028.JPG";;2.0;2;65.0;2;1.0;2;;4.0;1.5;"D�bris coquilliers";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;"P4080029.JPG";;;;;;;;;;;;3.5;;1;2;;;;;;;;;;21;10;34;22;26;;;;;;;0.75;1.0;;;;;;;;;;;;;;;;;;;;;1;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;"P4080006.JPG";;;;60.0;2;2.5;2;;16.0;15.0;;;;1;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";;"P4080012.JPG";;1.0;2;100.0;2;;;2.5;17.0;4.0;"D�bris coquilliers";;;1;2;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Roche en place";"4";"face sup�rieure";;"P4080024.JPG";;2.0;2;50.0;1;;;;1.0;;"D�bris coquilliers";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377717;"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";;"P4080030.JPG";;75.0;2;1.0;2;;;;0.5;;"D�bris coquilliers";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"RIMG1072.JPG";;80.0;2;5.0;1;;;3.0;90.0;;;10.0;;;;;;;;;;;;;13;1;0;3;15;;;;;;;;;1.5;;;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;2;;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"RIMG1071.JPG";;;;;;;;;;;;20.0;;;;;;;;;;;;;10;12;10;12;18;;;;;;;5.5;;25.0;;12.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;2;;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;"RIMG1090.JPG";;;;80.0;2;20.0;2;;16.0;15.0;;5.0;;2;0;;;;;;;;;;0;3;1;2;0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;;;5.0;2;50.0;2;0.5;2;;8.0;;;1.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Roche en place";"4";"face sup�rieure";;"RIMG1076.JPG";;2.0;2;50.0;1;;;;100.0;;"D�bris coquilliers";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"RIMG1088.JPG";;3.0;2;37.5;;5.0;;;5.0;80.0;"Sable grossier";;;;;;;;;;;;;;0;0;0;0;0;;;;;;;;;;;;;5.0;"Sable grossier";;;;;;;;1;;;;;;;;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;"RIMG1087.JPG";;;;;;;;;1.0;;;50.0;;;;;;;;;;;;;10;5;6;0;0;;;;;;;7.0;;;;;;5.0;"Sable grossier";;;;;;;;1;;;;;;;;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"RIMG1086.JPG";;;;1.0;1;80.0;2;;60.0;50.0;;40.0;;1;;;;;;;;;;;10;8;0;0;0;;;;;;;;;;;;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;1;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"RIMG1085.JPG";;;;;;;;;1.0;;;50.0;;;;;;;;;;;;;14;13;10;15;17;;;;;;;3.75;;;;;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;1;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;"RIMG1067.JPG";;5.0;2;30.0;2;5.0;2;;100.0;0.0;;;6;2;1;;;;;;;;;;;;;;;;;;;;;;;;;;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;1;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;"RIMG1070.JPG";;;;;;;;;;0.0;;1.0;;;;;;;;;;;;;19;11;6;18;12;;;;;;;1.0;0.5;;;43.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;1;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"RIMG1077.JPG";;3.0;2;85.0;2;10.0;;;50.0;1.0;"Sable fin";;;;5;;;;;;;;;;;;;;;;;;;;;0.125;;;;;;;;;2;1;;;;;4;;;10;;;;5;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;"RIMG1082.JPG";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;30.0;1.0;;;50.0;;;;;2;1;;;;;4;;;10;;;;5;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"RIMG1074.JPG";;3.0;1;30.0;2;0.5;1;0.5;90.0;;;;;;;1;;;;;;;;;3;4;7;4;6;;;;;;;;3.0;;;;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;1;;;;;;;;;1;;; +377784;"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"RIMG1073.JPG";;;;;;;;;;;;;;;;;;;;;;;;;36;16;13;39;25;;;;;;;3.5;8.0;;;5.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;1;;;;;;;;;1;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"RIMG1502.JPG";;0.5;1;90.0;3;10.0;3;;10.0;;;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1;;;;;2;;;;;;;2;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"RIMG1503.JPG";;;;;;;;;;;;50.0;;1;;;;;;;;;;10;20;12;12;14;5;;;;;;;;5.0;;;;;;;;;1;;;;;2;;;;;;;2;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"10";"face sup�rieure";;"RIMG1506.JPG";;;;90.0;3;5.5;2;;100.0;;;;;2;;;;;;;;;;;;;;;;;;;;;;;;;;;;;"Sable grossier";;1;;;;;;;;2;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"10";"face inf�rieure";;"RIMG1507.JPG";;;;;;;;;33.0;;;50.0;;1;;;;;;;;;;5;8;10;16;8;17;;;;;;;;0.5;;;;;;"Sable grossier";;1;;;;;;;;2;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc fix�";"1";"face sup�rieure";;"RIMG1477.JPG";;10.0;1;90.0;3;10.0;2;;80.0;;;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc fix�";"2";"face sup�rieure";;"RIMG1500.JPG";;10.0;3;50.0;3;0.5;1;;50.0;1.0;"Sable fin";;;;;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc fix�";"3";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc fix�";"5";"face sup�rieure";;;;1.0;1;100.0;2;0.5;1;;25.0;10.0;"D�bris coquilliers";;;4;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Roche en place";"4";"face sup�rieure";;"RIMG1490.JPG";;5.0;2;80.0;2;0.0;;0.25;10.0;25.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"RIMG1470.JPG";;0.125;1;30.0;2;100.0;3;;5.0;0.0;;;;;2;;;;;;;;;1;2;0;0;4;0;;;;;;;1.0;0.5;;;2.0;;20.0;"Sable grossier";;;;;;;;4;;;;;;;2;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"1";"face inf�rieure";;"RIMG1471.JPG";;0.0;;0.0;;0.0;;0.0;31.0;0.5;"Sable grossier";5.0;;18;;4;;;;;;;;;27;3;5;12;1;;;;;;;;4.0;;;;;20.0;"Sable grossier";;;;;;;;4;;;;;;;2;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"RIMG1474.JPG";;1.5;1;90.0;3;1.0;1;;90.0;;;;;7;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"RIMG1475.JPG";;;;;;;;;;;;;;2;;;;;;;;;;7;35;12;29;21;19;;;;;;;;25.0;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"3";"face sup�rieure";;"RIMG1492.JPG";;0.5;1;100.0;3;;;;90.0;;;;;3;1;12;;;;;;;;;10;0;5;3;0;;;;;;;;;;;;;;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;1;;1;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"3";"face inf�rieure";;"RIMG1493.JPG";;;;;;;;;;;;10.0;;2;;;;;;;;;;4;15;10;5;9;22;;;;;;;;50.0;25.0;;;;;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;1;;1;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"4";"face sup�rieure";;"RIMG1498.JPG";;1.0;1;100.0;2;;;0.5;25.0;10.0;"Sable fin";0.0;;2;;;;;;;;;;;;;;;;;;;;;;;;;;;;;"Blocs";;;;;;;;2;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"4";"face inf�rieure";;"RIMG1499.JPG";;;;;;;;;;20.0;;;;7;;;;;;;;;;9;11;8;10;5;9;;;;;;;37.5;10.0;;;;;;"Blocs";;;;;;;;2;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"5";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"5";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"6";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"6";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"RIMG1480.JPG";;;;100.0;2;25.0;2;;10.0;10.0;"D�bris coquilliers";;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;2.0;"Sable grossier";;;;;;;;2;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"RIMG1485.JPG";;;;;;;;;;;;5.5;;;;;;;;;;;;10;28;18;13;10;4;;;;;;;0.5;1.0;;;;;2.0;"Sable grossier";;;;;;;;2;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"RIMG1488.JPG";;4.0;1;90.0;2;1.0;2;;30.0;2.0;"D�bris coquilliers";;;7;1;1;;;;;;;;;;;;;;;;;;;;;;;;;;2.0;"Blocs";;;;;;;;;;;;;;;;; +377827;"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"RIMG1489.JPG";;;;0.125;1;;;;2.0;0.0;;4.0;;2;;1;;;;;;;;9;18;20;20;22;4;;;;;;;6.0;8.0;;;;;2.0;"Blocs";;;;;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc fix�";"4";"face sup�rieure";;"P1130155.JPG";;0.5;1;40.0;2;5.0;2;;10.0;30.0;"Sable fin";10.0;;;;;;;;;;;;1;0;0;0;0;3;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"P1130132.JPG";;1.0;1;60.0;2;;;;90.0;4.0;"D�bris coquilliers";1.0;;;;;;;;;;;;;1;2;0;4;0;;;;;;;;;;;;;3.5;"Sable grossier";;;;;;;;1;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"1";"face inf�rieure";;"P1130134.JPG";;;;;;;;;;;;25.0;;;;;;;;;;;;5;7;3;4;6;0;;;;;;;50.0;;;;25.0;;3.5;"Sable grossier";;;;;;;;1;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"P1130135.JPG";;15.0;1;85.0;2;;;;60.0;4.0;"D�bris coquilliers";5.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;10.0;"Sable grossier";;;;1;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"P1130136.JPG";;;;;;;;;;;;;;;;;;;;;;;;6;21;6;27;7;23;;;;;;;50.0;;;;;;10.0;"Sable grossier";;;;1;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"3";"face sup�rieure";;"P1130138.JPG";;2.0;2;90.0;2;1.0;2;;50.0;50.0;"D�bris coquilliers";;;;1;;;;;;;;;;5;0;7;6;0;;;;;;;;;;;;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;1;;;;1; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"3";"face inf�rieure";;"P1130140.JPG";;;;;;;;;;;;;;;;;;;;;;;;13;5;5;10;9;0;;;;;;;20.0;;;;5.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;1;;;;1; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"4";"face sup�rieure";;"P1130141.JPG";;;;2.0;2;60.0;2;;40.0;35.0;"Sable fin";5.0;;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;20.0;"Sable grossier";;;;;;;;;;;;;;;;1; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"4";"face inf�rieure";;"P1130142.JPG";;;;;;;;;65.0;;;35.0;;;;;;;;;;;;4;10;7;23;0;21;;;;;;;0.5;0.25;;;;;20.0;"Sable grossier";;;;;;;;;;;;;;;;1; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"5";"face sup�rieure";;"P1130145.JPG";;39.0;1;75.0;2;10.0;2;;95.0;2.0;"Sable fin";;;1;1;;;;;;;;;;13;0;0;0;0;;;;;;;;1.0;;;;;10.0;"Sable grossier";;;;2;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"5";"face inf�rieure";;"P1130150.JPG";;;;1.0;;;;;;;;;;;;;;;;;;;;6;5;4;22;9;7;;;;;;;;40.0;;;;;10.0;"Sable grossier";;;;2;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"P1130146.JPG";;10.0;1;20.0;2;30.0;2;;80.0;;;;;;1;1;;;;;;;;;;;;;;;;;;;;;1.0;;;;;10.0;"Sable grossier";;;1;;;;;;;;2;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"6";"face inf�rieure";;"P1130149.JPG";;;;;;;;;;;;;;;;;;;;;;;;44;22;17;14;10;24;;;;;;;10.0;;;;;;10.0;"Sable grossier";;;1;;;;;;;;2;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"P1130156.JPG";;1.0;3;30.0;2;0.5;2;;85.0;;;1.0;;;3;;;;;;;;;;;;;;;;;;;;;;;;;;;10.0;"Sable grossier";;;;;;;;1;;;;;;;;1; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"P1130158.JPG";;;;;;;;;;;;;;;1;;;;;;;;;7;11;21;19;29;19;;;;;;;20.0;;;;;;10.0;"Sable grossier";;;;;;;;1;;;;;;;;1; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"P1130157.JPG";;2.0;1;80.0;2;5.0;2;;90.0;35.0;"D�bris coquilliers";2.0;;;;;;;;;;;;;6;0;0;0;0;;;;;;;;;;;;;30.0;"Sable grossier";;;;;;;;;;1;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"P1130159.JPG";;;;;;;;;;;;;;;;;;;;;;;;4;16;15;0;5;10;;;;;;;3.0;;;;;;30.0;"Sable grossier";;;;;;;;;;1;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"P1130162.JPG";;8.0;1;80.0;2;10.0;2;;90.0;5.0;"Sable fin";;;;1;;;;;;;;;;0;0;0;15;0;;;;;;;;;;;;;10.0;"Sable grossier";;;;;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"P1130164.JPG";;;;;;;;;;;;;;;;;;;;;;;;4;15;19;17;20;9;;;;;;;15.0;5.5;;;;;10.0;"Sable grossier";;;;;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"10";"face sup�rieure";;"P1130163.JPG";;60.0;1;90.0;2;1.0;2;;5.0;40.0;"D�bris coquilliers";;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc mobile";"10";"face inf�rieure";;"P1130165.JPG";;;;;;;;;;;;10.0;;;;;;;;;;;;8;17;18;5;20;0;;;;;;;;6.5;;15.0;;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc fix�";"1";"face sup�rieure";;"P1130131.JPG";;1.0;1;12.0;2;0.5;1;;80.0;;;;;;1;;;;;;;;;;4;3;0;3;4;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc fix�";"2";"face sup�rieure";;"P1130139.JPG";;20.0;2;55.0;2;1.0;2;;95.0;2.0;"D�bris coquilliers";1.0;;;1;;;;;;;;;;;;;;;;;;;;;;1.0;;;;;;;;;;;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc fix�";"3";"face sup�rieure";;"P1130144.JPG";;2.5;1;40.0;2;3.0;2;;90.0;5.0;"D�bris coquilliers";5.0;;;3;;;;;;;;;;0;0;0;0;17;;;;;;;;2.0;;;;;;;;;;;;;;;;;;;;;;; +377894;"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Bloc fix�";"5";"face sup�rieure";;"P1130161.JPG";;22.0;1;90.0;2;1.0;2;;70.0;30.0;"D�bris coquilliers";;1;;;;;;;;;;;;16;0;0;0;0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"10";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"10";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"1";"face sup�rieure";;"P4210004.JPG";;25.0;3;70.0;2;20.0;1;2.0;9.0;0.0;;7.0;0;0;0;0;0;0;;;;;;;;;;;;;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"1";"face inf�rieure";;"P4210005.JPG";;0.0;;1.0;1;14.0;2;0.0;2.0;0.0;;2.0;0;1;0;0;0;0;;;;;;;3;11;9;5;11;;;;;;;0.0;5.0;1.25;0.5;8.0;;5.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"2";"face sup�rieure";;"P4210006.JPG";;50.0;3;95.0;2;1.5;3;13.5;50.0;;;2.0;;2;2;;;;;;;;;;;;;;;;;;;;;;;;;;;4.5;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"2";"face inf�rieure";;"P4210007.JPG";;;;;3;2.0;;1.5;3.0;;;4.5;;5;;;;;;;;;;;65;24;33;2;13;;;;;;;1.0;5.0;12.0;;;;4.5;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"3";"face sup�rieure";;"DSCF8844.JPG";;1.0;1;50.0;2;0.25;1;;80.0;;;25.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;17.5;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"3";"face inf�rieure";;"DSCF8846.JPG";;;;;;;;;;;;0.5;;;;;;;;;;;;;18;11;10;8;9;;;;;;;17.0;0.25;;;;;17.5;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"4";"face sup�rieure";;"DSCF8847.JPG";;10.0;3;77.5;2;3.0;2;2.0;35.0;;;;;1;;1;;;;;;;;;;;;;;;;;;;;;1.25;;;;;8.5;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"4";"face inf�rieure";;"DSCF8848.JPG";;;;;;;;;;;;;;;;;;;;;;;;;8;9;24;8;13;;;;;;;1.5;1.0;;20.0;;;8.5;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"5";"face sup�rieure";;"P4210010.JPG";;5.0;1;75.0;2;4.0;2;11.0;50.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1.0;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"5";"face inf�rieure";;"P4210011.JPG";;;;;;;;;1.0;;;;;1;;;;;;;;;;;30;18;37;53;13;;;;;;;16.0;;34.0;;;;1.0;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"6";"face sup�rieure";;"P4210012.JPG";;100.0;3;10.0;2;;;;3.0;;;4.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.0;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"6";"face inf�rieure";;"P4210013.JPG";;;;;;;;;;;;;;;;;;;;;;;;;9;21;32;15;6;;;;;;;29.0;1.0;5.0;;;;0.0;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"7";"face sup�rieure";;"DSCF8853.JPG";;10.0;3;45.0;2;4.0;2;4.5;32.5;;;0.25;;;1;;;;;;;;;;;;;;;;;;;;;1.0;;;;;;0.5;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"7";"face inf�rieure";;"DSCF8854.JPG";;;;;;;;;;;;1.0;;;2;;;;;;;;;;8;36;23;24;23;;;;;;;2.5;7.0;;;;;0.5;"Sable grossier";;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"8";"face sup�rieure";;"DSCF8850.JPG";;6.0;3;40.0;2;;;16.0;;2.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;97.5;"Sable grossier";;;;;;;;;;3;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"8";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;2;19;30;7;8;;;;;;;0.25;4.0;;;;;97.5;"Sable grossier";;;;;;;;;;3;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"9";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc mobile";"9";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc fix�";"1";"face sup�rieure";;"P4210008.JPG";;25.0;3;75.0;2;13.0;2;2.5;65.0;;;1.0;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc fix�";"2";"face sup�rieure";;"DSCF8849.JPG";;65.0;3;24.0;2;;;2.0;22.0;;;6.0;;;;;;;7;;;;;;;;;;;;;;;;;;;;5.0;;;;;;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Roche en place";"3";"face sup�rieure";;"P4210014.JPG";;60.0;3;10.0;2;5.0;2;;70.0;5.0;"Sable grossier";4.0;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Bloc fix�";"4";"face sup�rieure";;"P4210015.JPG";;62.5;3;40.0;2;;;5.0;85.0;;;1.5;;;2;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +377961;"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Roche en place";"5";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"RIMG0681.JPG";;100.0;;;;;;;5.0;75.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"RIMG0645.JPG";;10.0;2;60.0;2;5.0;1;4.0;45.0;;;;;;;;;;;;;;;;6;12;6;3;0;;;;;;;3.0;;0.5;1.5;;;1.0;"Sable grossier";;;1;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"1";"face inf�rieure";;"RIMG0646.JPG";;;;;;;;;;;;0.5;;;;;;;;;;;;4;14;39;23;29;28;;;;;;;35.0;1.75;0.0;0.25;;;1.0;"Sable grossier";;;1;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"RIMG0649.JPG";;5.0;2;30.0;2;30.0;2;0.125;65.0;;;;;;3;;;;;;;;;;5;0;8;0;12;;;;;;;;0.125;;0.25;1.0;;1.0;"Sable grossier";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"2";"face inf�rieure";;"RIMG0652.JPG";;5.0;2;30.0;2;30.0;2;0.125;2.0;;;;;1;;;;;;;;;;2;38;30;9;40;11;;;;;;;1.75;0.5;0.05;0.125;1.0;;1.0;"Sable grossier";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"RIMG0653.JPG";;10.0;2;5.0;2;0.5;2;;80.0;;;0.25;;;;;;;;;;;;;;;;;;;;;;;;;0.25;;;;;1.5;"Sable grossier";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"3";"face inf�rieure";;"RIMG0656.JPG";;;;2.5;;0.25;;;11.0;;;1.5;;;;;;;;;;;;1;38;44;27;10;19;;;;;;;0.25;;3.0;;;;1.5;"Sable grossier";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"RIMG0654.JPG";;37.5;3;4.0;2;;;0.125;;42.5;;;;;;;;;;;;;;;4;0;10;4;27;;;;;;;1.5;;;0.05;;;;"Sable grossier";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"4";"face inf�rieure";;"RIMG0660.JPG";;;;;;;;;;;;;;;;;;;;;;;;1;15;18;34;6;15;;;;;;;15.0;;;0.5;;;;"Sable grossier";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"RIMG0664.JPG";;25.0;3;40.0;2;;;;10.0;;;;;;1;;;;;;;;;;3;1;2;6;2;;;;;;;1.0;;;;;;;"Sable grossier";;;;;;;;;;;1;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"5";"face inf�rieure";;"RIMG0668.JPG";;;;;;;;;0.25;;;;;;;;;;;;;;;4;22;8;59;12;6;;;;;;;10.0;;;0.75;0.5;;;"Sable grossier";;;;;;;;;;;1;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"RIMG0666.JPG";;1.0;2;7.0;2;;;1.0;40.0;;;5.0;;;;;;;;;;;;;;;;;;;;;;;;2.25;;;0.25;;;;"Sable grossier";;;;;;;;1;;1;;;;;1;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"6";"face inf�rieure";;"RIMG0667.JPG";;;;;;;;;1.0;;;2.5;;;;;;;;;;;;10;23;23;10;9;0;;;;;;;2.5;0.5;;0.25;;;;"Sable grossier";;;;;;;;1;;1;;;;;1;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"RIMG0675.JPG";;;;23.5;2;1.0;2;0.5;31.0;;;1.0;;;;;;;;;;;;;5;11;24;20;1;;;;;;;0.75;;;0.125;;;;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"7";"face inf�rieure";;"RIMG0678.JPG";;;;1.0;2;1.5;2;;1.25;;;1.0;;;;;;;;;;;;1;15;7;38;18;3;;;;;;;4.5;;0.5;;;;;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"RIMG0673.JPG";;6.0;2;7.5;2;;;;30.0;;;0.25;;;;;;;;;;;;;0;0;13;8;5;;;;;;;;;;;;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"8";"face inf�rieure";;"RIMG0676.JPG";;;;;;;;;;;;;;;;;;;;;;;;;20;10;20;17;14;;;;;;;17.0;1.0;;;;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune";"RIMG0680.JPG";;50.0;2;15.0;2;2.0;2;0.25;;12.0;;0.25;;;;;;;;;;;;;3;4;2;1;0;;;;;;;;;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"9";"face inf�rieure";;"RIMG0686.JPG";;;;1.5;3;0.5;2;2.0;;16.0;;;;;;;;;;;;;;5;28;16;6;8;4;;;;;;;4.0;;;;0.5;;;"Sable grossier";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"RIMG0682.JPG";;;;3.0;2;0.5;2;0.5;;;;1.0;;;;;;;;;;;;;34;5;26;15;25;;;;;;;1.0;1.0;;;5.0;;1.5;"Sable grossier";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc mobile";"10";"face inf�rieure";;"RIMG0683.JPG";;;;2.0;2;1.0;2;;;;;45.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1.5;"Sable grossier";;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"RIMG0650.JPG";;5.0;2;75.0;3;1.5;2;3.5;75.0;;;;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Roche en place";"2";"face sup�rieure";"Brune-Rouge";"RIMG0661.JPG";;30.0;2;9.0;2;0.25;2;2.0;28.0;;;;;;;;;;;;;;;;3;3;0;0;0;;;;;;;1.75;;;;;;;;;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge";"RIMG0669.JPG";;2.5;1;12.0;2;;;;75.0;;;;;;;;;;;;;;;;;;;;;;;;;;;0.375;0.125;;0.125;;;;;;;;;;;;;;;;;;;;; +378028;"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"RIMG0672.JPG";;7.5;3;20.0;2;;;0.125;60.0;;;;;;;;;;;;;;;;0;14;0;17;6;;;;;;;0.25;;;0.25;;;;;;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc fix�";"2";"face sup�rieure";;"P4080024.JPG";;20.0;2;20.0;2;5.0;;1.0;85.0;;;0.5;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"1";"face sup�rieure";;"P4080048.JPG";;15.0;2;50.0;2;5.0;2;1.0;70.0;;;0.0;;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;0.0;"Sable grossier";;;1;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"1";"face inf�rieure";;"P4080050.JPG";;;;;;;;;;;;0.0;;;;;;;;;;;;;43;17;23;60;38;;;;;;;0.0;0.5;0.0;0.0;0.0;;0.0;"Sable grossier";;;1;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"2";"face sup�rieure";;"P4080049.JPG";;5.0;2;25.0;2;0.5;2;1.0;75.0;0.0;;1.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1.0;"Sable grossier";;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"2";"face inf�rieure";;"P4080051.JPG";;;;;;;;;;;;1.0;;;1;;;;;;;;;;25;30;19;8;25;;;;;;;0.5;0.25;;0.05;0.0;;1.0;"Sable grossier";;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"3";"face sup�rieure";;"P4080018.JPG";;42.5;2;35.0;2;3.5;2;3.5;90.0;;;0.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.0;"Sable grossier";;1;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"3";"face inf�rieure";;;;;;;;;;;;;;0.0;;1;;;;;;;;;;;27;16;39;19;33;;;;;;;;1.5;0.0;2.0;;;0.0;"Sable grossier";;1;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"4";"face sup�rieure";;"P4080020.JPG";;50.0;2;2.0;2;0.5;2;0.5;10.0;;;0.5;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.05;;40.0;"Sable grossier";;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"4";"face inf�rieure";;"P4080023.JPG";;;;0.5;1;;;;1.5;;;1.0;;;;;;;;;;;;5;;;;;;2;;;;;;0.5;;;;;;40.0;"Sable grossier";;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"5";"face sup�rieure";;"P4080027.JPG";;100.0;2;4.0;2;0.25;2;0.125;90.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"5";"face inf�rieure";;;;;;;;;;;;;;;;1;1;;;;;;;;;;27;42;20;31;12;;;;;;;35.0;1.5;;;;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"6";"face sup�rieure";;;;0.25;2;1.0;2;0.0;;0.5;100.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;30.0;;;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"6";"face inf�rieure";;"P4080031.JPG";;;;;;;;;;;;;;2;;;;;;;;;;;;;;;;;;;;;;35.0;;;0.25;;;30.0;;;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"7";"face sup�rieure";;"P4080034.JPG";;40.0;3;50.0;2;1.5;2;1.5;90.0;;;1.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;5.0;"Sable grossier";;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"7";"face inf�rieure";;"P4080037.JPG";;;;;;;;;;;;2.0;;1;;;;;;;;;;;21;53;32;28;43;;;;;;;25.0;2.0;;0.5;;;5.0;"Sable grossier";;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"8";"face sup�rieure";;"P4080035.JPG";;0.5;2;0.5;2;;;5.0;75.0;10.0;"Sable grossier";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;30.0;"Sable grossier";;;;;;;;;;1;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"8";"face inf�rieure";;"P4080036.JPG";;;;;;;;;;;;0.5;;;1;;;;;;;;;;;;;;;1;;;;;;30.0;0.5;;0.05;;;30.0;"Sable grossier";;;;;;;;;;1;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"9";"face sup�rieure";;"P4080043.JPG";;2.0;3;1.0;2;0.5;2;0.5;70.0;;;30.0;;1;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"9";"face inf�rieure";;"P4080044.JPG";;;;;;;;;;;;0.0;;;;;;;;;;;;;10;7;8;12;5;;;;;;;50.0;0.5;;;;;;;;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"10";"face sup�rieure";;"P4080040.JPG";;10.0;2;25.0;2;;2;;100.0;;;0.5;;1;;;;;;;;;;;30;22;33;29;22;;;;;;;;0.5;;;;;;;;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc mobile";"10";"face inf�rieure";;"P4080045.JPG";;;;;;;;;1.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc fix�";"1";"face sup�rieure";;"P4080047.JPG";;10.0;2;50.0;2;0.5;2;1.0;50.0;0.0;;1.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Roche en place";"3";"face sup�rieure";;"P4080026.JPG";;5.0;3;50.0;;;;3.0;85.0;5.0;"Sable grossier";;;;2;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Bloc fix�";"4";"face sup�rieure";;"P4080033.JPG";;0.5;2;30.0;2;;;2.0;100.0;1.0;"Sable fin";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378095;"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Roche en place";"5";"face sup�rieure";;"P4080039.JPG";;5.0;2;20.0;2;0.25;;0.5;100.0;;;0.5;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"RIMG0995.JPG";;65.0;2;1.0;3;0.0;;2.0;75.0;0.0;;0.0;;;;;;;;;;;;;9;7;15;3;14;;;;;;;;;;3.0;;;20.0;"Sable grossier";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;"RIMG0997.JPG";;;;;;;;;1.0;;;;;;;;;;;;;;;;36;30;40;32;22;;;;;;;10.5;;0.5;1.0;;;20.0;"Sable grossier";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"RIMG0996.JPG";;7.0;;10.0;;;;8.0;80.0;0.0;;;;;;;;;;;;;;;0;5;0;3;0;;;;;;;1.0;;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"RIMG0998.JPG";;;;;;;;;;1.0;;;;;;;;;;;;;;;22;0;20;13;0;;;;;;;75.0;;;0.25;0.5;;;"Sable grossier";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;"RIMG1002.JPG";;25.0;;25.0;;1.0;;0.5;100.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;3.0;"Sable grossier";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;"RIMG1004.JPG";;;;;;;;;;;;;;;;;;;;;;;;;12;6;18;15;5;;;;;;;6.0;;;0.5;5.0;;3.0;"Sable grossier";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"RIMG1001.JPG";;0.5;1;35.0;2;0.5;;0.5;3.0;;;;;;;;;;;;;;;;13;0;5;0;4;;;;;;;;;;1.5;;;50.0;"Sable grossier";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;"RIMG1003.JPG";;;;;;;;;;;;;;;;;;;;;;;;;31;15;43;8;40;;;;;;;;1.0;;;;;50.0;"Sable grossier";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"RIMG1008.JPG";;10.0;;75.0;;;;5.0;30.0;;;;;;1;;;;;;;;;;7;5;0;0;4;;;;;;;;;;0.5;;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"RIMG1011.JPG";;;;;;;;;;;;0.5;;2;;;;;;;;;;;47;18;11;21;15;;;;;;;1.5;0.25;;0.75;;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"RIMG1007.JPG";;50.0;3;10.0;2;;;1.0;60.0;;;;;;;;;;;;;;;;15;3;8;0;10;;;;;;;;;;;;;30.0;"Sable grossier";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"RIMG1010.JPG";;;;;;;;;;;;;;;;;;;;;;;;;25;18;27;10;38;;;;;;;7.0;1.0;;;0.5;;30.0;"Sable grossier";;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"RIMG1015.JPG";;100.0;;5.0;;;;;1.0;50.0;"Sable fin";;;;3;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;1;;;;;;;;;;;;;3;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"RIMG1017.JPG";;;;;;;;;;;;;;;;;;;;;;;;;17;8;2;6;7;;;;;;;10.0;;;;;;;;;1;;;;;;;;;;;;;3;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;"RIMG1013.JPG";;30.0;2;50.0;;1.5;;1.5;30.0;;;;;1;1;;;;;;;;;;;;;;;;;;;;;;;;;;;30.0;"Sable grossier";;1;;;;;;1;;2;4;;;;1;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;"RIMG1016.JPG";;;;;;;;;;;;;;;;;;;;;;;;;40;16;13;52;45;;;;;;;2.0;0.5;;;4.0;;30.0;"Sable grossier";;1;;;;;;1;;2;4;;;;1;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Roche en place";"3";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Roche en place";"5";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378162;"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;"IMGP4164.JPG";;;;12.0;2;;;1.0;60.0;;;;;;;;;;;;;;;;0;0;0;0;2;;;;;;;;;;2.0;;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;4;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;"IMGP4165.JPG";;;;;;;;;;;;;;;1;;;;;;;;;;38;22;13;4;23;;;;;;;10.5;;;0.25;1.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;4;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";;"IMGP4181.JPG";;100.0;2;10.0;2;;;;5.0;25.0;"Sable fin";;;;12;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;"IMGP4173.JPG";;10.0;2;7.0;2;;;1.0;100.0;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;0.25;;;;;;;;;;;;;;;;;;;;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;"IMGP4170.JPG";;1.0;2;2.0;2;;;0.5;100.0;;;;;;;;;;;;;;;;;;;;;;;;;;;1.0;;;0.25;;;;;;;;;;;;;;;;;;;;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;"IMGP4162.JPG";;80.0;2;60.0;2;;;51.0;;;;;;;6;;;;;;;;;;;;;;;;;;;;;;;;0.25;;;;;;;;;;;;;;;;;;;;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"IMGP4178.JPG";;21.0;2;6.0;;0.5;;1.0;16.0;;;;;1;;;;;;;;;;;;;;;;;;;;;;;0.5;;;;;;;;;;;;;;;;;5;;;;;1; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"IMGP4180.JPG";;;;;;;;;;;;;;;;;;;;;;;;;3;16;32;12;23;;;;;;;1.0;;;;;;;;;;;;;;;;;;5;;;;;1; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"IMGP4172.JPG";;0.25;;10.0;;;;0.0;11.0;;;;;;;;;;;;;;;;0;17;7;12;3;;;;;;;0.5;;;;;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;1;;;;;;;;;;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"IMGP4176.JPG";;;;1.0;;;;0.25;2.5;;;;;;2;;;;;;;;;;42;28;33;12;27;;;;;;;1.0;;;0.25;;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;1;;;;;;;;;;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"IMGP4168.JPG";;0.5;;2.0;;;;0.25;100.0;;;;;;2;;;;;;;;;;;;;;;;;;;;;;;;;;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;1;;;;;;;;;1;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"IMGP4171.JPG";;;;0.25;;;;0.5;0.5;;;;;;;;;;;;;;;;29;32;41;43;38;;;;;;;12.0;;;;;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;1;;;;;;;;;1;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"IMGP4166.JPG";;0.5;;2.0;;;;1.0;85.0;;;;;;1;;;;;;;;;;0;0;0;0;1;;;;;;;2.0;;;1.5;;;;"Blocs";;;;;;;;;;;;;;;;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;"IMGP4167.JPG";;;;;;;;;;;;;;;;;;;;;;;;;12;21;16;37;6;;;;;;;2.0;;;0.5;;;;"Blocs";;;;;;;;;;;;;;;;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"IMGP4159.JPG";;3.0;2;20.0;2;0.5;2;1.0;85.0;;;1.0;;;;;;;;;;;;;0;0;0;0;3;;;;;;;;;;;;;;"Sable grossier";;;;;;;;;;;;;;;1;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"IMGP4161.JPG";;;;;;;;;;;;;;;;;;;;;;;;;8;5;18;0;21;;;;;;;65.0;;;;2.5;;;"Sable grossier";;;;;;;;;;;;;;;1;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"IMGP4157.JPG";;;;26.0;2;;;2.0;85.0;;;1.0;;;;;;;;;;;;;0;0;1;0;3;;;;;;;;;;1.0;;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;1;;;;;;;;;1;; +378229;"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;"IMGP4158.JPG";;;;;;;;;;20.0;"Sable grossier";1.0;;;;;;;;;;;;;12;1;17;18;11;;;;;;;36.0;;;0.5;5.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;1;;;;;;;;;1;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";;"RIMG1900.JPG";;100.0;2;5.0;2;;;1.0;12.5;40.0;"Sable fin";;;;8;;;;;;;;;;0;0;3;0;0;;;;;;;;0.25;;;;;;;;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;"RIMG1894.JPG";;75.0;2;10.0;2;;;0.25;75.0;;;;;;;;;;;;;;;;0;0;0;0;2;;;;;;;;;;0.25;;;;;;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;"RIMG1884.JPG";;25.0;2;90.0;2;;;1.0;50.0;;;;;;1;;;;;;;;;;;;;;;;;;;;;1.0;;;0.25;;;;;;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;"RIMG1876.JPG";;;;;;5.0;2;10.0;30.0;10.0;"Sable fin";;;1;1;;;;;;;;;;0;5;0;3;2;;;;;;;1.0;;;;;;;;;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;"RIMG1896.JPG";;100.0;2;0.5;;;;;15.0;20.0;;;;1;1;1;;;;;;;;;;;;;;;;;;;;;;;;;;;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;"RIMG1898.JPG";;;;;;0.125;;0.125;;;;;;;;;;;;;;;;;12;0;20;0;9;;;;;;;;;;;;;;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"RIMG1897.JPG";;25.0;2;5.5;2;;;;75.0;25.0;"Sable fin";;;;;;;;;;;;;;4;12;3;0;0;;;;;;;;;;;;;;;;1;;;;;;;;;1;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"RIMG1899.JPG";;;;;;;;;;;;;;;;;;;;;;;;3;1;14;3;6;0;;;;;;;25.0;0.5;;;;;;;;1;;;;;;;;;1;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"RIMG1885.JPG";;20.0;2;5.0;2;;;5.0;50.0;3.0;"Sable grossier";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"RIMG1889.JPG";;;;;;;;0.25;0.5;;;;;;;;;;;;;;;1;45;35;3;58;36;;;;;;;11.25;;;;1.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"RIMG1887.JPG";;25.0;2;25.0;2;5.0;2;1.0;50.0;;;;;;;;;;;;;;;;0;0;0;10;5;;;;;;;;;;;;;;;;;;;;;;;;3;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"RIMG1888.JPG";;;;;;;;;;;;;;;;;;;;;;;;;30;6;42;24;12;;;;;;;25.0;0.25;;;;;;;;;;;;;;;;3;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"RIMG1873.JPG";;1.5;3;12.5;2;;;1.0;95.0;;;5.0;;1;;;;;;;;;;;5;1;0;1;3;;;;;;;;;;;;;15.0;"Sable grossier";;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;"RIMG1875.JPG";;;;;;;;;;;;;;;;;;;;;;;;4;31;42;52;40;28;;;;;;;25.0;;;;0.5;;15.0;"Sable grossier";;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;"RIMG1872.JPG";;45.0;3;;;;;0.25;95.0;;;;;;;;;;;;;;;;0;0;0;0;2;;;;;;;1.5;;;;;;10.0;"Vase";;;;;;;;1;;4;;;;;4;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;"RIMG1874.JPG";;;;;;;;;;;;;;1;;;;;;;;;;;56;33;50;45;15;;;;;;;35.0;;;;20.0;;10.0;"Vase";;;;;;;;1;;4;;;;;4;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"RIMG1880.JPG";;18.75;2;62.5;2;;;0.75;30.0;;;0.5;;;;;;;;;;;;;0;0;0;8;7;;;;;;;1.5;;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"RIMG1883.JPG";;;;;;;;;;;;;;;;;;;;;;;;2;50;4;48;20;43;;;;;;;3.0;1.0;;;;;;"Sable grossier";;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"RIMG1881.JPG";;33.0;2;33.0;2;;;0.25;50.0;;;;;;;;;;;;;;;;12;0;3;4;15;;;;;;;;;;;;;10.0;"Sable grossier";;;;;;;;;;;;;;;;; +378280;"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;"RIMG1882.JPG";;;;;;;;;;;;;;1;;;;;;;;;;;50;39;50;60;45;;;;;;;10.0;;;;;;10.0;"Sable grossier";;;;;;;;;;;;;;;;; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;;"mai14-VerB8sup";20.0;2;70.0;2;30.0;2;0.0;1.0;0.0;"Pas de s�diment";4.0;0;0;1;0;0;0;;;;;;11;0;0;0;0;0;0;;;;;;0.0;0.25;0.0;0.0;12.0;;40.0;"Sable grossier";;0;0;1;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;;"mai14-VerB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";40.0;0;2;1;0;0;0;;;;;;15;;;;;;1800;;;;;;0.0;2.5;3.0;0.0;15.0;;40.0;"Sable grossier";;0;0;1;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;;"mai14-VerB1sup";40.0;2;0.5;2;0.0;;0.0;13.0;0.0;"Pas de s�diment";4.0;0;0;1;2;0;0;;;;;;8;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;40.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;;"mai14-VerB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";16.0;0;2;0;0;0;0;;;;;;50;;;;;;240;;;;;;0.0;6.0;0.5;20.0;15.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;;"mai14-VerB2sup";10.0;3;15.0;2;15.0;2;0.0;1.0;0.0;"Pas de s�diment";10.0;0;0;0;3;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;80.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;;"mai14-VerB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;3;2;0;0;0;;;;;;23;;;;;;40;;;;;;2.0;7.0;0.5;4.0;30.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";;;"mai14-VerB3sup";10.0;3;15.0;2;30.0;2;0.0;0.0;0.0;"Pas de s�diment";4.5;0;1;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;30.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;2;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;;"mai14-VerB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;3;0;0;0;0;;;;;;43;;;;;;520;;;;;;0.0;5.0;0.0;1.0;12.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;2;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";;;"mai14-VerB4sup";30.0;2;35.0;3;11.0;2;0.0;0.0;0.0;"Pas de s�diment";4.0;0;0;2;0;0;0;;;;;;3;0;0;0;0;0;0;;;;;;0.0;0.25;0.0;0.0;11.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;;"mai14-VerB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;1;0;0;0;0;;;;;;50;;;;;;1920;;;;;;0.0;13.0;2.0;12.0;7.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;;"mai14-VerB5sup";1.0;2;20.0;2;90.0;2;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;15;0;0;0;0;0;0;;;;;;0.0;1.0;0.0;5.0;9.0;;5.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;;"mai14-VerB5inf";0.0;;16.0;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";35.0;0;6;0;0;0;0;;;;;;42;;;;;;960;;;;;;0.0;6.0;0.0;7.0;25.0;;5.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;;"mai14-VerB6sup";0.5;2;20.0;2;100.0;2;0.0;0.0;;"Sable fin";0.0;0;0;0;0;0;0;;;;;;15;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;;"mai14-VerB6inf";0.0;;40.0;2;10.0;2;0.0;1.0;0.0;"Pas de s�diment";7.0;0;0;0;1;0;0;;;;;;37;;;;;;80;;;;;;0.0;3.5;0.0;7.0;15.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;;"mai14-VerB7sup";6.0;2;25.0;3;25.0;2;0.0;1.0;;"Sable fin";0.0;0;2;0;0;0;0;;;;;;12;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;10.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;2;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;;"mai14-VerB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;60;;;;;;680;;;;;;1.5;9.5;2.0;8.0;2.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;2;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;;"mai14-VerB9sup";85.0;3;1.0;2;2.0;2;0.0;2.0;0.0;"Pas de s�diment";25.0;0;1;3;0;0;0;;;;;;6;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;50.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;;"mai14-VerB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";25.0;0;2;0;0;0;0;;;;;;50;;;;;;1880;;;;;;0.0;5.0;2.0;1.0;13.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;;"mai14-VerB10sup";10.0;3;30.0;2;34.0;2;0.0;1.0;0.0;"Pas de s�diment";1.5;0;2;4;0;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;88.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;5;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;;"mai14-VerB10inf";1.0;2;0.5;2;0.5;2;0.0;0.5;0.0;"Pas de s�diment";6.0;0;0;1;0;0;0;;;;;;18;;;;;;1360;;;;;;0.0;5.0;0.0;4.0;35.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;5;0;;0;0;0; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;;"mai14-VerQ1";50.0;3;30.0;2;10.0;2;0.0;7.0;0.0;"Pas de s�diment";1.0;0;0;3;0;0;0;;;;;;3;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;90.0;;;;;;;;;;;;;;;;;;;; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";;;"mai14-VerQ2";100.0;3;18.5;2;0.5;2;0.0;0.0;0.0;"Pas de s�diment";5.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;90.0;;;;;;;;;;;;;;;;;;;; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;;"mai14-VerQ3";60.0;3;50.0;2;30.0;2;0.0;0.0;;"Vase";0.0;0;1;3;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;;"mai14-VerQ4";100.0;3;12.0;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";1.0;0;1;7;3;0;0;;;;;;47;;;;;;40;;;;;;1.0;3.5;0.0;0.0;95.0;;;;;;;;;;;;;;;;;;;; +378335;"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";;;"mai14-VerQ5";55.0;3;11.0;2;5.0;2;0.0;20.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;25.0;;;;;;;;;;;;;;;;;;;; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;;"oct14-VerB7sup";50.0;3;50.0;2;11.0;2;0.0;3.5;70.0;"Sable grossier";3.0;0;0;0;0;0;0;;;;;;10;;;;;;800;;;;;;0.0;0.0;0.0;4.5;2.5;;25.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;;"oct14-VerB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;3;0;0;0;0;;;;;;30;;;;;;2800;;;;;;1.0;1.0;0.0;1.5;5.5;;25.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;;"oct14-VerB9sup";20.0;3;4.0;2;35.0;2;0.0;0.0;90.0;"Sable fin";2.0;0;0;0;0;0;0;;;;;;0;;;;;;40;;;;;;0.0;0.0;0.0;0.0;2.5;;15.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;;"oct14-VerB9inf";0.25;2;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";40.0;0;3;1;0;0;0;;;;;;65;;;;;;2000;;;;;;0.0;0.5;0.0;0.0;19.0;;15.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;;"oct14-VerB10sup";70.0;3;8.5;2;11.0;2;0.0;0.0;0.0;"Pas de s�diment";12.0;0;0;1;0;0;0;;;;;;28;;;;;;80;;;;;;0.0;0.0;0.0;0.5;75.0;;2.0;"Blocs";;1;1;0;0;;;1;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;;"oct14-VerB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";9.0;0;4;0;0;0;0;;;;;;15;;;;;;3800;;;;;;2.0;3.5;0.5;0.0;6.0;;2.0;"Blocs";;1;1;0;0;;;1;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;;"oct14-VerQ1";95.0;3;6.0;2;40.0;2;0.0;1.0;10.0;"Sable fin";7.0;0;1;5;0;0;0;;;;;;2;;;;;;280;;;;;;0.0;0.0;0.0;4.0;4.0;;;;;;;;;;;;;;;;;;;; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";;;"oct14-VerQ2";75.0;3;60.0;2;14.0;2;0.0;1.0;90.0;"Sable fin";0.0;0;0;2;0;0;0;;;;;;2;;;;;;120;;;;;;0.0;0.0;0.0;0.5;1.0;;;;;;;;;;;;;;;;;;;; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;;"oct14-VerQ3";92.0;3;60.0;2;15.0;2;0.0;1.0;50.0;"D�bris coquilliers";1.0;0;0;2;0;0;0;;;;;;10;;;;;;80;;;;;;0.0;1.0;0.0;5.5;1.0;;;;;;;;;;;;;;;;;;;; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;;"oct14-VerQ4";88.0;3;17.0;2;9.0;2;0.0;11.0;0.0;"Pas de s�diment";10.0;0;1;7;0;0;0;;;;;;60;;;;;;920;;;;;;0.0;0.25;0.0;1.0;25.0;;;;;;;;;;;;;;;;;;;; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";;;"oct14-VerQ5";95.0;3;1.0;2;5.0;2;0.0;11.0;1.5;"Sable fin";25.0;0;0;0;0;0;0;;;;;;17;;;;;;360;;;;;;0.0;0.0;0.0;0.0;40.0;;;;;;;;;;;;;;;;;;;; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;;"oct14-VerB1sup";55.0;2;20.0;2;8.0;2;0.0;9.0;5.0;"Sable fin";5.0;0;0;0;0;0;0;;;;;;26;;;;;;400;;;;;;0.0;0.5;0.0;0.0;7.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;;"oct14-VerB1inf";0.0;;0.5;2;0.25;2;0.0;0.0;0.0;"Pas de s�diment";10.0;0;6;2;0;0;0;;;;;;50;;;;;;4520;;;;;;5.0;2.5;1.0;0.25;14.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;;"oct14-VerB2sup";15.0;3;2.0;2;17.0;2;0.0;8.0;5.0;"Sable grossier";11.0;0;0;2;0;0;0;;;;;;27;;;;;;200;;;;;;0.0;0.125;0.0;0.0;15.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;;"oct14-VerB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";9.0;0;0;1;0;0;0;;;;;;20;;;;;;640;;;;;;0.0;2.5;2.0;3.0;11.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";;;"oct14-VerB3sup";60.0;3;50.0;2;40.0;2;0.0;0.0;90.0;"Sable fin";0.5;0;0;1;0;0;0;;;;;;22;;;;;;240;;;;;;0.0;0.0;0.0;6.0;0.5;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;;"oct14-VerB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.5;0;1;1;0;0;0;;;;;;400;;;;;;2240;;;;;;0.0;5.5;0.0;5.0;14.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";;;"oct14-VerB4sup";5.0;2;12.0;2;24.0;2;2.0;0.0;25.0;"D�bris coquilliers";11.0;0;0;0;0;0;0;;;;;;40;;;;;;880;;;;;;0.0;0.0;0.0;0.0;3.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;;"oct14-VerB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";35.0;0;3;4;0;0;0;;;;;;45;;;;;;2640;;;;;;1.0;1.0;0.0;0.25;1.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;;"oct14-VerB5sup";10.0;2;89.0;2;10.0;2;0.0;0.0;95.0;"D�bris coquilliers";0.5;0;0;0;0;0;0;;;;;;5;;;;;;400;;;;;;0.0;0.25;0.0;4.0;0.5;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;0;0;;0;0;1; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;;"oct14-VerB5inf";0.0;;1.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.5;0;11;0;0;0;0;;;;;;150;;;;;;1680;;;;;;1.0;2.5;0.0;1.0;6.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;0;0;;0;0;1; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;;"oct14-VerB6sup";50.0;3;70.0;2;10.0;2;0.0;0.5;95.0;"Sable fin";1.0;0;0;4;0;0;0;;;;;;4;;;;;;80;;;;;;0.0;0.0;0.0;0.0;1.0;;30.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;;"oct14-VerB6inf";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";30.0;0;24;3;0;0;0;;;;;;60;;;;;;2280;;;;;;1.0;2.0;0.0;1.5;5.5;;30.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;;"oct14-VerB8sup";55.0;3;50.0;2;1.5;2;0.0;8.5;10.0;"Sable fin";4.0;0;0;4;0;0;0;;;;;;35;;;;;;320;;;;;;0.0;0.125;0.0;0.0;11.0;;30.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378402;"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;;"oct14-VerB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;3;0;0;0;0;;;;;;40;;;;;;920;;;;;;2.5;1.0;0.0;0.5;12.5;;30.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"IMGP0900.JPG";"mar15-VerQ5";40.0;3;12.0;2;0.5;2;0.0;25.0;10.0;"Sable grossier";6.0;0;0;3;0;0;0;;;;;;26;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;10.0;;;;;;;;;;;;;;;;;;;; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"IMGP0854.JPG";"mar15-VerB1sup";11.0;2;2.0;3;0.0;;0.0;9.0;0.0;"Pas de s�diment";40.0;0;0;0;0;0;0;;;;;;65;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;23.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP0855.JPG";"mar15-VerB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";26.0;0;12;10;4;0;0;;;;;;53;17;5;2;4;1;1160;;;;;;0.0;0.5;0.0;0.0;1.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune";"IMGP0857.JPG";"mar15-VerB2sup";50.0;3;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";28.0;0;0;0;3;0;0;;;;;;10;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;24.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"IMGP0858.JPG";"mar15-VerB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";29.0;0;2;16;5;0;0;;;;;;142;5;0;5;6;12;1120;;;;;;0.0;0.5;0.0;2.0;10.5;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune-Rouge";"IMGP0890.JPG";"mar15-VerB8sup";31.0;3;70.0;2;40.0;2;0.0;35.0;3.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;12;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;2.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP0891.JPG";"mar15-VerB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";19.0;0;10;0;0;0;0;16;12;0;20;0;960;10;20;0;0;19;1960;;;;;;0.5;1.0;0.0;3.5;9.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"IMGP0898.JPG";"mar15-VerB10inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";45.0;0;8;9;3;0;0;;;;;;12;47;58;27;0;0;5280;;;;;;0.0;0.0;0.0;0.0;15.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Brune";"IMGP0897.JPG";"mar15-VerB10sup";50.0;3;5.0;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";11.0;0;0;6;1;0;0;;;;;;6;23;29;0;0;0;2080;;;;;;0.0;0.0;0.0;0.0;25.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune";;"mar15-VerQ4";75.0;3;20.0;2;8.0;2;0.0;22.0;0.0;"Pas de s�diment";1.0;0;1;4;0;0;0;;;;;;65;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;50.0;;;;;;;;;;;;;;;;;;;; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Brune";;"mar15-VerQ3";55.0;3;18.0;2;0.5;2;0.0;12.0;0.0;"Pas de s�diment";5.0;0;0;2;0;0;0;;;;;;11;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;30.0;;;;;;;;;;;;;;;;;;;; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune-Rouge";;"mar15-VerB9sup";20.0;3;11.5;3;0.0;;0.0;20.0;0.0;"Pas de s�diment";31.0;0;0;2;0;0;0;;;;;;5;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;30.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";;"mar15-VerB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";95.0;0;0;0;0;0;0;;;;;;8;;;;;;187;;;;;;0.0;0.0;0.0;0.0;1.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Verte";;"mar15-VerB3sup";2.5;2;0.5;2;39.0;2;0.0;0.5;1.5;"Sable fin";7.5;0;0;0;0;0;0;;;;;;15;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;40.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche-Brune";;"mar15-VerB3inf";15.0;2;1.0;2;0.0;;0.0;2.5;0.0;"Pas de s�diment";11.0;0;1;4;0;0;0;16;0;15;5;5;820;4;5;0;0;0;360;;;;;;0.0;0.0;0.0;2.5;30.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Rouge";"IMGP0887.JPG";"mar15-VerB7sup";12.0;3;30.0;2;5.5;2;0.0;5.0;5.0;"Sable fin";19.0;0;0;1;0;0;0;;;;;;18;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;15.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"IMGP0888.JPG";"mar15-VerB7inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";45.0;0;20;10;0;0;0;;;;;;197;10;12;7;21;12;2480;;;;;;1.0;1.0;0.0;0.0;8.5;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";;"mar15-VerB6sup";1.0;2;35.0;2;17.0;2;0.0;0.0;40.0;"Sable grossier";11.0;0;0;2;0;0;0;;;;;;22;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;30.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";;"mar15-VerB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";16.0;0;0;0;0;0;0;;;;;;116;8;8;4;7;4;1240;;;;;;0.5;2.0;0.0;0.0;50.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Rouge";;"mar15-VerB5sup";50.0;3;45.0;2;18.0;2;0.0;4.0;0.0;"Pas de s�diment";2.0;0;0;4;0;0;0;;;;;;36;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;25.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";;"mar15-VerB5inf";0.0;;0.0;;0.25;2;0.0;0.5;0.0;"Pas de s�diment";1.5;0;0;0;0;0;0;;;;;;217;0;0;0;0;0;0;;;;;;1.0;2.5;0.0;5.5;8.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune";;"mar15-VerB4sup";60.0;3;17.0;2;7.0;2;0.0;2.0;3.0;"Sable fin";7.0;0;0;0;0;0;0;;;;;;11;0;0;0;0;0;0;;;;;;0.0;1.0;0.0;0.0;15.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"IMGP0870.JPG";"mar15-VerB4inf";0.25;2;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";3.5;0;2;0;0;0;0;;;;;;183;14;7;6;4;5;1440;;;;;;0.0;1.0;0.0;0.0;8.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune-Rouge";"IMGP0862.JPG";"mar15-VerQ1";20.0;3;20.0;2;13.0;2;0.0;16.0;10.0;"Sable grossier";1.0;0;0;1;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +378469;"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"IMGP0878.JPG";"mar15-VerQ2";25.0;3;50.0;2;8.0;2;0.0;1.5;40.0;"Sable grossier";1.5;0;0;0;0;0;0;;;;;;5;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune";"IMGP1412.JPG";"oct15-VerQ4";90.0;3;83.5;2;6.0;2;0.0;0.5;90.0;"D�bris coquilliers";0.0;0;0;1;0;0;0;;;;;;2;4;0;0;0;0;160;;;;;;0.0;0.0;0.0;0.25;0.25;;;;;;;;;;;;;;;;;;;; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune-Verte";"IMGP1252.JPG";"oct15-VerB1sup";40.0;2;10.0;2;25.0;2;0.0;0.0;10.0;"Sable fin";6.0;1;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;12.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP1253.JPG";"oct15-VerB1inf";0.0;;0.5;2;0.5;2;0.0;0.5;0.0;"Pas de s�diment";12.0;0;3;2;1;0;0;0;0;0;0;0;58;35;21;10;32;19;4680;;;;;;0.5;1.0;0.0;1.0;4.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune";"IMGP1254.JPG";"oct15-VerB2sup";90.0;3;5.0;2;5.0;2;0.0;40.0;0.0;"Pas de s�diment";29.0;0;0;1;0;0;0;;;;;;5;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;20.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;3;0;0;0;;;0;;0;0;0;;1;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"IMGP1255.JPG";"oct15-VerB2inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";24.0;0;7;5;3;0;0;;;;;;5;0;28;14;22;4;2720;;;;;;0.0;1.0;0.0;0.0;8.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;3;0;0;0;;;0;;0;0;0;;1;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche-Verte";"IMGP1256.JPG";"oct15-VerB3sup";0.5;2;1.0;2;91.0;2;0.0;0.0;45.0;"Sable fin";5.0;0;0;4;0;0;0;;;;;;4;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;5.0;;5.0;"Blocs";;0;1;0;0;;;1;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"IMGP1257.JPG";"oct15-VerB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";19.0;0;3;4;0;0;0;;;;;;108;17;26;19;22;20;4160;;;;;;0.0;0.0;0.0;1.0;15.0;;5.0;"Blocs";;0;1;0;0;;;1;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune-Verte";"IMGP1258.JPG";"oct15-VerB4sup";40.0;2;10.0;2;20.0;2;0.0;0.0;15.0;"Sable fin";3.0;0;0;3;0;0;0;;;;;;5;0;0;0;0;0;0;;;;;;0.0;0.25;0.0;0.0;5.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"IMGP1259.JPG";"oct15-VerB4inf";0.5;2;0.0;;3.0;2;0.0;0.5;0.0;"Pas de s�diment";9.5;0;1;0;0;0;0;;;;;;44;11;13;2;8;10;1760;;;;;;0.5;0.0;0.0;1.0;10.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Brune";"IMGP1261.JPG";"oct15-VerB5sup";50.0;2;14.0;2;16.0;2;0.0;0.0;5.0;"Sable fin";9.0;0;0;4;0;0;0;;;;;;20;0;0;0;0;6;240;;;;;;0.0;0.5;0.0;0.0;5.5;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"IMGP1262.JPG";"oct15-VerB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;9;12;3;5;1;600;15;17;0;4;3;1560;;;;;;5.0;1.0;0.0;8.0;30.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Brune";"IMGP1263.JPG";"oct15-VerB6sup";65.0;2;5.0;2;7.0;2;0.0;0.0;25.0;"Sable fin";3.0;0;0;9;0;0;0;;;;;;11;1;0;9;3;0;520;;;;;;0.0;0.0;0.0;0.5;2.0;;5.0;"Sable grossier";;0;2;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"IMGP1264.JPG";"oct15-VerB6inf";0.0;;5.0;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";50.0;0;11;2;0;0;0;;;;;;41;9;2;5;14;4;1360;;;;;;0.5;0.5;0.0;0.0;0.5;;5.0;"Sable grossier";;0;2;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Brune";"IMGP1402.JPG";"oct15-VerB7sup";70.0;3;5.0;2;2.0;2;0.0;2.5;0.0;"Pas de s�diment";18.5;0;1;2;0;0;0;;;;;;40;0;2;1;6;0;360;;;;;;0.0;0.0;0.0;1.0;15.0;;40.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"IMGP1403.JPG";"oct15-VerB7inf";0.0;;2.0;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";20.0;0;0;0;0;0;0;5;11;2;5;3;920;4;2;1;0;7;560;;;;;;0.0;1.5;0.0;11.0;6.0;;40.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche-Brune";"IMGP1405.JPG";"oct15-VerB8sup";37.0;3;3.0;2;13.0;2;0.0;0.5;0.0;"Pas de s�diment";42.0;0;0;1;0;0;0;;;;;;70;0;0;0;7;1;320;;;;;;0.0;0.0;0.0;0.0;25.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;4;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP1407.JPG";"oct15-VerB8inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";16.5;0;9;5;0;0;0;;;;;;100;15;0;12;12;0;1560;;;;;;0.0;1.0;1.0;1.5;50.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;4;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Brune";"IMGP1393.JPG";"oct15-VerB9sup";50.0;3;17.0;2;3.5;2;0.0;3.5;1.5;"Sable fin";11.0;0;0;2;0;0;0;;;;;;17;0;0;4;1;0;200;;;;;;0.0;0.5;0.0;0.0;42.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"IMGP1394.JPG";"oct15-VerB9inf";1.0;2;6.0;2;1.0;2;0.0;1.5;0.0;"Pas de s�diment";9.0;0;1;0;0;0;0;;;;;;25;;;;;;4200;;;;;;0.25;0.0;0.0;0.5;15.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Brune";"IMGP1396.JPG";"oct15-VerB10sup";35.0;3;6.0;2;11.0;2;0.0;20.0;0.0;"Pas de s�diment";14.5;0;0;0;0;0;0;;;;;;10;0;3;7;0;0;400;;;;;;0.0;0.0;0.0;0.0;46.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"IMGP1397.JPG";"oct15-VerB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";7.0;0;3;0;0;0;0;;;;;;40;25;15;15;11;25;3640;;;;;;0.5;2.5;0.0;0.0;33.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune";"IMGP1251.JPG";"oct15-VerQ1";75.0;2;10.0;2;4.0;2;0.0;5.0;0.0;"Pas de s�diment";11.0;0;0;0;4;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;40.0;;;;;;;;;;;;;;;;;;;; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche-Brune";"IMGP1399.JPG";"oct15-VerQ5";50.0;2;2.0;2;2.0;2;0.0;6.0;7.0;"D�bris coquilliers";11.0;0;0;5;1;0;0;;;;;;15;1;0;0;1;8;400;;;;;;0.0;0.0;0.0;0.0;26.0;;;;;;;;;;;;;;;;;;;; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"IMGP1260.JPG";"oct15-VerQ2";50.0;3;87.0;2;8.0;2;0.0;0.0;92.0;"Sable fin";2.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;1.0;2.0;;;;;;;;;;;;;;;;;;;; +378536;"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"IMGP1411.JPG";"oct15-VerQ3";2.0;2;81.0;2;1.0;2;0.5;0.5;91.0;"D�bris coquilliers";9.0;0;0;6;0;0;0;;;;;;0;0;0;1;0;0;40;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune";"IMGP1726.JPG";"avr16-VerQ2";50.0;2;9.0;2;2.0;2;0.0;5.5;3.0;"Sable fin";20.0;0;0;1;2;0;0;;;;;;91;0;0;0;5;2;280;;;;;;0.0;0.0;0.0;0.0;8.5;;;;;;;;;;;;;;;;;;;; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"IMGP1733.JPG";"avr16-VerQ3";0.0;;29.0;2;3.0;2;0.0;8.5;7.0;"D�bris coquilliers";6.0;0;0;7;0;0;0;;;;;;31;0;0;0;1;0;40;;;;;;0.0;0.0;0.0;0.5;1.5;;;;;;;;;;;;;;;;;;;; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune-Rouge";"IMGP1740.JPG";"avr16-VerQ4";20.0;3;25.0;2;5.0;2;0.0;25.0;30.0;"D�bris coquilliers";0.5;0;0;3;0;0;0;;;;;;15;0;0;1;0;0;40;;;;;;0.0;0.0;0.0;0.0;4.0;;;;;;;;;;;;;;;;;;;; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"IMGP1747.JPG";"avr16-VerQ5";65.0;3;17.0;2;6.0;2;0.0;35.0;15.0;"Sable fin";3.0;0;0;11;0;0;0;;;;;;15;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;8.5;;;;;;;;;;;;;;;;;;;; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune";"IMGP1737.JPG";"avr16-VerB8sup";53.0;3;21.0;2;6.0;2;0.0;16.0;10.0;"Sable fin";0.5;0;1;8;0;0;0;19;11;0;5;9;880;1;0;0;2;0;120;;;;;;0.0;0.0;0.0;0.5;7.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP1738.JPG";"avr16-VerB8inf";0.0;;0.0;;0.0;;0.0;0.0;2.0;"Sable fin";17.0;0;10;1;0;0;0;11;4;2;7;1;500;16;0;17;16;6;2200;;;;;;0.75;1.0;0.0;4.0;30.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Brune-Rouge";"IMGP1734.JPG";"avr16-VerB7sup";50.0;2;33.0;2;19.0;2;0.0;14.5;3.0;"Sable fin";12.5;0;0;6;0;0;0;;;;;;13;0;0;0;0;0;15;;;;;;0.0;0.0;0.0;0.5;13.0;;77.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"IMGP1735.JPG";"avr16-VerB7inf";0.5;1;2.0;2;2.0;2;0.0;1.5;2.0;"Sable fin";75.0;0;2;2;0;0;0;;;;;;29;2;18;12;6;15;2120;;;;;;0.5;1.5;0.25;0.0;10.0;;77.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"IMGP1730.JPG";"avr16VerB6sup";14.0;2;35.0;2;26.0;2;0.0;4.5;3.0;"Sable fin";12.0;0;0;7;0;0;0;;;;;;177;10;3;2;0;22;1480;;;;;;0.0;1.0;5.0;0.0;10.0;;25.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"IMGP1731.JPG";"avr16-VerB6inf";0.0;;0.0;;0.0;;0.0;3.0;0.0;"Pas de s�diment";15.0;0;12;2;0;0;0;;;;;;331;4;13;7;10;5;1560;;;;;;0.0;2.0;0.0;1.0;11.0;;25.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge-Verte";"IMGP1727.JPG";"avr16-VerB5sup";0.0;;40.0;2;11.5;2;0.0;5.5;10.0;"D�bris coquilliers";4.0;0;0;1;0;0;0;;;;;;42;0;0;0;1;0;40;;;;;;0.0;0.125;0.0;0.0;17.0;;10.0;"Roche en place";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"IMGP1728.JPG";"avr16-VerB5inf";0.0;;2.0;2;0.5;2;0.0;4.0;0.0;"Pas de s�diment";8.5;0;4;2;0;0;0;;;;;;269;8;0;17;9;0;1360;;;;;;0.0;0.5;0.0;1.0;17.5;;10.0;"Roche en place";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"IMGP1723.JPG";"avr16-VerB4sup";0.0;;13.0;2;85.0;2;0.0;1.5;84.0;"D�bris coquilliers";2.5;0;0;1;0;0;0;;;;;;9;0;0;0;0;0;7;;;;;;0.0;0.0;0.0;0.0;6.5;;45.0;"Roche en place";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"IMGP1724.JPG";"avr16-Ver4inf";0.0;;1.0;2;1.5;2;0.0;0.5;2.5;"Sable fin";47.0;0;0;0;0;0;0;11;39;7;0;2;1180;0;0;2;0;3;200;;;;;;0.0;0.25;0.0;0.5;11.0;;45.0;"Roche en place";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune";"IMGP1720.JPG";"avr16-VerB3sup";60.0;3;15.0;2;2.0;2;0.0;5.5;26.0;"Sable fin";1.5;0;0;8;0;0;0;;;;;;24;6;0;12;7;42;2680;;;;;;0.0;0.0;0.0;0.5;8.0;;20.0;"Roche en place";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"IMGP1721.JPG";"avr16-VerB3inf";0.0;;4.5;2;0.5;2;0.0;2.5;3.0;"Sable grossier";14.0;0;0;3;0;0;0;;;;;;390;7;0;4;6;5;880;;;;;;0.0;1.0;0.25;8.0;14.5;;20.0;"Roche en place";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune";"IMGP1716.JPG";"avr16-VerB2sup";93.0;3;16.0;2;6.0;2;0.0;21.0;3.0;"Sable fin";7.0;0;0;5;3;0;0;;;;;;22;0;0;0;0;0;45;;;;;;0.0;0.25;0.0;0.0;15.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"IMGP1717.JPG";"avr16-VerB2inf";0.0;;0.0;;0.0;;0.0;1.5;3.0;"Sable fin";3.0;0;8;3;0;0;0;;;;;;94;20;8;0;26;7;2440;;;;;;5.0;2.0;0.0;2.5;9.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Brune";"IMGP1713.JPG";"avr16-VerB1sup";19.0;3;1.0;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";86.0;0;0;0;0;0;0;;;;;;6;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;8.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP1714.JPG";"avr16-VerB1inf";0.0;;0.0;;0.0;;0.0;0.0;5.0;"Sable fin";12.5;0;9;5;1;0;0;;;;;;73;35;43;39;0;12;5160;;;;;;0.0;0.5;0.0;0.5;8.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune";"IMGP1741.JPG";"avr16-VerB9sup";60.0;3;3.5;2;11.5;2;0.0;1.5;8.0;"Sable fin";18.0;0;0;1;0;0;0;;;;;;6;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;15.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"IMGP1742.JPG";"avr16-VerB9inf";0.0;;0.0;;0.0;;0.0;2.5;0.0;"Pas de s�diment";9.0;0;3;5;0;0;0;3;0;1;1;0;100;20;27;13;21;32;4520;;;;;;0.25;2.0;0.0;0.0;6.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"IMGP1744.JPG";"avr16-VerB10sup";10.0;2;2.0;2;1.0;2;0.0;0.5;1.0;"Sable fin";76.0;0;0;2;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;16.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"IMGP1745.JPG";"avr16-VerB10inf";0.0;;0.0;;0.0;;0.0;0.25;0.0;"Pas de s�diment";10.5;0;1;1;0;0;0;1;4;9;0;3;340;11;8;3;10;5;1480;;;;;;0.25;1.0;0.0;1.0;25.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378603;"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche-Rouge";"IMGP1719.JPG";"avr16-VerQ1";12.0;2;21.0;2;2.5;2;0.0;17.5;11.0;"D�bris coquilliers";25.0;0;0;0;0;0;0;;;;;;12;0;0;0;0;0;12;;;;;;0.25;0.0;0.0;0.0;6.5;;;;;;;;;;;;;;;;;;;; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"IMGP2110.JPG";"oct16-VerQ5";90.0;3;12.5;2;5.5;2;0.0;35.0;16.0;"Sable fin";5.5;0;0;0;1;0;0;;;;;;12;0;7;2;1;5;600;;;;;;0.0;0.0;0.0;1.0;3.0;;;;;;;;;;;;;;;;;;;; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Verte";"151222.JPG";"oct16-VerB1sup";2.0;2;0.5;2;43.0;2;0.0;1.0;37.0;"D�bris coquilliers";10.0;0;0;1;0;0;0;;;;;;11;1;0;0;0;0;40;;;;;;0.0;0.0;0.0;0.0;1.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;5;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"151146.JPG";"oct16-VerB1inf";2.0;2;0.0;;0.0;;0.0;11.0;0.0;"Pas de s�diment";83.0;0;1;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;9.5;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;5;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Rouge";"151439.JPG";"oct16-VerB2sup";30.0;3;20.0;2;2.0;2;0.0;1.0;0.0;"Pas de s�diment";16.0;0;0;0;0;0;0;;;;;;0;0;0;18;0;1;760;;;;;;0.0;0.0;0.0;0.0;79.0;;4.0;"Sable grossier";;1;0;0;4;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";;"oct16-VerB2inf";0.0;;0.5;2;0.0;;0.0;0.0;1.0;"D�bris coquilliers";8.5;0;4;3;0;0;0;;;;;;180;5;2;2;14;0;920;;;;;;0.0;1.5;0.0;1.5;2.0;;4.0;"Sable grossier";;1;0;0;4;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Verte";"153053.JPG";"oct16-VerB3sup";12.0;2;7.0;2;77.0;2;0.0;0.0;26.0;"Sable fin";7.0;0;0;2;0;0;0;;;;;;66;2;0;0;0;0;80;;;;;;0.0;0.0;0.0;0.5;1.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"153509.JPG";"oct16-VerB3inf";2.5;2;0.25;2;3.0;2;0.0;0.0;0.0;"Pas de s�diment";22.0;0;12;1;0;0;0;;;;;;135;9;3;3;6;3;960;;;;;;0.0;0.5;0.0;2.0;1.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune";"153926.JPG";"oct16-VerB4sup";75.0;3;39.0;2;29.0;2;0.0;0.5;35.0;"Sable fin";8.0;0;0;1;0;0;0;;;;;;26;9;0;0;0;0;360;;;;;;0.0;0.25;0.0;3.5;1.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;3;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"154545.JPG";"oct16-VerB4inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";19.0;0;0;0;0;0;0;;;;;;120;20;11;8;1;15;2200;;;;;;0.0;1.5;0.0;2.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;3;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune";"160923.JPG";"oct16-VerB5sup";60.0;3;35.0;2;9.0;2;0.0;1.5;92.0;"Sable fin";5.0;0;0;3;0;0;0;;;;;;115;2;0;5;4;12;920;;;;;;0.0;0.0;0.0;4.5;0.25;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;4;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"161516.JPG";"oct16-VerB5inf";0.0;;1.0;2;1.0;2;0.0;0.0;0.0;"Pas de s�diment";5.0;0;4;0;0;0;0;;;;;;210;24;3;0;6;11;1760;;;;;;0.0;0.5;0.0;3.0;1.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;4;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"162013.JPG";"oct16-VerB6sup";0.5;2;97.0;2;2.5;2;0.0;0.0;50.0;"Sable fin";15.0;0;0;2;0;0;0;;;;;;12;3;0;0;0;0;120;;;;;;0.0;0.0;0.0;2.0;1.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"162333.JPG";"oct16-VerB6inf";0.0;;3.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";11.0;0;0;0;0;0;0;;;;;;130;10;11;23;3;6;2120;;;;;;0.5;1.5;0.0;5.0;0.5;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Brune";"IMGP2101.JPG";"oct16-VerB7sup";85.0;3;18.0;2;1.5;2;0.0;6.0;10.0;"Sable fin";4.0;0;0;1;0;0;0;;;;;;120;14;15;13;20;15;3080;;;;;;0.0;0.5;0.0;2.0;4.5;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"IMGP2102.JPG";"oct16-VerB7inf";0.0;;4.0;2;1.0;2;0.0;0.5;0.0;"Pas de s�diment";19.0;0;0;2;0;0;0;;;;;;26;36;0;0;4;3;1720;;;;;;8.0;2.5;0.25;1.0;9.5;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune";"IMGP2103.JPG";"oct16-VerB8sup";98.0;3;1.0;2;1.0;2;0.0;0.25;85.0;"Sable fin";6.0;1;3;2;0;0;0;3;0;0;4;1;160;7;2;0;4;2;600;0;0;;;;0.0;1.0;0.125;17.0;1.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;1;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP2104.JPG";"oct16-VerB8inf";0.0;;1.0;2;0.0;;0.0;2.5;0.0;"Pas de s�diment";11.0;0;5;4;0;0;0;;;;;;24;6;8;14;2;20;2000;;;;;;0.0;1.75;0.125;5.5;2.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;1;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Brune";"IMGP2106.JPG";"oct16-VerB9sup";37.0;2;6.0;2;4.5;2;0.0;5.0;0.0;"Pas de s�diment";40.0;0;0;0;0;0;0;;;;;;8;0;13;0;0;38;2040;;;;;;0.0;2.0;0.0;0.0;14.0;;89.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"IMGP2107.JPG";"oct16-VerB9inf";0.0;;0.0;;0.0;;0.0;1.0;3.0;"Vase";95.0;0;0;0;0;0;0;;;;;;8;0;30;0;0;20;2000;;;;;;0.0;0.0;0.0;0.0;0.5;;89.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Brune";"IMGP2108.JPG";"oct16-VerB10sup";18.0;2;10.0;2;3.0;2;0.0;3.0;5.0;"Sable fin";50.0;0;0;0;0;0;0;;;;;;35;0;1;0;0;0;40;;;;;;0.0;0.0;0.25;0.5;13.0;;65.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"IMGP2109.JPG";"oct16-VerB10nf";0.0;;0.0;;0.0;;0.0;0.25;1.0;"Vase";60.0;0;0;2;0;0;0;;;;;;24;12;7;14;0;0;1320;;;;;;4.0;0.25;0.0;0.0;3.5;;65.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune-Rouge";"152616.JPG";"oct16-VerQ1";35.0;3;30.0;2;12.0;2;0.0;45.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;14;1;0;0;0;0;40;;;;;;0.0;0.0;0.0;0.0;2.0;;;;;;;;;;;;;;;;;;;; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune";"IMGP2105.JPG";"oct16-VerQ4";95.0;3;25.0;2;1.5;2;0.0;1.5;81.0;"Sable fin";1.0;0;0;0;0;0;0;;;;;;33;15;1;4;0;3;920;;;;;;0.0;1.5;0.0;1.5;2.0;;;;;;;;;;;;;;;;;;;; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";;"oct16-VerQ2";55.0;3;86.0;2;9.0;2;0.0;3.0;35.0;"Sable fin";2.5;0;0;3;0;0;0;;;;;;4;0;2;3;8;18;1240;;;;;;0.0;0.0;0.0;1.0;2.0;;;;;;;;;;;;;;;;;;;; +378670;"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Brune-Rouge";;"oct16-VerQ3";40.0;3;82.0;2;1.0;2;0.0;6.0;83.0;"D�bris coquilliers";8.0;0;0;0;0;0;0;;;;;;28;2;6;5;1;11;1000;;;;;;0.0;0.0;0.0;1.0;0.0;;;;;;;;;;;;;;;;;;;; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Roche en place";"2";"face sup�rieure";;;"mai14-Pi�Q2";0.5;1;25.0;2;20.0;2;0.0;18.0;;"Sable fin";7.0;0;0;3;5;0;0;;;;;;8;;;;;;120;;;;;;0.0;0.0;0.0;0.0;30.0;;;;;;;;;;;;;;;;;;;; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;;"mai14-Pi�Q4";50.0;3;40.0;3;15.0;3;0.0;0.5;;"Sable fin";0.0;0;0;1;0;0;0;;;;;;2;;;;;;0;;;;;;0.0;0.0;0.0;0.0;10.0;;;;;;;;;;;;;;;;;;;; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Roche en place";"1";"face sup�rieure";;;"mai14-Pi�Q1";80.0;3;5.0;2;20.0;2;0.0;25.0;;"Sable fin";1.0;0;0;12;3;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;28.0;;;;;;;;;;;;;;;;;;;; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;;"mai14-Pi�B10sup";70.0;3;2.0;2;4.0;2;0.0;1.0;0.0;"Pas de s�diment";3.0;0;0;4;0;0;0;;;;;;15;;;;;;0;;;;;;0.0;12.0;0.0;1.0;90.0;;6.0;"Sable grossier";;1;0;0;0;;;0;;0;0;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;;"mai14-Pi�B10inf";0.0;;0.0;;0.0;;0.0;1.0;;"Pas de s�diment";14.0;0;1;0;0;0;0;;;;;;60;;;;;;0;;;;;;0.0;6.0;0.0;0.0;25.0;;6.0;"Sable grossier";;1;0;0;0;;;0;;0;0;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;;"mai14-Pi�B9sup";16.0;2;0.0;;35.0;2;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;1;0;0;0;;;;;;8;;;;;;0;;;;;;0.0;0.0;0.0;0.0;80.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;2;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;;"mai14-Pi�B9inf";0.0;;0.0;;0.5;2;0.0;0.5;0.0;"Pas de s�diment";11.0;0;5;1;0;0;0;;;;;;70;;;;;;0;;;;;;0.0;1.0;0.0;0.0;50.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;2;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;;"mai14-Pi�B8sup";5.0;3;20.0;2;50.0;2;0.0;0.0;;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;3;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;;"mai14-Pi�B8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;4;1;0;0;0;;;;;;90;;;;;;801;;;;;;0.5;40.0;0.0;0.0;8.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;3;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;;"mai14-Pi�B7sup";10.0;2;70.0;2;45.0;2;0.0;0.0;;"Sable fin";0.0;0;0;4;0;0;0;;;;;;17;;;;;;0;;;;;;0.0;0.0;0.0;0.0;2.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;3;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;;"mai14-Pi�B7inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";4.0;0;5;0;0;0;0;;;;;;100;;;;;;120;;;;;;0.0;6.0;0.5;0.0;45.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;3;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;;"mai14-Pi�B6sup";30.0;3;50.0;2;10.0;2;0.0;1.0;;"Sable fin";0.0;0;0;1;0;0;0;;;;;;2;;;;;;0;;;;;;0.0;0.0;0.0;0.0;21.0;;10.0;"Sable grossier";;1;1;1;0;;;0;;0;7;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;;"mai14-Pi�B6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;2;1;0;0;0;;;;;;67;;;;;;280;;;;;;2.0;0.5;1.5;0.0;50.0;;10.0;"Sable grossier";;1;1;1;0;;;0;;0;7;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;;"mai14-Pi�B5sup";75.0;3;40.0;2;2.5;2;0.0;0.5;;"Sable fin";0.0;0;1;0;0;0;0;;;;;;9;;;;;;0;;;;;;0.0;0.0;0.0;0.0;15.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;0;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;;"mai14-Pi�B5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";11.0;0;4;0;0;0;0;;;;;;72;;;;;;160;;;;;;0.0;1.0;1.0;0.0;30.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;0;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";;;"mai14-Pi�B4sup";0.0;;0.0;;0.5;2;0.0;0.0;0.0;"Pas de s�diment";25.0;0;0;0;0;0;0;;;;;;12;;;;;;480;;;;;;0.0;0.0;0.0;0.0;40.0;;10.0;"Sable fin";;0;0;0;0;;;1;;0;0;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;;"mai14-Pi�B4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";80.0;0;0;5;2;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;10.0;;10.0;"Sable fin";;0;0;0;0;;;1;;0;0;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";;;"mai14-Pi�B3sup";0.0;;0.0;;0.5;2;0.0;0.0;0.0;"Pas de s�diment";16.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;82.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;;"mai14-Pi�B3inf";0.0;;0.0;;0.5;2;0.0;0.5;0.0;"Pas de s�diment";70.0;0;2;6;5;0;0;;;;;;47;;;;;;2440;;;;;;0.0;0.0;0.0;0.0;25.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;;"mai14-Pi�B2sup";20.0;2;2.0;2;24.0;2;0.0;0.0;;"Sable fin";4.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;40.0;;40.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;;"mai14-Pi�B2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";45.0;0;0;0;0;0;0;;;;;;18;;;;;;2120;;;;;;2.0;0.0;0.0;0.0;1.0;;40.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;;"mai14-Pi�B1sup";0.0;;0.0;;2.5;2;0.0;0.0;;"Sable fin";30.0;0;0;1;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;65.0;;30.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;;"mai14-Pi�B1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";75.0;0;0;1;0;0;0;;;;;;25;;;;;;40;;;;;;3.0;0.0;0.0;0.0;5.0;;30.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;;"mai14-Pi�Q3";50.0;3;40.0;2;2.0;2;0.0;0.5;0.0;"Pas de s�diment";0.0;0;0;2;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.25;0.0;0.0;90.0;;;;;;;;;;;;;;;;;;;; +378737;"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";;;"mai14-Pi�Q5";90.0;3;25.0;2;1.0;2;0.0;1.5;;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;15.0;;;;;;;;;;;;;;;;;;;; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;;"nov14-Pi�B9sup";0.0;;10.0;2;1.0;2;0.0;1.0;0.0;"Pas de s�diment";6.5;0;0;0;0;0;0;;;;;;81;;;;;;0;;;;;;0.0;2.0;0.5;0.0;11.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;1;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;;"nov14-Pi�B9inf";1.0;2;1.0;2;14.0;2;0.5;0.0;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;;;;;;131;;;;;;0;;;;;;0.0;0.5;0.0;2.0;8.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;1;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";;;"nov14-Pi�B3sup";8.0;2;0.0;;10.0;2;0.0;0.0;4.0;"Sable fin";55.0;0;0;1;0;0;0;;;;;;11;;;;;;0;;;;;;0.0;0.0;0.0;0.0;13.0;;80.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;;"nov14-Pi�B3inf";0.0;;0.0;;0.25;2;0.0;0.25;0.0;"Pas de s�diment";90.0;0;0;2;0;0;0;;;;;;90;;;;;;200;;;;;;0.0;0.0;0.0;0.0;1.0;;80.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";;;"nov14-Pi�B4sup";20.0;2;0.0;;40.0;2;1.0;4.0;2.0;"Sable fin";50.0;0;0;1;0;0;0;;;;;;12;;;;;;0;;;;;;0.0;0.0;0.0;0.0;8.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;;"nov14-Pi�B4inf";0.0;;0.0;;0.0;;0.0;11.0;0.0;"Pas de s�diment";50.0;0;0;6;0;0;0;;;;;;55;;;;;;40;;;;;;0.0;0.25;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;;"nov14-Pi�B5sup";15.0;2;3.0;2;3.0;2;0.0;0.0;5.0;"Sable fin";8.0;0;1;0;0;0;0;;;;;;10;;;;;;0;;;;;;0.0;0.0;0.0;0.0;87.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;;"nov14-Pi�B5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";11.0;0;0;1;0;0;0;;;;;;150;;;;;;400;;;;;;0.0;0.5;0.5;0.0;1.5;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;;"nov14-Pi�B6sup";70.0;3;25.0;2;3.5;2;0.0;1.0;90.0;"Sable fin";0.0;0;0;2;0;0;0;;;;;;2;;;;;;0;;;;;;0.0;0.5;0.0;0.0;0.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;;"nov14-Pi�B6inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";25.0;0;0;1;0;0;0;;;;;;70;;;;;;1240;;;;;;2.0;1.5;1.5;0.5;10.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;;"nov14-Pi�B7sup";0.0;;0.5;2;0.5;2;0.0;0.0;0.0;"Pas de s�diment";7.0;0;3;1;0;0;0;;;;;;2640;;;;;;0;;;;;;0.0;1.0;0.0;0.25;16.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;1;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;;"nov14-Pi�B7inf";30.0;2;30.0;2;4.0;2;0.0;0.5;1.0;"Sable fin";5.0;0;3;10;0;0;0;;;;;;50;;;;;;0;;;;;;0.0;1.5;0.0;1.0;12.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;1;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;;"nov14-Pi�B8sup";30.0;2;12.0;2;12.0;2;0.0;0.0;20.0;"Sable fin";5.0;0;2;7;0;0;0;;;;;;760;;;;;;0;;;;;;0.0;1.0;0.0;3.0;2.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;1;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;;"nov14-Pi�B8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.5;0;6;5;0;0;0;;;;;;1160;;;;;;0;;;;;;0.0;0.25;0.0;0.0;2.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;1;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;;"nov14-Pi�B10sup";27.0;3;9.0;2;15.0;2;0.0;4.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;400;;;;;;0;;;;;;0.0;1.0;0.0;0.0;14.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;0;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;;"nov14-Pi�B10inf";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;2;0;0;0;0;;;;;;360;;;;;;0;;;;;;1.0;6.0;0.0;0.0;3.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;0;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Roche en place";"1";"face sup�rieure";;;"nov14-Pi�Q1";7.0;3;4.0;2;3.0;2;1.0;20.0;25.0;"Sable fin";3.0;0;0;0;0;0;0;;;;;;80;;;;;;0;;;;;;0.5;0.0;0.0;0.0;20.0;;;;;;;;;;;;;;;;;;;; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";;;"nov14-Pi�Q2";13.0;2;0.5;2;0.5;2;0.0;0.0;10.0;"Sable fin";35.0;0;0;0;0;0;0;;;;;;300;;;;;;0;;;;;;0.0;0.0;0.0;0.0;7.5;;;;;;;;;;;;;;;;;;;; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;;"nov14-Pi�Q3";30.0;3;25.0;2;10.0;2;0.0;2.0;35.0;"Sable fin";1.5;0;0;1;0;0;0;;;;;;9;;;;;;0;;;;;;0.0;0.0;0.0;0.0;5.0;;;;;;;;;;;;;;;;;;;; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;;"nov14-Pi�Q4";1.0;3;16.0;2;4.0;2;0.0;2.0;60.0;"Sable fin";2.0;0;2;1;0;0;0;;;;;;10;;;;;;0;;;;;;0.0;1.5;0.0;4.0;2.5;;;;;;;;;;;;;;;;;;;; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";;;"nov14-Pi�Q5";55.0;3;40.0;2;15.0;2;0.0;0.0;90.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;1;;;;;;0;;;;;;0.0;0.5;0.0;0.0;2.0;;;;;;;;;;;;;;;;;;;; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;;"nov14-Pi�B1sup";3.0;2;0.0;;1.0;2;0.0;1.0;0.0;"Pas de s�diment";21.0;0;0;2;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;40.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;2;0;;;0;;0;3;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;;"nov14-Pi�B1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";30.0;0;0;1;0;0;0;;;;;;75;;;;;;1000;;;;;;1.0;2.5;0.5;0.0;8.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;2;0;;;0;;0;3;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;;"nov14-Pi�B2sup";25.0;3;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";55.0;0;0;2;0;0;0;;;;;;25;;;;;;0;;;;;;0.0;0.0;0.0;0.0;20.0;;60.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378804;"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;;"nov14-Pi�B2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";70.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.25;0.0;0.0;6.0;;60.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune-Rouge";"IMGP0802.JPG";"mar15-Pi�Q3";85.0;3;35.0;2;3.0;2;0.0;9.0;30.0;"Sable fin";20.0;0;0;0;0;0;0;;;;;;92;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.5;;;;;;;;;;;;;;;;;;;; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Rouge";"IMGP0803.JPG";"mar15-Pi�B7sup";0.0;;4.0;2;2.0;2;0.0;0.0;2.0;"Sable fin";10.0;0;0;0;0;0;0;21;16;32;13;21;2060;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;19.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"IMGP0804.JPG";"mar15-Pi�B7inf";1.0;2;10.0;2;0.0;;0.0;5.0;5.0;"Sable fin";30.0;0;4;3;0;0;0;;;;;;124;0;0;0;0;0;0;;;;;;0.0;1.0;0.0;0.0;2.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune";;"mar15-Pi�B1sup";55.0;2;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";21.0;0;0;5;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;34.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;1;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP0767.JPG";"mar15-Pi�B1inf";0.0;;0.0;;0.0;;0.0;0.0;1.0;"Sable fin";50.0;0;0;11;1;0;0;;;;;;24;1;0;5;8;4;720;;;;;;0.0;0.0;0.0;0.0;1.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;1;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"IMGP0769.JPG";"mar15-Pi�B2sup";14.0;2;0.0;;0.0;;0.0;0.0;4.0;"Sable fin";35.0;0;0;0;0;0;0;;;;;;15;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;5.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;2;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"IMGP0780.JPG";"mar15-Pi�B2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";95.0;0;0;7;0;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.0;0.0;0.25;0.0;1.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;2;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";;"mar15-Pi�B3sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";35.0;0;0;0;0;0;0;6;4;11;7;6;680;3;8;15;19;10;2200;;;;;;0.0;0.0;0.0;0.0;6.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";;"mar15-Pi�B3inf";5.0;2;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";90.0;0;0;6;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;25.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"IMGP0787.JPG";"mar15-Pi�B4sup";4.0;2;0.0;;0.0;;0.0;0.0;5.0;"Sable fin";50.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;50.0;;10.0;"Sable fin";;0;0;0;0;;;0;;0;2;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"IMGP0788.JPG";"mar15-Pi�B4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;2;3;0;0;0;12;16;20;21;23;1840;8;8;7;18;5;1840;;;;;;0.0;0.0;0.5;0.0;2.5;;10.0;"Sable fin";;0;0;0;0;;;0;;0;2;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Rouge";;"mar15-Pi�B5sup";60.0;3;35.0;2;1.5;2;0.0;3.0;1.0;"Sable fin";18.0;0;0;0;0;0;0;;;;;;44;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";;"mar15-Pi�B5inf";0.0;;0.0;;0.0;;0.0;0.5;1.0;"Sable grossier";55.0;0;1;3;0;0;0;;;;;;91;2;1;19;12;13;1880;;;;;;2.0;1.0;0.0;0.0;5.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Brune-Rouge";;"mar15-Pi�B6sup";50.0;3;11.0;2;10.0;2;0.0;1.5;0.0;"Pas de s�diment";16.0;0;0;3;0;0;0;;;;;;185;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;7.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";;"mar15-Pi�B6inf";0.5;2;0.0;;0.0;;0.0;0.5;5.0;"Sable grossier";85.0;0;0;4;0;0;0;;;;;;144;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.5;4.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune-Rouge";"IMGP0806.JPG";"mar15-Pi�B8sup";25.0;3;29.0;2;17.0;2;0.0;0.5;4.0;"Sable fin";2.0;0;0;0;0;0;0;;;;;;23;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;4.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP0807.JPG";"mar15-Pi�B8inf";0.0;;0.0;;0.0;;0.0;0.5;1.5;"Sable fin";6.0;0;0;0;0;0;0;;;;;;91;5;1;9;0;0;600;;;;;;1.0;0.0;0.0;0.25;1.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune";;"mar15-Pi�B9sup";45.0;3;3.0;2;7.0;2;0.0;6.0;30.0;"Sable fin";2.0;0;0;3;0;0;0;;;;;;175;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;1.5;1.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";;"mar15-Pi�B9inf";0.0;;0.5;2;0.0;;0.0;2.5;20.0;"Sable fin";5.5;0;1;0;0;0;0;;;;;;233;0;0;0;0;0;0;;;;;;0.0;4.0;2.0;0.0;2.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"IMGP0901.JPG";"mar15-Pi�B10sup";65.0;3;18.0;2;15.0;2;0.0;2.0;3.0;"Sable fin";4.0;0;0;0;0;0;0;;;;;;35;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.5;10.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"IMGP0902.JPG";"mar15-Pi�B10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";30.0;0;3;0;0;0;0;;;;;;115;8;14;1;0;1;960;;;;;;2.0;0.5;0.0;0.0;5.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Brune";"IMGP0782.JPG";"mar15-Pi�Q1";90.0;3;0.5;2;0.0;;0.0;45.0;20.0;"Sable fin";3.5;0;0;13;0;0;0;8;5;0;6;0;380;0;0;0;0;0;0;;;;;;4.0;0.0;0.0;0.0;10.0;;;;;;;;;;;;;;;;;;;; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Brune-Rouge";"IMGP0904.JPG";"mar15-Pi�Q5";50.0;3;30.0;2;2.0;2;0.0;0.5;20.0;"Sable grossier";3.0;0;0;0;0;0;0;;;;;;109;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;3.0;;;;;;;;;;;;;;;;;;;; +378871;"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Brune";"IMGP0791.JPG";"mar15-Pi�Q2";70.0;2;1.0;2;1.5;2;0.0;8.0;6.0;"Sable fin";22.0;0;0;11;0;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;18.0;;;;;;;;;;;;;;;;;;;; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Brune";"IMGP1232.JPG";"oct15-Pi�Q3";85.0;3;18.0;2;14.0;2;0.0;0.5;16.0;"Sable fin";4.0;0;0;0;0;0;0;;;;;;10;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;4.5;;;;;;;;;;;;;;;;;;;; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Brune";"IMGP1234.JPG";"oct15-Pi�B7sup";75.0;3;8.0;2;5.0;2;0.0;0.0;11.0;"Sable fin";3.0;0;1;3;0;;;19;0;36;19;13;1740;0;0;0;0;0;0;;;;;;0.0;2.0;0.0;1.0;6.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"IMGP1236.JPG";"oct15-Pi�B7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";7.0;0;4;3;0;0;0;5;2;3;12;17;780;0;0;0;0;0;0;;;;;;0.0;0.25;0.0;4.0;6.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune";"IMGP1226.JPG";"oct15-Pi�B5sup";65.0;3;12.0;2;6.5;2;0.0;2.0;12.0;"Sable fin";3.0;0;0;2;0;0;0;;;;;;176;0;0;0;0;0;0;;;;;;0.0;0.25;0.0;0.5;5.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;2;2;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"IMGP1227.JPG";"oct15-Pi�B5inf";0.0;;0.5;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;8;0;0;0;0;20;8;13;10;7;1160;10;1;3;1;0;600;;;;;;0.0;3.0;2.0;1.0;3.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;2;2;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Brune";"IMGP1229.JPG";"oct15-Pi�B6sup";90.0;3;3.5;2;0.5;2;0.0;4.0;14.0;"Sable fin";17.0;0;0;1;0;0;0;;;;;;214;0;0;0;0;0;0;;;;;;0.0;0.25;0.0;0.25;2.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"IMGP1231.JPG";"oct15-Pi�B6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";32.0;0;5;0;0;0;0;21;25;13;13;4;1520;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;1.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Brune";"IMGP1201.JPG";"oct15-Pi�B1sup";17.0;2;0.0;;6.5;2;0.0;0.0;2.0;"Sable fin";10.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;88.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP1203.JPG";"oct15-Pi�B1inf";0.5;2;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";12.5;0;0;7;0;0;0;5;3;5;8;5;;5;12;30;7;24;3120;;;;;;0.0;3.0;1.0;1.0;30.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche-Brune";"IMGP1206.JPG";"oct15-Pi�B2sup";35.0;2;0.0;;2.5;2;0.0;0.0;5.0;"Sable fin";17.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;22.0;;45.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"IMGP1208.JPG";"oct15-Pi�B2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";50.0;0;0;2;0;0;0;;;;;;117;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;13.0;;45.0;"Sable fin";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune-Rouge";"IMGP1247.JPG";"oct15-Pi�Q5";50.0;3;88.0;2;4.0;2;0.0;0.0;12.5;"D�bris coquilliers";1.5;0;0;0;0;0;0;;;;;;22;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;5.0;0.5;;;;;;;;;;;;;;;;;;;; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"IMGP1240.JPG";"oct15-Pi�Q4";20.0;2;95.0;2;7.0;2;0.0;0.0;60.0;"Sable fin";3.0;0;1;0;0;0;0;;;;;;13;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche";"IMGP1223.JPG";"oct15-Pi�Q2";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";77.0;0;0;0;0;0;0;;;;;;203;1;0;0;0;2;120;;;;;;0.0;0.0;0.0;0.0;23.0;;;;;;;;;;;;;;;;;;;; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Brune";"IMGP1211.JPG";"oct15-Pi�Q1";99.0;3;0.5;2;0.0;;0.0;40.0;13.0;"Sable fin";3.5;0;0;2;0;0;0;;;;;;215;0;0;0;0;0;0;;;;;;5.0;0.0;0.0;0.5;11.0;;;;;;;;;;;;;;;;;;;; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"IMGP1244.JPG";"oct15-Pi�B10sup";85.0;3;7.0;3;11.0;2;0.0;0.0;7.0;"Sable fin";14.0;0;0;1;0;0;0;23;0;4;7;1;700;0;0;0;0;0;0;;;;;;0.0;1.5;0.25;2.0;8.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;1;2;0;0;;;1;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"IMGP1246.JPG";"oct15-Pi�B10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";35.0;0;0;0;0;0;0;6;5;8;5;11;700;0;0;0;0;0;0;;;;;;0.25;0.25;0.25;0.5;11.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;1;2;0;0;;;1;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Verte";"IMGP1241.JPG";"oct15-Pi�B9sup";0.0;;12.0;2;25.0;2;0.0;0.0;1.0;"Sable fin";50.0;0;0;0;0;0;0;11;5;11;11;2;800;0;0;0;0;0;0;;;;;;7.0;0.0;0.0;0.0;2.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"IMGP1243.JPG";"oct15-Pi�B9inf";0.0;;0.0;;11.0;2;0.0;0.0;0.0;"Pas de s�diment";75.0;0;0;0;0;0;0;6;16;28;0;12;1240;0;0;0;0;0;0;;;;;;0.0;0.25;0.0;2.0;5.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche-Rouge";"IMGP1237.JPG";"oct15-Pi�B8sup";5.0;2;22.0;2;2.0;2;0.0;0.0;0.0;"Pas de s�diment";40.0;0;0;0;0;0;0;7;18;3;28;1;1140;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;5.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP1239.JPG";"oct15-Pi�B8inf";0.0;;0.0;;1.0;2;0.0;0.0;0.0;"Pas de s�diment";9.0;0;7;2;0;0;0;6;7;24;21;3;1220;16;7;2;31;3;2360;;;;;;0.0;0.0;0.0;1.0;3.0;;5.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"IMGP1217.JPG";"oct15-Pi�B3sup";2.0;2;1.0;2;0.5;2;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;83.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;10;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche-Verte";"IMGP1214.JPG";"oct15-Pi�B3inf";0.0;;1.0;2;9.0;2;0.0;0.0;0.0;"Pas de s�diment";12.0;0;1;2;1;0;0;21;9;9;14;6;1180;39;23;31;0;22;4600;;;;;;0.0;2.5;0.5;0.5;0.5;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;10;0;;0;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"IMGP1218.JPG";"oct15-Pi�B4sup";8.0;2;0.0;;10.0;2;0.0;0.0;0.0;"Pas de s�diment";20.0;0;0;0;2;0;0;;;;;;4;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;20.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;1;0;0; +378934;"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"IMGP1220.JPG";"oct15-Pi�B4inf";1.0;2;0.5;2;0.25;2;0.0;0.5;0.0;"Pas de s�diment";3.0;0;3;0;0;0;0;4;3;6;9;0;440;30;10;5;3;43;3640;;;;;;0.0;11.0;0.5;0.5;2.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;1;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"IMGP1665.JPG";"avr16-Pi�B3sup";1.0;2;2.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";24.0;0;0;0;3;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;76.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"IMGP1666.JPG";"avr16-Pi�B3inf";0.0;;0.0;;0.0;;0.0;0.0;1.0;"Sable fin";83.0;0;1;7;8;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;6.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"IMGP1636.JPG";"avr16-Pi�B2sup";2.5;;0.0;;0.5;2;0.0;0.0;0.0;"Pas de s�diment";37.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;35.0;;10.0;"Roche en place";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"IMGP1637.JPG";"avr16-Pi�B2inf";0.0;;0.0;;0.0;;0.0;0.0;10.0;"Sable fin";32.0;0;1;4;0;0;0;;;;;;92;4;6;2;7;1;800;;;;;;0.0;0.0;0.0;0.0;18.0;;10.0;"Roche en place";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune";"IMGP1633.JPG";"avr16-Pi�B1sup";96.0;3;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";8.0;0;0;2;0;0;0;;;;;;46;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.25;11.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP1634.JPG";"avr16-Pi�B1inf";0.0;;0.0;;0.0;;0.0;0.0;5.0;"Sable fin";55.0;0;0;3;0;0;0;;;;;;79;9;4;0;0;10;920;;;;;;0.0;0.0;0.0;0.0;8.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Brune";"IMGP1664.JPG";"avr16-Pi�Q5";65.0;3;18.0;2;6.0;2;0.0;3.0;10.0;"Sable fin";9.0;0;1;3;0;0;0;10;6;3;0;4;460;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;8.0;;;;;;;;;;;;;;;;;;;; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune";"IMGP1656.JPG";"avr16-Pi�Q4";90.0;3;24.0;2;0.5;2;0.0;0.0;14.0;"Sable fin";4.0;0;0;3;0;0;0;13;24;9;14;6;1320;0;0;0;0;0;0;;;;;;0.0;0.25;0.0;1.0;8.0;;;;;;;;;;;;;;;;;;;; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune";"IMGP1646.JPG";"avr16-Pi�Q3";84.0;3;50.0;2;14.0;2;0.0;0.5;94.0;"Sable fin";0.5;0;0;1;0;0;0;;;;;;61;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche";"IMGP1671.JPG";"avr16-Pi�Q2";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";45.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;29.0;;;;;;;;;;;;;;;;;;;; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Brune";"IMGP1639.JPG";"avr16-Pi�Q1";100.0;3;0.0;;0.0;;0.0;20.0;18.0;"Sable fin";3.0;0;0;18;0;0;0;;;;;;100;0;0;0;0;0;0;;;;;;1.5;0.0;0.0;0.0;5.0;;;;;;;;;;;;;;;;;;;; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"IMGP1660.JPG";"avr16-Pi�B10sup";14.0;2;2.0;2;9.0;2;0.0;0.5;2.0;"D�bris coquilliers";35.0;0;0;2;0;0;0;;;;;;55;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;4.0;35.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"IMGP1662.JPG";"avr16-Pi�B10inf";0.0;;1.0;2;0.5;2;0.0;0.5;1.0;"Sable fin";80.0;0;2;1;0;0;0;;;;;;25;1;0;0;0;0;40;;;;;;0.0;0.5;2.0;1.0;21.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche";"IMGP1657.JPG";"avr16-Pi�B9sup";0.0;;1.0;2;0.0;;0.0;0.5;1.0;"Sable fin";15.0;0;0;3;0;0;0;25;18;11;14;15;1660;1;1;0;0;0;80;;;;;;0.0;0.0;0.5;1.5;12.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche-Brune";"IMGP1658.JPG";"avr16-Pi�B9inf";70.0;3;6.0;2;1.0;2;0.0;7.0;20.0;"D�bris coquilliers";1.0;0;2;8;0;0;0;14;12;7;7;3;860;0;0;0;0;0;0;;;;;;1.5;0.0;0.0;0.0;4.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune-Rouge";"IMGP1650.JPG";"avr16-Pi�B8sup";35.0;3;22.0;2;22.0;2;0.0;0.0;0.5;"Sable fin";4.0;0;0;3;0;0;0;12;6;11;0;10;780;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;8.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP1651.JPG";"avr16-Pi�B8inf";0.0;;2.0;2;0.0;;0.0;1.0;5.0;"D�bris coquilliers";25.0;0;4;0;0;0;0;;;;;;82;0;0;2;1;2;200;;;;;;1.0;1.0;0.25;0.0;27.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Brune";"IMGP1647.JPG";"avr16-Pi�B7sup";20.0;2;21.0;2;13.5;2;0.0;1.0;18.0;"Sable fin";9.0;0;0;5;1;0;0;;;;;;115;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;8.5;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"IMGP1648.JPG";"avr16-Pi�B7inf";0.5;2;2.5;2;0.5;2;0.0;0.5;7.0;"Sable fin";30.0;0;1;1;0;0;0;;;;;;120;0;0;0;0;0;0;;;;;;0.0;3.0;0.5;0.0;7.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"IMGP1643.JPG";"avr16-Pi�B6sup";0.0;;0.5;2;0.0;;0.0;1.0;27.0;"Sable fin";17.0;0;0;2;0;0;0;6;8;9;17;9;980;1;1;0;0;0;80;;;;;;0.0;0.0;0.0;0.0;2.5;;5.0;"Roche en place";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche-Rouge";"IMGP1644.JPG";"avr16-Pi�B6inf";13.0;2;17.0;2;2.0;2;0.0;4.5;1.0;"Sable fin";12.0;0;20;9;1;0;0;;;;;;26;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;7.0;;5.0;"Roche en place";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Rouge";"IMGP1640.JPG";"avr16-Pi�B5sup";50.0;3;45.0;2;2.5;2;0.0;3.0;35.0;"Sable fin";1.0;0;0;7;0;0;0;;;;;;8;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.5;1.5;;53.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"IMGP1641.JPG";"avr16-Pi�B5inf";0.0;;0.0;;0.0;;0.0;0.0;5.0;"D�bris coquilliers";53.0;0;1;1;0;0;0;5;8;7;30;11;1220;0;8;1;1;0;400;;;;;;0.5;1.5;0.5;0.0;2.5;;53.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"IMGP1668.JPG";"avr16-Pi�B4sup";0.0;;0.0;;0.0;;0.0;0.0;0.5;"Sable grossier";26.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;30.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;1;0;0; +379001;"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"IMGP1669.JPG";"avr16-Pi�B4inf";0.0;;0.0;;0.0;;0.0;1.0;3.0;"Sable fin";19.0;0;10;6;3;0;0;;;;;;26;16;30;38;15;16;4600;;;;;;0.0;0.0;0.0;0.5;20.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;1;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge-Verte";"IMGP2081.JPG";"oct16-Pi�B9sup";13.0;2;24.0;2;14.0;2;0.0;0.0;10.0;"Sable fin";13.0;0;0;8;0;0;0;;;;;;61;0;0;0;0;0;0;;;;;;6.0;0.0;0.0;0.5;2.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"IMGP2082.JPG";"oct16-Pi�B9inf";0.5;2;0.0;;3.0;2;0.0;0.0;0.0;"Pas de s�diment";1.0;0;1;0;0;0;0;;;;;;148;0;0;0;0;0;0;;;;;;9.0;1.5;6.0;8.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Verte";"IMGP2065.JPG";"oct16-Pi�B1sup";9.0;2;0.0;;30.0;2;0.0;0.0;26.0;"Sable fin";32.0;0;0;2;0;0;0;;;;;;14;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;7.0;;60.0;"Sable fin";;0;0;0;1;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP2066.JPG";"oct16-Pi�B1inf";0.5;1;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";90.0;0;0;0;0;0;0;;;;;;7;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;60.0;"Sable fin";;0;0;0;1;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Verte";"IMGP2067.JPG";"oct16-Pi�B2sup";27.0;2;2.0;2;23.0;2;0.0;0.0;12.0;"Sable fin";15.0;0;0;5;0;0;0;;;;;;12;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;6.0;;25.0;"Sable fin";;0;0;0;0;;;0;;0;5;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"IMGP2068.JPG";"oct16-Pi�B2inf";1.0;3;0.0;;0.0;;0.0;2.0;25.0;"Sable fin";75.0;0;2;4;1;0;0;;;;;;18;0;0;0;0;2;80;;;;;;0.0;0.0;0.0;0.0;2.0;;25.0;"Sable fin";;0;0;0;0;;;0;;0;5;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche-Brune";"IMGP2060.JPG";"oct16-Pi�B3sup";40.0;2;0.0;;1.5;2;0.0;0.0;0.0;"Pas de s�diment";11.0;0;0;4;3;0;0;;;;;;15;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;23.0;;10.0;"Sable fin";;1;1;1;0;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"IMGP2061.JPG";"oct16-Pi�B3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;2;0;0;0;0;;;;;;70;80;2;13;6;50;6040;;;;;;0.0;2.5;0.0;0.5;1.0;;10.0;"Sable fin";;1;1;1;0;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche";"IMGP2062.JPG";"oct16-Pi�B4sup";7.0;2;7.5;2;1.0;2;0.0;1.0;0.0;"Pas de s�diment";18.0;0;0;5;3;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;72.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;2;2;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"IMGP2063.JPG";"oct16-Pi�B4inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";28.0;0;1;1;0;0;0;;;;;;73;1;5;30;0;0;1440;;;;;;0.0;2.0;0.0;0.0;1.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;2;2;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Rouge";"IMGP2070.JPG";"oct16-Pi�B5sup";70.0;3;28.0;2;3.5;2;0.0;1.0;27.0;"Sable fin";9.0;0;0;1;0;0;0;;;;;;15;0;0;0;0;0;0;;;;;;0.0;1.0;0.0;0.0;1.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"IMGP2072.JPG";"oct16-Pi�B5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";50.0;0;0;1;0;0;0;1;2;12;8;3;520;0;0;0;0;0;0;;;;;;0.0;1.5;0.5;1.5;1.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Brune-Rouge";"IMGP2073.JPG";"oct16-Pi�B6sup";70.0;2;90.0;2;5.0;2;0.0;0.0;97.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.5;0.5;0.0;0.0;0.5;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"IMGP2074.JPG";"oct16-Pi�B6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";31.0;0;0;0;0;0;0;1;2;0;5;0;160;0;0;0;0;0;0;;;;;;2.0;4.5;0.25;0.0;0.5;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Verte";"IMGP2076.JPG";"oct16-Pi�B7sup";0.5;2;12.0;2;22.0;2;0.0;0.0;25.0;"Sable fin";6.0;0;0;6;0;0;0;;;;;;54;0;0;0;0;0;0;;;;;;0.0;0.25;0.5;0.5;7.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"IMGP2077.JPG";"oct16-Pi�B7inf";0.5;2;0.5;2;2.0;2;0.5;0.0;15.0;"Sable fin";8.5;0;0;0;0;0;0;;;;;;68;0;0;0;0;0;0;;;;;;0.0;2.0;0.5;27.0;6.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune";"IMGP2078.JPG";"oct16-Pi�B8sup";88.0;3;35.0;2;14.0;2;0.0;0.0;30.0;"Sable fin";2.0;0;0;2;0;0;0;;;;;;27;0;0;0;0;0;0;;;;;;0.0;0.0;0.25;0.0;1.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"IMGP2079.JPG";"oct16-Pi�B8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";13.0;0;6;0;0;0;0;;;;;;190;5;2;0;0;0;280;;;;;;0.5;3.0;5.0;5.0;0.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"IMGP2083.JPG";"oct16-Pi�B10sup";75.0;2;27.0;2;9.0;2;0.0;0.5;60.0;"Sable fin";2.0;0;0;5;0;0;0;;;;;;17;0;0;0;0;0;0;;;;;;0.25;0.25;0.0;0.5;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;2;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"IMGP2084.JPG";"oct16-Pi�B10inf";1.5;2;0.0;;1.5;2;0.0;0.0;0.0;"Pas de s�diment";10.0;0;2;0;0;0;0;;;;;;135;1;3;0;0;0;160;;;;;;1.0;1.5;0.25;0.0;0.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;2;0;;0;0;0; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Brune";"IMGP2069.JPG";"oct16-Pi�Q1";70.0;3;2.5;2;2.5;2;0.0;0.0;6.0;"Sable fin";10.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;20.0;;;;;;;;;;;;;;;;;;;; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune";"IMGP2064.JPG";"oct16-Pi�Q2";70.0;3;0.0;;3.0;2;0.0;0.5;2.0;"Sable fin";9.0;1;1;5;3;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;1.5;22.0;;;;;;;;;;;;;;;;;;;; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune";"IMGP2075.JPG";"oct16-Pi�Q3";88.0;3;53.0;2;4.0;2;0.0;0.25;61.0;"Sable fin";4.0;0;0;3;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.5;0.5;;;;;;;;;;;;;;;;;;;; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Brune-Rouge";"IMGP2080.JPG";"oct16-Pi�Q4";88.0;3;41.0;2;7.0;2;0.0;0.0;95.0;"Sable fin";2.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.5;0.5;;;;;;;;;;;;;;;;;;;; +379068;"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune-Rouge";"IMGP2085.JPG";"oct16-Pi�Q5";12.0;3;85.0;2;6.0;2;0.0;0.0;97.5;"Sable fin";3.0;0;0;2;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.75;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";;;"avr14-PlouB4sup";95.0;3;14.0;2;0.5;2;0.0;5.0;0.0;;15.0;0;1;29;0;0;0;;;;;;;;;;;;480;;;;;;0.0;0.0;0.0;0.0;4.5;;10.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;;"avr14-PlouB4inf";0.0;;2.5;2;0.0;;0.0;3.0;0.0;;20.0;0;2;1;0;0;0;;;;;;;;;;;;3280;;;;;;4.0;2.5;0.0;0.0;;;10.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;;"avr14-PlouQ3";100.0;3;2.0;2;0.25;2;0.0;75.0;0.0;;15.0;0;0;15;2;0;0;;;;;;;;;;;;1040;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";;;"avr14-PlouB3sup";0.0;;1.0;2;17.0;2;0.0;0.0;0.0;;30.0;0;0;2;1;0;0;;;;;;;;;;;;4160;;;;;;0.0;0.0;0.0;0.0;11.5;;2.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;;"avr14-PlouB3inf";5.5;2;1.5;2;0.0;;0.0;18.0;0.0;;65.0;0;2;16;8;0;0;;;;;;;;;;;;1080;;;;;;0.0;0.0;0.0;0.0;;;2.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;;"avr14-PlouB2sup";100.0;3;25.0;2;0.5;2;0.0;10.0;30.0;"Sable fin";0.0;0;0;2;2;0;0;;;;;;;;;;;;80;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;;"avr14-PlouB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;;7.0;0;3;2;0;0;0;;;;;;;;;;;;6040;;;;;;12.0;3.5;0.0;0.0;;;5.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;;"avr14-PlouB1sup";70.0;3;0.5;2;0.0;;0.0;23.0;0.0;;34.0;1;0;3;0;0;0;;;;;;;;;;;;840;;;;;;0.0;0.0;0.0;0.0;1.0;;2.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;;"avr14-PlouB1inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;;12.0;0;8;0;3;0;0;;;;;;;;;;;;7840;;;;;;0.5;2.0;0.0;0.0;;;2.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";;;"avr14-PlouQ2";95.0;3;30.0;2;5.0;2;0.0;10.0;50.0;"Sable fin";2.0;1;1;1;1;0;0;;;;;;;;;;;;400;;;;;;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;;"avr14-PlouQ1";60.0;3;0.0;;0.0;;0.0;26.0;0.0;;50.0;0;1;7;1;0;0;;;;;;;;;;;;360;;;;;;0.0;0.0;0.0;0.0;8.5;;;;;;;;;;;;;;;;;;;; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;"bloc 10 dessus.JPG";"avr14-PlouB10sup";75.0;3;1.0;2;0.0;;0.0;4.0;0.0;;35.0;0;0;8;4;0;0;;;;;;;;;;;;320;;;;;;0.25;0.0;0.0;0.0;20.0;;30.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;"bloc 10 dessous.JPG";"avr14-PlouB10inf";0.0;;1.0;2;0.0;;0.0;1.0;0.0;;42.0;0;0;0;0;0;0;;;;;;;;;;;;1520;;;;;;2.0;3.0;3.0;0.0;1.0;;30.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"bloc 9 dessus.JPG";"avr14-PlouB9sup";8.0;3;8.0;2;0.5;2;0.0;0.5;0.0;;25.0;0;0;1;4;0;0;;;;;;;;;;;;160;;;;;;2.0;0.0;0.0;0.0;20.0;;40.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"bloc 9 dessous.JPG";"avr14-PlouB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;;1.0;0;2;0;0;0;0;;;;;;;;;;;;2120;;;;;;3.0;1.0;1.0;0.0;4.5;;40.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"bloc 8 dessus.JPG";"avr14-PlouB8sup";5.0;2;6.0;2;92.0;2;0.0;1.0;0.0;;19.0;0;0;3;0;0;0;;;;;;;;;;;;0;;;;;;0.0;0.0;0.0;0.0;4.0;;5.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"bloc 8 dessous.JPG";"avr14-PlouB8inf";0.5;2;5.0;2;0.5;2;0.0;7.0;0.0;;15.0;0;1;0;0;0;0;;;;;;;;;;;;240;;;;;;0.0;10.0;0.0;0.0;40.0;;5.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"bloc 7 dessus.JPG";"avr14-PlouB7sup";95.0;3;4.0;2;1.0;2;0.0;11.5;0.0;;1.0;0;2;4;0;0;0;;;;;;;;;;;;200;;;;;;0.5;0.5;0.0;0.0;20.0;;0.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"bloc 7 dessous.JPG";"avr14-PlouB7inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;;6.5;0;0;2;0;0;0;;;;;;;;;;;;40;;;;;;3.0;3.5;0.0;0.0;65.0;;0.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;;"avr14-PlouB6sup";50.0;3;7.5;2;0.5;2;0.0;14.5;0.0;;75.0;1;0;3;1;0;0;;;;;;;;;;;;520;;;;;;0.0;0.0;0.0;0.0;0.25;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;1;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;;"avr14-PlouB6inf";0.0;;0.0;;0.0;;0.0;16.0;0.0;;13.0;0;0;0;0;0;0;;;;;;;;;;;;5120;;;;;;3.0;2.5;0.5;0.0;;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;1;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;;"avr14-PlouB5sup";50.0;3;3.0;2;0.0;;0.0;2.5;0.0;;75.0;1;0;4;1;0;0;;;;;;;;;;;;560;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Sable grossier";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;;"avr14-PlouB5inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;;40.0;0;2;2;1;0;0;;;;;;;;;;;;5560;;;;;;0.0;4.0;0.0;0.0;;;5.0;"Sable grossier";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";;"Q5Ref.JPG";"avr14-PlouQ5";100.0;3;4.0;2;0.0;;0.0;16.0;0.0;;40.0;0;0;11;1;0;0;;;;;;;;;;;;840;;;;;;;0.0;0.0;0.0;15.0;;;;;;;;;;;;;;;;;;;; +379135;"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;"Q4Ref.JPG";"avr14-PlouQ4";25.0;3;9.0;2;15.0;2;0.0;20.0;0.0;;25.0;0;1;5;0;0;0;;;;;;;;;;;;40;;;;;;0.0;0.0;0.0;0.0;9.5;;;;;;;;;;;;;;;;;;;; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;;"oct14-PlouB10sup";10.0;2;10.0;2;28.0;2;0.0;4.0;0.0;"Pas de s�diment";65.0;0;0;3;0;0;0;;;;;;;;;;;;480;;;;;;1.0;0.0;0.0;0.0;2.0;;10.0;"Sable grossier";;0;2;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;;"oct14-PlouB10inf";0.5;2;1.0;2;0.5;2;0.0;3.0;0.0;"Pas de s�diment";60.0;0;8;3;0;0;0;;;;;;;;;;;;3840;;;;;;1.5;0.5;0.0;0.0;0.5;;10.0;"Sable grossier";;0;2;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";;;"oct14-PlouQ2";4.0;2;35.0;2;2.0;2;0.0;2.0;20.0;"Sable grossier";57.0;0;1;5;0;0;0;;;;;;;;;;;;1760;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";;;"oct14-PlouQ5";95.0;3;1.0;2;0.25;2;0.0;28.0;0.0;"Pas de s�diment";70.0;1;1;22;0;0;0;;;;;;;;;;;;880;;;;;;3.5;0.0;0.0;0.0;2.0;;;;;;;;;;;;;;;;;;;; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;;"oct14-PlouQ4";35.0;2;25.0;2;15.0;2;0.0;4.0;0.0;"Pas de s�diment";8.0;1;3;4;0;0;0;;;;;;;;;;;;1040;;;;;;0.0;0.0;0.0;0.0;100.0;;;;;;;;;;;;;;;;;;;; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;"IMGP0399.JPG";"oct14-PlouQ3";30.0;3;2.0;2;0.0;;0.0;12.0;0.0;"Pas de s�diment";70.0;1;0;0;0;0;0;;;;;;;;;;;;1000;;;;;;0.0;0.0;0.0;0.0;0.125;;;;;;;;;;;;;;;;;;;; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"IMGP0406.JPG";"oct14-PlouB1sup";5.0;2;8.0;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";75.0;0;0;1;1;0;0;;;;;;;;;;;;720;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Sable grossier";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;;"oct14-PlouB1inf";0.0;;1.0;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";45.0;0;9;17;6;0;0;;;;;;;;;;;;3640;;;;;;0.0;2.0;1.0;0.0;0.0;;5.0;"Sable grossier";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"IMGP0407.JPG";"oct14-PlouB2sup";80.0;3;5.0;2;0.0;;0.0;30.0;5.0;"Sable fin";0.0;1;1;12;0;0;0;;;;;;;;;;;;2560;;;;;;0.0;1.0;0.0;0.0;2.0;;11.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"IMGP0408.JPG";"oct14-PlouB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;1;0;0;0;0;;;;;;;;;;;;3360;;;;;;1.5;1.5;0.5;0.0;2.0;;11.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";;;"oct14-PlouB3sup";10.0;2;45.0;2;1.0;2;0.0;0.0;30.0;"Sable grossier";20.0;1;0;0;0;0;0;;;;;;;;;;;;360;;;;;;5.0;0.0;0.0;0.0;0.0;;15.0;"Sable grossier";;0;0;0;0;;;1;;0;0;1;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;;"oct14-PlouB3inf";0.0;;1.0;2;1.0;2;0.0;1.5;0.0;"Pas de s�diment";35.0;0;13;0;0;0;0;;;;;;;;;;;;1160;;;;;;0.5;1.5;0.0;0.0;1.0;;15.0;"Sable grossier";;0;0;0;0;;;1;;0;0;1;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";;;"oct14-PlouB4sup";40.0;2;75.0;2;20.0;2;0.0;0.0;75.0;"Sable grossier";10.0;1;0;1;0;0;0;;;;;;;;;;;;160;;;;;;0.5;0.0;0.0;0.0;0.0;;5.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;;"oct14-PlouB4inf";0.0;;4.0;2;0.5;2;0.0;2.5;0.0;"Pas de s�diment";11.0;0;0;0;0;0;0;;;;;;;;;;;;3040;;;;;;4.0;0.0;0.5;0.0;0.0;;5.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;"IMGP0402.JPG";"oct14-PlouB5sup";60.0;2;3.0;2;0.0;;0.0;45.0;20.0;"Sable fin";35.0;3;0;0;0;0;0;;;;;;;;;;;;3600;;;;;;3.0;0.0;0.0;0.0;0.0;;90.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;"IMGP0403.JPG";"oct14-PlouB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";90.0;0;0;0;0;0;0;;;;;;;;;;;;0;;;;;;3.0;0.0;0.0;0.0;0.0;;90.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"IMGP0404.JPG";"oct14-PlouB6sup";30.0;3;8.0;2;0.5;2;0.0;1.5;2.5;"Sable fin";50.0;0;0;0;2;0;0;;;;;;;;;;;;1760;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Sable grossier";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;"IMGP0405.JPG";"oct14-PlouB6inf";0.0;;2.0;2;0.0;;0.0;0.25;0.0;"Pas de s�diment";11.0;0;0;4;0;0;0;;;;;;;;;;;;10040;;;;;;0.5;5.0;1.5;0.0;0.5;;5.0;"Sable grossier";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"IMGP0412.JPG";"oct14-PlouB7sup";0.5;2;35.0;2;35.0;2;0.0;0.0;15.0;"Sable grossier";25.0;0;0;12;0;0;0;;;;;;;;;;;;1360;;;;;;0.0;0.0;0.0;0.0;1.0;;15.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"IMGP0413.JPG";"oct14-PlouB7inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";30.0;0;0;0;0;0;0;;;;;;;;;;;;1400;;;;;;1.0;1.0;0.5;0.0;2.0;;15.0;"Sable grossier";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"IMGP0414.JPG";"oct14-PlouB8sup";11.0;2;3.0;2;29.0;2;0.0;1.0;0.0;"Pas de s�diment";22.0;0;0;3;8;0;0;;;;;;;;;;;;440;;;;;;0.0;0.0;0.0;0.0;8.0;;50.0;"Sable grossier";;0;0;1;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"IMGP0415.JPG";"oct14-PlouB8inf";0.0;;1.5;2;0.0;;0.0;20.0;0.0;"Pas de s�diment";72.0;0;0;0;0;0;0;;;;;;;;;;;;1720;;;;;;1.5;0.0;0.0;0.0;0.5;;50.0;"Sable grossier";;0;0;1;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"IMGP0416.JPG";"oct14-PlouB9sup";75.0;2;7.0;2;1.0;2;0.0;3.0;0.0;"Pas de s�diment";40.0;0;4;4;1;0;0;;;;;;;;;;;;1680;;;;;;1.0;0.0;0.0;0.0;2.0;;15.0;"Sable grossier";;0;2;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"IMGP0442.JPG";"oct14-PlouB9inf";0.0;;0.25;2;0.0;;0.0;1.5;0.0;"Pas de s�diment";20.0;0;1;0;0;0;0;;;;;;;;;;;;1600;;;;;;5.0;7.0;0.0;0.0;2.5;;15.0;"Sable grossier";;0;2;0;0;;;0;;0;0;0;;0;0;0; +379202;"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;"IMGP0409.JPG";"oct14-PlouQ1";25.0;2;0.0;;0.0;;0.25;0.0;0.0;"Pas de s�diment";90.0;0;0;2;1;0;0;;;;;;;;;;;;0;;;;;;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Rouge";"IMGP0993.JPG";"avr15-PlouB7sup";20.0;3;30.0;2;15.0;2;0.0;5.0;5.0;"Sable grossier";40.0;0;0;0;4;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;28.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;2;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"IMGP0994.JPG";"avr15-PlouB7inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";35.0;0;4;5;8;0;0;;;;;;8;8;3;2;2;0;600;;;;;;0.0;1.5;0.0;0.0;13.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;2;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"IMGP0985.JPG";"avr15-PlouB9sup";12.0;3;28.0;2;9.0;2;0.0;50.0;0.0;"Pas de s�diment";13.0;0;1;1;4;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;2.0;;55.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"IMGP0986.JPG";"avr15-PlouB9inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";85.0;0;0;1;0;0;0;;;;;;6;20;15;5;1;29;2800;;;;;;0.5;10.5;0.25;0.0;1.5;;55.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"IMGP0988.JPG";"avr15-PlouB10sup";70.0;3;12.0;2;1.0;2;0.0;55.0;0.0;"Pas de s�diment";10.0;0;1;0;2;0;0;;;;;;0;6;5;8;0;0;760;;;;;;3.0;0.0;0.0;0.0;5.5;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"IMGP0989.JPG";"avr15-PlouB10inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";25.0;0;1;1;0;0;0;;;;;;0;3;16;27;1;25;2880;;;;;;8.5;2.0;0.0;5.0;1.5;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche-Brune";"IMGP1022.JPG";"avr15-PlouQ1";20.0;2;0.0;;0.5;2;0.0;0.0;0.0;"Pas de s�diment";91.0;0;0;0;3;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche-Brune";"IMGP1008.JPG";"avr15-PlouQ3";36.0;2;5.0;2;2.0;2;0.0;35.0;5.0;"Sable grossier";51.0;0;0;30;5;0;0;;;;;;0;24;25;16;22;21;4320;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"IMGP0996.JPG";"avr15-PlouB8sup";25.0;2;12.5;2;87.5;2;0.0;6.25;25.0;"Sable grossier";25.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;2.0;;80.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP0997.JPG";"avr15-PlouB8inf";0.0;;1.25;2;0.0;;0.0;20.0;6.25;"Sable grossier";25.0;0;0;1;0;0;0;;;;;;2;1;6;12;11;11;2050;;;;;;0.0;0.0;0.0;0.0;8.0;;80.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"IMGP1015.JPG";"avr15-PlouQ2";5.0;2;92.0;2;1.0;2;0.0;0.0;100.0;"Sable fin";0.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Blanche-Brune";"IMGP0999.JPG";"avr15-PlouQ4";20.0;2;14.0;2;1.0;2;0.0;11.0;5.0;"Sable grossier";55.0;0;1;2;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;8.0;;;;;;;;;;;;;;;;;;;; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"IMGP0991.JPG";"avr15-PlouQ5";70.0;3;26.0;2;0.5;2;0.0;20.0;0.0;"Pas de s�diment";40.0;0;0;2;5;0;0;;;;;;1;2;0;0;2;6;400;;;;;;3.0;0.5;0.0;1.5;0.5;;;;;;;;;;;;;;;;;;;; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"IMGP1016.JPG";"avr15-PBilB1sup";0.0;;0.0;;0.0;;0.0;5.0;0.0;"Pas de s�diment";95.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP1017.JPG";"avr15-PBiB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";25.0;0;0;4;3;0;0;;;;;;0;8;50;38;67;45;8320;;;;;;0.0;5.0;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune";"IMGP1019.JPG";"avr15-PBi2sup";80.0;3;5.0;2;24.0;2;0.0;90.0;5.0;"Sable fin";10.0;1;0;1;1;0;0;;;;;;0;14;24;13;6;11;2720;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;1;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"IMGP1020.JPG";"avr15-PBiB2inf";0.0;;0.0;;0.0;;0.0;3.0;0.0;"Pas de s�diment";10.0;0;1;0;0;0;0;;;;;;1;35;25;35;10;15;4800;;;;;;1.5;1.5;2.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;1;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"IMGP1009.JPG";"avr15-PlouB3sup";5.0;2;85.0;2;15.0;2;0.0;0.0;90.0;"Sable fin";10.0;0;0;0;0;0;0;;;;;;0;;;;;;20;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"IMGP1010.JPG";"avr15-PlouB3inf";0.0;;0.0;;0.0;;0.0;1.0;1.0;"Sable fin";54.0;0;0;0;0;0;0;;;;;;5;8;12;9;3;0;1280;;;;;;5.0;1.0;0.5;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Verte";"IMGP1012.JPG";"avr15-PlouB4sup";0.0;;20.0;2;30.0;2;0.0;0.0;70.0;"Sable fin";15.0;0;0;2;0;0;0;;;;;;4;0;5;0;3;0;320;;;;;;0.0;0.0;0.0;0.0;0.5;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;4;;0;1;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Rouge";"IMGP1013.JPG";"avr15-PlouB4inf";0.0;;50.0;2;0.0;;0.0;0.0;40.0;"Sable grossier";20.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;2.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;4;;0;1;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Brune";"IMGP1000.JPG";"avr15-PlouB5sup";32.0;3;4.0;2;1.0;2;0.0;5.0;0.0;"Pas de s�diment";75.0;0;0;0;0;0;0;;;;;;0;0;0;0;15;10;600;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"IMGP1001.JPG";"avr15-PlouB5inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";30.0;0;2;11;2;0;0;;;;;;1;40;19;50;65;80;10160;;;;;;0.0;0.25;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Brune";"IMGP1003.JPG";"avr15-PlouB6sup";30.0;2;3.0;2;0.5;2;0.0;20.0;0.0;"Pas de s�diment";75.0;0;0;5;0;0;0;;;;;;0;0;5;4;0;0;360;;;;;;1.0;0.0;0.0;0.0;2.0;;55.0;"Sable grossier";;0;0;0;0;;;0;;0;1;0;;0;0;0; +379269;"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"IMGP1004.JPG";"avr15-PlouB6inf";0.0;;2.0;2;0.5;2;0.0;16.5;0.0;"Pas de s�diment";0.25;0;2;14;0;0;0;;;;;;6;1;17;33;14;12;3080;;;;;;0.0;0.5;0.25;0.0;0.25;;55.0;"Sable grossier";;0;0;0;0;;;0;;0;1;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche-Brune";"IMGP1293.JPG";"oct15-PlouB2sup";40.0;3;5.0;2;0.25;2;0.0;19.0;0.0;"Pas de s�diment";33.0;1;0;4;1;0;0;;;;;;0;12;0;0;0;4;640;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;1;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"IMGP1295.JPG";"oct15-PlouB2inf";0.0;;0.25;2;0.25;2;0.0;2.5;0.0;"Pas de s�diment";9.5;0;7;1;0;0;0;;;;;;2;33;17;66;102;40;10320;;;;;;5.0;6.5;0.0;0.0;3.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;1;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune";"IMGP1289.JPG";"oct15-PlouQ2";90.0;3;6.0;2;0.5;2;0.0;1.0;7.0;"D�bris coquilliers";65.0;0;4;7;0;0;0;;;;;;1;16;7;28;13;5;2760;;;;;;0.0;0.25;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune";"IMGP1290.JPG";"oct15-PlouB1sup";90.0;3;12.0;2;0.0;;0.0;40.0;21.0;"Sable fin";10.0;1;0;5;2;0;0;;;;;;1;16;35;17;0;0;2720;;;;;;0.0;0.0;0.0;0.0;0.0;;2.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP1292.JPG";"oct15-PlouB1inf";0.0;;0.0;;0.0;;0.0;5.0;0.0;"Pas de s�diment";8.0;0;3;2;0;0;0;;;;;;2;56;23;64;39;84;10640;;;;;;0.5;2.5;0.35;0.0;7.0;;2.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune";"IMGP1283.JPG";"oct15-PlouB3sup";90.0;3;12.0;2;0.5;2;0.0;24.0;0.0;"Pas de s�diment";9.5;0;0;10;4;0;0;;;;;;0;5;7;3;0;0;600;;;;;;0.0;0.0;0.0;0.0;5.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"IMGP1284.JPG";"oct15-PlouB3inf";1.0;2;1.5;2;0.25;2;0.0;6.0;0.0;"Pas de s�diment";19.0;0;1;1;0;0;0;;;;;;7;23;27;48;2;13;4520;;;;;;0.5;0.5;0.0;0.0;12.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"IMGP1286.JPG";"oct15-PlouB4sup";0.0;;1.0;2;70.0;2;0.0;0.0;20.0;"Sable grossier";27.0;0;0;1;1;0;0;;;;;;1;5;3;2;0;0;400;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Rouge";"IMGP1287.JPG";"oct15-PlouB4inf";0.5;1;24.0;2;0.0;;0.0;20.0;0.0;"D�bris coquilliers";25.0;0;4;7;1;0;0;;;;;;2;2;4;0;0;3;360;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Brune";"IMGP1297.JPG";"oct15-PlouB5sup";44.0;3;2.0;2;0.25;2;0.0;12.0;0.0;"Pas de s�diment";40.0;0;0;3;3;0;0;;;;;;0;32;0;12;6;0;2000;;;;;;1.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"IMGP1299.JPG";"oct15-PlouB5inf";0.0;;0.5;2;0.25;2;0.0;5.5;0.0;"Pas de s�diment";18.0;0;0;5;0;0;0;;;;;;0;138;38;22;34;26;10320;;;;;;5.0;0.0;0.0;0.0;0.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Brune";"IMGP1316.JPG";"oct15-PlouB6sup";25.0;2;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";98.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;0.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"IMGP1318.JPG";"oct15-PlouB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";95.5;0;1;5;8;0;0;;;;;;0;1;18;16;5;5;1800;;;;;;0.0;0.0;0.0;0.0;0.25;;0.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Brune";"IMGP1275.JPG";"oct15-PlouB7sup";55.0;3;0.5;2;0.0;;0.0;5.0;5.0;"Sable grossier";86.0;1;0;9;1;0;0;;;;;;1;2;0;5;0;0;280;;;;;;0.0;0.0;0.0;0.0;2.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"IMGP1278.JPG";"oct15-PlouB7inf";0.0;;0.0;;0.0;;0.0;17.0;0.0;"Pas de s�diment";35.0;0;1;8;0;0;0;;;;;;3;14;5;21;26;0;2640;;;;;;0.5;0.0;0.0;0.0;1.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche";"IMGP1279.JPG";"oct15-PlouB8sup";5.0;3;0.25;2;3.0;2;0.0;5.0;0.0;"Pas de s�diment";90.0;0;0;1;0;0;0;;;;;;4;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP1280.JPG";"oct15-PlouB8inf";0.0;;0.0;;0.0;;0.0;1.0;5.0;"D�bris coquilliers";45.0;0;0;0;0;0;0;;;;;;0;20;2;0;23;0;1800;;;;;;0.0;0.0;0.0;0.0;1.5;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Brune";"IMGP1270.JPG";"oct15-PlouB9sup";35.0;3;17.0;2;0.5;2;0.0;25.0;0.0;"Pas de s�diment";50.0;0;0;7;3;0;0;;;;;;0;51;0;31;3;0;3400;;;;;;1.0;0.0;0.0;0.0;1.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;3;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"IMGP1271.JPG";"oct15-PlouB9inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";15.0;0;8;1;0;0;0;;;;;;2;16;19;7;34;29;4200;;;;;;1.0;4.0;0.0;0.0;4.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;3;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Brune";"IMGP1272.JPG";"oct15-PlouB10sup";15.0;2;5.0;2;0.0;;0.0;8.0;0.0;"Pas de s�diment";76.0;0;0;1;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;3.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"IMGP1273.JPG";"oct15-PlouB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";29.0;0;2;0;0;0;0;;;;;;3;33;29;38;27;44;6840;;;;;;5.5;1.5;0.0;0.0;0.25;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";"IMGP1296.JPG";"oct15-PlouQ1";2.0;2;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";92.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche-Brune";"IMGP1320.JPG";"oct15-PlouQ3";32.0;2;2.0;2;0.0;;0.0;4.0;0.0;"Pas de s�diment";80.0;1;0;2;3;0;0;;;;;;0;13;0;0;13;0;1040;;;;;;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune";"IMGP1282.JPG";"oct15-PlouQ4";90.0;3;20.0;2;0.5;2;0.0;13.0;20.0;"Sable grossier";3.5;1;0;20;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +379336;"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"IMGP1274.JPG";"oct15-PlouQ5";75.0;3;14.0;2;0.0;;0.0;50.0;10.0;"Sable fin";26.0;0;0;8;0;0;0;;;;;;0;22;0;0;15;14;2040;;;;;;3.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Brune";"IMGP1702.JPG";"avr16-PlouB1sup";35.0;2;5.5;2;4.0;2;0.0;81.0;0.0;"Pas de s�diment";8.5;0;0;0;0;0;0;;;;;;0;17;11;8;9;3;1920;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"IMGP1703.JPG";"avr16-PlouB1inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";20.0;0;5;7;0;0;0;;;;;;3;12;41;26;38;20;5480;;;;;;1.5;2.0;0.0;0.0;10.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"IMGP1695.JPG";"avr16-PlouB3sup";4.0;2;40.0;2;4.5;2;0.0;2.0;35.0;"D�bris coquilliers";25.0;0;0;15;0;0;0;;;;;;3;5;8;13;12;10;1920;;;;;;0.0;6.0;0.0;0.0;0.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;0;1;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"IMGP1696.JPG";"avr16-PlouB3inf";0.0;;0.0;;0.0;;0.0;3.5;1.0;"Sable grossier";93.0;0;6;0;0;0;0;;;;;;19;24;7;19;10;13;2920;;;;;;0.0;0.0;0.0;0.0;0.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;0;1;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Blanche-Brune";"IMGP1685.JPG";"avr16-PlouQ4";25.0;2;12.0;2;5.0;2;0.0;4.5;1.0;"D�bris coquilliers";80.0;0;0;1;4;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;3.5;;;;;;;;;;;;;;;;;;;; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune";"IMGP1694.JPG";"avr16-PlouQ3";85.0;2;9.0;2;2.0;2;0.0;26.0;8.0;"Sable fin";34.0;0;0;9;15;0;0;;;;;;0;6;5;18;0;0;1160;;;;;;4.0;0.0;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"IMGP1701.JPG";"avr16-PlouQ2";30.0;3;24.0;2;8.0;2;0.0;1.5;90.0;"D�bris coquilliers";3.0;0;0;0;0;0;0;;;;;;0;8;0;0;0;0;320;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"IMGP1678.JPG";"avr16-PlouQ5";55.0;3;9.0;2;0.25;2;0.0;20.0;5.0;"Sable fin";60.0;0;0;7;0;0;0;;;;;;0;11;0;0;0;0;440;;;;;;0.0;0.0;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"IMGP1705.JPG";"avr16-PlouB2sup";0.0;2;1.0;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";96.0;0;0;1;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"IMGP1706.JPG";"avr16-PlouB2inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";30.0;0;7;2;5;0;0;;;;;;11;32;51;22;27;22;6160;;;;;;0.5;2.5;0.0;0.0;0.25;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";"IMGP1708.JPG";"avr16-PlouQ1";0.5;2;9.0;2;1.0;2;0.0;2.5;1.0;"D�bris coquilliers";88.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Brune";"IMGP1675.JPG";"avr16-PlouB10sup";25.0;3;6.0;2;5.5;2;0.0;25.0;0.0;"Pas de s�diment";30.0;0;0;3;2;0;0;;;;;;0;0;0;0;0;13;520;;;;;;1.0;0.0;0.0;0.0;0.25;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"IMGP1676.JPG";"avr16-PlouB10inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";10.5;0;0;0;0;0;0;;;;;;1;26;23;41;18;28;5440;;;;;;3.0;1.0;0.5;0.25;5.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Brune";"IMGP1672.JPG";"avr16-PlouB9sup";24.0;2;10.0;2;2.0;2;0.0;8.5;0.0;"Pas de s�diment";70.0;0;0;2;5;0;0;;;;;;0;0;0;0;7;2;360;;;;;;0.0;0.0;0.0;0.0;0.5;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"IMGP1673.JPG";"avr16-PlouB9inf";0.0;;2.0;2;1.0;2;0.0;8.5;0.0;"Pas de s�diment";11.0;0;0;2;1;0;0;;;;;;0;9;5;34;39;9;3840;;;;;;11.0;3.0;0.25;0.0;0.5;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"IMGP1682.JPG";"avr16-PlouB8sup";30.0;2;0.5;2;75.0;2;0.0;4.0;30.0;"D�bris coquilliers";25.0;0;0;23;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP1683.JPG";"avr16-PlouB8inf";0.0;;0.0;;1.0;2;0.0;3.0;5.0;"D�bris coquilliers";90.0;0;0;3;0;0;0;;;;;;5;0;16;10;5;4;1400;;;;;;0.0;1.5;0.0;0.0;3.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"IMGP1679.JPG";"avr16-PlouB7sup";35.0;2;5.0;2;66.0;2;0.0;7.0;71.0;"D�bris coquilliers";20.0;0;0;10;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.25;;90.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"IMGP1680.JPG";"avr16-PlouB7inf";0.0;;0.0;;5.0;2;0.0;3.5;15.0;"D�bris coquilliers";80.0;0;2;2;1;0;0;;;;;;7;16;5;19;10;12;2480;;;;;;0.0;0.0;0.0;0.0;0.5;;90.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Brune";"IMGP1689.JPG";"avr16-PlouB6sup";30.0;2;6.0;2;0.0;;0.0;22.0;10.0;"Sable fin";55.0;0;0;5;2;0;0;;;;;;0;7;4;0;0;6;680;;;;;;1.0;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"IMGP1690.JPG";"avr16-PlouB6inf";1.0;2;4.0;2;0.25;2;0.0;15.0;8.0;"D�bris coquilliers";40.0;0;0;1;0;0;0;;;;;;0;26;19;23;21;18;4280;;;;;;5.5;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune";"IMGP1686.JPG";"avr16-PlouB5sup";80.0;2;3.0;2;0.0;;0.0;7.0;0.0;"Pas de s�diment";75.0;0;1;0;6;0;0;;;;;;0;5;0;0;0;0;200;;;;;;0.5;0.0;0.0;0.0;0.0;;99.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"IMGP1687.JPG";"avr16-PlouB5inf";0.0;;0.0;;0.0;;0.0;1.0;3.0;"Sable grossier";95.0;0;0;1;0;0;0;;;;;;0;1;0;0;0;0;40;;;;;;0.0;0.0;0.0;0.0;0.0;;99.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Rouge";"IMGP1698.JPG";"avr16-PlouB4sup";8.5;2;20.0;2;10.0;2;0.0;7.0;5.0;"Sable fin";85.0;0;0;4;0;0;0;;;;;;0;1;8;27;0;0;1440;;;;;;0.5;0.0;0.0;0.0;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +379403;"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"IMGP1699.JPG";"avr16-PlouB4inf";0.0;;6.0;2;3.0;2;0.0;3.5;1.0;"Sable grossier";60.0;0;0;4;0;0;0;;;;;;9;17;29;31;12;5;3760;;;;;;2.0;4.0;0.0;0.0;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Brune";"IMGP2056.JPG";"oct16-PlouB6sup";35.0;3;3.0;;0.0;;0.0;15.0;5.0;"Sable fin";50.0;0;0;0;3;0;0;;;;;;0;0;3;5;6;5;760;;;;;;6.0;0.0;0.0;0.0;0.0;;60.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"IMGP2057.JPG";"oct16-PlouB6inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";65.0;0;0;0;0;0;0;;;;;;0;7;2;19;22;2;2080;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"IMGP2039.JPG";"oct16-PlouB7sup";0.0;;2.0;2;1.0;2;0.0;0.0;2.0;"Sable grossier";45.0;0;1;0;5;0;0;;;;;;13;3;4;6;0;0;520;;;;;;0.0;0.0;0.0;0.0;20.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"IMGP2040.JPG";"oct16-PlouB7inf";0.0;;1.0;2;0.0;;0.0;9.0;0.0;"Pas de s�diment";50.0;0;1;1;0;0;1;;;;;;12;4;14;4;0;5;1080;;;;;;1.0;2.0;0.0;0.5;1.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"IMGP2050.JPG";"oct16-PlouB1sup";0.5;2;0.5;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";95.0;0;0;0;4;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP2051.JPG";"oct16-PlouB1inf";0.0;;0.0;;0.0;;0.0;9.0;0.0;"Pas de s�diment";15.0;0;1;0;2;0;0;;;;;;0;;;;;;;;;;;;0.0;1.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche-Brune";"IMGP2052.JPG";"oct16-PlouB2sup";21.0;2;5.0;2;0.0;;0.0;8.0;2.0;"Sable fin";83.0;0;0;1;1;0;0;;;;;;0;0;0;0;6;3;360;;;;;;0.0;0.0;0.0;0.0;0.0;;75.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"IMGP2053.JPG";"oct16-PlouB2inf";0.0;;0.0;;0.0;;0.0;5.0;15.0;"Sable fin";78.0;0;0;0;1;0;0;;;;;;0;3;12;0;14;0;1160;;;;;;0.0;0.0;0.0;0.0;0.0;;75.0;"Vase";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune";"IMGP2044.JPG";"oct16-PlouB3sup";80.0;3;7.0;2;0.0;;0.0;25.0;15.0;"Sable fin";25.0;2;0;1;0;0;0;;;;;;2;13;39;5;3;2;2480;;;;;;2.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"IMGP2045.JPG";"oct16-PlouB3inf";0.0;;13.0;2;0.5;2;0.0;5.0;0.0;"Pas de s�diment";15.0;0;0;0;0;0;0;;;;;;3;3;10;7;5;0;1000;;;;;;5.5;0.5;0.0;0.0;1.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"IMGP2046.JPG";"oct16-PlouB4sup";0.0;;7.0;2;96.0;2;0.0;0.0;90.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;2.5;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Rouge";"IMGP2047.JPG";"oct16-PlouB4inf";6.0;2;37.0;2;0.0;;0.0;19.0;0.0;"Pas de s�diment";9.0;0;4;0;0;0;0;;;;;;2;0;0;14;2;2;720;;;;;;0.0;1.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche";"IMGP2058.JPG";"oct16-PlouB5sup";5.5;2;9.5;2;0.25;2;0.0;7.0;2.0;"Sable fin";81.0;0;0;0;2;0;0;;;;;;0;8;3;0;0;0;440;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"IMGP2059.JPG";"oct16-PlouB5inf";0.0;;0.0;;0.0;;0.0;2.5;0.0;"Pas de s�diment";93.0;0;0;0;11;0;0;;;;;;0;17;6;4;6;4;1480;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune-Rouge";"IMGP2041.JPG";"oct16-PlouB8sup";24.0;3;16.0;2;1.0;2;0.0;70.0;5.0;"D�bris coquilliers";20.0;0;0;1;0;0;0;;;;;;3;9;2;1;3;17;1280;;;;;;0.0;0.0;0.0;0.0;6.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;5;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"IMGP2042.JPG";"oct16-PlouB8inf";0.0;;0.0;;0.0;;0.0;7.0;0.0;"Pas de s�diment";85.0;0;0;0;0;0;0;;;;;;33;5;17;12;14;10;2320;;;;;;2.5;1.0;0.0;3.0;0.25;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;5;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune";"IMGP2035.JPG";"oct16-PlouB9sup";91.0;3;1.0;2;2.0;2;0.0;11.0;2.0;"Sable fin";75.0;1;0;1;2;0;0;;;;;;0;7;6;5;15;17;2000;;;;;;1.0;0.0;0.0;0.0;0.25;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;2;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"IMGP2036.JPG";"oct16-PlouB9inf";0.0;;2.0;2;0.5;2;0.0;15.0;0.0;"Pas de s�diment";21.5;0;0;0;0;1;0;;;;;;7;10;10;6;15;18;2360;;;;;;7.0;7.0;2.0;0.0;0.25;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;2;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"IMGP2037.JPG";"oct16-PlouB10sup";9.0;3;6.0;2;0.0;;0.0;7.0;0.0;"Pas de s�diment";91.0;0;0;0;1;0;0;;;;;;0;0;0;0;6;1;280;;;;;;3.0;0.0;0.0;0.0;2.0;;30.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"IMGP2038.JPG";"oct16-PlouB10inf";0.0;;1.0;2;0.0;;0.0;4.0;0.0;"Pas de s�diment";30.0;0;0;0;0;0;0;;;;;;8;15;9;9;8;16;2280;;;;;;5.0;1.0;0.0;0.0;0.5;;30.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune";"IMGP2054.JPG";"oct16-PlouQ1";75.0;2;6.0;2;0.5;2;0.0;12.0;2.0;"Sable fin";72.0;0;0;0;0;0;0;;;;;;0;10;0;10;0;0;800;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune";"IMGP2048.JPG";"oct16-PlouQ2";60.0;3;3.0;2;0.5;2;0.0;34.0;0.5;"Sable fin";35.0;0;0;2;0;0;0;;;;;;0;5;11;2;0;1;760;;;;;;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche-Brune";"IMGP2055.JPG";"oct16-PlouQ3";18.0;2;2.0;2;0.0;;0.0;7.0;3.0;"Sable fin";85.0;0;0;0;0;0;0;;;;;;0;0;0;0;3;5;320;;;;;;1.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune";"IMGP2043.JPG";"oct16-PlouQ4";86.0;3;15.0;2;5.5;2;0.0;27.0;5.5;"D�bris coquilliers";15.0;0;3;5;0;0;0;;;;;;1;0;0;0;4;3;280;;;;;;0.0;2.5;0.0;0.0;8.0;;;;;;;;;;;;;;;;;;;; +379470;"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"IMGP2034.JPG";"oct16-PlouQ5";38.0;3;2.0;2;2.0;2;0.0;20.0;0.5;"Sable grossier";76.0;0;0;1;0;0;0;;;;;;0;0;8;0;15;11;1360;;;;;;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"bloc2dessus.JPG";"avr14-iPlaB2sup";0.0;;50.0;2;12.0;2;20.0;0.0;;"Sable fin";0.25;0;0;1;0;0;0;;;;;;0;;;;;;0;;;;;;0.25;0.25;0.0;0.0;0.0;;100.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"bloc2dessous.JPG";"avr14-iPlaB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";100.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";;"bloc3dessus.JPG";"avr14-iPlaB3sup";18.0;3;85.0;2;10.0;2;0.0;0.0;;"Sable fin";0.0;0;0;2;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;6.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;"bloc3dessous.JPG";"avr14-iPlaB3inf";0.0;;0.0;;0.0;;0.0;12.0;0.0;"Pas de s�diment";4.0;0;5;2;0;0;0;;;;;;0;;;;;;6120;;;;;;4.0;4.0;0.0;0.0;0.0;;6.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"bloc8dessus.JPG";"avr14-iPlaB8sup";25.0;3;60.0;2;0.5;1;0.0;2.5;;"Sable fin";3.0;0;2;4;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"bloc8dessous.JPG";"avr14-iPlaB8inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";1.0;0;5;0;0;0;0;;;;;;1;;;;;;10280;;;;;;2.0;3.0;0.0;0.0;0.25;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"bloc9dessus.JPG";"avr14-iPlaB9sup";0.5;2;75.0;2;2.0;2;0.0;0.5;;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"bloc9dessous.JPG";"avr14-iPlaB9inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";15.0;0;2;1;0;0;0;;;;;;0;;;;;;5400;;;;;;0.0;0.75;0.0;0.0;5.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;"bloc10dessus.JPG";"avr14-iPlaB10sup";5.0;2;90.0;2;2.5;2;5.0;0.0;;"Sable fin";1.0;0;0;2;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;"bloc10dessous.JPG";"avr14-iPlaB10inf";0.0;;2.0;2;0.0;;0.0;15.0;0.0;"Pas de s�diment";14.0;0;9;5;0;0;0;;;;;;0;;;;;;3760;;;;;;5.0;2.0;0.0;0.0;7.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";;"Q1Ref.JPG";"avr14-iPlaQ1";25.0;3;50.0;2;6.5;2;25.0;0.0;;"Sable fin";0.0;0;1;1;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";;"Q2Ref.JPG";"avr14-iPlaQ2";40.0;2;75.0;2;0.0;;0.0;0.0;;"Sable grossier";0.0;0;1;8;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;"Q3Ref.JPG";"avr14-iPlaQ3";1.0;3;80.0;2;10.0;2;0.0;0.0;;"Sable grossier";0.0;0;0;1;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Roche en place";"4";"face sup�rieure";;"Q4Ref.JPG";"avr14-iPlaQ4";45.0;3;75.0;2;1.0;2;0.0;1.0;;"Sable grossier";0.0;0;0;2;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Roche en place";"5";"face sup�rieure";;"Q5Ref.JPG";"avr14-iPlaQ5";15.0;3;70.0;2;1.0;2;5.0;1.0;;"Sable grossier";0.0;0;0;2;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"bloc7dessus.JPG";"avr14-iPlaB7sup";75.0;3;40.0;2;0.0;;0.0;9.0;;"Sable fin";0.0;0;2;24;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"bloc7dessous.JPG";"avr14-iPlaB7inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";19.0;0;0;0;0;0;0;;;;;;1;;;;;;5960;;;;;;6.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"bloc6dessus.JPG";"avr14-iPlaB6sup";0.0;;40.0;2;15.0;2;25.0;0.0;;"Sable fin";0.0;0;0;1;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;;"avr14-iPlaB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";50.0;0;0;0;0;0;0;;;;;;0;;;;;;3200;;;;;;0.0;0.0;0.0;0.0;5.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;"bloc5dessus.JPG";"avr14-iPlaB5sup";0.0;;20.0;2;95.0;2;0.0;10.0;;"Sable fin";1.0;0;1;3;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;"bloc5dessous.JPG";"avr14-iPlaB5inf";0.0;;4.0;2;3.0;2;3.0;50.0;0.0;"Pas de s�diment";30.0;0;4;3;0;0;0;;;;;;1;;;;;;1920;;;;;;0.0;0.125;0.0;0.0;0.5;;10.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";;"bloc4dessus.JPG";"avr14-iPlaB4sup";0.0;;5.0;2;96.0;2;0.0;0.0;;"Sable fin";0.0;0;0;1;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;"bloc4dessous.JPG";"avr14-iPlaB4inf";0.5;2;5.0;2;0.25;2;0.0;60.0;0.0;"Pas de s�diment";20.0;0;4;0;0;0;0;;;;;;0;;;;;;1880;;;;;;0.0;0.0;0.5;0.0;0.0;;10.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"bloc1dessus.JPG";"avr14-iPlaB1sup";0.0;;22.0;2;80.0;2;0.0;4.0;;"Sable fin";1.0;0;0;13;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379537;"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;"bloc1dessous.JPG";"avr14-iPlaB1inf";0.0;;25.0;2;1.0;2;0.0;30.0;0.0;"Pas de s�diment";20.0;0;11;9;0;0;0;;;;;;0;;;;;;560;;;;;;0.0;0.25;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche-Rouge";"IMGP0925.JPG";"avr15-iPlaB3sup";0.0;;30.0;2;0.5;1;0.0;10.0;1.0;"Sable grossier";50.0;0;3;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"IMGP0929.JPG";"avr15-iPlaB3inf";0.0;;5.0;2;5.0;2;0.0;25.0;0.0;"Pas de s�diment";3.0;0;4;7;0;0;0;;;;;;0;24;18;20;3;12;3080;;;;;;5.5;2.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"IMGP0950.JPG";"avr15-iPlaB7sup";5.0;2;70.0;2;30.0;2;0.0;2.0;50.0;"Sable grossier";1.0;1;2;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"IMGP0951.JPG";"avr15-iPlaB7inf";0.0;;1.0;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;;;;;;3;20;20;14;12;11;3080;;;;;;14.0;4.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"IMGP0963.JPG";"avr15-iPlaB10sup";11.0;3;82.0;2;13.0;2;0.0;5.0;95.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"IMGP0964.JPG";"avr15-iPlaB10inf";0.0;;9.0;2;0.25;2;0.0;6.0;0.0;"Pas de s�diment";10.0;0;3;0;0;0;0;;;;;;0;30;29;30;19;23;5240;;;;;;10.0;3.0;0.0;0.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"IMGP0947.JPG";"avr15-iPlaQ1";2.0;2;70.0;2;13.0;2;0.0;0.0;25.0;"Sable grossier";1.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Brune-Rouge";"IMGP0977.JPG";"avr15-iPlaQ3";35.0;3;50.0;2;12.0;2;10.0;2.0;30.0;"Sable grossier";1.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"IMGP0939.JPG";"avr15-iPlaB1sup";7.0;2;65.0;2;15.0;2;1.0;0.0;90.0;"Sable grossier";0.5;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP0940.JPG";"avr15-iPlaB1inf";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";40.0;0;2;1;0;0;0;;;;;;3;25;6;0;42;35;4320;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge-Verte";"IMGP0942.JPG";"avr15-iPlaB2sup";0.5;1;80.0;2;33.0;2;0.0;0.5;35.0;"Sable grossier";5.0;0;0;0;0;0;0;;;;;;0;3;0;0;0;0;120;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"IMGP0945.JPG";"avr15-iPlaB2inf";0.0;;80.0;2;1.0;2;0.0;24.0;0.0;"Pas de s�diment";6.0;0;1;1;0;0;0;;;;;;2;12;40;9;17;20;3520;;;;;;17.0;1.0;0.0;0.0;0.0;;5.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Verte";"IMGP0931.JPG";"avr15-iPlaB4sup";0.0;;25.0;3;50.0;2;0.0;0.0;15.0;"Sable grossier";35.0;0;2;5;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Rouge";"IMGP0934.JPG";"avr15-iPlaB4inf";0.0;;15.0;2;5.0;2;0.0;47.0;0.0;"Pas de s�diment";13.0;0;9;5;0;0;0;;;;;;2;2;3;13;14;21;2120;;;;;;0.5;0.5;0.0;0.0;0.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Rouge";"IMGP0968.JPG";"avr15-iPlaB5sup";40.0;3;75.0;2;7.0;2;0.0;0.0;25.0;"Sable grossier";11.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;2.0;0.0;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"IMGP0969.JPG";"avr15-iPlaB5inf";0.0;;7.0;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";1.5;0;4;0;0;0;0;;;;;;0;40;19;12;19;20;4400;;;;;;5.0;3.0;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"IMGP0974.JPG";"avr15-iPlaB6sup";30.0;3;60.0;2;30.0;2;1.0;0.0;95.0;"Sable grossier";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"IMGP0975.JPG";"avr15-iPlaB6inf";0.0;;5.0;2;0.5;2;0.0;10.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;0;51;14;25;39;20;5960;;;;;;6.6;3.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune-Rouge";"IMGP0953.JPG";"avr15-iPlaB8sup";40.0;3;70.0;2;15.0;2;0.0;0.0;100.0;"Sable grossier";0.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP0954.JPG";"avr15-iPlaB8inf";0.0;;1.0;2;0.0;;0.0;6.0;0.0;"Pas de s�diment";20.0;0;11;1;0;0;0;;;;;;0;20;40;16;10;10;3840;;;;;;2.0;0.5;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge-Verte";"IMGP0959.JPG";"avr15-iPlaB9sup";7.0;3;90.0;2;35.0;2;0.0;0.0;80.0;"Sable grossier";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"IMGP0960.JPG";"avr15-iPlaB9inf";0.0;;7.0;2;3.0;2;0.0;11.0;0.0;"Pas de s�diment";1.5;0;3;0;0;0;0;;;;;;0;0;34;20;35;0;3560;;;;;;30.0;2.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"IMGP0938.JPG";"avr15-iPlaQ2";45.0;3;75.0;2;3.0;2;0.0;1.0;90.0;"Sable grossier";0.0;0;0;10;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"IMGP0956.JPG";"avr15-iPlaQ4";15.0;3;55.0;2;7.0;2;0.0;0.5;90.0;"Sable grossier";2.0;0;0;4;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.25;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379604;"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Brune-Rouge";"IMGP0966.JPG";"avr15-iPlaQ5";25.0;2;91.0;2;36.0;2;0.0;2.0;93.0;"Sable grossier";1.0;0;0;5;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"IMGP1352.JPG";"oct15-iPlaB10sup";1.5;2;95.0;2;15.0;2;1.0;0.0;100.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"IMGP1353.JPG";"oct15-iPlaB10inf";0.0;;10.0;2;1.5;2;1.0;12.0;0.0;"Pas de s�diment";70.0;0;1;3;0;0;0;;;;;;0;1;50;40;1;20;4480;;;;;;0.5;1.5;0.0;0.0;1.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Rouge";"IMGP1371.JPG";"oct15-iPlaQ1";2.0;2;94.0;2;2.0;2;0.0;0.5;98.0;"D�bris coquilliers";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Brune-Rouge";"IMGP1346.JPG";"oct15-iPlaQ3";19.0;2;75.0;2;1.0;2;15.0;2.0;20.0;"Sable fin";0.0;0;0;11;0;0;0;;;;;;0;3;0;0;0;0;120;;;;;;0.0;0.25;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune-Rouge";"IMGP1365.JPG";"oct15-iPlaB1sup";30.0;2;40.0;2;21.0;2;0.5;0.5;30.0;"D�bris coquilliers";15.0;0;0;4;0;0;0;;;;;;0;26;0;10;7;7;2000;;;;;;0.0;0.0;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP1367.JPG";"oct15-iPlaB1inf";0.0;;8.0;2;0.5;2;0.5;9.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;0;206;130;212;128;156;33280;;;;;;1.0;0.5;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"IMGP1355.JPG";"oct15-iPlaQ5";10.0;2;99.0;2;0.5;2;0.5;0.75;99.0;"Sable fin";0.0;0;1;1;0;0;0;;;;;;0;1;0;0;0;0;40;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Brune-Rouge";"IMGP1335.JPG";"oct15-iPlaQ2";60.0;3;90.0;2;0.0;;17.0;22.0;5.0;"Sable grossier";5.0;0;0;0;0;0;0;;;;;;0;30;10;13;2;30;3840;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"IMGP1347.JPG";"oct15-iPlaB9sup";6.0;2;95.0;2;0.5;2;0.0;1.5;96.0;"D�bris coquilliers";0.5;0;0;2;0;0;0;;;;;;0;10;2;0;1;0;520;;;;;;0.0;0.0;0.0;0.0;0.0;;22.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;3;;0;0;0;;0;1;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche-Rouge";"IMGP1350.JPG";"oct15-iPlaB9inf";0.0;;10.0;2;0.5;2;0.0;4.0;0.0;"Pas de s�diment";20.0;0;0;2;0;0;0;;;;;;0;26;19;60;45;20;6800;;;;;;2.0;1.5;0.0;0.5;6.5;;22.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;3;;0;0;0;;0;1;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"IMGP1359.JPG";"oct15-iPlaB8sup";4.0;2;94.0;2;1.0;2;0.0;5.5;95.0;"D�bris coquilliers";1.5;0;0;0;0;0;0;;;;;;0;1;0;0;0;0;40;;;;;;0.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"IMGP1362.JPG";"oct15-iPlaB8inf";0.0;;3.0;2;0.0;;0.0;4.0;0.0;"Pas de s�diment";8.0;0;13;0;0;0;0;;;;;;0;120;186;128;130;169;29320;;;;;;2.0;5.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"IMGP1356.JPG";"oct15-iPlaB7sup";1.0;2;94.0;2;16.0;2;0.0;2.5;83.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;5;23;3;21;0;2080;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche-Rouge";"IMGP1357.JPG";"oct15-iPlaB7inf";0.0;;11.0;2;0.0;;0.0;27.0;0.0;"Pas de s�diment";12.5;0;11;2;0;0;0;;;;;;0;168;244;280;47;45;31360;;;;;;0.5;0.25;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"IMGP1338.JPG";"oct15-iPlaB5sup";2.0;2;89.0;2;10.0;2;0.0;0.0;85.0;"Sable fin";4.0;0;0;1;0;0;0;;;;;;0;0;0;5;0;2;280;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"IMGP1339.JPG";"oct15-iPlaB5inf";0.0;;6.5;2;0.0;;0.0;7.0;0.0;"Pas de s�diment";1.5;0;1;0;0;0;0;;;;;;0;55;56;22;50;65;9920;;;;;;7.0;1.5;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"IMGP1330.JPG";"oct15-iPlaB4sup";0.5;2;5.0;2;53.0;2;0.0;12.25;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;1;100;30;35;120;30;12600;;;;;;0.0;0.0;0.0;0.0;0.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Rouge";"IMGP1333.JPG";"oct15-iPlaB4inf";5.0;2;55.0;2;1.5;2;0.0;21.0;0.0;"Pas de s�diment";28.0;0;34;3;3;0;0;;;;;;1;25;30;20;39;30;5760;;;;;;1.0;0.0;0.0;0.0;0.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune-Rouge";"IMGP1327.JPG";"oct15-iPlaB3sup";45.0;3;85.0;2;5.0;2;0.0;9.0;25.0;"D�bris coquilliers";4.0;0;0;0;0;0;0;;;;;;0;0;4;1;25;0;1200;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"IMGP1328.JPG";"oct15-iPlaB3inf";0.0;;12.0;2;0.25;2;2.0;29.0;0.0;"Pas de s�diment";6.0;0;4;0;0;0;0;;;;;;0;60;50;40;30;5;7400;;;;;;0.5;2.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"IMGP1368.JPG";"oct15-iPlaB2sup";11.0;2;87.0;2;17.0;2;1.5;1.5;97.0;"D�bris coquilliers";0.0;0;1;0;0;0;0;;;;;;0;12;0;0;0;0;480;;;;;;0.0;0.0;0.0;0.0;0.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;1;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"IMGP1369.JPG";"oct15-iPlaB2inf";0.0;;2.0;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";5.0;0;1;0;0;0;0;;;;;;3;256;120;196;120;164;34240;;;;;;0.0;0.0;0.0;0.0;0.0;;0.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;1;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge";"IMGP1364.JPG";"oct15-iPlaQ4";7.0;2;95.0;2;5.0;2;0.0;7.0;92.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.25;0.0;;;;;;;;;;;;;;;;;;;; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"IMGP1341.JPG";"oct15-iPlaB6sup";0.0;;95.0;2;1.0;2;0.0;0.0;95.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379671;"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"IMGP1342.JPG";"oct15-iPlaB6inf";0.0;;5.0;2;2.0;2;0.0;3.0;0.0;"Pas de s�diment";10.0;0;5;2;2;0;0;;;;;;1;40;16;60;50;50;8640;;;;;;6.5;1.5;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Rouge-Verte";"IMGP1608.JPG";"mars16-iPlaQ1";2.5;2;67.0;2;14.0;2;2.0;0.0;99.0;"D�bris coquilliers";0.0;0;0;1;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"IMGP1615.JPG";"mars16-iPlaQ5";2.0;2;27.0;2;4.0;2;0.0;3.0;96.0;"D�bris coquilliers";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"IMGP1623.JPG";"mars16-iPlaQ4";25.0;2;35.0;2;3.0;2;0.0;2.0;97.0;"D�bris coquilliers";0.5;0;1;10;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Rouge";"IMGP1631.JPG";"mars16-iPlaQ3";3.5;2;44.0;2;7.0;2;1.0;9.0;88.0;"D�bris coquilliers";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"IMGP1592.JPG";"mars16-iPlaQ2";24.0;2;87.0;2;0.25;2;0.25;2.0;94.0;"D�bris coquilliers";1.0;0;0;28;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Brune";"IMGP1609.JPG";"mars16-iPlaB9sup";2.0;3;45.0;2;0.25;2;0.0;6.0;16.0;"D�bris coquilliers";26.0;0;0;4;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.25;0.0;0.0;0.0;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"IMGP1610.JPG";"mars16-iPlaB9inf";0.0;;6.0;2;0.25;2;0.0;5.0;0.0;"Pas de s�diment";40.0;0;5;1;0;0;0;;;;;;0;41;42;110;0;90;11320;;;;;;4.0;0.0;0.0;0.0;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"IMGP1619.JPG";"mars16-iPlaB8sup";0.5;2;40.0;2;50.0;2;0.0;5.0;14.0;"D�bris coquilliers";3.0;0;1;9;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMGP1620.JPG";"mars16-iPlaB8inf";0.0;;5.0;2;0.0;;0.0;7.5;0.0;"Pas de s�diment";7.5;0;2;1;0;0;0;;;;;;0;50;42;35;59;34;8800;;;;;;5.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"IMGP1627.JPG";"mars16-iPlaB6sup";2.5;2;92.0;2;5.5;2;0.25;1.0;97.0;"D�bris coquilliers";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;8.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;1;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"IMGP1628.JPG";"mars16-iPlaB6inf";0.0;;1.5;2;0.25;2;0.0;9.0;0.0;"Pas de s�diment";6.0;0;0;1;0;0;0;;;;;;0;30;27;42;34;35;6720;;;;;;9.0;0.5;0.0;0.0;3.0;;8.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;1;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"IMGP1624.JPG";"mars16-iPlaB5sup";2.0;2;75.0;2;5.0;2;2.0;2.0;98.0;"D�bris coquilliers";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"IMGP1625.JPG";"mars16-iPlaB5inf";0.0;;3.5;2;0.0;;0.0;4.5;0.0;"Pas de s�diment";13.5;0;13;3;0;0;0;;;;;;1;44;67;44;85;54;11760;;;;;;1.5;0.5;0.0;0.0;5.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"IMGP1586.JPG";"mars16-iPlaB3sup";3.0;2;31.0;2;0.0;;0.0;9.0;17.0;"D�bris coquilliers";25.0;0;0;6;0;0;0;;;;;;0;0;0;0;0;0;1;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;1;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"IMGP1587.JPG";"mars16-iPlaB3inf";0.0;;1.0;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";32.0;0;2;0;0;0;0;;;;;;5;7;102;16;50;48;8920;;;;;;1.25;3.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;1;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"IMGP1595.JPG";"mars16-iPlaB1sup";2.0;2;86.0;2;4.0;2;2.0;0.5;97.0;"D�bris coquilliers";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;1;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"IMGP1596.JPG";"mars16-iPlaB1inf";0.0;;2.0;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";6.0;0;2;3;0;0;0;;;;;;3;34;120;80;57;100;15640;;;;;;0.0;0.25;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;1;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"IMGP1599.JPG";"mars16-iPlaB2sup";1.0;2;6.0;2;0.5;2;0.0;15.0;0.0;"Pas de s�diment";70.0;0;0;0;1;0;0;;;;;;0;0;0;0;0;3;120;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;1;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"IMGP1600.JPG";"mars16-iPlaB2inf";0.0;;2.0;2;0.0;;0.0;5.5;0.0;"Pas de s�diment";6.5;0;3;6;0;0;0;;;;;;0;26;41;6;60;100;9320;;;;;;4.0;1.5;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;1;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"IMGP1589.JPG";"mars16-iPlaB4sup";10.0;2;55.0;2;7.0;2;0.0;2.0;94.0;"D�bris coquilliers";1.5;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;1;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"IMGP1590.JPG";"mars16-iPlaB4inf";0.0;;0.0;;0.0;;0.0;12.0;0.0;"Pas de s�diment";6.0;0;3;3;0;0;0;;;;;;0;30;40;14;35;30;5960;;;;;;8.0;2.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;1;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"IMGP1616.JPG";"mars16-iPlaB7sup";20.0;2;70.0;2;1.0;2;0.0;10.0;40.0;"Sable fin";0.0;0;3;9;0;0;0;;;;;;0;8;0;0;0;9;680;;;;;;0.0;0.0;0.0;0.0;0.0;;11.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;1;;1;1;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"IMGP1617.JPG";"mars16-iPlaB7inf";0.0;;3.0;2;0.25;2;2.5;1.0;0.0;"Pas de s�diment";3.5;0;0;0;0;0;0;;;;;;6;40;42;38;42;45;8280;;;;;;6.0;3.5;0.0;0.0;0.0;;11.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;1;;1;1;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"IMGP1612.JPG";"mars16-iPla10sup";8.0;3;83.0;2;1.5;2;0.5;7.0;40.0;"D�bris coquilliers";1.0;0;0;4;0;0;0;;;;;;0;0;0;0;0;0;1;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;0;0; +379738;"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"IMGP1613.JPG";"mars16-iPlaB10inf";0.0;;2.0;2;0.0;;0.0;25.0;0.0;"Pas de s�diment";11.0;0;10;3;0;0;0;;;;;;2;22;40;32;1;37;5280;;;;;;1.5;1.5;0.0;0.0;6.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune";"IMGP2122.JPG";"nov16-iPlaB5sup";70.0;2;45.0;2;20.0;2;0.0;11.0;25.0;"D�bris coquilliers";16.0;0;0;1;0;0;0;;;;;;0;4;1;0;2;1;320;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"IMGP2123.JPG";"nov16-iPlaB5inf";0.0;;9.0;2;0.0;;0.0;6.5;0.0;"Pas de s�diment";15.5;0;5;0;0;0;0;;;;;;0;65;48;13;3;5;5360;;;;;;1.0;4.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"IMGP2113.JPG";"nov16-iPlaB10sup";0.5;2;91.0;2;0.0;;1.5;2.5;95.5;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;8;0;3;0;0;440;;;;;;0.0;0.0;0.0;1.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"IMGP2114.JPG";"nov16-iPlaB10inf";0.0;;1.0;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";12.0;0;0;0;0;0;0;;;;;;1;53;45;100;30;45;10920;;;;;;4.5;3.0;0.25;0.0;2.5;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"IMGP2116.JPG";"nov16-iPlaB7sup";25.0;2;94.0;2;0.0;;0.0;3.5;96.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;0.0;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;3;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"IMGP2118.JPG";"nov16-iPlaB7inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";8.0;0;12;0;0;0;0;;;;;;0;50;120;60;45;60;13400;;;;;;2.5;6.5;0.0;0.0;0.0;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;3;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Verte";"IMGP2124.JPG";"nov16-iPlaB6sup";1.0;1;22.0;2;86.0;2;0.5;1.0;96.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;3;0;1;2;0;240;;;;;;0.0;0.0;0.0;0.0;0.0;;6.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche-Rouge";"IMGP2125.JPG";"nov16-iPlaB6inf";0.5;2;10.0;2;0.5;2;0.0;18.0;0.0;"Pas de s�diment";12.0;0;0;0;0;0;0;;;;;;0;30;27;37;40;61;7800;;;;;;0.0;0.25;0.0;0.0;0.0;;6.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"IMGP2116.JPG";"oct16-iPlaQ5";1.5;2;92.0;2;0.5;1;0.5;1.0;95.0;"D�bris coquilliers";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"IMGP2132.JPG";"nov16-iPlaB1sup";0.0;;3.0;2;2.5;2;0.0;5.0;0.0;"Pas de s�diment";76.0;0;0;0;0;0;0;;;;;;0;1;0;0;0;0;40;;;;;;0.0;0.0;0.0;0.0;0.0;;2.0;"Blocs";;0;1;0;0;;;1;;2;1;0;;0;0;1; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"IMGP2133.JPG";"nov16-iPlaB1inf";0.0;;0.0;;1.0;2;0.0;5.0;0.0;"Pas de s�diment";16.0;0;4;0;0;0;0;;;;;;1;48;50;30;40;26;7760;;;;;;27.0;0.5;0.0;0.0;0.5;;2.0;"Blocs";;0;1;0;0;;;1;;2;1;0;;0;0;1; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"IMGP2119.JPG";"nov16-iPlaB8sup";77.0;2;0.0;;1.5;2;0.0;7.0;35.0;"D�bris coquilliers";15.0;0;0;0;0;0;0;;;;;;0;0;1;0;0;0;40;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"IMGP2120.JPG";"nov16-iPlaB8inf";0.0;;1.0;2;0.25;2;0.0;19.0;0.0;"Pas de s�diment";5.0;0;1;0;0;0;0;;;;;;0;49;70;20;70;35;9760;;;;;;4.0;2.0;0.25;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"IMGP2111.JPG";"nov16-iPlaB9sup";1.5;2;60.0;2;3.5;2;0.0;0.5;50.0;"Sable grossier";12.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;2;80;;;;;;0.0;0.0;0.0;0.0;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"IMGP2112.JPG";"nov16-iPlaB9inf";0.0;;4.0;2;0.0;;0.0;9.0;0.0;"Pas de s�diment";43.0;0;3;0;0;0;0;;;;;;0;43;130;150;50;39;16480;;;;;;3.0;0.0;0.0;0.5;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Rouge";"IMGP2136.JPG";"nov16-iPlaQ1";1.0;2;60.0;2;12.0;2;8.0;0.5;95.0;"D�bris coquilliers";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"IMGP2131.JPG";"nov16-iPlaQ2";0.5;1;43.0;2;2.0;2;0.25;10.0;43.0;"D�bris coquilliers";15.0;0;0;0;0;0;0;;;;;;0;0;4;0;0;0;160;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge";"IMGP2126.JPG";"nov16-iPlaQ3";40.0;3;88.0;2;0.5;2;3.5;4.0;96.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;4;0;0;0;1;200;;;;;;0.0;0.0;0.0;1.0;0.0;;;;;;;;;;;;;;;;;;;; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"IMGP2134.JPG";"nov16-iPlaB2sup";0.5;2;94.0;2;0.25;2;0.0;2.0;92.0;"D�bris coquilliers";2.0;0;0;0;0;0;0;;;;;;0;3;0;4;0;1;320;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"IMGP2135.JPG";"nov16-iPlaB2inf";0.0;;3.0;2;0.0;;0.0;2.5;0.0;"Pas de s�diment";10.5;0;1;0;0;0;0;;;;;;0;51;45;61;15;5;7080;;;;;;0.0;0.25;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"IMGP2127.JPG";"nov16-iPlaB3sup";0.5;2;94.0;2;0.5;2;0.0;5.0;94.0;"D�bris coquilliers";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"IMGP2128.JPG";"nov16-iPlaB3inf";0.0;;0.0;;0.0;;0.0;15.0;0.0;"Pas de s�diment";3.0;0;4;0;0;0;0;;;;;;1;55;40;12;45;40;7680;;;;;;5.0;2.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune";"IMGP2121.JPG";"nov16-iPlaQ4";0.0;;98.0;2;1.0;2;0.0;2.0;95.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"IMGP2129.JPG";"nov16-iPlaB4sup";3.0;2;24.0;2;16.5;2;0.0;31.0;7.0;"D�bris coquilliers";5.0;0;0;0;0;0;0;;;;;;0;0;1;1;0;0;80;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;1;1;;0;1;1; +379805;"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"IMGP2130.JPG";"nov16-iPlaB4inf";0.0;;8.0;2;0.0;;0.0;22.0;0.0;"Pas de s�diment";14.0;0;0;0;0;0;0;;;;;;0;19;66;39;2;39;6600;;;;;;0.75;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;1;1;;0;1;1; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Rouge";"Q3-bloc6dessus.JPG";"sept14-PerhB5sup";10.0;2;80.0;2;10.0;2;0.0;0.0;0.0;"Pas de s�diment";12.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Brune-Rouge";"Q3-bloc6dessous.JPG";"sept14-PerhB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";95.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Verte";"Q3-bloc7dessus.JPG";"sept14-PerhB6sup";0.0;;4.0;2;100.0;2;0.0;0.0;0.0;"Pas de s�diment";20.0;0;0;5;0;0;0;;;;;;0;;;;;;320;;;;;;0.5;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;3;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Verte";"Q3-bloc7dessous.JPG";"sept14-PerhB6inf";0.0;;3.0;2;0.0;;0.0;9.0;0.0;"Pas de s�diment";15.0;0;0;0;0;0;0;;;;;;0;;;;;;2760;;;;;;3.0;3.5;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;3;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Brune";"Q4-Bloc1dessus.JPG";"sept14-PerhB7sup";40.0;3;31.0;2;2.0;2;16.0;1.5;4.5;"Sable fin";0.25;0;0;1;0;0;0;;;;;;0;;;;;;5;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;3;0;0;;;1;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Brune";"Q4-Bloc1dessous.JPG";"sept14-PerhB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;2;0;0;0;0;;;;;;0;;;;;;10440;;;;;;1.0;3.25;0.5;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;3;0;0;;;1;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"Q4-Bloc2dessus.JPG";"sept14-PerhB8sup";0.0;;60.0;2;40.0;;0.0;0.0;10.0;"Vase";5.0;1;0;7;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Rouge-Verte";"Q4-Bloc2dessous.JPG";"sept14-PerhB8inf";0.0;;0.0;;0.0;;0.0;4.0;0.0;"Pas de s�diment";0.0;1;0;2;0;0;0;;;;;;2;;;;;;3640;;;;;;1.5;0.25;0.0;0.25;0.5;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"Q2-BlocReference.JPG";"sept14-PerhQ2";10.0;2;75.0;2;2.0;2;0.5;2.0;40.0;"Sable fin";0.0;0;1;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune-Rouge";"Q4-BlocReference.JPG";"sept14-PerhQ4";115.0;3;22.0;2;3.75;2;1.5;0.75;2.5;"Sable fin";0.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"Q5-Bloc2dessus.JPG";"sept14-PerhB10sup";10.0;3;50.25;2;10.0;2;13.0;0.0;3.5;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Brune";"Q5-Bloc2dessous.JPG";"sept14-PerhB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;1;;;;;;8800;;;;;;14.0;6.0;0.5;0.5;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"Q2-Bloc2dessus.JPG";"sept14-PerhB4sup";10.0;2;3.0;2;95.0;2;0.0;0.0;50.0;"Sable fin";1.0;0;0;0;0;1;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Verte";"Q2-Bloc2dessous.JPG";"sept14-PerhB4inf";12.0;2;4.0;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";0.0;0;12;1;0;0;0;;;;;;1;;;;;;1680;;;;;;4.0;0.25;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune-Verte";"Q5-Bloc1dessus.JPG";"sept14-PerhB9sup";0.5;2;35.0;2;35.0;2;3.0;0.0;3.0;"Sable fin";0.0;0;1;1;0;0;0;;;;;;0;;;;;;5;;;;;;0.0;0.5;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Brune-Verte";"Q5-Bloc1dessous.JPG";"sept14-PerhB9inf";0.0;;4.5;2;0.0;;1.75;40.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;1;;;;;;9560;;;;;;5.0;2.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune";"Q2-Bloc1dessus.JPG";"sept14-PerhB3sup";25.0;2;70.0;2;5.0;2;0.0;1.0;60.0;"Sable fin";0.0;0;1;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.25;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Brune";"Q2-Bloc1dessous.JPG";"sept14-PerhB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";30.0;0;1;0;0;0;0;;;;;;0;;;;;;3320;;;;;;3.5;2.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune";"Q1-bloc4dessus.JPG";"sept14-PerhB2sup";0.0;;90.0;2;10.0;2;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;0;;;;;;320;;;;;;0.5;1.0;0.0;1.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Brune";"Q1-bloc4dessous.JPG";"sept14-PerhB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";30.0;0;0;0;0;0;0;;;;;;2;;;;;;1880;;;;;;1.0;3.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune-Verte";"Q1-bloc3dessus.JPG";"sept14-PerhB1sup";15.0;2;20.0;2;40.0;2;0.0;0.0;0.0;"Pas de s�diment";10.0;0;1;0;0;0;0;;;;;;2;;;;;;1560;;;;;;0.0;0.0;0.0;0.0;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379879;"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Brune-Verte";;"sept14-PerhB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;0;;;;;;98;;;;;;1.5;0.5;0.0;0.0;0.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"DSC_0092.JPG";"mars15-PerhB8sup";0.5;2;60.0;2;40.0;2;0.0;0.0;100.0;"Sable fin";0.0;1;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSC_0099.JPG";"mars15-PerhB8inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";0.0;0;2;0;0;0;0;;;;;;1;52;41;48;31;41;8520;;;;;;0.0;5.5;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"DSC_0086.JPG";"mars15-PerhB7sup";0.0;;2.0;2;95.0;2;0.0;0.0;100.0;"Sable fin";0.0;3;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Sable fin";;0;0;1;0;;;3;;0;2;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"DSC_0089.JPG";"mars15-PerhB7inf";0.0;;20.0;;0.0;;5.0;5.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;7;21;15;11;9;2520;;;;;;0.0;3.0;0.0;0.0;0.0;;30.0;"Sable fin";;0;0;1;0;;;3;;0;2;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Verte";"DSC_0014.JPG";"mars15-PerhB5sup";0.0;;10.0;2;85.0;2;0.0;0.0;100.0;"Sable fin";0.0;0;4;0;0;0;0;;;;;;0;2;0;0;0;0;80;;;;;;5.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSC_0018.JPG";"mars15-PerhB5inf";0.0;;15.0;2;0.0;;0.0;30.0;0.0;"Pas de s�diment";0.0;0;8;0;0;0;0;;;;;;0;0;10;21;55;32;4720;;;;;;2.0;5.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"DSCN2879.JPG";"mars15-PerhB4sup";10.0;1;20.0;2;50.0;2;0.0;5.0;20.0;"Sable fin";5.0;0;10;3;7;0;0;;;;;;0;0;30;0;0;0;1200;;;;;;1.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;1;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSCN2883.JPG";"mars15-PerhB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;2;2;0;0;0;;;;;;0;42;57;0;49;41;7560;;;;;;0.0;5.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;1;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"DSCN2873.JPG";"mars15-PerhB3sup";5.0;2;90.0;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";5.0;0;10;14;8;0;0;;;;;;0;5;0;0;0;4;360;;;;;;3.0;3.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCN2878.JPG";"mars15-PerhB3inf";0.0;;0.0;;0.0;;0.0;5.0;0.0;"Pas de s�diment";50.0;2;0;1;2;0;0;;;;;;0;35;15;5;52;0;4280;;;;;;1.0;3.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"DSC01494.JPG";"mars15-PerhB2sup";0.5;2;90.0;2;1.0;1;7.5;8.0;40.0;"Sable grossier";0.0;0;4;5;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;2.0;0.0;0.0;0.0;;30.0;"Sable grossier";;0;0;1;0;;;0;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSC01495.JPG";"mars15-PerhB2inf";0.0;;0.0;;0.0;;0.0;5.0;0.0;"Pas de s�diment";5.0;0;4;0;0;0;0;;;;;;0;40;10;70;15;16;6040;;;;;;0.0;0.0;12.5;0.0;0.0;;30.0;"Sable grossier";;0;0;1;0;;;0;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"DSC01489.JPG";"mars15-PerhB1sup";20.0;2;70.0;2;5.0;2;1.5;2.5;90.0;"Sable grossier";0.0;0;4;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.0;;20.0;"Sable grossier";;0;1;1;0;;;0;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"DSC01490.JPG";"mars15-PerhB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;1;;;;;;0;19;50;40;29;35;6920;;;;;;15.5;15.5;0.0;0.0;0.0;;20.0;"Sable grossier";;0;1;1;0;;;0;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche";"DSC_0020.JPG";"mars15-PerhB6sup";0.5;3;0.5;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";0.0;0;1;1;2;0;0;;;;;;0;22;42;41;12;46;6520;;;;;;0.0;2.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;0;;0;2;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Rouge-Verte";"DSC_0027.JPG";"mars15-PerhB6inf";1.0;3;20.0;2;10.0;2;0.0;60.0;0.0;"Pas de s�diment";0.0;0;14;6;4;0;0;;;;;;0;8;10;0;0;0;720;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;0;;0;2;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune-Rouge";"DSC_0029.JPG";"mars15-PerhQ3";10.0;2;70.0;2;0.0;;0.0;0.5;70.0;"Sable fin";5.0;0;0;3;0;0;0;;;;;;0;0;3;0;0;5;320;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"DSC_0160.JPG";"mai15-PerhQ5";3.5;2;80.0;2;3.0;2;0.0;0.0;90.0;"Sable fin";0.0;5;4;3;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"DSC_0100.JPG";"mars15-PerhQ4";0.0;;80.0;2;0.0;;0.5;1.0;100.0;"Sable fin";0.0;0;0;5;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"DSCN2886.JPG";"mars15-PerhQ2";5.0;2;60.0;2;10.0;2;1.0;1.0;20.0;"Sable fin";0.0;0;6;9;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"DSCN2890.JPG";"mars15-PerhQ1";5.0;2;90.0;2;0.5;2;0.0;2.0;80.0;"Sable grossier";5.0;0;3;3;0;0;0;;;;;;0;0;8;0;0;0;320;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"DSC_0154.JPG";"mai15-PerhB10sup";5.0;2;80.0;2;1.0;;0.0;1.0;50.0;"Sable fin";0.0;0;3;0;0;0;0;;;;;;0;0;0;0;0;0;500;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;1;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"DSC_0159.JPG";"mai15-PerhB10inf";0.0;;1.0;1;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;5;0;0;0;0;;;;;;2;42;26;27;21;33;4920;;;;;;0.0;0.5;2.5;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;1;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Verte";"DSC_0144.JPG";"mai15-PerhB9sup";0.0;;0.0;;100.0;2;20.0;0.0;100.0;"Sable fin";0.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;40.0;"Blocs";;0;1;1;0;;;2;;0;0;0;;0;0;0; +379934;"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSC_0149.JPG";"mai15-PerhB9inf";0.0;;1.5;2;0.0;;0.5;25.0;0.0;"Pas de s�diment";0.5;0;5;5;1;0;0;;;;;;0;30;35;25;5;16;3200;;;;;;0.0;2.0;0.0;0.0;0.0;;40.0;"Blocs";;0;1;1;0;;;2;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Verte";"DSC00178.JPG";"sept15-PerhB10sup";7.0;1;1.0;2;80.0;2;0.0;0.0;100.0;"Sable fin";0.0;3;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"DSC00184.JPG";"sept15-PerhB10inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;46;34;30;44;25;7160;;;;;;7.0;3.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"DSC00172.JPG";"sept15-PerhB9sup";0.0;;100.0;2;0.0;;0.0;0.0;100.0;"Sable fin";0.0;5;3;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;1;1;;;3;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"DSC00176.JPG";"sept15-PerhB9inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;40;21;29;32;30;6080;;;;;;0.0;2.5;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;1;1;;;3;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Verte";"DSC01552.JPG";"sept15-PerhB8sup";0.0;;3.5;2;96.5;2;0.0;0.5;97.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.0;;50.0;"Sable fin";;0;1;0;0;;;6;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche-Rouge";"DSC01553.JPG";"sept15-PerhB8inf";0.0;;2.0;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;0;1;0;0;0;;;;;;1;20;12;19;11;14;3040;;;;;;0.5;6.0;0.0;0.0;0.0;;50.0;"Sable fin";;0;1;0;0;;;6;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"DSC01550.JPG";"sept15-PerhB7sup";0.5;2;75.0;2;20.0;2;0.0;0.0;20.0;"Sable fin";0.0;0;3;2;0;0;0;;;;;;0;0;0;0;0;0;5;;;;;;6.0;0.5;1.0;0.0;0.0;;25.0;"Sable fin";;0;0;0;0;;;2;;0;2;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSC01551.JPG";"sept15-PerhB7inf";0.0;;1.0;2;0.5;2;0.0;1.0;0.0;"Pas de s�diment";40.0;0;0;0;0;0;0;;;;;;0;0;23;5;20;11;2360;;;;;;3.5;2.0;0.0;0.0;0.0;;25.0;"Sable fin";;0;0;0;0;;;2;;0;2;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Verte";"DSC00160.JPG";"sept15-PerhB6sup";0.0;;5.0;2;95.0;2;0.0;0.0;100.0;"Sable fin";0.0;0;3;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;40.0;"Blocs";;0;1;0;0;;;3;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSC00164.JPG";"sept15-PerhB6inf";0.0;;3.0;2;0.0;;0.0;7.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;3;54;44;32;41;32;8120;;;;;;0.5;3.5;0.0;0.0;0.0;;40.0;"Blocs";;0;1;0;0;;;3;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"DSC00152.JPG";"sept15-PerhB5sup";4.0;2;95.0;2;1.0;2;0.0;0.0;100.0;"Sable fin";0.0;0;2;5;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;3;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"DSC00158.JPG";"sept15-PerhB5inf";0.0;;2.5;;0.0;;0.0;5.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;2;35;50;45;48;28;8240;;;;;;0.0;2.5;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;3;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune";"DSC01544.JPG";"sept15-PerhB4sup";95.0;2;5.0;2;0.5;2;0.5;9.0;0.0;"Pas de s�diment";0.0;0;5;1;0;0;0;;;;;;1;30;7;13;26;16;3680;;;;;;0.5;0.5;0.0;0.0;0.0;;20.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSC01545.JPG";"sept15-PerhB4inf";0.0;;0.0;;0.0;;0.5;0.0;0.0;"Pas de s�diment";1.5;0;0;0;0;0;0;;;;;;0;35;32;45;23;12;5880;;;;;;0.5;0.5;0.0;0.0;0.0;;20.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Verte";"DSC01540.JPG";"sept15-PerhB3sup";0.5;2;3.0;2;27.5;2;7.0;5.0;0.0;"Pas de s�diment";11.0;0;1;2;0;0;0;;;;;;0;28;2;1;10;0;1640;;;;;;0.0;0.0;0.0;0.0;0.0;;40.0;"Blocs";;0;0;0;2;;;0;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSC01542.JPG";"sept15-PerhB3inf";2.5;2;2.0;2;0.5;1;0.0;7.0;0.0;"Pas de s�diment";1.0;0;0;2;2;0;0;;;;;;0;22;20;11;5;7;2600;;;;;;0.0;1.0;0.0;0.0;0.0;;40.0;"Blocs";;0;0;0;2;;;0;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"DSC00141.JPG";"sept15-PerhB2sup";1.0;2;95.0;2;0.0;;0.0;0.0;100.0;"Sable fin";1.5;2;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;1;2;;;0;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";;"sept15-PerhB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;1;2;1;0;0;0;;;;;;2;34;25;24;46;72;8040;;;;;;0.0;4.5;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;1;2;;;0;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"DSC00179.JPG";"sept15-PerhQ5";24.0;2;45.0;2;2.0;2;0.0;0.0;10.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"DSC01554.JPG";"sept15-PerhQ4";8.0;2;20.0;2;7.0;2;1.5;0.0;15.0;"Sable fin";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune";"DSC01546.JPG";"sept15-PerhQ2";90.0;2;9.0;2;10.0;1;1.0;0.0;0.0;"Pas de s�diment";0.0;2;13;1;0;0;0;;;;;;0;22;16;22;20;0;3200;;;;;;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune";"DSC00150.JPG";"sept15-PerhQ1";75.0;2;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";25.0;0;5;0;0;0;0;;;;;;0;0;9;0;6;3;720;;;;;;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Verte";"DSC00129.JPG";"sept15-PerhB1sup";0.0;;10.0;2;90.0;2;0.0;0.0;0.0;"Pas de s�diment";4.0;0;2;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;4;;;1;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSC00137.JPG";"sept15-PerhB1inf";0.5;2;0.0;;0.0;;0.0;8.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;3;27;28;38;21;9;4120;;;;;;0.0;4.5;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;4;;;1;;0;0;0;;0;0;0; +380001;"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune";"DSC00168.JPG";"sept15-PerhQ3";80.0;2;20.0;2;0.0;;0.0;0.0;100.0;"Sable fin";0.0;0;3;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Color�e";"DSC01919.JPG";"mars16-PerhB7sup";0.0;;10.0;2;25.0;2;0.0;3.0;75.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.0;;15.0;"Blocs";;3;0;0;0;;;6;;0;4;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSC01920.JPG";"mars16-PerhB7inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;3;30;18;28;52;24;6080;;;;;;10.0;0.5;0.0;0.0;0.0;;15.0;"Blocs";;3;0;0;0;;;6;;0;4;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Brune";"DSC00303.JPG";"mars16-PerhB1sup";100.0;2;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;1;26;23;3;10;12;2960;;;;;;0.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSC00309.JPG";"mars16-PerhB1inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;7;0;0;0;0;;;;;;0;14;25;37;18;39;5320;;;;;;0.5;0.5;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"DSC00324.JPG";"mars16-PerhB9sup";10.0;1;75.0;2;0.5;2;0.0;5.0;85.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;1;1;;;2;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSC00331.JPG";"mars16-PerhB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;5;0;0;0;0;;;;;;1;50;22;30;24;41;6680;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;1;1;;;2;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune";"DSC00318.JPG";"mars16-PerhQ1";100.0;2;0.0;;0.0;;0.0;20.0;0.0;"Pas de s�diment";0.0;0;1;10;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;3.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune";"DSC01901.JPG";"mars16-PerhQ2";104.0;3;6.0;2;0.0;;2.0;6.0;20.0;"Sable fin";0.0;0;0;22;3;0;0;;;;;;0;0;0;0;0;0;0;;;;;;3.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Blanche-Rouge";"DSC01908.JPG";"mars16-PerhQ3";0.0;;30.0;2;1.0;2;0.0;2.5;85.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.5;0.5;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"DSC01927.JPG";"mars16-PerhQ4";0.0;;55.0;2;0.0;;2.0;5.0;95.0;"Sable fin";0.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche-Rouge";"DSC00343.JPG";"mars16-PerhQ5";0.5;2;30.0;2;0.0;;4.5;30.0;20.0;"Sable fin";0.0;0;2;0;0;0;0;;;;;;2;0;4;0;0;0;160;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"DSC00310.JPG";"mars16-PerhB2sup";1.0;1;80.0;2;0.0;;1.0;20.0;60.0;"Sable fin";0.0;0;2;0;1;0;0;;;;;;0;4;0;4;2;1;440;;;;;;0.0;0.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSC00316.JPG";"mars16-PerhB2inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;5;0;0;0;0;;;;;;1;60;39;47;16;23;7400;;;;;;3.0;4.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Color�e";"DSC01896.JPG";"mars16-PerhB3sup";10.0;2;17.5;2;17.5;2;0.5;40.0;20.0;"Sable fin";0.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;90.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSC01898.JPG";"mars16-PerhB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;2;1;0;0;0;;;;;;3;22;22;3;10;9;2640;;;;;;1.0;1.0;0.0;0.0;0.0;;90.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Blanche-Rouge";"DSC01899.JPG";"mars16-PerhB4sup";0.5;1;30.0;2;5.0;1;0.0;16.0;1.0;"Sable fin";30.0;0;1;0;0;0;0;;;;;;0;10;1;0;0;0;440;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Blocs";;0;0;0;0;;;1;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSC01900.JPG";"mars16-PerhB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;1;0;0;0;;;;;;2;15;20;15;21;7;3120;;;;;;0.0;2.0;0.0;0.0;0.0;;60.0;"Blocs";;0;0;0;0;;;1;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"DSC01904.JPG";"mars16-PerhB5sup";0.0;;40.0;2;0.0;;0.5;2.0;75.0;"Sable fin";0.0;0;0;2;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;2.0;0.5;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;2;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSC01905.JPG";"mars16-PerhB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;4;0;0;0;0;;;;;;1;12;15;8;20;30;3400;;;;;;2.0;2.0;3.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;2;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"DSC01906.JPG";"mars16-PerhB6sup";0.0;;15.0;2;10.0;2;0.0;35.0;0.0;"Pas de s�diment";1.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;2.0;0.5;0.0;0.0;0.0;;10.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSC01907.JPG";"mars16PerhB6inf";0.0;;1.0;2;0.0;;0.0;3.5;0.0;"Pas de s�diment";0.0;0;3;0;0;0;0;;;;;;1;18;19;20;32;25;4560;;;;;;6.0;0.5;0.0;0.0;0.0;;10.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Color�e";"DSC01921.JPG";"mars16-PerhB8sup";10.0;2;20.0;2;3.0;2;0.5;0.0;90.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;40.0;"Blocs";;0;0;0;0;;;2;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSC01922.JPG";"mars16-PerhB8inf";0.0;;0.0;;0.0;;0.0;3.0;0.0;"Pas de s�diment";2.0;0;1;0;0;0;0;;;;;;1;13;20;10;18;16;3080;;;;;;3.0;7.0;0.0;0.0;0.5;;40.0;"Blocs";;0;0;0;0;;;2;;0;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"DSC00333.JPG";"mars16-PerhB10sup";0.5;1;60.0;2;0.0;;11.0;2.0;95.0;"Sable fin";0.0;0;2;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;5.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;0;0; +380068;"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSC00340.JPG";"mars16-PerhB10inf";0.0;2;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;1;23;39;35;11;0;4320;;;;;;15.0;2.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune-Rouge";"DSC00393.JPG";"sept16-PerhB10sup";36.0;2;55.0;2;5.0;2;0.5;0.0;70.0;"Sable fin";0.0;2;4;1;0;0;0;;;;;;0;2;0;0;2;0;160;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSC00399.JPG";"sept16-PerhB10inf";1.0;2;0.0;;0.5;2;1.0;9.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;40;35;31;20;35;6440;;;;;;0.5;0.0;1.5;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"DSC00400.JPG";"sept16-PerhB9sup";0.0;;90.0;2;1.5;2;0.0;0.5;80.0;"Sable fin";0.0;1;0;1;0;0;0;;;;;;0;0;3;5;0;0;320;;;;;;6.0;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;0;;1;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSC00403.JPG";"sept16-PerhB9inf";0.0;;0.5;2;0.0;;0.0;4.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;0;22;8;12;31;13;3440;;;;;;7.0;0.5;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;1;;;0;;1;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Verte";"Q3_bloc5dessus_19092016.JPG";"sept16-PerhB5sup";0.0;;5.0;2;80.0;2;0.0;8.0;40.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;14;2;0;4;0;800;;;;;;1.5;1.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;2;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"Q3_bloc5dessous_19092016.JPG";"sept16-PerhB5inf";0.0;;10.0;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";5.0;0;1;0;0;0;0;0;0;0;1;0;20;10;14;20;9;11;2560;;;;;;6.5;2.5;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;2;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Verte";"Q1_bloc1dessus_19092016.JPG";"sept16-PerhB1sup";0.0;;2.0;2;95.0;2;0.0;0.0;20.0;"Sable fin";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;4;;0;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"Q1_bloc1dessous_19092016.JPG";"sept16-PerhB1inf";2.0;1;0.5;2;0.0;;0.5;10.0;0.0;"Pas de s�diment";0.0;0;6;0;0;0;0;;;;;;0;26;10;8;14;5;2520;;;;;;2.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;4;;0;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"DSC00410.JPG";"sept16-PerhB8sup";1.0;2;40.0;2;40.0;2;0.0;1.0;95.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;1;2;0;0;0;120;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSC00416.JPG";"sept16-PerhB8inf";1.0;2;0.5;2;0.0;;0.0;1.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;12;12;9;6;8;1880;;;;;;0.5;1.5;0.5;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"Q1_blocRef_19092016.JPG";"sept16-PerhQ1";30.0;2;65.0;2;5.0;2;10.0;45.0;15.0;"Sable fin";0.0;2;1;0;0;0;0;0;1;0;0;0;20;14;4;0;3;0;840;;;;;;0.0;0.5;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"DSC00381.JPG";"sept16-PerhQ2";5.0;2;85.0;2;1.0;2;10.0;10.0;70.0;"Sable fin";0.0;1;2;0;0;0;0;;;;;;0;0;1;1;0;2;160;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge";"Q3_blocref_19092016.JPG";"sept16-PerhQ3";5.0;2;75.0;2;10.0;2;0.0;0.0;95.0;"Sable fin";0.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge-Verte";"DSC00413.JPG";"sept16-PerhQ4";0.0;;65.0;2;30.0;2;1.0;0.0;70.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"DSC00395.JPG";"sept16-PerhQ5";60.0;2;15.0;2;5.0;2;0.0;2.0;70.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;1;3;0;0;0;160;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"Q3_bloc6dessus_19092016.JPG";"sept16-PerhB6sup";3.0;2;50.0;2;20.0;2;0.5;1.5;90.0;"Sable fin";0.0;0;1;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;3.5;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;3;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"Q3_bloc6dessous_19092016.JPG";"sept16-PerhB6inf";0.0;;3.0;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;2;0;0;0;0;0;1;0;0;0;20;15;12;23;17;15;3280;;;;;;0.5;1.5;10.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;3;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"DSC00370.JPG";"sept16-PerhB4sup";0.0;;92.0;2;8.0;2;0.5;0.0;90.0;"Sable fin";0.0;2;2;2;0;0;0;;;;;;0;0;0;2;3;1;240;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;3;0;0;;;2;;0;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSC00378.JPG";"sept16-PerhB4inf";0.0;;0.0;;0.0;;0.0;3.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;1;1;0;0;0;40;33;14;27;17;30;4840;;;;;;3.0;6.0;2.5;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;3;0;0;;;2;;0;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune-Rouge";"DSC00361.JPG";"sept16-PerhB3sup";31.0;2;60.0;2;10.0;2;0.5;2.0;35.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;1;1;5;3;0;400;;;;;;0.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSC00369.JPG";"sept16-PerhB3inf";0.0;;25.0;2;0.0;;0.0;12.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;47;20;25;6;23;4840;;;;;;0.0;7.0;2.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Brune";"Q4_bloc7dessus_19092016.JPG";"sept16-PerhB7sup";75.0;3;20.0;2;1.0;2;1.0;0.0;85.0;"Sable fin";0.0;0;2;2;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;0.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;1;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"Q4_bloc7dessous_19092016.JPG";"sept16-PerhB7inf";0.0;;0.0;;0.5;2;0.0;15.0;0.0;"Pas de s�diment";1.0;0;1;0;0;0;0;1;0;1;0;0;40;8;9;8;7;3;1400;;;;;;0.5;3.5;0.0;0.0;0.5;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;1;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"Q1_bloc2dessus_19092016.JPG";"sept16-PerhB2sup";15.0;2;60.0;2;5.0;2;10.0;7.0;45.0;"Sable fin";0.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +380135;"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"Q1_bloc2dessous_19092016.JPG";"sept16-PerhB2inf";0.0;;1.5;2;0.0;;0.0;10.0;0.0;"Pas de s�diment";5.0;0;1;0;0;0;0;;;;;;0;5;8;12;6;9;1600;;;;;;5.0;11.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Roche en place";"1";"face sup�rieure";;"DSCF8693.JPG";"oct14-KerQ1";2.0;2;22.5;2;0.125;2;0.0;2.25;0.0;"Pas de s�diment";3.5;0;0;11;4;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;36.0;;;;;;;;;;;;;;;;;;;; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;"DSCF8704.JPG";"oct14-KerB5sup";1.25;2;56.0;2;2.5;2;0.0;0.25;0.0;"Pas de s�diment";12.0;0;4;7;2;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.125;0.0;0.0;12.0;;9.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;1; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;"DSCF8706.JPG";"oct14-KerB5inf";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;11;1;0;0;0;;;;;;5;;;;;;2000;;;;;;0.125;12.0;0.0;0.0;22.5;;9.0;"Sable grossier";;0;0;0;0;;;0;;0;0;0;;0;0;1; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";;"DSCF8698.JPG";"oct14-KerB4sup";0.0;;89.0;2;1.0;2;0.0;0.0;1.5;"Vase";11.0;0;11;17;0;0;0;;;;;;0;;;;;;280;;;;;;0.0;0.0;0.0;0.0;9.5;;17.5;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;0;0;;0;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";;"DSCF8700.JPG";"oct14-KerB4inf";0.0;;0.0;;0.0;;0.0;0.0;0.5;"Sable fin";5.5;0;6;5;0;0;1;;;;;;0;;;;;;1640;;;;;;1.75;2.5;0.0;0.0;10.5;;17.5;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;0;0;;0;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";;"DSCF8696.JPG";"oct14-KerB3sup";1.0;2;12.0;2;16.0;2;0.0;0.0;2.0;"Sable fin";26.0;0;0;2;0;0;0;;;;;;5;;;;;;1880;;;;;;0.0;0.125;0.0;0.0;21.0;;12.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";;"DSCF8699.JPG";"oct14-KerB3inf";0.0;;41.0;2;1.0;2;0.0;0.0;0.0;"Pas de s�diment";2.0;0;21;6;0;1;1;;;;;;1;;;;;;560;;;;;;0.0;2.5;0.0;0.0;12.0;;12.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";;"83.JPG";"oct14-KerQ5";1.25;2;65.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;4;17;3;0;0;;;;;;0;;;;;;200;;;;;;0.0;2.25;0.25;0.0;15.0;;;;;;;;;;;;;;;;;;;; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";;"91.JPG";"oct14-KerQ4";25.0;2;30.0;2;0.5;2;0.0;0.0;0.0;"Pas de s�diment";3.5;0;3;4;9;0;0;;;;;;0;;;;;;160;;;;;;0.0;0.0;0.0;0.0;4.0;;;;;;;;;;;;;;;;;;;; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;"80.JPG";"oct14-KerB10sup";1.25;2;100.0;2;0.0;;0.0;0.0;9.0;"Vase";10.5;0;0;5;13;0;0;;;;;;0;;;;;;280;;;;;;0.0;0.0;0.0;0.0;6.5;;40.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;"82.JPG";"oct14-KerB10inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;0;1;0;0;;;;;;3;;;;;;640;;;;;;0.5;0.0;0.0;0.0;0.75;;40.0;"Vase";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;"79.JPG";"oct14-KerB9sup";0.0;;65.0;2;0.75;2;0.0;0.0;3.5;"Vase";8.0;0;1;9;0;1;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;1.375;;37.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;1;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;"81.JPG";"oct14-KerB9inf";0.0;;0.125;2;0.125;2;0.0;0.0;0.25;"Sable grossier";5.25;0;12;5;0;0;0;;;;;;2;;;;;;480;;;;;;28.0;0.0;0.0;0.0;23.8;;37.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;1;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;"87.JPG";"oct14-KerB8sup";0.0;;70.0;2;1.0;2;0.0;0.0;2.5;"Vase";9.5;1;2;5;2;0;0;;;;;;0;;;;;;320;;;;;;0.0;1.0;0.0;0.0;9.5;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;"89.JPG";"oct14-KerB8inf";0.0;;0.0;;0.0;;0.0;0.0;1.5;"Vase";13.0;0;2;1;0;0;0;;;;;;0;;;;;;0;;;;;;5.0;1.5;0.0;0.0;16.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;0;0;0;;0;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;"86.JPG";"oct14-KerB7sup";6.0;2;34.5;2;36.0;2;0.0;0.0;6.0;"Vase";0.375;0;5;7;3;2;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;5.625;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;"88.JPG";"oct14-KerB7inf";0.0;;2.0;2;27.5;2;0.0;0.0;0.0;"Pas de s�diment";10.5;0;25;7;0;1;0;;;;;;1;;;;;;840;;;;;;0.0;4.0;0.0;0.0;8.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;"DSCF8689.JPG";"oct14-KerB1sup";0.0;;0.0;2;28.0;2;0.0;0.0;0.5;"Sable fin";17.5;0;0;0;4;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;20.5;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;15;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;"DSCF8691.JPG";"oct14-KerB1inf";0.0;3;2.0;1;2.0;;0.0;0.5;0.0;"Pas de s�diment";22.0;0;1;14;8;0;0;;;;;;0;;;;;;560;;;;;;0.0;0.0;0.0;0.0;50.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;15;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;"DSCF8690.JPG";"oct14-KerB2sup";0.0;;0.0;;0.125;2;1.25;0.0;0.0;"Pas de s�diment";4.0;0;0;9;1;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;20.0;;69.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;"DSCF8694.JPG";"oct14-KerB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.25;"Vase";30.0;0;6;3;0;0;0;;;;;;1;;;;;;78;;;;;;0.0;0.0;0.0;0.0;22.0;;69.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";;;"oct14-KerQ3";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Roche en place";"2";"face sup�rieure";;"DSCF8701.JPG";"oct14-KerQ2";0.0;;70.0;2;0.0;;0.0;1.0;30.0;"Vase";6.5;0;2;11;0;0;1;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;"DSCF8705.JPG";"oct14-KerB6sup";2.5;2;4.0;2;11.5;2;0.0;0.0;1.5;"Vase";4.5;0;0;4;5;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;50.0;;;;;;;;;;;;;;;;;;;; +380202;"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;;"oct14-KerB6inf";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"DSCN0129.JPG";"mars15-KerB10sup";0.0;;29.0;2;0.125;2;0.0;0.0;10.5;"Sable grossier";2.25;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;3.75;;15.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSCN0137.JPG";"mars15-KerB10inf";0.0;;1.5;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;6;0;0;0;0;;;;;;1;4;0;9;0;0;520;;;;;;0.625;0.0;0.0;0.0;40.0;;15.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche-Rouge";"DSCN0138.JPG";"mars15-KerQ5";5.5;2;54.75;2;2.75;2;0.0;2.25;0.5;"Sable fin";5.375;0;0;13;9;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;18.75;;;;;;;;;;;;;;;;;;;; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune-Rouge";"DSCN0145.JPG";"mars15-KerQ4";18.5;2;84.5;2;1.5;2;0.0;2.2;0.25;"Sable grossier";1.0;0;3;6;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune-Rouge";"DSCN0158.JPG";"mars15-KerQ3";20.0;2;50.0;2;6.0;2;0.0;0.5;40.0;"Vase";0.0;0;4;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"DSCN0202.JPG";"mars15-KerQ2";0.0;;45.0;2;3.0;2;0.0;3.5;0.0;"Pas de s�diment";1.0;0;0;6;4;0;3;;;;;;0;0;0;0;0;0;0;;;;;;2.375;0.5;0.0;0.0;0.25;;;;;;;;;;;;;;;;;;;; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche-Rouge";"DSCN0186.JPG";"mars15-KerQ1";0.5;2;35.0;2;1.0;2;0.0;3.0;0.0;"Pas de s�diment";3.5;0;0;5;6;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;6.0;;;;;;;;;;;;;;;;;;;; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"DSCN0127.JPG";"mars15-KerB9sup";0.0;;39.0;2;0.0;;0.0;0.0;3.0;"Vase";7.0;0;2;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;2.125;;57.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCN0128.JPG";"mars15-KerB9inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;13;4;3;0;0;;;;;;0;10;2;3;14;0;1160;;;;;;0.0;0.0;1.25;0.0;2.0;;57.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche-Rouge";"DSCN0151.JPG";"mars15-KerB8sup";1.0;2;35.5;2;0.0;;0.0;1.0;8.0;"Vase";5.0;0;3;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;8.5;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSCN0153.JPG";"mars15-KerB8inf";0.0;;0.0;;0.25;2;0.0;0.0;3.0;"Vase";11.25;0;13;6;0;0;0;;;;;;0;5;1;0;6;1;520;;;;;;0.25;0.5;0.0;0.0;5.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"DSCN0191.JPG";"mars15-KerB3sup";2.5;2;35.0;2;1.25;2;0.0;0.0;1.75;"Vase";2.25;0;4;1;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;5.5;;16.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCN0196.JPG";"mars15-KerB3inf";0.0;;1.25;2;0.0;;0.0;0.25;1.0;"Vase";8.75;0;3;1;0;0;0;;;;;;1;24;6;47;9;14;4000;;;;;;0.0;3.5;10.5;0.0;28.0;;16.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"DSCN0177.JPG";"mars15-KerB1sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";6.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;32.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCN0181.JPG";"mars15-KerB1inf";0.0;;1.5;2;0.0;;0.0;4.0;0.0;"Pas de s�diment";7.0;0;4;34;0;0;2;;;;;;0;6;4;3;4;9;1040;;;;;;0.0;0.0;0.0;0.0;25.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche-Rouge";"DSCN0175.JPG";"mars15-KerB2sup";5.0;2;24.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;4.25;;17.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCN0183.JPG";"mars15-KerB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";4.12;0;5;7;12;0;0;;;;;;4;6;14;11;9;42;3280;;;;;;0.0;0.0;0.0;0.0;21.25;;17.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"DSCN0194.JPG";"mars15-KerB4sup";1.0;2;5.0;2;8.0;2;0.0;0.0;0.0;"Pas de s�diment";2.5;0;5;3;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;3.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;1;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSCN0199.JPG";"mars15-KerB4inf";0.0;;4.0;2;0.5;2;0.0;2.25;0.0;"Pas de s�diment";2.75;0;0;1;0;0;0;;;;;;0;3;4;10;5;1;920;;;;;;0.125;0.0;0.0;0.0;28.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;1;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Blanche-Rouge";"DSCN0154.JPG";"mars15-KerB5sup";0.0;;35.0;2;0.0;;0.0;0.0;35.0;"Vase";1.0;0;0;2;1;0;1;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;11.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSCN0166.JPG";"mars15-KerB5inf";0.0;;0.0;;0.0;;0.0;0.0;3.0;"D�bris coquilliers";80.0;0;5;2;0;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;5.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Rouge";"DSCN0159.JPG";"mars15-KerB6sup";0.0;;37.0;2;1.0;2;0.0;4.5;5.0;"Vase";3.0;0;5;2;0;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;17.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"DSCN0169.JPG";"mars15-KerB6inf";0.0;;13.0;2;0.5;;0.0;2.0;60.0;"Vase";2.0;0;1;1;0;0;0;;;;;;0;1;0;0;0;0;40;;;;;;0.0;0.0;0.0;0.0;5.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"DSCN0143.JPG";"mars15-KerB7sup";0.0;;63.0;2;0.0;;0.0;0.0;20.0;"Sable grossier";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;3.5;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380276;"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSCN0150.JPG";"mars15-KerB7inf";0.0;;0.0;;0.0;;0.0;0.0;3.0;"Sable grossier";15.0;0;3;3;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Blanche";"DSCN0490.JPG";"mars16-KerQ5";0.0;;0.0;;0.0;;0.0;3.5;0.0;"Pas de s�diment";6.5;0;0;0;11;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;40.0;;;;;;;;;;;;;;;;;;;; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"DSCN0471.JPG";"mars16-KerB1sup";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";11.5;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;9.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;3;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCN0475.JPG";"mars16-KerB1inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";35.0;0;12;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0;20;;;;;;0.0;0.25;0.0;0.0;12.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;3;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche-Rouge";"DSCN0492.JPG";"mars16-KerB10sup";0.25;2;50.0;2;0.0;;0.0;0.0;2.0;"D�bris coquilliers";6.5;0;3;1;5;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;10.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSCN0494.JPG";"mars16-KerB10inf";0.0;;0.5;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;37;4;8;0;0;0;0;0;0;0;0;4;7;4;2;1;720;;;;;;0.0;0.0;0.0;0.0;5.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"DSCN0470.JPG";"mars16-KerB2sup";6.0;2;40.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";8.5;0;0;1;4;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;;0.0;0.0;1.25;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCN0472.JPG";"mars16-KerB2inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";8.0;0;21;0;7;0;0;0;0;0;0;0;0;1;3;7;3;0;560;;;;;;0.5;1.25;0.0;0.0;0.425;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"DSCN0516.JPG";"mars16-KerB3sup";0.0;;45.0;2;0.0;;0.0;5.0;3.5;"Sable fin";2.0;0;12;2;5;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.75;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;8;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCN0524.JPG";"mars16-KerB3inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;20;0;1;0;1;0;0;0;0;0;0;6;5;3;11;2;1080;;;;;;0.0;0.0;0.0;0.0;5.5;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;8;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche";"DSCN0495.JPG";"mars16-KerB9sup";0.25;2;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";17.0;0;0;0;1;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;16.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCN0497.JPG";"mars16-KerB9inf";0.5;2;0.125;2;0.0;;0.0;0.125;0.0;"Pas de s�diment";10.5;0;6;1;28;0;0;0;0;0;0;0;0;8;7;12;7;4;1520;;;;;;0.0;0.0;0.0;0.0;25.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"DSCN0481.JPG";"mars16-KerB8sup";0.0;;42.5;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.25;0;27;2;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSCN0482.JPG";"mars16-KerB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";17.0;0;7;1;0;0;0;0;0;0;0;0;2;0;0;1;0;2;120;;;;;;3.0;1.75;0.0;0.0;0.5;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"DSCN0480.JPG";"mars16-KerB7sup";0.0;;70.0;2;0.5;1;0.0;0.5;1.5;"Sable fin";1.0;0;5;0;1;1;1;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;3;;;0;;0;0;0;;1;0;1; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSCN0485.JPG";"mars16-KerB7inf";0.0;;0.25;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;3;0;0;0;0;0;0;0;0;0;1;0;0;0;0;0;24;;;;;;0.0;4.5;0.0;0.0;3.5;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;3;;;0;;0;0;0;;1;0;1; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Rouge";"DSCN0503.JPG";"mars16-KerB6sup";0.25;2;10.0;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";17.0;0;1;0;2;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;15.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSCN0505.JPG";"mars16-KerB6inf";0.0;;0.125;2;0.0;;0.0;3.5;2.5;"D�bris coquilliers";18.0;0;40;0;1;0;0;0;0;0;0;0;0;5;4;5;2;0;640;;;;;;1.0;0.0;0.0;0.0;2.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"DSCN0501.JPG";"mars16-KerB5sup";0.0;;38.0;2;0.0;;0.0;3.5;1.0;"Sable fin";0.0;0;7;2;3;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.25;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSCN0509.JPG";"mars16-KerB5inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;6;0;1;0;0;0;0;0;0;0;0;5;11;1;3;2;880;;;;;;0.0;0.0;0.0;0.0;16.5;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge";"DSCN0518.JPG";"mars16-KerB4sup";0.0;;50.0;2;0.0;;0.0;2.5;8.0;"Vase";0.5;0;2;0;0;0;3;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSCN0521.JPG";"mars16-KerB4inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";20.0;0;0;0;0;0;0;0;0;0;0;0;0;21;9;13;18;8;2760;;;;;;0.0;0.0;0.0;0.0;12.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;0;0; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche-Brune";"DSCN0477.JPG";"mars16-KerQ1";0.5;2;7.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";8.0;0;0;1;3;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;10.0;;;;;;;;;;;;;;;;;;;; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"DSCN0514.JPG";"mars16-KerQ2";0.0;;60.0;2;1.0;2;0.0;4.0;3.0;"D�bris coquilliers";0.5;0;6;3;3;0;5;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;1.0;0.25;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune-Rouge";"DSCN0500.JPG";"mars16-KerQ3";3.0;2;50.0;2;1.0;2;0.0;9.5;3.0;"D�bris coquilliers";5.5;0;4;1;1;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;3.5;;;;;;;;;;;;;;;;;;;; +380343;"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"DSCN0486.JPG";"mars16-KerQ4";0.0;;55.0;2;0.5;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;10;3;0;0;8;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge-Verte";;"OCTOBRE/16/BR5";0.0;;55.0;2;0.0;;0.0;0.0;1.75;"Vase";0.0;0;5;4;2;1;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.125;;;;;;;;;;;;;;;;;;;; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche";"DSCN1114.JPG";"octobre/16/B2/sup";0.5;1;0.0;;7.0;2;0.0;0.0;0.0;"Pas de s�diment";8.25;0;0;0;7;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;25.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCN1115.JPG";"octobre/16/B2/inf";0.0;;5.0;2;0.0;;0.0;12.5;0.0;"Pas de s�diment";27.5;0;7;0;0;0;0;;;;;;4;45;18;12;22;11;4320;;;;;;0.0;0.0;0.0;0.0;25.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;1; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"DSCN1121.JPG";"OCTOBRE/16/B3/SUP";1.0;2;45.0;2;0.0;;0.0;4.5;6.0;"Vase";5.5;0;3;2;2;0;0;;;;;;0;2;6;5;7;6;1040;;;;;;0.0;0.0;0.125;0.0;1.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;0;0;;0;0;1; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"DSCN1125.JPG";"OCTOBRE/16/B3/INF";0.0;;0.0;;0.0;;0.0;1.5;0.0;"Pas de s�diment";1.0;0;32;1;0;0;0;;;;;;5;31;10;9;8;10;2720;;;;;;0.0;30.0;0.0;0.0;5.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;0;;0;0;0;;0;0;1; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"DSCN1124.JPG";"OCTOBRE/16/B4/SUP";4.0;2;40.0;2;0.125;1;0.0;4.0;5.0;"Vase";19.0;0;7;3;0;0;0;;;;;;0;17;2;5;13;3;1600;;;;;;0.0;0.0;0.25;0.125;2.5;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"DSCN1133.JPG";"OCTOBRE/16/B4/INF";0.0;;0.5;2;0.0;;0.0;3.0;1.5;"Vase";2.5;0;4;0;0;0;0;;;;;;10;12;12;5;6;7;1680;;;;;;0.0;4.0;0.0;0.0;35.0;;35.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"DSCN1120.JPG";"OCTOBRE/16/B7/SUP";1.5;2;30.0;2;12.0;2;0.0;0.0;0.25;"Vase";1.0;0;12;7;10;1;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;5.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;2;0;0;;0;1;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"DSCN1122.JPG";"OCTOBRE/16/B7/INF";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.5;0;3;0;0;0;0;;;;;;5;7;10;0;0;0;680;;;;;;0.375;0.5;0.0;0.0;2.0;;45.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;1;;2;0;0;;0;1;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge-Verte";"DSCN1126.JPG";"OCTOBRE/16/B8/SUP";1.75;2;18.75;2;20.0;2;0.0;0.0;0.0;"Pas de s�diment";1.75;0;0;0;5;0;0;;;;;;0;9;4;6;0;0;760;;;;;;0.0;0.0;0.0;0.0;9.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSCN1127.JPG";"OCTOBRE/16/B8/INF";0.0;;11.25;2;5.0;2;0.0;0.0;0.0;"Pas de s�diment";30.0;0;4;0;0;0;0;;;;;;0;19;21;21;18;17;3840;;;;;;0.25;0.125;0.0;0.0;2.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Rouge";"DSCN1135.JPG";"OCTOBRE/16/B9/SUP";0.0;;22.5;2;2.5;2;0.0;0.0;0.75;"Vase";3.25;0;0;0;7;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;11.75;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;1;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"DSCN1136.JPG";"OCTOBRE/16/B9/INF";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";4.0;0;1;0;0;0;0;;;;;;3;22;20;33;15;12;4080;;;;;;0.0;0.0;0.0;0.0;20.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;1;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"DSCN1139.JPG";"OCTOBRE/16/B10/SUP";0.0;;5.0;2;1.0;;0.0;0.0;1.0;"Vase";8.5;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;12.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;1;0;;1;0;1; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"DSCN1140.JPG";"OCTOBRE/16/B10/INF";0.0;;0.25;2;0.0;;0.0;1.5;0.0;"Pas de s�diment";7.0;0;3;0;2;0;0;;;;;;1;2;4;1;2;7;640;;;;;;0.0;0.0;0.0;0.0;10.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;0;1;0;;1;0;1; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Blanche";"DSCN1108.JPG";"OCTOBRE/16/BR1";0.0;;0.0;;6.0;2;0.0;0.0;2.0;"Vase";9.5;0;2;0;4;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;45.0;;;;;;;;;;;;;;;;;;;; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"DSCN1132.JPG";"OCTOBRE/16/BR2";5.0;2;75.0;2;5.0;2;1.0;1.0;2.0;"Vase";0.25;0;5;5;0;1;4;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Color�e";;"OCTOBRE/16/BR3";37.5;2;25.0;2;7.0;;0.0;0.0;0.0;"Pas de s�diment";1.5;0;22;5;19;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;8.0;;;;;;;;;;;;;;;;;;;; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Rouge";"DSCN1130.JPG";"OCTOBRE/16/BR4";5.0;2;40.0;2;6.5;2;0.0;0.0;7.5;"Vase";0.25;0;2;3;4;1;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge-Verte";"040.JPG";"OCTOBRE/16/B6/SUP";2.5;2;35.0;2;20.0;2;0.0;0.0;1.0;"Vase";3.5;0;4;2;3;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.375;;65.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"045.JPG";"OCTOBRE/16/B6/INF";0.0;;0.0;;0.0;;0.0;0.0;1.0;"Vase";25.0;0;5;0;0;0;0;;;;;;0;50;10;4;6;7;3080;;;;;;0.0;0.5;0.0;0.0;0.125;;65.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge-Verte";"IMGP3620.JPG";"OCTOBRE/16/B5/SUP";0.0;;74.0;2;11.5;2;0.0;0.0;10.0;"Vase";0.0;0;1;0;0;0;1;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"039.JPG";"OCTOBRE/16/B5/INF";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";100.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;100.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Verte";"DSCN1104.JPG";"octobre/16/B1/sup";13.0;2;1.0;1;0.0;;0.0;0.0;1.0;"Vase";8.5;1;0;1;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;9.0;;7.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380410;"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCN1106.JPG";"octobre/16/B1/inf";0.0;;1.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.5;0;7;5;0;0;0;;;;;;8;58;40;45;54;34;9240;;;;;;0.0;2.5;0.0;0.0;6.0;;7.5;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Brune-Rouge";"DSCF8684.JPG";"oct14-MousQ1";32.0;2;24.0;2;0.0;;0.0;0.0;5.0;"Sable grossier";4.5;0;6;17;0;0;0;;;;;;1;;;;;;120;;;;;;0.0;0.75;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc fix�";"4";"face sup�rieure";"Brune-Rouge";"IMG_0222.JPG";"oct14-MousQ4";5.0;2;85.0;2;1.0;2;0.0;2.0;15.0;"Sable grossier";15.0;0;0;8;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Rouge";"IMG_0218.JPG";"oct14-MousQ3";0.0;;75.0;2;5.0;2;0.5;0.0;50.0;"Sable grossier";0.0;0;4;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.5;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Rouge";"IMG_0204.JPG";"oct14-MousQ2";0.0;;40.0;2;1.0;2;10.0;0.0;35.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.5;0.0;0.5;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche-Verte";"IMG_0225.JPG";"oct14-MousB8sup";0.0;;12.0;2;10.0;2;0.0;0.5;3.0;"Sable grossier";30.0;0;0;10;2;0;0;;;;;;10;;;;;;0;;;;;;0.5;0.0;1.0;0.0;3.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"IMG_0223.JPG";"oct14-MousB8inf";0.0;;4.0;2;0.0;;0.0;6.0;0.0;"Pas de s�diment";10.0;0;1;3;1;0;0;;;;;;113;;;;;;280;;;;;;1.0;5.5;1.5;0.0;3.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune-Rouge";"IMG_0202.JPG";"oct14-MousB4sup";15.0;2;50.0;2;2.0;2;0.0;0.0;30.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.5;0.0;0.0;;60.0;"Sable grossier";;0;0;0;0;;;0;;0;2;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"IMG_0194.JPG";"oct14-MousB4inf";0.0;;2.5;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;212;;;;;;320;;;;;;1.0;6.0;0.0;0.0;2.0;;60.0;"Sable grossier";;0;0;0;0;;;0;;0;2;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"DSCF8687.JPG";"oct14-MousB3sup";0.0;;48.0;2;0.25;2;0.0;0.0;20.0;"Sable grossier";0.0;0;0;1;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;11.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;10;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"DSCF8688.JPG";"oct14-MousB3inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";3.5;0;0;0;0;0;0;;;;;;21;;;;;;1120;;;;;;11.5;1.75;0.0;0.0;12.0;;11.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;10;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Verte";"DSCF8679.JPG";"oct14-MousB1sup";0.0;;4.0;2;12.5;2;0.0;1.5;0.0;"Pas de s�diment";15.0;3;0;6;0;0;0;;;;;;89;;;;;;920;;;;;;0.0;0.125;0.0;0.0;6.5;;9.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;15;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCF8680.JPG";"oct14-MousB1inf";0.0;;10.0;2;0.0;;0.0;4.75;0.0;"Pas de s�diment";13.5;0;1;0;0;0;0;;;;;;4;;;;;;3920;;;;;;0.0;0.375;0.0;0.0;0.0;;9.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;15;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"DSCF8682.JPG";"oct14-MousB2sup";0.0;;25.0;2;0.5;2;0.0;0.5;1.0;"Sable grossier";20.0;0;2;9;0;0;0;;;;;;8;;;;;;0;;;;;;0.0;4.0;0.0;0.0;2.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;2;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"DSCF8683.JPG";"oct14-MousB2inf";0.0;;2.0;2;0.0;;0.0;1.75;0.0;"Pas de s�diment";7.0;0;0;0;0;0;0;;;;;;121;;;;;;3480;;;;;;6.5;1.125;0.0;0.0;10.5;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;2;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"IMG_0208.JPG";"oct14-MousB5sup";0.0;;90.0;2;5.0;2;0.5;0.0;5.0;"Sable grossier";2.0;0;1;3;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.5;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;1;;0;0;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"IMG_0209.JPG";"oct14-MousB5inf";0.0;;3.0;2;0.0;;0.0;1.5;0.5;"Sable fin";1.0;0;0;0;0;0;0;;;;;;42;;;;;;2120;;;;;;12.0;11.0;0.5;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;1;0;;;1;;0;0;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"IMG_0214.JPG";"oct14-MousB6sup";0.0;;75.0;2;10.0;2;0.0;0.0;20.0;"Sable grossier";3.0;0;0;0;0;0;0;;;;;;2;;;;;;0;;;;;;0.0;0.0;0.5;0.0;0.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;5;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"IMG_0215.JPG";"oct14-MousB6inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;98;;;;;;160;;;;;;20.0;4.0;0.0;0.0;0.5;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;5;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"IMG_0219.JPG";"oct14-MousB7sup";0.0;;70.0;2;5.0;2;2.0;0.0;50.0;"Sable grossier";5.0;0;3;21;0;0;0;;;;;;3;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"IMG_0221.JPG";"oct14-MousB7inf";0.0;;6.0;2;1.0;2;0.0;8.0;0.0;"Pas de s�diment";10.0;0;7;6;3;0;0;;;;;;40;;;;;;2000;;;;;;1.0;0.5;21.0;0.0;0.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380477;"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"QECB_MOUST_Q4_B8_sup.JPG";"mar15-MoustB8sup";0.25;2;80.0;2;0.5;2;0.0;0.0;60.0;"Sable fin";8.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;6;0;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"QECB_MOUST_Q4_B8_inf.JPG";"mar15-MoustB8inf";0.0;;2.0;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";8.0;0;4;10;0;0;0;;;;;;52;42;14;14;1;4;3000;;;;;;1.5;6.0;0.0;0.0;29.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;6;0;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Blanche-Rouge";"QECB_MOUST_Q5_B9_sup.JPG";"mar15-MoustB9sup";4.0;2;50.0;2;5.0;2;0.0;0.25;6.0;"Vase";6.0;0;0;0;0;0;0;;;;;;5;0;0;0;0;0;0;;;;;;2.0;0.125;0.0;0.0;0.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"QECB_MOUST_Q5_B9_inf.JPG";"mar15-MoustB9inf";0.0;;0.75;2;0.0;;0.0;4.0;0.0;"Pas de s�diment";8.0;0;1;1;0;0;0;;;;;;120;;;;;;195;;;;;;5.0;1.0;0.0;1.5;6.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;1;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune-Rouge";"QECB_MOUST_Q1_ref.JPG";"mar15-MoustB1ref";0.0;;35.0;2;0.0;;0.0;2.0;0.0;"Pas de s�diment";50.0;0;1;3;0;0;0;;;;;;39;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"QECB_MOUST_Q5_ref.JPG";"mar15-MoustB5ref";1.0;1;80.0;2;2.0;2;0.0;0.0;30.0;"Vase";20.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;4.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Brune-Rouge";"QECB_MOUST_Q4_ref.JPG";"mar15-MoustB4ref";0.0;;50.0;2;1.0;2;0.0;2.5;20.0;"Sable fin";25.0;0;2;35;0;0;0;;;;;;4;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune-Rouge";"QECB_MOUST_Q3_ref.JPG";"mar15-MoustB3ref";0.5;2;70.0;2;0.5;1;0.0;0.0;60.0;"D�bris coquilliers";1.5;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"QECB_MOUST_Q3_B6_sup.JPG";"mar15-MoustB6sup";0.0;;80.0;2;0.0;;0.1;0.5;50.0;"D�bris coquilliers";0.0;0;0;2;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;1;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"QECB_MOUST_Q3_B6_inf.JPG";"mar15-MoustB6inf";0.0;;3.0;2;0.25;2;0.0;5.5;0.5;"Pas de s�diment";20.0;0;3;5;0;0;0;;;;;;156;0;5;9;0;9;920;;;;;;3.0;0.0;0.0;2.0;12.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;1;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"QECB_MOUST_Q3_B5_sup.JPG";"mar15-MoustB5sup";0.0;;70.0;2;0.5;2;0.0;2.0;6.0;"Sable fin";15.0;0;1;1;0;0;0;;;;;;38;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.5;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"QECB_MOUST_Q3_B5_inf.JPG";"mar15-MoustB5inf";0.0;;2.0;2;0.0;;0.0;8.0;1.5;"Pas de s�diment";20.0;0;2;0;0;0;0;;;;;;265;1;0;12;5;0;720;;;;;;4.0;3.0;0.0;0.0;5.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Rouge";"QECB_MOUST_Q2_B3_sup.JPG";"mar15-MoustB3sup";0.0;;40.0;2;0.0;;0.0;2.25;80.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;1;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"QECB_MOUST_Q2_B3_inf.JPG";"mar15-MoustB3inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";15.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;3.0;0.5;0.0;0.0;2.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;1;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Verte";"QECB_MOUST_Q5_B10_sup.JPG";"mar15-MoustB10sup";0.25;2;9.0;2;70.0;2;0.0;2.0;6.0;"Sable fin";1.5;0;0;2;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;3.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Blanche";"QECB_MOUST_Q5_B10_inf.JPG";"mar15-MoustB10inf";0.0;;10.0;2;0.0;;0.0;6.6;0.0;"Pas de s�diment";35.0;0;0;0;0;0;0;;;;;;32;0;0;0;0;0;;;;;;;1.5;2.5;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche-Rouge";"QECB_MOUST_Q4_B7_sup.JPG";"mar15-MoustB7sup";0.0;;30.0;2;0.0;;0.0;9.0;15.0;"Sable fin";50.0;0;0;0;0;0;0;;;;;;11;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;1.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"QECB_MOUST_Q4_B7_inf.JPG";"mar15-MoustB7inf";0.0;;3.0;2;0.0;;0.0;9.5;0.0;"Pas de s�diment";35.0;0;3;7;0;0;0;;;;;;40;7;3;7;2;1;800;;;;;;7.0;3.0;0.0;0.5;5.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Blanche-Verte";"QECB_MOUST_Q1_B2_sup.JPG";"mar15-MoustB2sup";0.0;;15.0;2;2.0;2;0.0;5.0;9.0;"Sable fin";35.0;0;0;3;0;0;0;;;;;;43;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;3.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche-Rouge";"QECB_MOUST_Q1_B2_inf.JPG";"mar15-MoustB2inf";0.0;;2.0;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";30.0;0;0;2;0;0;0;;;;;;33;9;56;33;29;23;6000;;;;;;0.5;0.5;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"QECB_MOUST_Q1_B1_sup.JPG";"mar15-MoustB1sup";0.5;2;80.0;2;0.0;;0.0;0.0;80.0;"Sable fin";0.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;8.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;2;1; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"QECB_MOUST_Q1_B1_inf.JPG";"mar15-MoustB1inf";0.0;;0.5;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";10.0;0;0;1;0;0;0;;;;;;102;20;30;24;26;20;4800;;;;;;21.0;0.0;0.125;0.0;3.0;;8.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;2;1; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"QECB_MOUST_Q2_ref.JPG";"mar15-MoustB2ref";0.0;;80.0;2;1.5;2;0.0;3.5;50.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"QECB_MOUST_Q2_B4_sup.JPG";"mar15-MoustB4sup";0.5;2;10.0;2;90.0;2;0.0;1.0;9.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;1;0; +380540;"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche-Rouge";"QECB_MOUST_Q2_B4_inf.JPG";"mar15-MoustB4inf";0.0;;15.0;2;0.0;;0.0;14.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;25;;;;;;30;;;;;;2.5;4.5;0.0;0.0;0.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;0;0;;0;1;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Blanche-Rouge";"DSC06606.JPG";"oct15-MousB6sup";0.0;;30.0;2;15.0;2;0.0;0.0;35.0;"Sable fin";15.0;0;4;5;0;0;0;;;;;;20;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;6;0;;0;0;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Blanche";"DSC06608.JPG";"oct15-MousB6inf";0.0;;5.0;2;0.0;;0.0;4.0;8.0;"Sable fin";15.0;0;0;0;0;0;0;;;;;;230;51;22;12;28;3;5960;;;;;;2.0;15.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;6;0;;0;0;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Blanche-Rouge";"DSCN0232.JPG";"oct15-MousB8sup";0.0;;60.0;2;1.0;2;0.0;3.5;40.0;"Sable fin";11.0;0;7;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Sable grossier";;0;0;0;0;;;0;;8;1;0;;0;2;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Blanche";"DSCN0233.JPG";"oct15-MousB8inf";0.0;;6.0;2;0.0;;0.0;16.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;250;18;32;39;21;22;5280;;;;;;0.0;5.0;0.0;5.0;0.5;;20.0;"Sable grossier";;0;0;0;0;;;0;;8;1;0;;0;2;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"DSCN0223.JPG";"oct15-MousB10sup";0.0;;80.0;2;0.0;;0.0;0.5;50.0;"D�bris coquilliers";30.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;5;0;0;;0;0;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"DSCN0224.JPG";"oct15-MousB10inf";0.0;;0.0;;0.0;;0.0;5.0;0.0;"Pas de s�diment";30.0;0;0;0;0;0;0;;;;;;43;7;18;10;12;20;2680;;;;;;4.0;20.0;0.0;0.0;15.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;5;0;0;;0;0;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Rouge";"DSCN0225.JPG";"oct15-MousQ4";20.0;2;80.0;2;0.0;;0.0;0.0;80.0;"Sable fin";0.0;0;0;6;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche-Rouge";"PA270324.JPG";"oct15-MousQ2";0.0;;85.0;2;5.0;2;0.0;1.0;60.0;"Sable fin";3.0;3;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.01;;;;;;;;;;;;;;;;;;;; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Rouge";"DSCN0220.JPG";"oct15-MousQ5";0.0;;70.0;2;0.0;;0.0;0.0;30.0;"Sable fin";6.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Rouge-Verte";"DSC06610.JPG";"oct15-MousB4sup";0.0;;40.0;2;40.0;2;0.0;1.0;90.0;"Sable fin";1.0;0;1;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;15.0;"Sable fin";;0;0;0;0;;;1;;0;2;0;;0;1;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"DSC06613.JPG";"oct15-MousB4inf";0.0;;5.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;0;0;0;0;;;;;;52;10;8;4;7;15;1760;;;;;;20.0;13.0;0.0;0.0;5.0;;15.0;"Sable fin";;0;0;0;0;;;1;;0;2;0;;0;1;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Rouge";"DSC06600.JPG";"oct15-MousB5sup";0.0;;75.0;2;1.0;2;0.0;3.0;25.0;"Sable fin";30.0;0;2;19;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;3;;0;2;0;;0;1;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Blanche";"DSC06605.JPG";"oct15-MousB5inf";0.0;;2.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;215;7;11;4;13;17;2080;;;;;;2.0;8.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;3;;0;2;0;;0;1;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge";"DSCN0221.JPG";"oct15-MousB9sup";0.0;;90.0;2;2.0;2;0.0;0.0;70.0;"Sable grossier";4.0;0;0;2;0;0;0;;;;;;6;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;3;0;;;0;;3;0;0;;0;0;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"DSCN0222.JPG";"oct15-MousB9inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;60;14;6;8;16;12;2240;;;;;;14.0;2.0;0.0;5.0;0.5;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;3;0;;;0;;3;0;0;;0;0;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Rouge";"DSCN0209.JPG";"oct15-MousQ1";0.0;;90.0;2;3.0;2;0.0;0.0;50.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Rouge";"DSCN0211.JPG";"oct15-MousB1sup";0.0;;40.0;2;5.0;1;0.0;3.0;5.0;"Sable fin";40.0;2;10;0;0;0;0;;;;;;5;3;3;3;3;3;600;;;;;;0.0;0.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;3;0;;;0;;0;4;0;;0;0;1; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"DSCN0213.JPG";"oct15-MousB1inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";40.0;0;4;3;0;3;0;;;;;;126;30;45;70;10;2;7200;;;;;;1.0;2.5;0.0;2.0;0.125;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;3;0;;;0;;0;4;0;;0;0;1; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"DSCN0214.JPG";"oct15-MousB2sup";0.0;1;90.0;2;0.0;;0.0;0.0;80.0;"D�bris coquilliers";1.0;0;6;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;10;4;0;;0;0;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"DSCN0217.JPG";"oct15-MousB2inf";0.0;;4.0;2;0.0;;0.0;9.0;0.0;"Pas de s�diment";10.0;0;2;0;0;0;0;6;5;7;4;6;560;10;15;13;12;7;2280;;;;;;6.0;2.5;0.0;4.0;10.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;10;4;0;;0;0;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune-Rouge";"PA270326.JPG";"oct15-MousB3sup";20.0;2;40.0;2;4.0;2;0.0;1.0;70.0;"Sable fin";2.0;0;0;5;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.1;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;1;8;0;;0;0;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"PA270331.JPG";"oct15-MousB3inf";0.0;;0.0;;0.0;;0.0;7.0;0.0;"Pas de s�diment";20.0;0;0;0;0;0;0;;;;;;184;12;23;15;10;13;2920;;;;;;2.5;5.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;1;0;;;0;;1;8;0;;0;0;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge";"DSCN0234.JPG";"oct15-MousB7sup";0.0;;60.0;2;0.0;;0.0;2.0;50.0;"D�bris coquilliers";7.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;0;0;0;2;;;0;;0;0;0;;0;3;0; +380607;"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Blanche";"DSCN0235.JPG";"oct15-MousB7inf";0.0;;10.0;2;0.0;;0.0;9.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;90;23;9;19;23;16;3600;;;;;;0.0;20.0;0.0;4.0;2.0;;;;;0;0;0;2;;;0;;0;0;0;;0;3;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune";"P1050095.JPG";"mars16-MousB8sup";0.0;;68.0;2;0.0;;0.0;1.0;6.0;"D�bris coquilliers";11.0;0;0;17;0;0;0;;;;;;2;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;4;0;0;;0;0;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"P1050102.JPG";"mars16-MousB8inf";0.0;;1.0;2;0.0;;0.0;6.0;0.0;"Pas de s�diment";15.0;0;0;4;0;0;0;10;5;14;16;4;980;36;17;23;23;17;4640;;;;;;0.75;0.5;0.0;0.0;;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;4;0;0;;0;0;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Brune";"P1050094.JPG";"mars16-MousB7sup";0.0;;30.0;2;0.0;;0.0;11.0;50.0;"Sable grossier";15.0;0;3;2;0;0;0;;;;;;0;0;0;0;1;0;40;;;;;;0.0;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;6;0;0;;0;1;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"P1050097.JPG";"mars16-MousB7inf";0.0;;0.0;;0.0;;0.0;3.5;0.0;"Sable grossier";1.0;0;0;0;0;0;0;6;10;2;5;12;700;13;14;9;12;21;2760;;;;;;30.0;1.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;6;0;0;;0;1;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune";"P1050127.JPG";"mars16-MousB4sup";0.0;;36.0;1;0.0;;0.0;0.1;55.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"P1050131.JPG";"mars16-MousB4inf";0.0;;0.0;;0.0;;0.0;5.5;0.0;"Pas de s�diment";30.0;0;1;0;0;0;0;;;;;;33;22;4;8;6;10;2000;;;;;;8.25;1.75;0.0;0.0;2.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune-Verte";"P1050126.JPG";"mars16-MousB3sup";0.5;1;29.0;2;25.0;2;0.0;0.0;45.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"P1050129.JPG";"mars16-MousB3inf";0.0;;0.0;;3.0;2;0.0;16.0;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;43;6;5;4;1;0;640;;;;;;0.5;0.5;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;0;0;;0;0;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Rouge";"P1050081.JPG";"mars16-MousB1sup";0.0;;55.0;2;0.0;;0.0;0.0;85.0;"Sable grossier";2.0;0;0;3;0;0;0;;;;;;16;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"P1050085.JPG";"mars16-MousB1inf";0.0;;4.0;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";20.0;0;0;0;0;0;0;;;;;;38;10;18;14;23;2;2680;;;;;;0.0;0.5;0.0;0.0;0.125;;60.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Verte";"P1050083.JPG";"mars16-MousB2sup";0.0;;50.0;2;0.0;;0.0;2.0;16.0;"Sable fin";19.0;0;3;4;3;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;3;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"P1050088.JPG";"mars16-MousB2inf";0.0;;1.0;1;0.0;;0.0;2.0;0.0;"Pas de s�diment";50.0;0;0;0;0;0;0;14;9;5;17;11;1120;21;28;18;7;16;3600;;;;;;0.0;0.5;0.0;0.0;0.1;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;3;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Blanche-Brune";"P1050125.JPG";"mars16-MousQ2";0.0;;30.0;2;0.5;2;0.0;0.0;55.0;"Sable fin";0.5;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune";"P1050080.JPG";"mars16-MousQ1";0.0;;60.0;2;0.0;;0.0;1.0;13.0;"Sable fin";25.0;0;4;23;2;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"P1050112.JPG";"mars16-MousB10sup";0.0;;60.0;2;0.0;;0.0;0.5;35.0;"Sable fin";7.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;2;0;0;;0;1;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"P1050119.JPG";"mars16-MousB10inf";0.0;;1.5;1;0.0;;0.0;8.0;0.0;"Pas de s�diment";40.0;0;2;1;0;0;0;;;;;;20;21;10;20;24;25;4000;;;;;;9.0;0.5;0.0;0.0;2.5;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;2;;2;0;0;;0;1;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune";"P1050110.JPG";"mars16-MousB9sup";0.0;;85.0;2;0.0;;0.0;0.5;85.0;"Sable grossier";0.0;0;1;2;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;3;0;0;;0;1;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"P1050114.JPG";"mars16-MousB9inf";0.0;;0.0;;0.0;;0.0;3.0;0.0;"Pas de s�diment";1.5;0;0;0;0;0;0;;;;;;103;17;11;9;5;10;2080;;;;;;14.0;3.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;3;0;0;;0;1;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc fix�";"5";"face sup�rieure";"Brune";"P1050108.JPG";"mars16-MousQ5";0.0;;27.0;2;0.0;;0.0;0.0;50.0;"Sable fin";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Brune";"P1050092.JPG";"mars16-MousQ4";1.0;2;35.0;2;1.0;2;0.0;5.0;9.0;"Sable fin";8.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;1.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Brune";"P1050136.JPG";"mars16-MousB6sup";0.0;;62.0;2;0.0;;0.0;0.0;30.0;"Sable fin";1.5;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;1;0;0;;0;0;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"P1050141.JPG";"mars16-MousB6inf";0.0;;5.0;2;0.0;;0.0;5.5;0.0;"Pas de s�diment";15.0;0;0;1;0;0;0;8;6;9;7;10;800;8;13;15;12;14;2480;;;;;;0.125;1.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;1;0;0;;0;0;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune";"P1050135.JPG";"mars16-MousB5sup";0.0;;16.0;2;0.0;;0.0;4.0;45.0;"D�bris coquilliers";5.0;0;0;0;0;0;0;;;;;;12;0;5;0;0;0;200;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;2;2;0;;0;0;0; +380670;"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"P1050138.JPG";"mars16-MousB5inf";0.0;;0.0;;0.0;;0.0;3.0;0.0;"Pas de s�diment";15.0;0;0;0;0;0;0;9;7;3;8;6;660;27;21;14;3;11;3040;;;;;;1.5;3.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;2;2;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Brune";"P1050497.JPG";"nov16-MousQ4";0.0;;40.0;2;15.0;2;0.0;0.0;70.0;"D�bris coquilliers";5.0;0;0;2;1;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Brune";"P1050511.JPG";"nov16-MousQ5";0.0;;80.0;2;2.0;2;0.0;0.0;65.0;"D�bris coquilliers";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune-Verte";"P1050487.JPG";"nov16-MousB3sup";0.0;;60.0;2;40.0;2;0.0;0.0;20.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Sable fin";;0;0;0;0;;;0;;0;3;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Blanche";"P1050488.JPG";"nov16-MousB3inf";0.0;;2.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";20.0;0;0;0;0;0;0;2;5;4;4;5;400;16;20;10;10;14;2800;;;;;;0.0;25.0;0.0;0.0;0.75;;20.0;"Sable fin";;0;0;0;0;;;0;;0;3;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Color�e";"P1050505.JPG";"nov16-MousB1sup";5.0;2;60.0;2;10.0;2;0.0;0.0;90.0;"Sable fin";10.0;0;0;15;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;5;0;;;0;;1;1;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Brune";"P1050506.JPG";"nov16-MousB1inf";2.0;2;10.0;2;3.0;2;0.0;10.0;0.0;"Pas de s�diment";80.0;0;1;0;0;0;0;;;;;;108;6;9;13;19;8;2200;;;;;;0.0;5.0;0.0;0.0;0.1;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;5;0;;;0;;1;1;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune";"P1050501.JPG";"nov16-MousB8sup";1.5;2;50.0;2;1.0;2;0.0;0.5;50.0;"Sable fin";1.5;0;2;5;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"P1050502.JPG";"nov16-MousB8inf";0.0;;0.5;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";45.0;0;1;0;0;0;0;11;5;21;12;11;1200;16;22;47;41;0;5040;;;;;;8.25;8.0;0.0;0.0;;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Blanche";"P1050499.JPG";"nov16-MousB7sup";2.0;2;20.0;2;20.0;2;0.0;0.0;0.0;"Pas de s�diment";30.0;0;0;4;0;0;0;;;;;;0;5;6;3;4;6;960;;;;;;0.25;0.0;0.0;0.0;2.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"P1050500.JPG";"nov16-MousB7inf";0.0;;2.5;2;5.0;2;0.0;15.0;0.0;"Pas de s�diment";25.0;0;0;0;0;0;0;13;10;4;3;5;700;17;9;8;12;8;2160;;;;;;0.0;5.0;0.0;0.0;10.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Rouge";"P1050494.JPG";"nov16-MousB6sup";0.0;;76.0;2;3.0;2;0.0;1.5;40.0;"Sable fin";30.0;0;3;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;2;;1;0;0;;0;1;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"P1050496.JPG";"nov16-MousB6inf";0.0;;0.5;2;0.0;;0.0;11.0;0.0;"Pas de s�diment";5.0;0;0;1;0;0;0;16;19;10;14;7;1320;15;24;27;13;0;3160;;;;;;16.0;15.0;1.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;2;;1;0;0;;0;1;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune";"P1050493.JPG";"nov16-MousB5sup";0.0;;40.0;2;10.0;2;0.0;0.0;9.0;"D�bris coquilliers";10.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.5;0.0;0.0;1.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;2;0;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"P1050495.JPG";"nov16-MousB5inf";0.0;;2.0;2;0.0;;0.0;8.0;0.0;"Pas de s�diment";9.0;0;0;0;0;0;0;4;2;6;4;4;400;10;4;5;8;25;2080;;;;;;0.5;25.0;0.0;0.0;1.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;0;;2;0;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"P1050489.JPG";"nov16-MousB4sup";0.0;;7.0;2;100.0;2;0.0;0.0;80.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;6;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Blanche";"P1050490.JPG";"nov16-MousB4inf";0.0;;40.0;2;0.0;;0.0;3.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;11;15;0;0;3;0;720;;;;;;2.0;12.0;0.0;1.0;0.0;;7.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;6;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Verte";"P1050507.JPG";"nov16-MousB2sup";0.0;;40.0;2;40.0;2;0.0;0.0;5.0;"D�bris coquilliers";30.0;0;0;4;0;0;0;;;;;;31;4;7;4;6;2;920;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Brune";"P1050508.JPG";"nov16-MousB2inf";0.0;;3.0;2;0.0;;0.0;10.5;0.0;"Pas de s�diment";70.0;0;0;0;0;0;0;;;;;;138;17;4;17;7;11;2240;;;;;;1.0;1.0;0.0;0.0;;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Brune";"P1050512.JPG";"nov16-MousB9sup";0.0;;80.0;2;1.0;2;0.0;0.0;70.0;"D�bris coquilliers";1.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Sable grossier";;0;1;1;0;;;0;;3;0;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"P1050513.JPG";"nov16-MousB9inf";0.0;;5.0;2;0.5;2;0.0;7.0;0.0;"Pas de s�diment";30.0;0;1;0;0;0;0;;;;;;60;12;6;32;45;45;5600;;;;;;3.5;15.0;0.0;0.0;0.5;;10.0;"Sable grossier";;0;1;1;0;;;0;;3;0;0;;0;0;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"P1050515.JPG";"nov16-MousB10sup";0.0;;70.0;2;10.0;2;0.0;0.0;90.0;"D�bris coquilliers";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Sable grossier";;0;2;0;0;;;0;;2;0;0;;0;1;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"P1050516.JPG";"nov16-MousB10inf";0.0;;10.0;2;1.0;2;0.0;17.5;0.0;"Pas de s�diment";20.0;0;0;1;0;0;0;;;;;;68;24;9;40;45;19;5480;;;;;;20.0;12.0;0.0;0.0;0.0;;50.0;"Sable grossier";;0;2;0;0;;;0;;2;0;0;;0;1;0; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Brune-Verte";"P1050503.JPG";"nov16-MousQ1";15.0;2;60.0;2;40.0;2;0.0;0.0;10.0;"Sable fin";25.0;0;0;0;0;0;0;;;;;;1;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;15.0;;;;;;;;;;;;;;;;;;;; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Brune";"P1050485.JPG";"nov16-MousQ2";0.0;;50.0;2;40.0;2;0.0;0.0;25.0;"D�bris coquilliers";0.0;0;0;0;2;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380733;"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Brune-Verte";"P1050492.JPG";"nov16-MousQ3";5.0;2;40.0;2;40.0;2;0.0;0.0;15.0;"Sable fin";3.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Rouge";"St-Nicolas_Q1_BM2_sup_10102014_MD.JPG";"oct14-GleB2sup";0.0;;70.0;2;0.0;;2.0;1.0;1.5;"Sable fin";11.0;0;0;1;0;0;0;;;;;;1;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;25;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"St-Nicolas_Q1_BM2_inf_10102014_MD.JPG";"oct14-GleB2inf";0.0;;1.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;10;;;;;;4680;;;;;;2.0;4.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;25;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Verte";"St-Nicolas_Q5_BM9_sup_10102014_MD.JPG";"oct14-GleB9sup";0.0;;0.0;;100.0;2;0.0;0.0;10.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.5;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Rouge";"St-Nicolas_Q5_BM9_inf_10102014_MD.JPG";"oct14-GleB9inf";5.0;2;40.0;2;0.0;;0.0;15.0;0.0;"Pas de s�diment";15.0;0;2;1;0;0;0;;;;;;0;;;;;;2880;;;;;;0.0;1.5;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Brune-Rouge";"St-Nicolas_Q1_Roche_10102014_MD.JPG";"oct14-GleQ1";10.0;2;70.0;2;1.0;2;0.0;7.0;80.0;"Sable fin";1.0;1;0;2;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Blanche";"St-Nicolas_Q5_BM10_sup_10102014_MD.JPG";"oct14-GleB10sup";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;1;0;0;0;;;;;;39;;;;;;2360;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Rouge";"St-Nicolas_Q5_BM10_inf_10102014_MD.JPG";"oct14-GleB10inf";6.0;2;45.0;2;25.0;2;0.0;2.5;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;1;;;;;;3000;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Verte";"St-Nicolas_Q2_BM4_sup_1_10102014_MD.JPG";"oct14-GleB4sup";3.0;2;15.0;2;70.0;2;0.0;0.0;20.0;"Sable fin";5.0;0;0;12;0;0;0;;;;;;1;;;;;;520;;;;;;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;2;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"St-Nicolas_Q2_BM4_inf_10102014_MD.JPG";"oct14-GleB4inf";0.0;;2.0;2;0.0;;0.0;3.0;0.0;"Pas de s�diment";2.0;0;0;4;0;0;0;;;;;;212;;;;;;3960;;;;;;11.0;1.5;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;2;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Blanche";"St-Nicolas_Q2_BM3_sup_10102014_MD.JPG";"oct14-GleaB3sup";0.0;;15.0;2;0.0;;0.0;0.0;15.0;"Sable fin";10.0;0;0;4;6;0;0;;;;;;0;;;;;;880;;;;;;0.0;0.5;0.0;0.0;1.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"St-Nicolas_Q2_BM3_inf_10102014_MD.JPG";"oct14-GleB3inf";0.0;;0.0;;0.0;;0.0;7.0;0.0;"Pas de s�diment";6.0;0;0;1;0;0;0;;;;;;2;;;;;;4720;;;;;;5.0;2.0;0.5;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche";"St-Nicolas_Q1_BM1_sup_10102014_MD.JPG";"oct14-GleB1sup";0.0;;21.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";40.0;0;0;1;0;0;0;;;;;;89;;;;;;880;;;;;;0.0;1.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;2;0;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"St-Nicolas_Q1_BM1_inf_10102014_MD.JPG";"oct14-GleB1inf";0.0;;1.0;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;0;1;0;0;0;;;;;;79;;;;;;4880;;;;;;0.0;3.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;2;0;0;;0;0;0; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Brune-Rouge";"St-Nicolas_Q5_Roche_10102014_MD.JPG";"oct14-GleQ5";10.0;2;50.0;2;0.0;;5.0;0.0;60.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380800;"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Brune";"St-Nicolas_Q2_bloc_fixe_10102014_MD.JPG";"oct14-GleQ2";60.0;2;50.0;2;2.0;2;0.0;0.0;25.0;"Sable fin";0.0;0;0;3;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Rouge-Verte";"QECB_GLENA_Q4_B7_sup.JPG";"mar15-GlenB7sup";0.0;;20.0;2;80.0;2;0.0;0.0;0.0;;5.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;10.0;5.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;1;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"QECB_GLENA_Q4_B7_inf.JPG";"mar15-GlenB7inf";0.0;;0.0;;0.0;;0.0;25.0;0.0;;1.0;0;0;0;0;0;0;;;;;;17;40;35;40;16;20;6040;;;;;;12.0;4.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;1;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Blanche-Rouge";"QECB_GLENA_Q1_B1_sup.JPG";"mar15-GlenB1sup";0.0;;25.0;2;0.0;;0.0;6.0;0.0;;25.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Blanche";"QECB_GLENA_Q1_B1_inf.JPG";"mar15-GlenB1inf";0.0;;0.0;;0.0;;0.0;1.5;0.0;;0.5;0;0;0;0;0;0;;;;;;17;25;50;50;33;32;7600;;;;;;0.5;5.0;0.0;0.0;0.0;;25.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Rouge";"QECB_GLENA_Q1_B2_sup.JPG";"mar15-GlenB2sup";20.0;2;90.0;2;0.0;;0.0;0.0;80.0;"Sable fin";0.5;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;2;0;0;0;;;0;;0;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Blanche";"QECB_GLENA_Q1_B2_inf.JPG";"mar15-GlenB2inf";0.0;;0.0;;0.0;;0.0;0.25;0.0;;0.5;0;2;1;0;0;0;;;;;;5;27;33;46;30;32;6720;;;;;;1.0;3.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;2;0;0;0;;;0;;0;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune-Rouge";"QECB_GLENA_Q2_B4_sup.JPG";"mar15-GlenB4sup";45.0;2;35.0;2;2.5;2;0.0;0.5;17.0;"Sable fin";0.0;0;0;13;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;1.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;1;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"QECB_GLENA_Q2_B4_inf.JPG";"mar15-GlenB4inf";0.0;;1.0;2;0.5;2;0.0;0.0;0.0;;3.0;0;2;6;0;0;0;;;;;;1;25;25;4;6;3;2520;;;;;;6.0;6.5;0.0;3.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;1;;1;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc fix�";"1";"face sup�rieure";"Brune-Rouge";"QECB_GLENA_Q1_ref.JPG";"mar15-GlenQ1";50.0;2;50.0;2;0.0;;0.0;0.5;0.0;;2.0;0;7;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc fix�";"2";"face sup�rieure";"Rouge";"QECB_GLENA_Q2_ref.JPG";"mar15-GlenQ2";5.0;2;80.0;2;15.0;2;0.0;0.0;2.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc fix�";"3";"face sup�rieure";"Brune-Rouge";"QECB_GLENA_Q3_ref.JPG";"mar15-GlenQ3";50.0;3;50.0;2;10.0;2;0.0;0.0;100.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;3.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Brune";"QECB_GLENA_Q4_ref.JPG";"mar15-GlenQ4";60.0;2;20.0;2;5.0;2;0.0;15.0;1.0;"Sable fin";0.0;0;0;19;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;2.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Rouge";"QECB_GLENA_Q5_ref.JPG";"mar15-GlenQ5";15.0;3;80.0;2;0.0;;0.0;0.0;75.0;"Sable fin";0.0;0;0;3;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;1.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune-Rouge";"QECB_GLENA_Q2_B3_sup.JPG";"mar15-GlenB3sup";30.0;2;70.0;2;1.0;2;0.0;0.0;1.0;"Sable fin";0.0;0;3;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;1;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"QECB_GLENA_Q2_B3_inf.JPG";"mar15-GlenB3inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;;0.0;0;0;0;0;0;0;;;;;;2;;;;;;75;;;;;;8.5;4.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;1;0;0;0;;;0;;0;1;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Rouge";"QECB_GLENA_Q3_B5_sup.JPG";"mar15-GlenB5sup";15.0;3;70.0;2;80.0;2;0.0;0.0;100.0;"Sable fin";0.0;0;0;0;0;0;1;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;1;;1;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"QECB_GLENA_Q3_B5_inf.JPG";"mar15-GlenB5inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;;1.5;0;0;0;0;0;0;;;;;;11;18;11;18;5;23;3000;;;;;;13.0;6.5;0.0;3.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;2;0;0;;;1;;1;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Brune-Rouge";"QECB_GLENA_Q3_B6_sup.JPG";"mar15-GlenB6sup";40.0;3;80.0;2;0.0;;0.0;0.0;100.0;"Sable fin";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;1.125;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"QECB_GLENA_Q3_B6_inf.JPG";"mar15-GlenB6inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;;8.0;0;1;0;0;0;0;;;;;;7;28;9;26;25;23;4440;;;;;;5.0;15.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Rouge";"QECB_GLENA_Q4_B8_sup.JPG";"mar15-GlenB8sup";0.5;3;95.0;2;0.5;2;0.0;0.0;45.0;"Sable fin";7.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.25;1.5;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;3;2;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"QECB_GLENA_Q4_B8_inf.JPG";"mar15-GlenB8inf";0.0;;0.0;;0.0;;0.0;0.5;0.0;;1.0;0;0;0;0;0;0;;;;;;19;28;15;15;14;17;3560;;;;;;1.5;3.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;3;2;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Rouge-Verte";"QECB_GLENA_Q5_B9_sup.JPG";"mar15-GlenB9sup";0.0;;50.0;2;90.0;2;0.0;0.0;100.0;"Sable fin";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Sable fin";;0;0;0;0;;;1;;3;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Blanche";"QECB_GLENA_Q5_B9_inf.JPG";"mar15-GlenB9inf";0.0;;3.0;2;0.0;;0.0;1.0;0.0;;1.5;0;0;0;0;0;0;;;;;;11;17;25;22;17;38;4760;;;;;;1.5;6.0;0.0;0.0;0.0;;5.0;"Sable fin";;0;0;0;0;;;1;;3;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Rouge";"QECB_GLENA_Q5_B10_sup.JPG";"mar15-GlenB10sup";0.0;;65.0;2;3.0;2;0.0;0.0;100.0;"Sable fin";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;1;0;0;;0;0;0; +380859;"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"QECB_GLENA_Q5_B10_inf.JPG";"mar15-GlenB10inf";0.0;;0.5;2;0.0;;0.0;4.0;0.0;;4.0;0;0;1;0;0;0;;;;;;0;30;14;53;24;22;5720;;;;;;6.0;8.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;1;0;0;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune";"DSC_0006.JPG";"avr16-GlenB4sup";25.0;2;60.0;2;1.0;1;0.0;0.0;40.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;5;1;0;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"DSC_0007.JPG";"avr16-GlenB4inf";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;0;20;22;6;8;10;2640;;;;;;4.0;5.0;0.0;0.0;0.0;;40.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;5;1;0;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Verte";"DSC_0030.JPG";"avr16-GlenB5sup";0.0;;30.0;2;30.0;2;0.0;0.0;15.0;"Sable fin";5.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;3;1;0;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"DSC_0032.JPG";"avr16-GlenB5inf";0.0;;2.0;2;2.0;2;0.0;10.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;3;36;15;17;36;22;5040;;;;;;0.0;5.0;0.0;0.0;0.0;;1.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;3;1;0;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Brune";"DSC_0031.JPG";"avr16-GlenB6sup";1.0;1;60.0;2;2.0;2;0.0;0.0;38.0;"Sable fin";2.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;4;;1;0;0;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"DSC_0033.JPG";"avr16-GlenB6inf";0.0;;0.0;;0.0;;0.0;5.0;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;0;18;25;22;9;36;4400;;;;;;10.0;5.0;0.0;0.0;0.0;;;"Petits blocs, sable grossier, d�bris coquillers";;1;1;0;0;;;4;;1;0;0;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Brune";"DSC_0013.JPG";"avr16-GlenB7sup";20.0;3;40.0;2;0.0;;0.0;0.0;40.0;"Sable fin";0.0;0;1;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;2;0;3;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"DSC_0019.JPG";"avr16-GlenB7inf";0.0;;0.0;;0.0;;0.0;2.0;0.0;"Pas de s�diment";3.0;0;0;0;0;0;0;;;;;;2;17;;34;17;40;4320;;;;;;15.0;5.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;2;0;3;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune";"DSC_0023.JPG";"avr16-GlenB8sup";7.0;3;70.0;2;1.0;2;0.0;0.0;28.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;3;;2;0;0;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"DSC_0024.JPG";"avr16-GlenB8inf";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;0;0;0;0;;;;;;4;18;26;26;32;15;4680;;;;;;15.0;10.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;3;;2;0;0;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Verte";"DSC_0039.JPG";"avr16-GlenB9sup";1.0;1;25.0;2;20.0;2;0.0;0.0;10.0;"Sable fin";44.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;2;;3;0;0;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Color�e";"DSC_0042.JPG";"avr16-GlenB9inf";0.0;;8.0;;0.0;;0.0;10.0;0.0;"Pas de s�diment";0.0;0;0;1;0;0;0;;;;;;0;31;25;16;7;21;4000;;;;;;15.0;5.0;0.5;0.0;0.0;;2.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;2;;3;0;0;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"DSC_0041.JPG";"avr16-GlenB10sup";15.0;2;30.0;2;4.0;2;0.0;3.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";;;"avr16-GlenB10inf";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;;; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune";"DSC_0008.JPG";"avr16-GlenB3sup";0.0;;85.0;2;0.2;1;0.0;0.0;15.0;"Sable fin";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Sable grossier";;0;0;0;0;;;0;;0;0;1;;0;0;0; +380926;"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"DSC_0009.JPG";"avr16-GlenB3inf";0.0;;0.0;;0.0;;0.0;3.5;0.0;"Pas de s�diment";1.0;0;2;2;0;0;0;;;;;;21;33;32;26;31;28;6000;;;;;;1.5;5.0;0.0;0.0;0.0;;20.0;"Sable grossier";;0;0;0;0;;;0;;0;0;1;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"2";"face sup�rieure";"Brune-Verte";"DSC00152.JPG";"oct16-GlenB2sup";6.0;3;45.0;2;30.0;3;0.0;0.0;0.0;"Pas de s�diment";45.0;0;0;3;0;0;0;;;;;;0;42;8;21;1;12;3360;;;;;;0.0;0.0;0.0;0.0;0.0;;8.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"2";"face inf�rieure";"Color�e";"DSC00155.JPG";"oct16-GlenB2inf";0.0;;1.0;2;0.0;;0.0;8.0;0.0;"Pas de s�diment";8.0;0;0;0;0;0;0;;;;;;16;27;69;47;46;23;8480;;;;;;0.5;2.0;0.0;4.0;0.5;;8.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;1;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Roche en place";"2";"face sup�rieure";"Brune";"DSC00143.JPG";"oct16-GlenQ2";95.0;3;6.0;2;0.0;;0.0;18.0;15.0;"Sable fin";3.0;0;0;2;0;0;0;;;;;;0;3;17;2;2;0;960;;;;;;0.2;1.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"4";"face sup�rieure";"Brune";"DSC00139.JPG";"oct16-GlenB4sup";30.0;3;65.0;2;3.0;2;0.0;6.0;40.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;1;3;0;0;;;0;;2;0;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"4";"face inf�rieure";"Color�e";"DSC00142.JPG";"oct16-GlenB4inf";0.0;;3.0;2;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;0;0;0;0;0;;;;;;0;57;26;44;29;46;8080;;;;;;10.0;4.0;0.0;0.0;0.5;;3.0;"Petits blocs, sable grossier, d�bris coquillers";;1;3;0;0;;;0;;2;0;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"5";"face sup�rieure";"Brune-Verte";"DSC00144.JPG";"oct16-GlenB5sup";0.5;2;90.0;2;30.0;2;0.0;1.0;10.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;27;;;;;;1.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;2;;0;2;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"5";"face inf�rieure";"Color�e";"DSC00145.JPG";"oct16-GlenB5inf";0.0;;10.0;2;0.0;;0.0;3.5;0.0;"Pas de s�diment";1.0;0;0;0;0;0;0;;;;;;7;37;54;24;43;44;8080;;;;;;7.0;3.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;2;;0;2;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Roche en place";"1";"face sup�rieure";"Brune";"DSC05995.JPG";"oct16-GlenQ1";90.0;3;3.0;2;2.0;2;0.0;80.0;1.0;"Sable fin";10.0;0;0;15;0;0;0;;;;;;0;18;28;2;19;15;3280;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"6";"face sup�rieure";"Verte";"DSC00146.JPG";"oct16-GlenB6sup";1.0;2;37.5;2;30.0;3;0.0;1.5;15.0;"Sable fin";4.0;0;0;0;0;0;0;;;;;;15;16;5;7;0;0;1120;;;;;;0.0;1.0;0.0;0.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"6";"face inf�rieure";"Color�e";"DSC00147.JPG";"oct16-GlenB6inf";0.0;;8.0;2;0.0;;0.0;5.0;0.0;"Pas de s�diment";4.0;0;0;0;0;0;0;;;;;;0;70;30;8;20;82;8400;;;;;;5.5;15.0;0.0;0.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;2;0;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"9";"face sup�rieure";"Verte";"DSC00148.JPG";"oct16-GlenB9sup";0.0;;0.0;;8.0;2;0.0;0.0;0.0;"Pas de s�diment";19.0;0;0;0;0;0;0;;;;;;7;28;33;34;18;28;5640;;;;;;0.0;0.0;0.0;0.0;1.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;1;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"9";"face inf�rieure";"Rouge";"DSC00150.JPG";"oct16-GlenB9inf";0.0;;80.0;2;1.0;2;0.0;1.5;0.0;"Pas de s�diment";0.0;0;0;1;0;0;0;;;;;;0;16;27;22;16;19;4000;;;;;;0.5;0.75;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;1;;0;1;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"7";"face sup�rieure";"Verte";"DSC00134.JPG";"oct16-GlenB7sup";0.0;;100.0;2;50.0;2;0.0;0.0;20.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"7";"face inf�rieure";"Color�e";"DSC00136.JPG";"oct16-GlenB7inf";0.0;;0.0;;3.0;2;0.0;0.0;0.0;"Pas de s�diment";5.0;0;0;0;0;0;0;;;;;;1;21;31;22;9;33;4640;;;;;;10.0;0.5;0.0;0.0;0.1;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"8";"face sup�rieure";"Brune";"DSC00135.JPG";"oct16-GlenB8sup";40.0;2;80.0;2;1.0;2;0.0;0.0;10.0;"Sable fin";1.0;0;0;2;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;15.0;"Blocs";;0;1;0;0;;;0;;6;0;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"8";"face inf�rieure";"Color�e";"DSC00137.JPG";"oct16-GlenB8inf";0.0;;2.0;2;0.0;;0.0;1.0;0.0;"Pas de s�diment";8.0;0;0;0;0;0;0;;;;;;6;83;49;120;70;38;14400;;;;;;12.0;5.0;0.0;3.0;25.0;;15.0;"Blocs";;0;1;0;0;;;0;;6;0;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"10";"face sup�rieure";"Brune";"DSC00149.JPG";"oct16-GlenB10sup";15.0;3;65.0;2;5.0;2;0.0;0.0;5.0;"Sable fin";8.0;0;0;0;0;0;0;;;;;;0;8;5;0;1;0;560;;;;;;0.0;0.0;0.0;0.0;0.0;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;2;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"10";"face inf�rieure";"Color�e";"DSC00151.JPG";"oct16-GlenB10inf";0.0;;0.0;;0.0;;0.0;6.0;0.0;"Pas de s�diment";12.0;0;0;0;0;0;0;;;;;;20;44;53;36;13;71;8680;;;;;;2.0;11.0;0.0;0.0;1.5;;6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;1;2;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"3";"face sup�rieure";"Brune-Verte";"DSC00140.JPG";"oct16-GlenB3sup";10.0;2;70.0;2;7.0;2;0.0;4.0;2.0;"Sable fin";10.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;14;;;;;;0.0;0.0;0.0;0.0;0.25;;70.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"3";"face inf�rieure";"Color�e";"DSC00141.JPG";"oct16-GlenB3inf";0.0;;5.0;2;0.5;2;0.0;3.0;1.5;;0.0;0;0;0;0;0;0;;;;;;0;53;30;49;42;56;9200;;;;;;0.5;3.5;0.0;0.0;0.1;;70.0;"Blocs";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Roche en place";"5";"face sup�rieure";"Brune";"DSC05990.JPG";"oct16-GlenQ5";90.0;3;70.0;2;0.0;;0.0;0.0;50.0;"Sable fin";0.0;0;0;0;9;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Roche en place";"4";"face sup�rieure";"Brune";"DSC00138.JPG";"oct16-GlenQ4";50.0;2;30.0;2;20.0;2;0.0;0.0;30.0;"Sable fin";0.0;0;0;1;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Roche en place";"3";"face sup�rieure";"Brune";"DSC05985.JPG";"oct16-GlenQ3";95.0;3;70.0;2;0.0;;0.0;20.0;50.0;"D�bris coquilliers";0.5;0;0;10;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"1";"face sup�rieure";"Verte";"DSC00153.JPG";"oct16-GlenB1sup";30.0;2;80.0;2;0.0;;0.0;0.0;7.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;0;0;0;0;0;0;;;;;;0.25;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +380973;"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"Bloc mobile";"1";"face inf�rieure";"Color�e";"DSC00154.JPG";"oct16-GlenB1inf";0.0;;7.0;2;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.25;0;0;0;0;0;0;;;;;;5;30;32;48;46;45;8040;;;;;;7.0;3.0;0.0;0.0;0.1;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +494799;"2020-10-16-PNMI-CDB-003";"Bloc fix�";"4";"face sup�rieure";"Brune-Rouge";;"BF4";10.0;;80.0;;5.0;;0.0;1.0;;;0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"6";"face sup�rieure";"Brune-Rouge";;"Q3q2";0.0;;80.0;;10.0;;0.0;5.0;40.0;"Sable grossier";0.0;1;1;0;0;;;;;;;;0;0;0;0;0;0;0;;;;;;0.0;2.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;1;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"6";"face inf�rieure";"Color�e";;"Q3q2";0.0;;0.0;;0.0;;0.0;2.0;0.0;;5.0;0;0;0;0;;;;;;;;0;33;56;31;29;43;7680;;;;;;5.0;15.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;1;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc fix�";"1";"face sup�rieure";"Brune-Rouge";;"BF1";1.0;;90.0;;15.0;;0.0;0.0;0.0;;1.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc fix�";"3";"face sup�rieure";"Brune-Rouge";;"BF3";70.0;;30.0;;1.0;;0.0;2.0;;;0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"3";"face sup�rieure";"Brune-Rouge";;"Q2q1";5.0;;80.0;;5.0;;0.0;15.0;50.0;"Sable grossier";3.0;0;0;0;0;;;;;;;;0;0;0;0;0;0;0;;;;;;1.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"3";"face inf�rieure";"Color�e";;"Q2q1";0.0;;0.0;;0.0;;0.0;5.0;;;5.0;0;6;0;0;;;;;;;;0;65;31;19;51;46;8480;;;;;;20.0;30.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"4";"face sup�rieure";"Brune-Rouge";;"Q2q2";5.0;;80.0;;10.0;;0.0;20.0;30.0;"Sable grossier";0.0;1;1;0;0;;;;;;;;0;;;;;;0;;;;;;0.0;1.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;1;;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"4";"face inf�rieure";"Color�e";;"Q2q2";0.0;;0.0;;0.0;;0.0;3.0;;;5.0;0;4;0;0;;;;;;;;0;55;36;62;66;36;10200;;;;;;5.0;20.0;0.0;0.0;0.0;;70.0;"Petits blocs, sable grossier, d�bris coquillers";;1;;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"1";"face sup�rieure";"Brune-Rouge";;"Q1q1";0.0;;60.0;;10.0;;0.0;15.0;20.0;"Sable grossier";0.0;0;0;0;0;;;;;;;;0;;;;;;0;;;;;;2.0;1.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"1";"face inf�rieure";"Color�e";;"Q1q1";0.0;;0.0;;0.0;;0.0;0.0;;;5.0;0;2;0;0;;;;;;;;0;64;44;86;51;26;10840;;;;;;15.0;25.0;0.0;0.0;0.0;;80.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"7";"face sup�rieure";"Brune-Rouge";;"Q4q1";0.0;;80.0;;0.0;;0.0;5.0;70.0;"Sable grossier";1.0;0;0;0;0;;;;;;;;0;;;;;;0;;;;;;1.0;0.0;0.0;0.0;0.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;1;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"7";"face inf�rieure";"Brune-Rouge";;"Q4q1";0.0;;0.0;;0.0;;0.0;0.0;;;5.0;0;2;0;0;;;;;;;;0;38;42;25;31;23;6360;;;;;;35.0;20.0;0.0;0.0;0.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;1;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"8";"face sup�rieure";"Brune-Rouge";;"Q4q2";3.0;;60.0;;0.0;;0.0;15.0;45.0;"Sable grossier";0.0;0;0;0;0;;;;;;;;0;;;;;;0;;;;;;1.0;3.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"8";"face inf�rieure";"Color�e";;"Q4q2";0.0;;0.0;;0.0;;0.0;5.0;;;5.0;0;0;0;0;;;;;;;;0;48;36;33;29;36;7280;;;;;;10.0;20.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"2";"face sup�rieure";"Brune-Rouge";;"Q1q2";0.0;;70.0;;2.0;;0.0;30.0;20.0;"Sable grossier";10.0;0;0;0;0;;;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;;2;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"2";"face inf�rieure";"Color�e";;"Q1q2";0.0;;0.0;;0.0;;0.0;5.0;;;5.0;0;2;0;0;;;;;;;;0;48;54;91;52;38;11320;;;;;;10.0;40.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;;2;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"9";"face sup�rieure";"Brune-Rouge";;"Q5q1";1.0;;80.0;;10.0;;0.0;0.0;90.0;"Sable grossier";0.0;0;0;0;0;;;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;1;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"9";"face inf�rieure";"Color�e";;"Q5q1";0.0;;0.0;;0.0;;0.0;0.0;;;5.0;0;11;0;0;;;;;;;;0;56;59;45;32;39;9240;;;;;;10.0;20.0;0.0;0.0;0.0;;95.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;1;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"10";"face sup�rieure";"Brune-Rouge";;"Q5q2";1.0;;75.0;;0.0;;0.0;10.0;60.0;"Sable grossier";5.0;0;0;0;0;;;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;1;;;1;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"10";"face inf�rieure";"Color�e";;"Q5q2";0.0;;0.0;;0.0;;0.0;0.0;;;5.0;0;0;0;0;;;;;;;;0;25;26;25;45;40;6440;;;;;;70.0;10.0;0.0;0.0;0.0;;90.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;1;;;1;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"5";"face sup�rieure";"Brune-Rouge";;"Q3q1";0.0;;100.0;;5.0;;0.0;2.0;80.0;"Sable grossier";0.0;0;1;0;0;0;0;;;;;;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;"";80.0;"Petits blocs, sable grossier, d�bris coquillers";;;2;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc mobile";"5";"face inf�rieure";"Color�e";;"Q3q1";0.0;;0.0;;0.0;;0.0;1.0;0.0;;10.0;0;8;0;0;0;0;;;;;;0;72;42;53;33;24;8960;0;0;0.0;0.0;0.0;15.0;5.0;0.0;0.0;0.0;"";80.0;"Petits blocs, sable grossier, d�bris coquillers";;;2;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc fix�";"5";"face sup�rieure";"Brune-Rouge";;"BF5";5.0;;85.0;;1.0;;0.0;2.0;;;0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;2.0;3.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +494799;"2020-10-16-PNMI-CDB-003";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";;"BF2";5.0;;75.0;;10.0;;0.0;10.0;;;0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +512043;"2021-11-03-PNMI-CDB-001";"Bloc mobile";"3";"face sup�rieure";"Rouge";"Q2_BM.JPG";"Q2_BM_dessus_A2021";52.0;2;40.0;2;1.0;2;0.0;5.0;10.0;"Sable fin";0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;1;0;0;0;2;0;1;0;0;0;0;0;0; +512043;"2021-11-03-PNMI-CDB-001";"Bloc mobile";"3";"face inf�rieure";"Blanche";"Q2_BM_dessous.JPG";"Q2_BM_dessous_A2021";0.0;;0.0;;0.0;;0.0;0.0;0.0;;0.0;0;0;0;0;0;0;;;;;;2;;;;;;50;0;0;0.0;0.0;0.0;10.0;10.0;0.0;0.0;0.0;;50.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;1;0;0;0;2;0;1;0;0;0;0;0;0; +512043;"2021-11-03-PNMI-CDB-001";"Bloc mobile";"1";"face sup�rieure";"Rouge";"Q1_BM.JPG";"Q1_BM1_dessus_A2021";0.0;;85.0;2;5.0;2;0.0;1.0;1.0;"Sable fin";0.0;0;1;1;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;1;0;0;0;0;0;0;1;0; +512043;"2021-11-03-PNMI-CDB-001";"Bloc mobile";"1";"face inf�rieure";"Blanche";"Q1_BM_dessous.JPG";"Q1_BM1_dessous_A2021";0.0;;5.0;2;0.0;;0.0;0.0;;;4.0;1;3;0;0;0;0;0;0;0;0;0;0;34;0;40;18;13;4200;0;0;0.0;0.0;0.0;6.5;0.0;1.0;0.0;0.0;;15.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;1;0;0;0;0;0;0;1;0; +512043;"2021-11-03-PNMI-CDB-001";"Bloc fix�";"1";"face sup�rieure";"Rouge";"Q1_BF.JPG";"Q1_BF_A2021";30.0;2;40.0;2;0.5;2;0.0;0.0;10.0;"Sable fin";0.0;1;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +512043;"2021-11-03-PNMI-CDB-001";"Bloc mobile";"5";"face sup�rieure";"Rouge";"Q3_BM.JPG";"Q3_BM_dessus_A2021";15.0;2;40.0;2;0.0;;0.0;3.0;5.0;"Sable fin";0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;"lepadogaster" +512043;"2021-11-03-PNMI-CDB-001";"Bloc mobile";"5";"face inf�rieure";"Blanche";"Q3_BM_dessous.JPG";"Q3_BM_dessous_A2021";0.0;;0.25;2;0.0;;0.0;1.0;0.0;;0.0;0;0;0;0;0;0;0;0;0;0;0;0;35;29;15;37;38;6160;0;0;0.0;0.0;0.0;4.0;0.5;0.0;0.0;0.0;;4.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;"lepadogaster" +512043;"2021-11-03-PNMI-CDB-001";"Bloc fix�";"2";"face sup�rieure";"Rouge";"Q2_BF.JPG";"Q2_BF_A2021";15.0;2;80.0;2;2.0;2;0.0;5.0;10.0;"Sable fin";0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +512043;"2021-11-03-PNMI-CDB-001";"Bloc mobile";"7";"face sup�rieure";"Rouge";"Q4_BM.JPG";"Q4_BM_dessus_A2021";20.0;2;60.0;2;0.0;;0.0;5.0;50.0;"Sable fin";0.0;1;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;40.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +512043;"2021-11-03-PNMI-CDB-001";"Bloc mobile";"7";"face inf�rieure";"Blanche";"Q4_BM_dessous.JPG";"Q4_BM_dessous_A2021";0.0;;0.0;;0.0;;0.0;0.0;0.0;;1.0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;9000;0;0;0.0;0.0;0.0;0.0;0.0;1.0;0.0;0.0;;40.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +512043;"2021-11-03-PNMI-CDB-001";"Bloc fix�";"3";"face sup�rieure";"Brune";"Q3_BF.JPG";"Q3_BF_A2021";8.0;2;45.0;2;0.0;;0.0;2.0;20.0;"Sable fin";0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;"";;;;;;;;;;;;;;;;;;; +512043;"2021-11-03-PNMI-CDB-001";"Bloc fix�";"5";"face sup�rieure";"Rouge";"Q5_BF.JPG";"Q5_BF_A2021";20.0;2;80.0;2;1.0;2;0.5;3.0;5.5;"Sable fin";0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;"";;;;;;;;;;;;;;;;;;; +512043;"2021-11-03-PNMI-CDB-001";"Bloc mobile";"9";"face sup�rieure";"Rouge";"Q5_BM.JPG";"Q5_BM_dessus_A2021";10.0;2;40.0;2;0.0;;0.5;5.0;5.0;"Sable fin";0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +512043;"2021-11-03-PNMI-CDB-001";"Bloc mobile";"9";"face inf�rieure";"Blanche";"Q5_BM_dessous.JPG";"Q5_BM_dessous_A2021";0.0;;2.5;2;0.0;;0.0;0.5;0.0;;0.0;0;0;0;0;0;0;0;0;0;0;0;0;6;15;21;42;3;3480;0;0;0.0;0.0;0.0;10.5;2.5;0.5;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;; +512569;"2021-10-07-EGMP-CDB-001";"Bloc fix�";"3";"face sup�rieure";"Brune-Rouge";"2021-10-07_EGMP_119_CDB-3_sup_514182.JPG";"EVALHABLOC_CHASSIRON_QECB_Q3_BF";0.0;;50.0;1;15.0;2;0.0;5.0;10.0;"Sable grossier";3.0;0;0;0;6;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +512569;"2021-10-07-EGMP-CDB-001";"Bloc mobile";"3";"face sup�rieure";"Blanche-Brune";"2021-10-07_EGMP_119_CDB-2_sup_514386.JPG";"EVALHABLOC_CHASSIRON_QECB_Q2_BM_FS";0.0;;19.0;2;7.0;2;0.0;8.0;0.0;;0.0;0;0;1;1;0;0;;;;;;0;;;;;;0;0;0;0.5;0.5;0.0;0.0;0.0;0.0;0.0;0.0;;70.0;"Sable grossier";;0;0;0;0;2;0;0;1;0;0;0;0;0;0;0;"4 porcellanes � pinces plates" +512569;"2021-10-07-EGMP-CDB-001";"Bloc mobile";"3";"face inf�rieure";"Color�e";"EVALHABLOC_CHASSIRON_QECB_Q2_BM_FI_2.JPG";"EVALHABLOC_CHASSIRON_QECB_Q2_BM_FI";0.0;;0.0;;0.0;;0.0;3.0;0.0;;0.0;0;0;0;2;0;0;;;;;;100;;;;;;29;0;0;0.0;0.0;2.0;1.0;2.0;1.0;0.0;0.0;;70.0;"Sable grossier";;0;0;0;0;2;0;0;1;0;0;0;0;0;0;0;"4 porcellanes � pinces plates" +512569;"2021-10-07-EGMP-CDB-001";"Bloc mobile";"5";"face sup�rieure";"Blanche-Verte";"2021-10-07_EGMP_119_CDB-3_sup_514418.JPG";"EVALHABLOC_CHASSIRON_QECB_Q3_BM_FS";0.0;;35.0;2;45.0;2;0.0;35.0;0.0;;0.0;0;0;0;2;0;0;;;;;;0;;;;;;0;0;0;0.5;9.0;0.0;0.0;0.0;0.0;0.0;0.0;;70.0;"Blocs";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0;"5 porcellanes � pinces plates" +512569;"2021-10-07-EGMP-CDB-001";"Bloc mobile";"5";"face inf�rieure";"Color�e";"2021-10-07_EGMP_119_CDB-3_inf_514418.JPG";"EVALHABLOC_CHASSIRON_QECB_Q3_BM_FI";0.0;;25.0;1;25.0;2;0.0;0.0;0.0;;0.0;0;0;0;0;0;0;;;;;;20;;;;;;0;0;0;0.0;5.0;7.0;7.0;0.0;0.0;0.0;5.0;;70.0;"Blocs";;0;0;0;0;0;0;0;0;2;0;0;0;0;0;0;"5 porcellanes � pinces plates" +512569;"2021-10-07-EGMP-CDB-001";"Bloc mobile";"7";"face sup�rieure";"Verte";"2021-10-07_EGMP_119_CDB-4_sup_515134.JPG";"EVALHABLOC_CHASSIRON_QECB_Q4_BM_FS";0.0;;4.0;2;60.0;2;0.0;6.5;0.0;;0.0;0;0;0;1;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;2.5;12.5;0.0;0.0;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;;0;;0;0;"1 porcellane � pinces plates" +512569;"2021-10-07-EGMP-CDB-001";"Bloc mobile";"7";"face inf�rieure";"Color�e";"2021-10-07_EGMP_119_CDB-4_inf_515134.JPG";"EVALHABLOC_CHASSIRON_QECB_Q4_BM_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;;0.0;0;0;0;0;0;0;;;;;;34;;;;;;0;0;0;0.0;0.0;8.0;25.0;1.5;1.5;0.0;0.0;;30.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;;0;;0;0;"1 porcellane � pinces plates" +512569;"2021-10-07-EGMP-CDB-001";"Bloc fix�";"5";"face sup�rieure";"Blanche-Brune";"2021-10-07_EGMP_119_CDB-5_sup_514190.JPG";"EVALHABLOC_CHASSIRON_QECB_Q5_BF";0.0;;20.0;1;2.0;2;0.0;25.0;0.0;"Sable grossier";1.5;0;0;0;1;0;0;;;;;;6;;;;;;0;0;0;0.0;0.5;0.0;0.0;0.0;0.0;0.0;3.0;;;;;;;;;;;;;;;;;;;; +512569;"2021-10-07-EGMP-CDB-001";"Bloc fix�";"4";"face sup�rieure";"Blanche-Brune";"2021-10-07_EGMP_119_CDB-4_sup_514186.JPG";"EVALHABLOC_CHASSIRON_QECB_Q4_BF";0.0;;20.0;2;20.0;2;0.0;0.0;5.0;"Sable grossier";50.0;0;0;0;0;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +512569;"2021-10-07-EGMP-CDB-001";"Bloc fix�";"2";"face sup�rieure";"Brune-Rouge";"2021-10-07_EGMP_119_CDB-2_sup_514178.JPG";"EVALHABLOC_CHASSIRON_QECB_Q2_BF";0.0;;15.0;1;10.0;2;0.0;1.5;0.0;"Sable grossier";5.0;0;0;0;3;0;0;;;;;;0;;;;;;0;0;0;3.0;4.0;0.0;0.5;0.0;0.0;0.0;0.5;"";;;;;;;;;;;;;;;;;;; +512569;"2021-10-07-EGMP-CDB-001";"Bloc mobile";"9";"face sup�rieure";"Blanche-Verte";"2021-10-07_EGMP_119_CDB-5_sup_515138.JPG";"EVALHABLOC_CHASSIRON_QECB_Q5_BM_FS";0.0;;15.0;1;20.0;2;0.0;40.0;0.0;;0.0;0;0;0;1;0;0;;;;;;0;;;;;;0;0;0;0.0;10.5;0.0;0.0;0.0;0.0;0.0;3.0;"Sur face inf�rieure : bryozoaires encro�tants (4%)";70.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;"2 porcellanes � pinces plates" +512569;"2021-10-07-EGMP-CDB-001";"Bloc mobile";"9";"face inf�rieure";"Blanche";"2021-10-07_EGMP_119_CDB-5_inf_515138.jpg";"EVALHABLOC_CHASSIRON_QECB_Q5_BM_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;;0.0;0;0;0;0;0;0;;;;;;100;;;;;;22;0;0;0.0;0.5;0.0;7.0;0.0;0.0;0.0;55.0;"Sur face inf�rieure : bryozoaires encro�tants (4%)";70.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;"2 porcellanes � pinces plates" +513924;"2021-10-07-EGMP-CDB-002";"Bloc fix�";"5";"face sup�rieure";"Blanche";"2021-10-07_EGMP_114_CDB-5_sup_514206.JPG";"EVALHABLOC_LABREE_QECB_Q5_BF";0.0;;15.0;2;1.0;2;0.0;10.0;0.0;;5.0;0;10;1;2;0;0;;;;;;3;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;1.0;;;;;;;;;;;;;;;;;;;; +513924;"2021-10-07-EGMP-CDB-002";"Bloc mobile";"1";"face sup�rieure";"Blanche-Verte";"EVALHABLOC_LABREE_QECB_Q1_BM_FS_1.JPG";"EVALHABLOC_LABREE_QECB_Q1_BM_FS";0.0;;13.5;2;59.0;2;0.0;7.5;5.0;"Sable grossier";35.0;0;2;2;6;0;0;;;;;;0;;;;;;123456789;0;0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;2.0;"Spirorbes not�s sur la fiche terrain en % du carr� A !";6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;1;0;"1 crabe marbr� + 3 porcellanes � pinces plates" +513924;"2021-10-07-EGMP-CDB-002";"Bloc mobile";"1";"face inf�rieure";"Blanche";"EVALHABLOC_LABREE_QECB_Q1_BM_FI_1.JPG";"EVALHABLOC_LABREE_QECB_Q1_BM_FI";0.0;;1.5;2;0.0;;0.0;3.0;0.0;;0.0;0;1;0;0;0;0;;;;;;40;;;;;;123456789;0;0;0.0;0.0;0.0;6.5;2.0;0.5;0.0;0.0;"Spirorbes not�s sur la fiche terrain en % du carr� A !";6.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;1;0;0;0;0;0;0;0;0;1;0;"1 crabe marbr� + 3 porcellanes � pinces plates" +513924;"2021-10-07-EGMP-CDB-002";"Bloc mobile";"9";"face sup�rieure";"Blanche";"2021-10-07_EGMP_114_CDB-5_sup_515154.JPG";"EVALHABLOC_LABREE_QECB_Q5_BM_FS";0.0;;22.5;2;7.5;2;0.0;7.5;0.0;;75.0;0;0;0;5;0;0;;;;;;1;;;;;;0;0;0;0.0;2.5;0.0;0.0;0.0;0.0;0.0;5.75;;0.0;;"Non renseign� : aucune esp�ce mobile ???";;;;;;;;;;;;;;;; +513924;"2021-10-07-EGMP-CDB-002";"Bloc mobile";"9";"face inf�rieure";"Color�e";"2021-10-07_EGMP_114_CDB-5_inf_515154.JPG";"EVALHABLOC_LABREE_QECB_Q5_BM_FI";0.0;;7.5;2;0.0;;0.0;3.0;0.0;;0.0;0;1;1;0;0;0;;;;;;49;;;;;;143;0;0;0.0;0.0;0.0;1.0;6.0;0.0;0.0;3.0;;0.0;;"Non renseign� : aucune esp�ce mobile ???";;;;;;;;;;;;;;;; +513924;"2021-10-07-EGMP-CDB-002";"Bloc mobile";"3";"face sup�rieure";"Brune-Verte";"2021-10-07_EGMP_114_CDB-2_sup_515146.JPG";"EVALHABLOC_LABREE_QECB_Q2_BM_FS";0.0;;39.0;2;23.0;2;0.0;45.0;3.0;"Sable grossier";3.5;0;2;0;29;0;0;;;;;;0;;;;;;123456789;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;1.0;"Les spirorbes ont �t� not�s sur le fiche terrain en % de carr� A !";5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0;"26 porcellanes � pinces plates !" +513924;"2021-10-07-EGMP-CDB-002";"Bloc mobile";"3";"face inf�rieure";"Color�e";"2021-10-07_EGMP_114_CDB-2_inf_515146.JPG";"EVALHABLOC_LABREE_QECB_Q2_BM_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;;31.5;0;0;0;0;0;0;;;;;;58;;;;;;123456789;0;0;0.0;0.0;0.0;62.5;3.5;0.0;0.0;0.0;"Les spirorbes ont �t� not�s sur le fiche terrain en % de carr� A !";5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;0;0;0;2;0;"26 porcellanes � pinces plates !" +513924;"2021-10-07-EGMP-CDB-002";"Bloc mobile";"7";"face sup�rieure";"Blanche-Brune";"2021-10-07_EGMP_114_CDB-4_sup_515150.JPG";"EVALHABLOC_LABREE_QECB_Q4_BM_FS";0.0;;60.0;2;4.0;2;0.0;5.5;6.5;"Sable grossier";0.0;0;3;2;1;0;0;;;;;;0;;;;;;0;0;0;0.0;5.0;0.0;2.0;0.0;0.0;0.0;0.0;;0.0;;"Non renseign� car mar�e montante !";;;;;;;;;;;;;;;; +513924;"2021-10-07-EGMP-CDB-002";"Bloc mobile";"7";"face inf�rieure";"Color�e";"2021-10-07_EGMP_114_CDB-4_inf_515150.JPG";"EVALHABLOC_LABREE_QECB_Q4_BM_FI";0.0;;1.0;2;0.5;2;0.0;3.5;0.0;;0.0;0;2;0;0;0;0;;;;;;28;;;;;;2;0;0;0.0;0.0;1.5;55.0;0.0;0.0;0.0;0.0;;0.0;;"Non renseign� car mar�e montante !";;;;;;;;;;;;;;;; +513924;"2021-10-07-EGMP-CDB-002";"Bloc fix�";"4";"face sup�rieure";"Color�e";"2021-10-07_EGMP_114_CDB-4_sup_514202.JPG";"EVALHABLOC_LABREE_QECB_Q4_BF";0.0;;20.0;2;9.0;2;0.0;5.5;10.5;"Sable grossier";8.0;0;9;7;0;0;0;;;;;;2;;;;;;0;0;0;0.0;20.0;0.0;5.5;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +513924;"2021-10-07-EGMP-CDB-002";"Bloc fix�";"2";"face sup�rieure";"Blanche";"2021-10-07_EGMP_114_CDB-2_sup_514198.JPG";"EVALHABLOC_LABREE_QECB_Q2_BF";0.0;;17.0;2;5.0;2;0.0;15.0;0.0;;35.0;0;28;1;1;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;3.5;0.0;0.0;0.0;20.0;;;;;;;;;;;;;;;;;;;; +513924;"2021-10-07-EGMP-CDB-002";"Bloc fix�";"1";"face sup�rieure";"Rouge-Verte";"2021-10-07_EGMP_114_CDB-1_sup_514194.JPG";"EVALHABLOC_LABREE_QECB_Q1_BF";0.0;;25.0;2;20.0;2;0.0;1.0;5.0;"Sable fin";0.0;0;1;0;1;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;17.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"4";"face sup�rieure";"Color�e";"2021-10-07_BRES_12_CDB-4_sup_528161.JPG";"BRES_PteduRoz_2021_10_07_Q2_B4_FS";0.0;;25.0;2;0.0;;0.0;10.0;20.0;"Sable fin";2.0;0;3;0;4;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;20.0;;75.0;"Sable grossier";"Ma�rl et d�bris coquillers";0;0;3;0;;;0;;0;0;0;;0;0;0;"Pourpre : 2 +Porcelane :1 +Ast�rie : 1" +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"4";"face inf�rieure";"Color�e";"2021-10-07_BRES_12_CDB-4_inf_528161.JPG";"BRES_PteduRoz_2021_10_07_Q2_B4_FI";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.5;0;3;0;3;0;0;4;2;5;3;2;320;18;7;0;12;5;1680;0;0;0.0;0.0;0.0;0.0;1.0;0.0;0.0;0.0;;75.0;"Sable grossier";"Ma�rl et d�bris coquillers";0;0;3;0;;;0;;0;0;0;;0;0;0;"Pourpre : 2 +Porcelane :1 +Ast�rie : 1" +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"7";"face sup�rieure";"Color�e";"2021-10-07_BRES_12_CDB-7_sup_528181.JPG";"BRES_PteduRoz_2021_10_07_Q4_B7_FS";25.0;2;74.0;2;3.0;2;0.0;3.5;9.0;"Sable grossier";3.0;1;1;3;3;0;0;;;;;;0;;;;;;0;;;0.0;0.0;0.0;0.0;0.0;0.0;0.0;4.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";"";0;0;0;0;;;0;;0;0;0;;0;0;3; +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"7";"face inf�rieure";"Color�e";"2021-10-07_BRES_12_CDB-7_inf_528181.JPG";"BRES_PteduRoz_2021_10_07_Q4_B7_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";2.0;0;0;2;4;0;0;;;;;;25;17;14;5;15;20;2840;;;0.0;0.0;0.0;8.0;0.0;0.25;0.0;45.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";"";0;0;0;0;;;0;;0;0;0;;0;0;3; +526185;"2021-10-07-BRES-CDB-003";"Bloc fix�";"2";"face sup�rieure";"Color�e";"2021-10-07_BRES_12_CDB-2_sup_528176.JPG";"BRES_PteduRoz_2021_10_07_Q2_Bref";0.0;;50.0;;5.0;;0.0;0.0;60.0;"Vase";2.0;0;0;0;0;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;56.0;;;;;;;;;;;;;;;;;;;; +526185;"2021-10-07-BRES-CDB-003";"Bloc fix�";"5";"face sup�rieure";"Color�e";;"Q5-BF";0.0;;50.0;;3.0;;0.0;3.0;100.0;"Vase";1.0;0;1;0;0;1;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"10";"face sup�rieure";"Color�e";"2021-10-07_BRES_12_CDB-10_sup_528213.JPG";"BRES_PteduRoz_2021_10_07_Q5_B10_FS";1.0;2;97.0;2;2.0;2;0.0;0.0;35.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;24.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;6; +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"10";"face inf�rieure";"Color�e";"2021-10-07_BRES_12_CDB-10_inf_528213.JPG";"BRES_PteduRoz_2021_10_07_Q5_B10_FI";0.0;;0.5;2;0.12;2;0.0;0.0;0.0;"Pas de s�diment";5.0;0;3;0;0;0;1;;;;;;39;12;22;14;4;14;2640;;;;;;2.0;2.25;0.0;0.0;22.0;;24.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;1;6; +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"9";"face sup�rieure";"Color�e";"2021-10-07_BRES_12_CDB-9_sup_528209.JPG";"BRES_PteduRoz_2021_10_07_Q5_B9_FS";0.0;;70.0;;10.0;;0.0;0.0;100.0;"Vase";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;3;;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;75.0;"Sable grossier";"Ma�rl et d�bris coquillers";0;2;1;2;;;0;;0;0;0;;0;0;3; +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"9";"face inf�rieure";"Color�e";"2021-10-07_BRES_12_CDB-9_inf_528209.JPG";"BRES_PteduRoz_2021_10_07_Q5_B9_FI";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";2.0;0;1;0;0;0;0;2;3;2;2;4;260;13;12;3;7;38;2920;;;0.0;0.0;0.0;0.0;15.0;0.0;0.0;0.0;;75.0;"Sable grossier";"Ma�rl et d�bris coquillers";0;2;1;2;;;0;;0;0;0;;0;0;3; +526185;"2021-10-07-BRES-CDB-003";"Bloc fix�";"4";"face sup�rieure";"Color�e";"2021-10-07_BRES_12_CDB-4_sup_528205.JPG";"BRES_PteduRoz_2021_10_07_Q4_Bref";0.5;2;32.5;2;0.5;2;0.0;1.5;2.0;"D�bris coquilliers";4.0;0;0;2;10;0;0;;;;;;0;1;0;0;0;0;40;2;;;;;0.0;0.0;0.0;0.0;36.0;;;;;;;;;;;;;;;;;;;; +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"8";"face sup�rieure";"Color�e";"2021-10-07_BRES_12_CDB-8_sup_528192.JPG";"BRES_PteduRoz_2021_10_07_Q4_B8_FS";2.5;2;13.0;2;3.5;2;0.0;1.5;0.0;"Pas de s�diment";19.0;0;0;2;3;0;0;;;;;;12;;;;;;0;;;;;;0.0;0.0;0.0;0.0;11.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;1;0; +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"8";"face inf�rieure";"Color�e";"2021-10-07_BRES_12_CDB-8_inf_528192.JPG";"BRES_PteduRoz_2021_10_07_Q4_B8_FI";0.0;;0.5;;0.0;;0.0;7.5;0.0;"Pas de s�diment";5.0;0;6;0;1;0;0;;;;;;44;29;12;19;17;7;3360;;;;;;2.5;0.0;0.0;0.0;2.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;;;0;;0;0;0;;0;1;0; +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"3";"face sup�rieure";"Color�e";"2021-10-07_BRES_12_CDB-3_sup_526192.JPG";"BRES_PteduRoz_2021_10_07_Q2_B3_FS";0.5;;55.0;;0.5;;0.0;0.5;30.0;"Vase";3.5;0;1;0;0;0;0;;;;;;0;;;;;;0;;;0.0;0.0;0.0;0.0;0.0;0.0;0.0;15.0;;45.0;"Sable grossier";"D�bris coquillers, ma�rl, cailloutis";0;2;0;0;;;0;;0;0;0;;0;0;8;"Porcelane : 15" +526185;"2021-10-07-BRES-CDB-003";"Bloc mobile";"3";"face inf�rieure";"Color�e";"2021-10-07_BRES_12_CDB-3_inf_526192.JPG";"BRES_PteduRoz_2021_10_07_Q2_B3_FI";0.0;;0.0;;0.0;;0.0;35.0;0.0;"Pas de s�diment";1.0;0;5;1;0;0;0;;;;;;11;13;20;19;13;5;2800;;;0.0;0.0;0.0;3.0;5.0;0.0;0.0;0.0;;45.0;"Sable grossier";"D�bris coquillers, ma�rl, cailloutis";0;2;0;0;;;0;;0;0;0;;0;0;8;"Porcelane : 15" +526834;"2021-10-08-PNMI-CDB-002";"Bloc mobile";"1";"face sup�rieure";"Rouge";"2021-10-08_PNMI_07_CDB-1_sup_526847.jpg";"Q1_BM_dessus_A2021";0.0;;75.0;2;0.0;;0.0;0.0;25.0;"Sable fin";0.0;1;1;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Blocs";;0;2;0;0;0;0;3;0;0;0;0;0;0;0;0; +526834;"2021-10-08-PNMI-CDB-002";"Bloc mobile";"1";"face inf�rieure";"Color�e";"2021-10-08_PNMI_07_CDB-1_inf_526847.jpg";"Q1_BM_dessous_A2021";0.0;;0.0;;0.0;;0.0;0.0;0.0;;0.0;0;0;0;0;0;0;;;;;;6;14;38;15;3;4;2960;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;5.0;;5.0;"Blocs";;0;2;0;0;0;0;3;0;0;0;0;0;0;0;0; +526834;"2021-10-08-PNMI-CDB-002";"Bloc fix�";"2";"face sup�rieure";"Rouge";"2021-10-08_PNMI_07_CDB-2_sup_526851.jpg";"Q2_BF_A2021";0.0;;50.0;2;3.0;2;0.0;10.0;0.0;;0.0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;30;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +526834;"2021-10-08-PNMI-CDB-002";"Bloc mobile";"3";"face sup�rieure";"Rouge";"2021-10-08_PNMI_07_CDB-3_sup_526855.jpg";"Q2_BM_dessus_A2021";0.0;;15.0;3;0.0;;0.0;11.0;0.0;;0.0;0;0;0;0;0;0;;;;;;0;7;6;4;0;0;680;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +526834;"2021-10-08-PNMI-CDB-002";"Bloc mobile";"3";"face inf�rieure";"Color�e";"2021-10-08_PNMI_07_CDB-3_inf_526855.jpg";"Q2_BM_dessous_A2021";0.0;;0.0;;0.0;;0.0;5.0;0.0;;0.0;0;0;0;0;0;0;;;;;;5;27;32;15;20;8;4080;0;0;0.0;0.0;0.0;1.0;3.0;0.0;0.25;0.0;;5.0;"Blocs";;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0; +526834;"2021-10-08-PNMI-CDB-002";"Bloc mobile";"5";"face sup�rieure";"Rouge";"20211008_160933.jpg";"Q3_BM_dessus_A2021";25.0;3;50.0;3;0.5;2;0.0;12.0;5.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;1;0;0;0;0; +526834;"2021-10-08-PNMI-CDB-002";"Bloc mobile";"5";"face inf�rieure";"Color�e";"2021-10-08_PNMI_07_CDB-5_inf_526859.jpg";"Q3_BM_dessous_A2021";0.0;;0.25;2;0.0;;0.0;1.5;0.0;;2.0;0;1;1;0;0;0;;;;;;3;0;7;28;5;11;2040;0;0;0.0;0.0;0.0;50.0;0.0;0.0;0.0;0.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;0;0;0;0;0;0;1;0;0;0;0; +526834;"2021-10-08-PNMI-CDB-002";"Bloc fix�";"4";"face sup�rieure";"Rouge";"2021-10-08_PNMI_07_CDB-4_sup_526863.jpg";"Q4_BF_A2021";5.0;3;25.0;2;0.0;;0.0;1.0;25.0;"Sable fin";0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +526834;"2021-10-08-PNMI-CDB-002";"Bloc mobile";"7";"face sup�rieure";"Rouge";"2021-10-08_PNMI_07_CDB-7_sup_526867.jpg";"Q4_BM_dessus_A2021";4.0;3;70.0;2;0.5;2;0.0;15.0;4.0;"Sable grossier";0.0;0;0;0;0;0;0;;;;;;1;;;;;;75;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;1;1;0;0;0;0; +526834;"2021-10-08-PNMI-CDB-002";"Bloc mobile";"7";"face inf�rieure";"Blanche";"2021-10-08_PNMI_07_CDB-7_inf_526867.jpg";"Q4_BM_dessous_A2021";0.0;;0.0;;0.0;;0.0;0.0;0.0;;10.0;0;1;0;0;0;1;;;;;;9;17;20;0;7;7;2040;0;0;0.0;0.0;0.0;5.0;0.0;0.0;0.0;3.0;;10.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;0;0;1;1;0;0;0;0; +526834;"2021-10-08-PNMI-CDB-002";"Bloc mobile";"9";"face sup�rieure";"Rouge";"2021-10-08_PNMI_07_CDB-9_sup_526871.jpg";"Q5_BM_dessus_A2021";0.0;;75.0;2;0.5;2;0.0;35.0;0.0;;0.0;1;1;0;0;0;0;;;;;;0;;;;;;0;0;0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;0.0;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;1;0;0;0;0;0;0;0;"" +526834;"2021-10-08-PNMI-CDB-002";"Bloc mobile";"9";"face inf�rieure";"Blanche";"2021-10-08_PNMI_07_CDB-9_inf_526871.jpg";"Q5_BM_dessous_A2021";0.0;;0.0;;0.0;;0.0;0.0;0.0;;0.5;0;0;0;0;0;0;;;;;;5;0;27;7;12;6;2080;0;0;0.0;0.0;0.0;5.0;0.5;0.0;0.0;0.5;;5.0;"Petits blocs, sable grossier, d�bris coquillers";;0;1;0;0;0;0;0;1;0;0;0;0;0;0;0;"" +526834;"2021-10-08-PNMI-CDB-002";"Bloc fix�";"1";"face sup�rieure";"Rouge";"2021-10-08_PNMI_07_CDB-1_sup_526843.jpg";"Q1_BF_A2021";0.0;;50.0;2;5.0;2;0.0;20.0;10.0;"D�bris coquilliers";0.0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0;0.0;0.0;0.0;0.0;0.0;5.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"2";"face sup�rieure";"Color�e";"2020-03-13_BRES_12_CDB-2_sup_527903.JPG";"BRES_PteduRoz_2020_03_13_Q1_B2_FS";0.0;;2.0;;0.0;;0.0;85.0;0.0;"Pas de s�diment";50.5;0;5;0;0;0;0;;;;;;1;;;;;;10;;;;;;0.0;0.0;0.0;0.0;2.5;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;;"1 porcelane" +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"2";"face inf�rieure";"Color�e";"2020-03-13_BRES_12_CDB-2_inf_527903.JPG";"BRES_PteduRoz_2020_03_13_Q1_B2_FI";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";3.5;0;4;0;0;0;0;;;;;;10;18;24;40;42;46;6800;;;;;;0.0;0.0;0.0;0.0;0.0;;75.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;;"1 porcelane" +527881;"2020-03-13-BRES-CDB-001";"Bloc fix�";"1";"face sup�rieure";"Color�e";;"BRES_PteduRoz_2020_03_13_Q1_Bref";5.0;;70.0;;2.0;;30.0;10.0;25.0;"Sable grossier";5.0;23;9;0;0;0;1;;;;;;0;;;;;;7;;;;;;1.0;0.0;0.0;0.0;25.0;;;;;;;;;;;;;;;;;;;; +527881;"2020-03-13-BRES-CDB-001";"Bloc fix�";"2";"face sup�rieure";"Color�e";;"BRES_PteduRoz_2020_03_13_Q2_Bref";20.0;;90.0;;5.0;;45.0;2.0;20.0;"Sable grossier";5.0;0;1;0;0;0;3;;;;;;0;;;;;;20;;;;;;2.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"3";"face sup�rieure";"Color�e";"2020-03-13_BRES_12_CDB-3_sup_527917.JPG";"BRES_PteduRoz_2020_03_13_Q2_B3_FS";4.5;;80.0;;1.25;;0.0;12.0;14.0;"Sable grossier";9.0;0;1;0;1;0;0;;;;;;2;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;1; +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"3";"face inf�rieure";"Color�e";"2020-03-13_BRES_12_CDB-3_inf_527917.JPG";"BRES_PteduRoz_2020_03_13_Q2_B3_FI";0.0;;1.0;;0.0;;0.0;0.0;0.5;"D�bris coquilliers";14.0;0;13;0;0;0;0;;;;;;40;26;15;8;5;22;3040;;;;;;0.5;11.0;0.0;0.0;4.0;;85.0;"Petits blocs, sable grossier, d�bris coquillers";;;;;;;;;;;;;;;;1; +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"4";"face sup�rieure";"Color�e";"2020-03-13_BRES_12_CDB-4_sup_527921.JPG";"BRES_PteduRoz_2020_03_13_Q2_B4_FS";0.5;;60.0;;0.0;;0.0;25.0;5.0;"Sable grossier";12.0;0;10;0;1;0;0;;;;;;2;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.5;;55.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;1;;;;;;;;;;;;;"Porcelane : 2" +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"4";"face inf�rieure";"Color�e";"2020-03-13_BRES_12_CDB-4_inf_527921.JPG";"BRES_PteduRoz_2020_03_13_Q2_B4_FI";0.0;;0.5;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;13;0;0;0;0;;;;;;18;36;1;3;35;12;3480;;;;;;0.0;0.0;1.0;0.0;0.0;;55.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;1;;;;;;;;;;;;;"Porcelane : 2" +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"5";"face sup�rieure";"Color�e";"2020-03-13_BRES_12_CDB-5_sup_527925.JPG";"BRES_PteduRoz_2020_03_13_Q3_B5_FS";45.0;;55.0;;1.5;;0.0;12.5;35.0;"Sable grossier";3.5;0;0;0;4;0;0;;;;;;2;;;;;;2;;;;;;0.0;0.0;0.0;0.0;0.0;;25.0;"Blocs";;;;;;;;;;;1;;;;;; +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"5";"face inf�rieure";"Color�e";"2020-03-13_BRES_12_CDB-5_inf_527925.JPG";"BRES_PteduRoz_2020_03_13_Q3_B5_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";10.0;0;11;0;0;0;0;;;;;;22;33;20;17;13;30;4520;;;;;;0.0;15.0;0.0;0.0;30.0;;25.0;"Blocs";;;;;;;;;;;1;;;;;; +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"6";"face sup�rieure";"Color�e";"2020-03-13_BRES_12_CDB-6_sup_527929.jpg";"BRES_PteduRoz_2020_03_13_Q3_B6_FS";0.0;;6.0;;0.0;;0.0;50.0;0.0;"Pas de s�diment";6.0;0;7;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;6.0;"25 pourpres +ponte de pourpre japonaise +ponte de fibule";30.0;;;;;;;;;;;;;;;;;; +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"6";"face inf�rieure";"Color�e";"2020-03-13_BRES_12_CDB-6_inf_527929.jpg";"BRES_PteduRoz_2020_03_13_Q3_B6_FI";0.0;;0.0;;0.0;;0.0;1.0;0.0;"Pas de s�diment";0.0;0;10;0;0;0;0;;;;;;18;17;9;7;14;8;2200;;1;;;;0.0;0.0;0.0;0.0;0.0;"25 pourpres +ponte de pourpre japonaise +ponte de fibule";30.0;;;;;;;;;;;;;;;;;; +527881;"2020-03-13-BRES-CDB-001";"Bloc fix�";"3";"face sup�rieure";"Color�e";;"BRES_PteduRoz_2020_03_13_Q3_Bref";20.0;;40.0;;0.5;;0.0;22.0;15.0;"Sable grossier";12.0;0;0;1;2;0;0;;;;;;3;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.5;;;;;;;;;;;;;;;;;;;; +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"1";"face sup�rieure";"Color�e";"2020-03-13_BRES_12_CDB-1_sup_527896.JPG";"BRES_PteduRoz_2020_03_13_Q1_B1_FS";0.0;;20.0;;0.0;;0.0;65.0;0.0;"Pas de s�diment";10.0;0;0;0;5;0;0;0;0;0;0;0;0;0;0;0;0;0;0;;;;;;0.0;0.0;0.0;0.0;0.0;"";19.0;"Petits blocs, sable grossier, d�bris coquillers";;;;1;;;;;;;;;;;;6; +527881;"2020-03-13-BRES-CDB-001";"Bloc mobile";"1";"face inf�rieure";"Color�e";"2020-03-13_BRES_12_CDB-1_inf_527896.JPG";"BRES_PteduRoz_2020_03_13_Q1_B1_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";3.0;0;5;0;0;0;0;;;;;;2;53;20;23;40;19;6200;;;;;;0.0;5.0;1.0;0.0;42.0;"";19.0;"Petits blocs, sable grossier, d�bris coquillers";;;;1;;;;;;;;;;;;6; +527937;"2020-09-18-BRES-CDB-002";"Bloc fix�";"2";"face sup�rieure";"Color�e";"2020-09-18_BRES_12_CDB-2_sup_527978.JPG";"BRES_PteduRoz_2020_09_18_Q2_Bref";1.0;;60.0;;5.0;;2.5;1.0;0.0;"Pas de s�diment";0.5;0;2;0;0;0;2;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"6";"face sup�rieure";"Color�e";"2020-09-18_BRES_12_CDB-6_sup_527986.JPG";"BRES_PteduRoz_2020_09_18_Q3_B6_FS";15.0;;6.0;;5.0;2;0.0;0.0;50.0;"Vase";0.0;0;0;0;1;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Sable grossier";;;;;;;;;;;;;;;;1;"1 Asterina gibosa +1 chiton" +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"6";"face inf�rieure";"Color�e";"2020-09-18_BRES_12_CDB-6_inf_527986.JPG";"BRES_PteduRoz_2020_09_18_Q3_B6_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";1.0;0;4;0;0;0;0;;;;;;6;;;;;;37;;;;;;1.5;8.5;0.0;0.0;3.0;;80.0;"Sable grossier";;;;;;;;;;;;;;;;1;"1 Asterina gibosa +1 chiton" +527937;"2020-09-18-BRES-CDB-002";"Bloc fix�";"3";"face sup�rieure";"Color�e";;"BRES_PteduRoz_2020_09_18_Q3_Bref";30.0;;70.0;;10.0;;0.0;11.0;0.0;"Pas de s�diment";1.0;2;5;0;0;0;0;;;;;;0;5;0;0;1;0;240;;;;;;0.0;0.0;0.0;0.0;5.0;"1 Asterina gibbosa";;;;;;;;;;;;;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"7";"face sup�rieure";"Color�e";"2020-09-18_BRES_12_CDB-7_sup_527994.JPG";"BRES_PteduRoz_2020_09_18_Q4_B7_FS";10.0;;4.0;2;2.0;2;0.0;0.0;12.0;"Vase";0.0;0;1;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;80.0;"Sable grossier";"D�bris coquiller";0;1;0;0;;;0;;0;0;0;;0;0;0;"3 calliostones +1 Asterina gibbosa" +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"7";"face inf�rieure";"Color�e";"2020-09-18_BRES_12_CDB-7_inf_527994.JPG";"BRES_PteduRoz_2020_09_18_Q4_B7_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.5;0;2;0;1;0;0;;;;;;13;;;;;;65;;;;;;0.0;20.0;0.0;0.0;11.0;;80.0;"Sable grossier";"D�bris coquiller";0;1;0;0;;;0;;0;0;0;;0;0;0;"3 calliostones +1 Asterina gibbosa" +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"8";"face sup�rieure";"Color�e";"2020-09-18_BRES_12_CDB-8_sup_527998.JPG";"BRES_PteduRoz_2020_09_18_Q4_B8_FS";50.0;2;50.0;1;10.0;2;0.0;0.0;50.0;"Vase";0.0;0;1;0;1;0;0;;;;;;2;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;"/!\ Bloc fait 2/3 du quadrat !!";50.0;"Sable grossier";"cailloutis, d�bris coquillers, ma�rl";0;0;0;1;;;0;;0;0;0;;0;0;0; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"8";"face inf�rieure";"Color�e";"2020-09-18_BRES_12_CDB-8_inf_527998.JPG";"BRES_PteduRoz_2020_09_18_Q4_B8_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;1;0;0;5;10;10;4;6;700;;;;;;0;;;;;;0.0;6.5;0.0;0.0;0.0;"/!\ Bloc fait 2/3 du quadrat !!";50.0;"Sable grossier";"cailloutis, d�bris coquillers, ma�rl";0;0;0;1;;;0;;0;0;0;;0;0;0; +527937;"2020-09-18-BRES-CDB-002";"Roche en place";"4";"face sup�rieure";"Color�e";"2020-09-18_BRES_12_CDB-4_sup_528002.JPG";"BRES_PteduRoz_2020_09_18_Q4_Bref";0.5;2;60.0;2;25.0;2;0.5;0.0;100.0;"Sable fin";0.0;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;;;;;;;;;;;;;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"4";"face sup�rieure";"Color�e";"2020-09-18_BRES_12_CDB-4_sup_527974.JPG";"BRES_PteduRoz_2020_09_18_Q2_B4_FS";2.0;;6.0;;17.0;;0.0;0.0;0.0;"Pas de s�diment";7.0;0;0;2;3;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;45.0;;21.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"4";"face inf�rieure";"Color�e";"2020-09-18_BRES_12_CDB-4_inf_527974.JPG";"BRES_PteduRoz_2020_09_18_Q2_B4_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";15.0;0;0;3;0;0;1;;;;;;66;5;8;9;12;8;1680;;;;;;2.0;8.5;0.0;0.0;2.0;;21.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"3";"face sup�rieure";"Color�e";"2020-09-18_BRES_12_CDB-3_sup_527970.JPG";"BRES_PteduRoz_2020_09_18_Q2_B3_FS";1.0;;63.0;;5.0;;0.0;0.5;11.0;"D�bris coquilliers";6.0;0;0;1;2;0;0;;;;;;4;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"3";"face inf�rieure";"Color�e";"2020-09-18_BRES_12_CDB-3_inf_527970.JPG";"BRES_PteduRoz_2020_09_18_Q2_B3_FI";0.0;;0.0;;0.0;;0.0;6.0;0.0;"Pas de s�diment";13.0;0;4;0;0;0;0;;;;;;61;13;18;6;17;12;2640;;;;;;1.0;2.0;0.0;0.0;6.0;;20.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc fix�";"1";"face sup�rieure";"Color�e";"2020-09-18_BRES_12_CDB-1_sup_527966.JPG";"BRES_PteduRoz_2020_09_18_Q1_Bref";52.0;2;6.0;2;2.0;2;0.0;25.0;0.0;"Pas de s�diment";0.0;2;11;0;1;0;0;;;;;;0;1;0;0;1;1;120;;;;;;0.0;0.0;0.0;0.0;2.5;;;;;;;;;;;;;;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"2";"face sup�rieure";"Color�e";"2020-09-18_BRES_12_CDB-2_sup_527962.JPG";"BRES_PteduRoz_2020_09_18_Q1_B2_FS";1.0;;0.0;;11.0;;0.0;0.0;0.0;"Pas de s�diment";9.0;0;0;0;1;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;32.0;;24.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;1;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"2";"face inf�rieure";"Color�e";"2020-09-18_BRES_12_CDB-2_inf_527962.JPG";"BRES_PteduRoz_2020_09_18_Q1_B2_FI";0.0;;0.0;;0.0;;0.0;3.5;0.0;"Pas de s�diment";6.5;0;0;1;0;0;0;;;;;;79;21;29;22;19;28;4760;;;;;;0.0;4.0;0.0;0.0;1.0;;24.0;"Petits blocs, sable grossier, d�bris coquillers";;;1;;;;;;;1;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"1";"face sup�rieure";"Color�e";"2020-09-18_BRES_12_CDB-1_sup_527958.JPG";"BRES_PteduRoz_2020_09_18_Q1_B1_FS";20.0;;3.5;;0.0;;0.0;0.0;0.0;"Pas de s�diment";25.0;2;5;0;6;0;0;13;14;3;3;8;820;8;9;0;18;9;1760;;;;;;0.0;0.75;0.0;0.0;9.0;;26.0;"Sable grossier";;;;;;;;;;;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"1";"face inf�rieure";"Color�e";"2020-09-18_BRES_12_CDB-1_inf_527958.JPG";"BRES_PteduRoz_2020_09_18_Q1_B1_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;;;;;;42;12;19;25;8;12;3040;;;;;;0.0;3.5;0.0;0.0;13.0;;26.0;"Sable grossier";;;;;;;;;;;;;;;;; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"5";"face sup�rieure";"Color�e";"2020-09-18_BRES_12_CDB-5_sup_527982.JPG";"BRES_PteduRoz_2020_09_18_Q3_B5_FS";95.0;;25.0;;15.0;2;0.0;0.0;80.0;"Vase";0.0;1;1;0;3;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;20.0;"Sable grossier";;;;;;;;;;1;;;;;;6; +527937;"2020-09-18-BRES-CDB-002";"Bloc mobile";"5";"face inf�rieure";"Color�e";"2020-09-18_BRES_12_CDB-5_inf_527982.JPG";"BRES_PteduRoz_2020_09_18_Q3_B5_FI";0.0;;0.0;;0.0;;0.0;0.0;0.0;"Pas de s�diment";0.0;0;1;0;0;0;0;;;;;;2;;;;;;48;;;;;;1.0;7.0;0.13;0.0;9.0;;20.0;"Sable grossier";;;;;;;;;;1;;;;;;6; +527943;"2020-09-19-BRES-CDB-003";"Bloc mobile";"9";"face sup�rieure";"Color�e";"2020-09-19_BRES_12_CDB-9_sup_527950.JPG";"BRES_PteduRoz_2020_09_19_Q5_B9_FS";12.0;2;5.0;2;8.0;;1.5;0.0;90.0;"Sable fin";0.0;0;0;0;1;0;0;;;;;;0;0;1;0;0;0;40;;;;;;0.0;0.0;0.0;0.0;0.0;;60.0;"Sable grossier";;0;0;3;0;;;0;;0;0;0;;0;0;1;"1 blennie +1 asterina gibboser +1 chiton" +527943;"2020-09-19-BRES-CDB-003";"Bloc mobile";"9";"face inf�rieure";"Color�e";"2020-09-19_BRES_12_CDB-9_inf_527950.JPG";"BRES_PteduRoz_2020_09_19_Q5_B9_FI";0.5;1;8.0;1;0.0;;0.0;0.0;0.0;"Pas de s�diment";11.0;0;3;0;0;0;0;0;1;2;1;3;140;1;6;7;15;4;1320;;;;;;0.0;0.0;5.0;0.0;2.5;;60.0;"Sable grossier";;0;0;3;0;;;0;;0;0;0;;0;0;1;"1 blennie +1 asterina gibboser +1 chiton" +527943;"2020-09-19-BRES-CDB-003";"Roche en place";"5";"face sup�rieure";"Color�e";"2020-09-19_BRES_12_CDB-5_sup_527946.JPG";"BRES_PteduRoz_2020_09_19_Q5_Bref";0.0;;26.0;2;7.0;;0.0;3.0;90.0;"Sable fin";3.0;0;1;0;0;0;0;;;;;;6;0;1;3;12;5;840;;;;;;0.0;0.0;0.0;0.0;2.0;"1 bernard l'hermite +1 nasse +2 p�toncles";;;;;;;;;;;;;;;;;;; +527943;"2020-09-19-BRES-CDB-003";"Bloc mobile";"10";"face sup�rieure";"Color�e";"2020-09-19_BRES_12_CDB-10_sup_527954.JPG";"BRES_PteduRoz_2020_09_19_Q5_B10_FS";0.0;;0.0;;0.0;;0.0;0.5;0.0;"Pas de s�diment";0.0;0;0;0;0;0;0;0;2;1;2;2;140;12;6;9;19;9;2200;;;;;;0.0;0.0;2.0;0.0;0.0;;51.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0; +527943;"2020-09-19-BRES-CDB-003";"Bloc mobile";"10";"face inf�rieure";"Color�e";"2020-09-19_BRES_12_CDB-10_inf_527954.JPG";"BRES_PteduRoz_2020_09_19_Q5_B10_FI";0.0;;70.0;;5.0;;0.5;15.0;90.0;"Sable fin";1.5;0;0;0;0;0;0;;;;;;0;;;;;;0;;;;;;0.0;0.0;0.0;0.0;0.0;;51.0;"Petits blocs, sable grossier, d�bris coquillers";;0;0;0;0;;;0;;0;0;0;;0;0;0;
--- /dev/null Thu Jan 01 00:00:00 1970 +0000 +++ b/test-data/ficheterrain.csv Wed Jan 04 13:21:41 2023 +0000 @@ -0,0 +1,510 @@ +"ID Fiche";"type de suivi";"date sortie";"heure d�but";"heure fin";"coefficient mar�e";"heure mar�e basse";"hauteur basse mer";"p�riode";"libell� campagne";"libell� sortie";"r�f�rent sortie";"�quipe terrain";"territoire";"code site";"site";"sous site";"zone habitat";"type protocole";"version protocole";"auteur saisie";"organisme suivi";"couverture nuageuse";"pr�cipitations";"pression atmosph�rique";"temp�rature";"force du vent";"force du vent en rafale";"direction du vent";"�tat de la mer";"commentaires" +372990;"Suivi des champs de blocs";"2015-02-21 00:00:00.0";;;115;"15:33";;;"f�vr.-15";"GONB_00C1_CDB_f�vr.-15";"Non identifi�";"Etienne ROGEAU";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivis comportementaux";"V2015";"SYSTEME";"Mission d'�tude du golfe normand-breton";;"Pluie fine";;7.0;;;;;"Reprise de donn�es Champs Blocs +" +372999;"Suivi des champs de blocs";"2015-08-03 00:00:00.0";;;106;"16:43";;;"ao�t-15";"GONB_00C1_CDB_ao�t-15";"Non identifi�";"Florent CORBAIN et +Aurelien GUIBERT (SMDC)";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivis comportementaux";"V2015";"SYSTEME";"Mission d'�tude du golfe normand-breton";;"Pas de pr�cipitation";;25.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;;"Reprise de donn�es Champs Blocs +" +373005;"Suivi des champs de blocs";"2015-10-27 00:00:00.0";;;111;"13:14";;;"oct.-15";"GONB_00C1_CDB_oct.-15";"Non identifi�";"Ana�s PERUCAUD et Florent CORBAIN";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivis comportementaux";"V2015";"SYSTEME";"Mission d'�tude du golfe normand-breton";;"Pluie fine";;12.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;;"Reprise de donn�es Champs Blocs +" +373007;"Suivi des champs de blocs";"2015-11-27 00:00:00.0";;;102;"14:25";;;"nov.-15";"GONB_00C1_CDB_nov.-15";"Non identifi�";"Ana�s PERUCAUD";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivis comportementaux";"V2015";"SYSTEME";"Mission d'�tude du golfe normand-breton";;"Pas de pr�cipitation";;12.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;;"Reprise de donn�es Champs Blocs +" +373010;"Suivi des champs de blocs";"2016-03-11 00:00:00.0";;;114;"13:37";;"Semaine";"mars-16";"GONB_00C1_CDB_mars-16";"R�becca Bauchet";"Aur�lien Guilbert, Florent Corbain";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivis comportementaux";"V2016";"SYSTEME";"Mission d'�tude du golfe normand-breton";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;24.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373014;"Suivi des champs de blocs";"2016-05-06 00:00:00.0";;;109;"14:14";;"Semaine";"mai-16";"GONB_00C1_CDB_mai-16";"Marie Motte, R�becca Bauchet";"Marie Motte, Margaux Pinel, R�becca Bauchet";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivis comportementaux";"V2016";"SYSTEME";"Mission d'�tude du golfe normand-breton";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;24.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Sud-Est";;"Reprise de donn�es Champs Blocs +" +373023;"Suivi des champs de blocs";"2016-08-21 00:00:00.0";;;101;"16:37";;"Week-end ou Jour F�ri�";"ao�t-16";"GONB_00C1_CDB_ao�t-16";"Margaux Pinel, R�becca Bauchet";"Margaux Pinel, R�becca Bauchet";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivis comportementaux";"V2016";"SYSTEME";"Mission d'�tude du golfe normand-breton";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +373029;"Suivi des champs de blocs";"2016-10-16 00:00:00.0";;;111;"14:32";;"Week-end ou Jour F�ri�";"oct.-16";"GONB_00C1_CDB_oct.-16";"Margaux Pinel, R�becca Bauchet";"Margaux Pinel, R�becca Bauchet";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivis comportementaux";"V2016";"SYSTEME";"Mission d'�tude du golfe normand-breton";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Sud";;"Reprise de donn�es Champs Blocs +" +373033;"Suivi des champs de blocs";"2015-09-01 00:00:00.0";;;111;"16:23";;;"sept.-15";"ARMO_043_CDB_sept.-15";"Non identifi�";"Franck Delisle & Jean-Pierre Guillosson";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Ilot de Verdelet (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;20.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373039;"Suivi des champs de blocs";"2016-09-19 00:00:00.0";;;108;"16:17";;"Semaine";"sept.-16";"ARMO_043_CDB_sept.-16";"Franck Delisle";"Franck Delisle, Jean-Pierre Guillosson";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Ilot de Verdelet (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;20.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;"Reprise de donn�es Champs Blocs +" +373044;"Suivi des champs de blocs";"2016-08-19 00:00:00.0";;;100;"15:09";;"Semaine";"ao�t-16";"ARMO_043_CDB_ao�t-16";"Franck Delisle et Monette Gestin";"Franck Delisle";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Ilot de Verdelet (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"VivArmor Nature";"25-75% (Nuageux)";"Pluie fine";;18.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;"Reprise de donn�es Champs Blocs +" +373051;"Suivi des champs de blocs";"2015-05-19 00:00:00.0";;;99;"15:07";;;"mai-15";"ARMO_078_CDB_mai-15";"Non identifi�";"Franck Delisle";"C�tes d'Armor";"ARMO_078-082-153";"Port Lazo / Pointe de Bilfot";;"Pointe de Bilfot (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"VivArmor Nature";;"Pluies �parses";;;"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";;;;"Reprise de donn�es Champs Blocs +" +373053;"Suivi des champs de blocs";"2015-08-31 00:00:00.0";;;114;"15:29";;;"ao�t-15";"ARMO_078_CDB_ao�t-15";"Non identifi�";"Franck Delisle & Marie-France Le Boulzec";"C�tes d'Armor";"ARMO_078-082-153";"Port Lazo / Pointe de Bilfot";;"Pointe de Bilfot (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"VivArmor Nature";;"Pluies �parses";;17.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;"Reprise de donn�es Champs Blocs +" +373058;"Suivi des champs de blocs";"2015-03-20 00:00:00.0";;;118;"12:40";;;"mars-15";"ARMO_152_CDB_mars-15";"Non identifi�";"Elleouet Maxime (LPO)";"C�tes d'Armor";"ARMO_152";"Sept �les";;"Ile Plate (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"VivArmor Nature";;;;;;;;;"Reprise de donn�es Champs Blocs +" +373063;"Suivi des champs de blocs";"2016-05-06 00:00:00.0";;;105;"13:10";;"Semaine";"mai-16";"ARMO_152_CDB_mai-16";"Provost Pascal";"Antoine L'H�r�ec, Maeve Othelet";"C�tes d'Armor";"ARMO_152";"Sept �les";;"Ile Plate (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"VivArmor Nature";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;16.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Ouest";;"Reprise de donn�es Champs Blocs +" +373076;"Suivi des champs de blocs";"2016-06-05 00:00:00.0";;;102;"13:41";;"Week-end ou Jour F�ri�";"juin-16";"ARMO_152_CDB_juin-16";"Provost Pascal";"Provost Pascal";"C�tes d'Armor";"ARMO_152";"Sept �les";;"Ile Plate (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"VivArmor Nature";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;19.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"Ouest";;"Reprise de donn�es Champs Blocs +" +373080;"Suivi des champs de blocs";"2016-06-06 00:00:00.0";;;103;"14:29";;"Semaine";"juin-16";"ARMO_152_CDB_juin-16";"Provost Pascal";"Provost Pascal";"C�tes d'Armor";"ARMO_152";"Sept �les";;"Ile Plate (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"VivArmor Nature";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;17.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;"Reprise de donn�es Champs Blocs +" +373083;"Suivi des champs de blocs";"2016-06-19 00:00:00.0";;;71;"12:56";;"Week-end ou Jour F�ri�";"juin-16";"ARMO_152_CDB_juin-16";"Provost Pascal";"Provost Pascal";"C�tes d'Armor";"ARMO_152";"Sept �les";;"Ile Plate (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"VivArmor Nature";"25-75% (Nuageux)";"Pas de pr�cipitation";;20.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;"Reprise de donn�es Champs Blocs +" +373087;"Suivi des champs de blocs";"2014-09-10 00:00:00.0";;;115;"14:06";;;"sept.-14";"MORL_03_CDB_sept.-14";"Non identifi�";"Christine BLAIZE";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2014";"SYSTEME";"CPIE pays de Morlaix-Tregor";;"Pas de pr�cipitation";;18.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373094;"Suivi des champs de blocs";"2015-02-20 00:00:00.0";;;118;"13:27";;;"f�vr.-15";"MORL_03_CDB_f�vr.-15";"Non identifi�";"Micha�l TANGHE";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"CPIE pays de Morlaix-Tregor";;"Pas de pr�cipitation";;12.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373102;"Suivi des champs de blocs";"2015-04-21 00:00:00.0";;;100;"15:10";;;"avr.-15";"MORL_03_CDB_avr.-15";"Non identifi�";"Micha�l TANGHE";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"CPIE pays de Morlaix-Tregor";;"Pas de pr�cipitation";;15.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;;"Reprise de donn�es Champs Blocs +" +373104;"Suivi des champs de blocs";"2015-08-02 00:00:00.0";;;106;"14:39";;;"ao�t-15";"MORL_03_CDB_ao�t-15";"Non identifi�";"Micha�l TANGHE";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"CPIE pays de Morlaix-Tregor";;"Pas de pr�cipitation";;25.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";;;;"Reprise de donn�es Champs Blocs +" +373109;"Suivi des champs de blocs";"2015-08-30 00:00:00.0";;;111;"13:36";;;"ao�t-15";"MORL_03_CDB_ao�t-15";"Non identifi�";"Micha�l TANGHE";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"CPIE pays de Morlaix-Tregor";;"Pas de pr�cipitation";;20.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;;"Reprise de donn�es Champs Blocs +" +373114;"Suivi des champs de blocs";"2015-09-01 00:00:00.0";;;111;"15:06";;;"sept.-15";"MORL_03_CDB_sept.-15";"Non identifi�";"Micha�l TANGHE";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"CPIE pays de Morlaix-Tregor";;"Pas de pr�cipitation";;20.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";;;;"Reprise de donn�es Champs Blocs +" +373122;"Suivi des champs de blocs";"2015-09-29 00:00:00.0";;;117;"14:01";;;"sept.-15";"MORL_03_CDB_sept.-15";"Non identifi�";"Micha�l TANGHE";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"CPIE pays de Morlaix-Tregor";;"Pas de pr�cipitation";;18.0;"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";;;;"Reprise de donn�es Champs Blocs +" +373131;"Suivi des champs de blocs";"2016-04-06 00:00:00.0";;;103;"12:28";;"Week-end ou Jour F�ri�";"avr.-16";"MORL_03_CDB_avr.-16";"Micha�l Tanghe";"Micha�l Tanghe";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE pays de Morlaix-Tregor";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;12.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373134;"Suivi des champs de blocs";"2016-04-09 00:00:00.0";;;115;"14:46";;"Week-end ou Jour F�ri�";"avr.-16";"MORL_03_CDB_avr.-16";"Micha�l Tanghe";"Micha�l Tanghe";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE pays de Morlaix-Tregor";"25-75% (Nuageux)";"Pas de pr�cipitation";;14.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373141;"Suivi des champs de blocs";"2016-08-21 00:00:00.0";;;101;"15:20";;"Week-end ou Jour F�ri�";"ao�t-16";"MORL_03_CDB_ao�t-16";"Micha�l Tanghe";"Micha�l Tanghe";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE pays de Morlaix-Tregor";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;20.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373143;"Suivi des champs de blocs";"2016-09-18 00:00:00.0";;;111;"14:18";;"Week-end ou Jour F�ri�";"sept.-16";"MORL_03_CDB_sept.-16";"Micha�l Tanghe";"Micha�l Tanghe";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE pays de Morlaix-Tregor";"25-75% (Nuageux)";"Pas de pr�cipitation";;19.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373148;"Suivi des champs de blocs";"2016-11-15 00:00:00.0";;;112;"12:37";;"Semaine";"nov.-16";"MORL_03_CDB_nov.-16";"Micha�l Tanghe";"Micha�l Tanghe";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE pays de Morlaix-Tregor";"25-75% (Nuageux)";"Pluie fine";;14.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373150;"Suivi des champs de blocs";"2016-11-16 00:00:00.0";;;109;"13:24";;"Semaine";"nov.-16";"MORL_03_CDB_nov.-16";"Micha�l Tanghe";"Micha�l Tanghe";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE pays de Morlaix-Tregor";"25-75% (Nuageux)";"Pluies �parses";;13.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373152;"Suivi des champs de blocs";"2014-10-09 00:00:00.0";;;111;"12:30";;;"oct.-14";"BRES_03_CDB_oct.-14";"Non identifi�";"Florence S�n�chal";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivis comportementaux";"V2014";"SYSTEME";"Brest m�tropole";;"Pluie continue";;15.0;"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";;;;"Reprise de donn�es Champs Blocs +" +373156;"Suivi des champs de blocs";"2015-02-20 00:00:00.0";;;116;"12:12";;;"f�vr.-15";"BRES_03_CDB_f�vr.-15";"Non identifi�";"Christian Le Jeune";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Brest m�tropole";;"Pluies �parses";;8.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;;"Reprise de donn�es Champs Blocs +" +373166;"Suivi des champs de blocs";"2015-05-18 00:00:00.0";;;101;"12:10";;;"mai-15";"BRES_03_CDB_mai-15";"Non identifi�";"Annick Postollec";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Brest m�tropole";;"Pluie continue";;13.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;;"Reprise de donn�es Champs Blocs +" +373169;"Suivi des champs de blocs";"2015-10-27 00:00:00.0";;;108;"10:41";;;"oct.-15";"BRES_03_CDB_oct.-15";"Non identifi�";"Franck Oppermann";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Brest m�tropole";;"Pluie fine";;14.0;"0-Calme-1 km/h-Mer d'huile";;;;"Reprise de donn�es Champs Blocs +" +373173;"Suivi des champs de blocs";"2016-02-11 00:00:00.0";;;106;"13:11";;"Semaine";"f�vr.-16";"BRES_03_CDB_f�vr.-16";"Christian Le Jeune";"Frank Oppermann";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Brest m�tropole";"25-75% (Nuageux)";"Pas de pr�cipitation";;5.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373177;"Suivi des champs de blocs";"2016-03-09 00:00:00.0";;;112;"11:25";;"Semaine";"mars-16";"BRES_03_CDB_mars-16";"Christian Le Jeune";"Frank Oppermann";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Brest m�tropole";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;8.0;"8-Coup de vent-62 � 74 km/h-Tourbillons d'�cumes � la cr�te des lames";"10-Temp�te-89 � 102 km/h-Tr�s grosses lames � longue cr�te en panache. ";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373179;"Suivi des champs de blocs";"2016-05-06 00:00:00.0";;;105;"11:39";;"Semaine";"mai-16";"BRES_03_CDB_mai-16";"Christian Le Jeune";"Ronan Moine";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Brest m�tropole";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;15.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Nord-Est";;"Reprise de donn�es Champs Blocs +" +373183;"Suivi des champs de blocs";"2016-08-20 00:00:00.0";;;103;"13:24";;"Semaine";"ao�t-16";"BRES_03_CDB_ao�t-16";"Christian Le Jeune";"Ronan Moine";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Brest m�tropole";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;18.0;"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";"7-Grand frais-50 � 61 km/h- Lames d�ferlantes";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +373185;"Suivi des champs de blocs";"2016-10-16 00:00:00.0";;;108;"12:58";;"Week-end ou Jour F�ri�";"oct.-16";"BRES_03_CDB_oct.-16";"Christian Le Jeune";"Frank Oppermann";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Brest m�tropole";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;15.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +373193;"Suivi des champs de blocs";"2015-01-22 00:00:00.0";;;109;"11:58";;;"janv.-15";"FINS_02_CDB_janv.-15";"Non identifi�";"Pauline POISSON et Agathe LEFRANC";"Finist�re Sud";"FINS_02";"Pointe de Mousterlin";;"Pointe de Mousterlin (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;8.0;;;;;"Reprise de donn�es Champs Blocs +" +373198;"Suivi des champs de blocs";"2015-04-20 00:00:00.0";;;109;"12:41";;;"avr.-15";"FINS_02_CDB_avr.-15";"Non identifi�";"Pauline POISSON, H�lo�se YOU";"Finist�re Sud";"FINS_02";"Pointe de Mousterlin";;"Pointe de Mousterlin (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;18.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;"Reprise de donn�es Champs Blocs +" +373205;"Suivi des champs de blocs";"2015-09-01 00:00:00.0";;;111;"13:19";;;"sept.-15";"FINS_02_CDB_sept.-15";"Non identifi�";"H�lo�se YOU";"Finist�re Sud";"FINS_02";"Pointe de Mousterlin";;"Pointe de Mousterlin (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;17.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373210;"Suivi des champs de blocs";"2015-11-26 00:00:00.0";;;104;"14:40";;;"nov.-15";"FINS_02_CDB_nov.-15";"Non identifi�";"H�lo�se YOU";"Finist�re Sud";"FINS_02";"Pointe de Mousterlin";;"Pointe de Mousterlin (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;8.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +373213;"Suivi des champs de blocs";"2016-10-18 00:00:00.0";;;111;"12:56";;"Semaine";"oct.-16";"FINS_02_CDB_oct.-16";"Mathilde Le Roux";"H�lo�se You";"Finist�re Sud";"FINS_02";"Pointe de Mousterlin";;"Pointe de Mousterlin (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;10.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373215;"Suivi des champs de blocs";"2016-11-15 00:00:00.0";;;112;"10:52";;"Semaine";"nov.-16";"FINS_02_CDB_nov.-16";"H�lo�se You";"H�lo�se You";"Finist�re Sud";"FINS_02";"Pointe de Mousterlin";;"Pointe de Mousterlin (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Agence des aires marines prot�g�es";"25-75% (Nuageux)";"Pas de pr�cipitation";;10.0;"0-Calme-1 km/h-Mer d'huile";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"Ouest";;"Reprise de donn�es Champs Blocs +" +373217;"Suivi des champs de blocs";"2015-01-23 00:00:00.0";;;107;"12:44";;;"janv.-15";"FINS_12_CDB_janv.-15";"Pauline POISSON";"Pauline POISSON, Agathe LEFRANC";"Finist�re Sud";"FINS_12";"Saint Nicolas - Bananec";;"Saint-Nicolas des Gl�nan (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;10.0;;;;;"Reprise de donn�es Champs Blocs +" +373221;"Suivi des champs de blocs";"2015-09-01 00:00:00.0";;;111;"13:19";;;"sept.-15";"FINS_12_CDB_sept.-15";"Pauline POISSON";"Pauline POISSON";"Finist�re Sud";"FINS_12";"Saint Nicolas - Bananec";;"Saint-Nicolas des Gl�nan (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;17.0;;;;;"Reprise de donn�es Champs Blocs +" +373230;"Suivi des champs de blocs";"2015-11-26 00:00:00.0";;;104;"10:40";;;"nov.-15";"FINS_12_CDB_nov.-15";"H�lo�se YOU";"Pauline Poisson";"Finist�re Sud";"FINS_12";"Saint Nicolas - Bananec";;"Saint-Nicolas des Gl�nan (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;10.0;;;;;"Reprise de donn�es Champs Blocs +" +373232;"Suivi des champs de blocs";"2016-10-18 00:00:00.0";;;111;"12:56";;"Semaine";"oct.-16";"FINS_12_CDB_oct.-16";"Mathilde Le Roux";"V�ronique (b�n�vole Bretagne Vivante), Mathilde Le Roux";"Finist�re Sud";"FINS_12";"Saint Nicolas - Bananec";;"Saint-Nicolas des Gl�nan (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Agence des aires marines prot�g�es";"25-75% (Nuageux)";"Pas de pr�cipitation";;13.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373237;"Suivi des champs de blocs";"2016-11-15 00:00:00.0";;;112;"10:52";;"Semaine";"nov.-16";"FINS_12_CDB_nov.-16";"Mathilde Le Roux";"Bruno F�rr�, Nathana�l Jeune";"Finist�re Sud";"FINS_12";"Saint Nicolas - Bananec";;"Saint-Nicolas des Gl�nan (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Agence des aires marines prot�g�es";"25-75% (Nuageux)";"Pas de pr�cipitation";;14.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373240;"Suivi des champs de blocs";"2015-04-20 00:00:00.0";;;109;"12:59";;;"avr.-15";"GDMO_01_CDB_avr.-15";"Non identifi�";"Jonathan Pothier";"Golfe du Morbihan";"GDMO_01";"La falaise";;"Locmariaquer (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pas de pr�cipitation";;17.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;;"Reprise de donn�es Champs Blocs +" +373243;"Suivi des champs de blocs";"2015-08-31 00:00:00.0";;;114;"12:52";;;"ao�t-15";"GDMO_01_CDB_ao�t-15";"Non identifi�";"Jonathan Pothier";"Golfe du Morbihan";"GDMO_01";"La falaise";;"Locmariaquer (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pas de pr�cipitation";;21.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373246;"Suivi des champs de blocs";"2015-09-01 00:00:00.0";;;111;"13:38";;;"sept.-15";"GDMO_01_CDB_sept.-15";"Non identifi�";"Jonathan Pothier";"Golfe du Morbihan";"GDMO_01";"La falaise";;"Locmariaquer (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pas de pr�cipitation";;18.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373250;"Suivi des champs de blocs";"2015-09-02 00:00:00.0";;;105;"14:25";;;"sept.-15";"GDMO_01_CDB_sept.-15";"Non identifi�";"Jonathan Pothier";"Golfe du Morbihan";"GDMO_01";"La falaise";;"Locmariaquer (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pas de pr�cipitation";;18.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373256;"Suivi des champs de blocs";"2016-10-18 00:00:00.0";;;111;"13:16";;"Semaine";"oct.-16";"GDMO_01_CDB_oct.-16";"margot le priol";"margot le priol et leslie veron";"Golfe du Morbihan";"GDMO_01";"La falaise";;"Locmariaquer (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;13.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373261;"Suivi des champs de blocs";"2015-02-18 00:00:00.0";;;96;"10:20";;;"f�vr.-15";"GDMO_04_CDB_f�vr.-15";"Non identifi�";"Jonathan Pothier";"Golfe du Morbihan";"GDMO_04";"Beg Lann";;"Beg Lann (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pas de pr�cipitation";;5.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +373264;"Suivi des champs de blocs";"2015-08-31 00:00:00.0";;;114;"12:45";;;"ao�t-15";"GDMO_04_CDB_ao�t-15";"Non identifi�";"Margaux F�on";"Golfe du Morbihan";"GDMO_04";"Beg Lann";;"Beg Lann (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pas de pr�cipitation";;21.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373267;"Suivi des champs de blocs";"2015-10-28 00:00:00.0";;;113;"10:05";;;"oct.-15";"GDMO_04_CDB_oct.-15";"Non identifi�";"Jonathan Pothier";"Golfe du Morbihan";"GDMO_04";"Beg Lann";;"Beg Lann (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pas de pr�cipitation";;9.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +373270;"Suivi des champs de blocs";"2015-10-29 00:00:00.0";;;112;"11:52";;;"oct.-15";"GDMO_04_CDB_oct.-15";"Non identifi�";"Jonathan Pothier";"Golfe du Morbihan";"GDMO_04";"Beg Lann";;"Beg Lann (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pas de pr�cipitation";;11.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373274;"Suivi des champs de blocs";"2016-09-02 00:00:00.0";;;93;"12:33";;"Semaine";"sept.-16";"GDMO_04_CDB_sept.-16";"margot le priol";"leslie veron";"Golfe du Morbihan";"GDMO_04";"Beg Lann";;"Beg Lann (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Ouest";;"Reprise de donn�es Champs Blocs +" +373279;"Suivi des champs de blocs";"2015-08-03 00:00:00.0";;;104;"13:55";;;"ao�t-15";"FOUR_0_CDB_ao�t-15";"Non identifi�";"Estelle BAUDINIERE";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";;"Pas de pr�cipitation";;19.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373283;"Suivi des champs de blocs";"2015-08-04 00:00:00.0";;;97;"14:40";;;"ao�t-15";"FOUR_0_CDB_ao�t-15";"Non identifi�";"Mathilde et Patrick MUNIER";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";;"Pas de pr�cipitation";;17.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373288;"Suivi des champs de blocs";"2015-08-31 00:00:00.0";;;114;"13:55";;;"ao�t-15";"FOUR_0_CDB_ao�t-15";"Non identifi�";"Ion TILLIER";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";;"Pas de pr�cipitation";;17.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;;"Reprise de donn�es Champs Blocs +" +373294;"Suivi des champs de blocs";"2016-06-06 00:00:00.0";;;102;"12:37";;"Semaine";"juin-16";"FOUR_0_CDB_juin-16";"Estelle BAUDINIERE";"Matthieu HERVY, Guillaume LECOUTURIER";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;17.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Est";;"Reprise de donn�es Champs Blocs +" +373298;"Suivi des champs de blocs";"2016-06-07 00:00:00.0";;;97;"13:23";;"Semaine";"juin-16";"FOUR_0_CDB_juin-16";"Estelle BAUDINIERE";"Patrick MONNIER, J�r�me FIEVET";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;18.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +373303;"Suivi des champs de blocs";"2016-09-19 00:00:00.0";;;111;"13:33";;"Semaine";"sept.-16";"FOUR_0_CDB_sept.-16";"Estelle BAUDINIERE";"Laurie-Anne HENO";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;17.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373306;"Suivi des champs de blocs";"2016-09-20 00:00:00.0";;;105;"14:20";;"Semaine";"sept.-16";"FOUR_0_CDB_sept.-16";"Estelle BAUDINIERE";"Estelle BAUDINIERE";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;19.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373310;"Suivi des champs de blocs";"2015-02-04 00:00:00.0";;;84;"11:10";;;"f�vr.-15";"EGMP_014_CDB_f�vr.-15";"Non identifi�";"Julie Vuilleret et J�r�my Daniel";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_014-015";"Pointes du Grouin du Cou et de la R�publique";;"Pointe du Grouin du cou (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pluie fine";;3.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";;;;"Reprise de donn�es Champs Blocs +" +373313;"Suivi des champs de blocs";"2015-07-16 00:00:00.0";;;84;"11:44";;;"juil.-15";"EGMP_014_CDB_juil.-15";"Non identifi�";"Camille Pigot et Justine Vall�e";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_014-015";"Pointes du Grouin du Cou et de la R�publique";;"Pointe du Grouin du cou (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;23.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373317;"Suivi des champs de blocs";"2015-10-14 00:00:00.0";;;85;"12:15";;;"oct.-15";"EGMP_014_CDB_oct.-15";"Non identifi�";"Justine Vall�e et Julie Vuilleret";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_014-015";"Pointes du Grouin du Cou et de la R�publique";;"Pointe du Grouin du cou (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;11.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;;"Reprise de donn�es Champs Blocs +" +373321;"Suivi des champs de blocs";"2016-03-10 00:00:00.0";;;116;"11:34";;"Semaine";"mars-16";"EGMP_014_CDB_mars-16";"Pauline Momot";"Justine Vall�e, Pauline Momot";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_014-015";"Pointes du Grouin du Cou et de la R�publique";;"Pointe du Grouin du cou (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"25-75% (Nuageux)";"Pas de pr�cipitation";;8.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"Nord-Est";;"Reprise de donn�es Champs Blocs +" +373325;"Suivi des champs de blocs";"2016-06-08 00:00:00.0";;;92;"13:51";;"Semaine";"juin-16";"EGMP_014_CDB_juin-16";"Manon Charpentier";"Pauline Momot, Manon Charpentier";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_014-015";"Pointes du Grouin du Cou et de la R�publique";;"Pointe du Grouin du cou (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;20.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Nord-Est";;"Reprise de donn�es Champs Blocs +" +373329;"Suivi des champs de blocs";"2016-09-30 00:00:00.0";;;88;"11:11";;"Semaine";"sept.-16";"EGMP_014_CDB_sept.-16";"Justine Vall�e";"Pauline Momot, Justine Vall�e";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_014-015";"Pointes du Grouin du Cou et de la R�publique";;"Pointe du Grouin du cou (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"25-75% (Nuageux)";"Pluies �parses";;18.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord-Est";;"Reprise de donn�es Champs Blocs +" +373333;"Suivi des champs de blocs";"2015-05-19 00:00:00.0";;;99;"12:22";;;"mai-15";"EGMP_114_CDB_mai-15";"Non identifi�";"Sarah Olivier-Maud Granier";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pluie continue";;13.0;"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";;;;"Reprise de donn�es Champs Blocs +" +373338;"Suivi des champs de blocs";"2015-07-03 00:00:00.0";;;94;"12:26";;;"juil.-15";"EGMP_114_CDB_juil.-15";"Non identifi�";"Jean-Baptiste Bonnin";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;27.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;;"Reprise de donn�es Champs Blocs +" +373344;"Suivi des champs de blocs";"2015-08-03 00:00:00.0";;;104;"13:39";;;"ao�t-15";"EGMP_114_CDB_ao�t-15";"Non identifi�";"Sarah Olivier";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;21.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373351;"Suivi des champs de blocs";"2015-09-28 00:00:00.0";;;110;"11:28";;;"sept.-15";"EGMP_114_CDB_sept.-15";"Non identifi�";"Loe�za Lancelot";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;18.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373358;"Suivi des champs de blocs";"2016-05-09 00:00:00.0";;;106;"13:25";;"Semaine";"mai-16";"EGMP_114_CDB_mai-16";"Sarah Olivier";"Zachary Gaudin, Sarah Olivier";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"25-75% (Nuageux)";"Pas de pr�cipitation";;19.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Sud-Est";;"Reprise de donn�es Champs Blocs +" +373360;"Suivi des champs de blocs";"2016-06-06 00:00:00.0";;;102;"12:21";;"Semaine";"juin-16";"EGMP_114_CDB_juin-16";"Sarah Olivier";"Sarah Olivier";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;23.9;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Est";;"Reprise de donn�es Champs Blocs +" +373365;"Suivi des champs de blocs";"2016-07-05 00:00:00.0";;;96;"12:06";;"Semaine";"juil.-16";"EGMP_114_CDB_juil.-16";"Sarah Olivier";"Sarah Olivier";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"25-75% (Nuageux)";"Pas de pr�cipitation";;18.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373372;"Suivi des champs de blocs";"2016-08-20 00:00:00.0";;;102;"12:55";;"Week-end ou Jour F�ri�";"ao�t-16";"EGMP_114_CDB_ao�t-16";"Sarah Olivier";"Zachary Gaudin";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"25-75% (Nuageux)";"Pas de pr�cipitation";;21.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373379;"Suivi des champs de blocs";"2016-10-15 00:00:00.0";;;96;"10:41";;"Week-end ou Jour F�ri�";"oct.-16";"EGMP_114_CDB_oct.-16";"Sarah Olivier";"Sarah Olivier";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"25-75% (Nuageux)";"Pas de pr�cipitation";;15.7;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Sud-Est";;"Reprise de donn�es Champs Blocs +" +373384;"Suivi des champs de blocs";"2015-05-20 00:00:00.0";;;93;"12:38";;;"mai-15";"EGMP_116_CDB_mai-15";"Non identifi�";"Adrien Privat-Jean-Baptiste Bonnin-Maud Granier-Virginie Evenou";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;16.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +373386;"Suivi des champs de blocs";"2015-07-03 00:00:00.0";;;94;"12:26";;;"juil.-15";"EGMP_116_CDB_juil.-15";"Non identifi�";"Sarah Olivier";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;29.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373389;"Suivi des champs de blocs";"2015-08-04 00:00:00.0";;;101;"14:26";;;"ao�t-15";"EGMP_116_CDB_ao�t-15";"Non identifi�";"Adrien Privat";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;24.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373393;"Suivi des champs de blocs";"2015-09-30 00:00:00.0";;;113;"12:34";;;"sept.-15";"EGMP_116_CDB_sept.-15";"Non identifi�";"K�vin Fourni�re";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;19.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373397;"Suivi des champs de blocs";"2016-04-09 00:00:00.0";;;113;"12:58";;"Week-end ou Jour F�ri�";"avr.-16";"EGMP_116_CDB_avr.-16";"Sarah Olivier";"Richard Coz";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;13.1;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373403;"Suivi des champs de blocs";"2016-07-04 00:00:00.0";;;93;"11:18";;"Semaine";"juil.-16";"EGMP_116_CDB_juil.-16";"Sarah Olivier";"Zachary Gaudin, Adrien Privat, Marion Carsac";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"25-75% (Nuageux)";"Pas de pr�cipitation";;18.6;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Nord-Est";;"Reprise de donn�es Champs Blocs +" +373407;"Suivi des champs de blocs";"2016-08-20 00:00:00.0";;;103;"12:55";;"Week-end ou Jour F�ri�";"ao�t-16";"EGMP_116_CDB_ao�t-16";"Sarah Olivier";"Sarah Olivier";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"25-75% (Nuageux)";"Pas de pr�cipitation";;21.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Ouest";;"Reprise de donn�es Champs Blocs +" +373413;"Suivi des champs de blocs";"2016-10-19 00:00:00.0";;;101;"13:04";;"Semaine";"oct.-16";"EGMP_116_CDB_oct.-16";"Sarah Olivier";"Sarah Olivier";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;16.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"Nord";;"Reprise de donn�es Champs Blocs +" +373416;"Suivi des champs de blocs";"2015-09-27 00:00:00.0";;;106;"10:24";;;"sept.-15";"BASQ_01_CDB_ZP_sept.-15";"Non identifi�";"Josiane POPOSKY";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivis comportementaux";"V2015";"SYSTEME";"CPIE littoral basque";;"Pas de pr�cipitation";;20.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +373418;"Suivi des champs de blocs";"2016-03-07 00:00:00.0";;;87;"09:09";;"Semaine";"mars-16";"BASQ_01_CDB_ZP_mars-16";"Josiane Popovsky";"Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE littoral basque";"25-75% (Nuageux)";"Pluie continue";;7.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373420;"Suivi des champs de blocs";"2016-05-08 00:00:00.0";;;110;"12:18";;"Week-end ou Jour F�ri�";"mai-16";"BASQ_01_CDB_ZP_mai-16";"Josiane Popovsky";"Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE littoral basque";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373422;"Suivi des champs de blocs";"2016-08-21 00:00:00.0";;;101;"13:14";;"Week-end ou Jour F�ri�";"ao�t-16";"BASQ_01_CDB_ZP_ao�t-16";"Josiane Popovsky";"Josiane Popovsky";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE littoral basque";"25-75% (Nuageux)";"Pas de pr�cipitation";;24.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Ouest";;"Reprise de donn�es Champs Blocs +" +373427;"Suivi des champs de blocs";"2016-09-14 00:00:00.0";;;72;"09:27";;"Semaine";"sept.-16";"BASQ_01_CDB_ZP_sept.-16";"Josiane Popovsky";"Josiane Popovsky";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE littoral basque";"25-75% (Nuageux)";"Pas de pr�cipitation";;18.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"Ouest";;"Reprise de donn�es Champs Blocs +" +373429;"Suivi des champs de blocs";"2016-09-19 00:00:00.0";;;108;"12:59";;"Semaine";"sept.-16";"BASQ_01_CDB_ZP_sept.-16";"Josiane Popovsky";"Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE littoral basque";;;;;"0-Calme-1 km/h-Mer d'huile";"0-Calme-1 km/h-Mer d'huile";;;"Reprise de donn�es Champs Blocs +" +373433;"Suivi des champs de blocs";"2015-03-20 00:00:00.0";;;110;"10:00";;;"mars-15";"BASQ_01_CDB_ZF_mars-15";"Non identifi�";"Josiane POPOSKY";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivis comportementaux";"V2015";"SYSTEME";"CPIE littoral basque";;"Pas de pr�cipitation";;10.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;;"Reprise de donn�es Champs Blocs +" +373435;"Suivi des champs de blocs";"2015-08-16 00:00:00.0";;;86;"12:19";;;"ao�t-15";"BASQ_01_CDB_ZF_ao�t-15";"Non identifi�";"Josiane POPOSKY";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivis comportementaux";"V2015";"SYSTEME";"CPIE littoral basque";;"Pas de pr�cipitation";;23.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +373442;"Suivi des champs de blocs";"2015-10-25 00:00:00.0";;;89;"08:13";;;"oct.-15";"BASQ_01_CDB_ZF_oct.-15";"Non identifi�";"Josiane POPOSKY";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivis comportementaux";"V2015";"SYSTEME";"CPIE littoral basque";;"Pas de pr�cipitation";;18.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +373444;"Suivi des champs de blocs";"2016-03-07 00:00:00.0";;;87;"09:09";;"Semaine";"mars-16";"BASQ_01_CDB_ZF_mars-16";"Josiane Popovsky";"Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE littoral basque";"25-75% (Nuageux)";"Pluie continue";;7.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373446;"Suivi des champs de blocs";"2016-05-08 00:00:00.0";;;110;"12:18";;"Week-end ou Jour F�ri�";"mai-16";"BASQ_01_CDB_ZF_mai-16";"Josiane Popovsky";"Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE littoral basque";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373448;"Suivi des champs de blocs";"2016-08-17 00:00:00.0";;;83;"10:34";;"Semaine";"ao�t-16";"BASQ_01_CDB_ZF_ao�t-16";"Josiane Popovsky";"Josiane Popovsky, Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE littoral basque";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"Ouest";;"Reprise de donn�es Champs Blocs +" +373456;"Suivi des champs de blocs";"2016-09-14 00:00:00.0";;;72;"09:27";;"Semaine";"sept.-16";"BASQ_01_CDB_ZF_sept.-16";"Josiane Popovsky";"Josiane Popovsky";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE littoral basque";"25-75% (Nuageux)";"Pas de pr�cipitation";;18.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"Ouest";;"Reprise de donn�es Champs Blocs +" +373458;"Suivi des champs de blocs";"2016-10-18 00:00:00.0";;;111;"12:34";;"Semaine";"oct.-16";"BASQ_01_CDB_ZF_oct.-16";"Josiane Popovsky";"Josiane Popovsky";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivis comportementaux";"V2016";"SYSTEME";"CPIE littoral basque";"25-75% (Nuageux)";"Pas de pr�cipitation";;17.0;"0-Calme-1 km/h-Mer d'huile";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +373462;"Suivi des champs de blocs";"2014-10-10 00:00:00.0";;;106;"13:01";;;"oct.-14";"BDD_IVR&QECB_Locmariaquer_20141010_VImport.xlsx";"Non identifi�";"Tiphaine Yvon, JoNCthan pothier";"Golfe du Morbihan";"GDMO_01";"La falaise";;"Locmariaquer (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pluies �parses";;;;;;;"Reprise de donn�es Champs Blocs +" +373529;"Suivi des champs de blocs";"2015-03-22 00:00:00.0";;;115;"12:21";;;"mars-15";"BDD_IVR&QECB_Locmariaquer_22032015_VImport.xlsx";"Non identifi�";"G�raldine Colli, Jonathan pothier";"Golfe du Morbihan";"GDMO_01";"La falaise";;"Locmariaquer (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pas de pr�cipitation";;18.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373596;"Suivi des champs de blocs";"2015-10-30 00:00:00.0";;;115;"12:21";;;"oct.-15";"BDD_IVR&QECB_Locmariaquer_20151030_VImport.xlsx";"Non identifi�";"G�raldine Colli, Jonathan pothier";"Golfe du Morbihan";"GDMO_01";"La falaise";;"Locmariaquer (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pas de pr�cipitation";;18.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373663;"Suivi des champs de blocs";"2016-03-09 00:00:00.0";;;107;"11:20";;"Semaine";"mars-16";"BDD_IVR&QECB_Locmariaquer_20160309_VImport.xlsx";"margot le priol";"Jonathan Pothier, Thomas Cosson";"Golfe du Morbihan";"GDMO_01";"La falaise";;"Locmariaquer (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";"25-75% (Nuageux)";"Pas de pr�cipitation";;7.0;"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";"7-Grand frais-50 � 61 km/h- Lames d�ferlantes";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373730;"Suivi des champs de blocs";"2016-09-17 00:00:00.0";;;104;"12:09";;"Week-end ou Jour F�ri�";"sept.-16";"BDD_IVR&QECB_Locmariaquer_20160917_VImport.xlsx";"le priol margot";"Leslie Veron, Thomas Cosson, Le priol margot";"Golfe du Morbihan";"GDMO_01";"La falaise";;"Locmariaquer (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";"25-75% (Nuageux)";"Pas de pr�cipitation";;16.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +373797;"Suivi des champs de blocs";"2016-10-20 00:00:00.0";;;95;"14:53";;"Semaine";"oct.-16";"BDD_IVR_Locmariaquer_20161020_VImport.xlsx";"Leslie Veron";"Leslie Veron";"Golfe du Morbihan";"GDMO_01";"La falaise";;"Locmariaquer (champ de blocs)";"Suivi IVR";"V2016";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;14.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Nord";;"Reprise de donn�es Champs Blocs +" +373804;"Suivi des champs de blocs";"2014-11-06 00:00:00.0";;;100;"10:12";;;"nov.-14";"BDD_IVR&QECB_BegLann_20141106_VImport.xlsx";"Non identifi�";"Kim Van Arkel, Jonathan pothier";"Golfe du Morbihan";"GDMO_04";"Beg Lann";;"Beg Lann (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;;;;;;;;"Reprise de donn�es Champs Blocs +" +373871;"Suivi des champs de blocs";"2015-03-23 00:00:00.0";;;105;"13:00";;;"mars-15";"BDD_IVR&QECB_BegLann_20150323_VImport.xlsx";"Non identifi�";"Jonathan pothier";"Golfe du Morbihan";"GDMO_04";"Beg Lann";;"Beg Lann (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";;"Pas de pr�cipitation";;12.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +373938;"Suivi des champs de blocs";"2015-10-31 00:00:00.0";;;113;"13:10";;;"oct.-15";"BDD_IVR&QECB_BegLann_20151031_VImport.xlsx";"Non identifi�";"Jonathan pothier/Margaux F�on";"Golfe du Morbihan";"GDMO_04";"Beg Lann";;"Beg Lann (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";"25-75% (Nuageux)";"Pas de pr�cipitation";;14.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +374005;"Suivi des champs de blocs";"2016-03-10 00:00:00.0";;;115;"11:45";;"Semaine";"mars-16";"BDD_IVR&QECB_BegLann_20160310_VImport.xlsx";"Leslie Veron";"Jonathan Pothier, Thomas Cosson";"Golfe du Morbihan";"GDMO_04";"Beg Lann";;"Beg Lann (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";"25-75% (Nuageux)";"Pluie fine";;7.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Nord";;"Reprise de donn�es Champs Blocs +" +374072;"Suivi des champs de blocs";"2016-09-18 00:00:00.0";;;110;"12:40";;"Week-end ou Jour F�ri�";"sept.-16";"BDD_IVR&QECB_BegLann_20160918_VImport.xlsx";"margot le priol";"leslie , margot le priol, Thomas Cosson";"Golfe du Morbihan";"GDMO_04";"Beg Lann";;"Beg Lann (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel r�gional du golfe du Morbihan";"25-75% (Nuageux)";"Pas de pr�cipitation";;15.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord";;"Reprise de donn�es Champs Blocs +" +374139;"Suivi des champs de blocs";"2015-03-19 00:00:00.0";;;105;"10:01";;;"mars-15";"BDD_IVR&QECB_PFour_20150319&20_VImport.xlsx";"Non identifi�";"Ion TILLIER, Fran�oise GUIMAS, Adrien LETOURNEAU, Estelle BAUDINIERE";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";;"Pas de pr�cipitation";;10.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +374194;"Suivi des champs de blocs";"2015-04-20 00:00:00.0";;;109;"12:58";;;"avr.-15";"BDD_IVR&QECB_PFour_20150420&21_VImport.xlsx";"Non identifi�";"Marie FOUCARD, Jacques AUFFRET, J�r�me FIEVET, Maud BERNARD, Samuel MERMET, Ion TILLIER, Hel�ne LEGRAND, Alexis PENGRECH, Estelle BAUDINIERE";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";;"Pas de pr�cipitation";;14.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;;"Reprise de donn�es Champs Blocs +" +374261;"Suivi des champs de blocs";"2015-08-03 00:00:00.0";;;104;"13:55";;;"ao�t-15";"BDD_IVR_PlateauFour_20150803_VImport.xlsx";"Non identifi�";"Christine TRIDEAU, Camille DELAGE, Antonin GUIMARD, Hel�ne LEGRAND, Alexis PENGRECH, Estelle BAUDINIERE";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivi IVR";"V2015";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";;"Pas de pr�cipitation";;19.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +374268;"Suivi des champs de blocs";"2015-09-28 00:00:00.0";;;114;"11:47";;;"sept.-15";"BDD_IVR&QECB_PFour_20150928_VImport.xlsx";"Non identifi�";"Pauline POISSON, Florence BECK, Benjamin BAUDINIERE, M�lissa OUVRARD, Alexandra COLLIAS, Estelle BAUDINIERE";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";;"Pas de pr�cipitation";;16.0;"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";;;;"Reprise de donn�es Champs Blocs +" +374335;"Suivi des champs de blocs";"2016-04-07 00:00:00.0";;;109;"11:45";;"Semaine";"avr.-16";"BDD_IVR&QECB_PFour_20160407&08_VImport.xlsx";"Estelle BAUDINIERE";"Alexis PENGRECH, Morgane GUENO-BRUNEAU, Fran�oise GUIMAS";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;13.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +374402;"Suivi des champs de blocs";"2016-06-06 00:00:00.0";;;102;"12:37";;"Semaine";"juin-16";"BDD_IVR&QECB_PFour_20160606&07_VImport.xlsx";"Estelle BAUDINIERE";"Ion TILLIER, Ga�tan MORIN, Morgane GUENO-BRUNEAU, Thomas POPOVIC, Estelle BAUDINIERE";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;17.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Est";;"Reprise de donn�es Champs Blocs +" +374469;"Suivi des champs de blocs";"2016-09-19 00:00:00.0";;;111;"13:33";;"Semaine";"sept.-16";"BDD_IVR&QECB_PFour_20160919&20_VImport.xlsx";"Estelle BAUDINIERE";"Ga�tan MORIN, Marine REYNAUD, H�l�ne LEGRAND, Florent CORBAIN, Estelle BAUDINIERE";"Plateau du Four (territoire)";"FOUR_0";"Plateau du Four";;"Plateau du Four (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Comit� r�gional des p�ches maritimes et des �levages marins des Pays de Loire";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;17.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +374536;"Suivi des champs de blocs";"2014-10-08 00:00:00.0";;;109;"11:08";;;"oct.-14";"BDD_IVR&QECB_Groinducou_20141008_VImport.xlsx";"Non identifi�";"Adrien Privat, Sarah Olivier et Marine Le Feunteun";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_014-015";"Pointes du Grouin du Cou et de la R�publique";;"Pointe du Grouin du cou (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2014";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pluies �parses";;14.0;;;;;"Reprise de donn�es Champs Blocs +" +374599;"Suivi des champs de blocs";"2015-03-20 00:00:00.0";;;110;"10:26";;;"mars-15";"BDD_IVR&QECB_GroinduCou_20150319&20_VImport.xlsx";"Non identifi�";"Camille Pigot/ Marinne Leclercq";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_014-015";"Pointes du Grouin du Cou et de la R�publique";;"Pointe du Grouin du cou (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pluie fine";;6.0;"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";;;;"Reprise de donn�es Champs Blocs +" +374666;"Suivi des champs de blocs";"2015-09-29 00:00:00.0";;;113;"12:55";;;"sept.-15";"BDD_IVR&QECB_GroinduCou_20150929_VImport.xlsx";"Non identifi�";"Lise Sannipoli/ Julie Vuilleret/ Maud Bernard/ Justine Vall�e";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_014-015";"Pointes du Grouin du Cou et de la R�publique";;"Pointe du Grouin du cou (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;16.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;;"Reprise de donn�es Champs Blocs +" +374733;"Suivi des champs de blocs";"2016-04-06 00:00:00.0";;;103;"10:42";;"Semaine";"avr.-16";"BDD_IVR&QECB_GrouinDuCou_20160406_VImport.xlsx";"Pauline Momot";"Sebastien Poiret et Pauline Trecant";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_014-015";"Pointes du Grouin du Cou et de la R�publique";;"Pointe du Grouin du cou (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;0.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Ouest";;"Reprise de donn�es Champs Blocs +" +374800;"Suivi des champs de blocs";"2016-10-16 00:00:00.0";;;108;"11:20";;"Week-end ou Jour F�ri�";"oct.-16";"BDD_IVR&QECB_GrouinDuCou_20161016&18_VImport.xlsx";"Justine Vall�e";"Marine Genet et Justine Vall�e";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_014-015";"Pointes du Grouin du Cou et de la R�publique";;"Pointe du Grouin du cou (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"25-75% (Nuageux)";"Pas de pr�cipitation";;17.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +374867;"Suivi des champs de blocs";"2015-10-30 00:00:00.0";;;98;"12:28";;;"oct.-15";"BDD_IVR&QECB_Ensembert_20151029&30_VImport.xlsx";"Non identifi�";"Ana�s Lucas, Romary Berlot et Thierry Fradet";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_199";"Les Grenettes";;"Pas d'Ensembert (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;16.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +374934;"Suivi des champs de blocs";"2016-03-10 00:00:00.0";;;115;"11:36";;"Semaine";"mars-16";"BDD_IVR&QECB_Ensembert_20160310_VImport.xlsx";"Michael Gamarde";"Alix Burhendt et Michael Gamarde";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_199";"Les Grenettes";;"Pas d'Ensembert (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;7.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +375001;"Suivi des champs de blocs";"2016-10-18 00:00:00.0";;;115;"11:36";;"Semaine";"oct.-16";"BDD_IVR&QECB_Ensembert_20161018_VImport.xlsx";"MG";"Alix Burhendt et MG";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_199";"Les Grenettes";;"Pas d'Ensembert (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;7.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +375068;"Suivi des champs de blocs";"2014-09-08 00:00:00.0";;;97;"10:41";;;"sept.-14";"BDD_IVR_LaBree_08092014_VImport.xlsx";"Non identifi�";"Adrien Privat";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivi IVR";"V2014";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"75-100% (Tr�s nuageux)";"Pluie continue";;;;;"Ouest";;"Reprise de donn�es Champs Blocs +" +375075;"Suivi des champs de blocs";"2014-09-11 00:00:00.0";;;111;"13:04";;;"sept.-14";"BDD_IVR_LaBree_11092014_Vmport.xlsx";"Non identifi�";"Adrien Privat, Pascale Marjana (B), Tom Mothet (Stag), Marine LeFeunteun (B)";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivi IVR";"V2014";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;;;;;;"Reprise de donn�es Champs Blocs +" +375082;"Suivi des champs de blocs";"2014-10-10 00:00:00.0";;;109;"11:43";;;"oct.-14";"BDD_IVR&QECB_LaBree_oct2014_VImport.xlsx";"Non identifi�";"Adrien Privat, Francine Fevre, Benjamin Jaufry";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2014";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;;;;;;;;"Reprise de donn�es Champs Blocs +" +375149;"Suivi des champs de blocs";"2015-03-23 00:00:00.0";;;105;"12:48";;;"mars-15";"BDD_QECB&IVR_LaBree_23032015_VImport.xlsx";"Non identifi�";"Richard Coz/Jean-Baptiste Bonnin";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;11.6;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +375216;"Suivi des champs de blocs";"2015-10-27 00:00:00.0";;;108;"10:07";;;"oct.-15";"BDD_QECB&IVR_LaBree_26&27102015_VImport.xlsx";"Non identifi�";"RC+JBB";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pluie fine";;13.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +375283;"Suivi des champs de blocs";"2016-04-06 00:00:00.0";;;96;"10:42";;"Semaine";"avr.-16";"BDD_IVR&QECB_La Bree_20160406_VImport.xlsx";"Richard Coz, Coline Dumas, Adrien Lowenstein";"Adrien Privat, Marion, Axel Lauray, Jean-Louis le coeur";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"25-75% (Nuageux)";"Pas de pr�cipitation";;11.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Ouest";;"Reprise de donn�es Champs Blocs +" +375350;"Suivi des champs de blocs";"2016-10-16 00:00:00.0";;;108;"11:36";;"Week-end ou Jour F�ri�";"oct.-16";"BDD_IVR&QECB_LaBree_20161016_VImport.xlsx";"Sarah Olivier et Adrien Lowenstein";"Richard Coz Sarah Olivier Adrien Lowenstein Coline Dumas";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;12.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +375417;"Suivi des champs de blocs";"2014-10-09 00:00:00.0";;;111;"11:59";;;"oct.-14";"BDD_IVR&QECB_PerAnt_20141009_VImport.xlsx";"Non identifi�";"Richard Coz, Adrien Privat";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2014";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;;"Reprise de donn�es Champs Blocs +" +375484;"Suivi des champs de blocs";"2015-04-18 00:00:00.0";;;106;"11:10";;;"avr.-15";"BDD_QECB&IVR_PerAntiochat_18042015_VImport.xlsx";"Non identifi�";"Richard Coz, Adrien Privat";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pluie fine";;15.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +375551;"Suivi des champs de blocs";"2015-10-27 00:00:00.0";;;108;"10:07";;;"oct.-15";"BDD_QECB&IVR_PerAntiochat_20151027&29_VImport.xlsx";"Non identifi�";"AP+LL+PM";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pluie fine";;13.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +375618;"Suivi des champs de blocs";"2016-04-07 00:00:00.0";;;109;"11:28";;"Semaine";"avr.-16";"BDD_IVR&QECB_PerAnt_20160407_VImport.xlsx";"Adrien Privat, Gwena�lle Auproux";"Adrien Privat, Axel Auvray, Pascale Marjana";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;10.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +375685;"Suivi des champs de blocs";"2016-10-17 00:00:00.0";;;114;"12:11";;"Semaine";"oct.-16";"BDD_IVR&QECB_PerAnt_20161017_VImport.xlsx";"Samuel Rinaud et Zachary Gaudin";"Pierre Crepin, Camille Lemasne, Richad Coz, Dominique Moisan et Zachary Gaudin";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"75-100% (Tr�s nuageux)";"Pluies �parses";;13.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +375752;"Suivi des champs de blocs";"2015-04-20 00:00:00.0";;;112;"12:42";;;"avr.-15";"BDD_IVR&QECB_Chassiron_20150420_VImport.xlsx";"Non identifi�";"Tamatoa Laughlin/Virginie Evenou/Morgane JeanJean";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_119";"Concession scientifique";;"Chassiron (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pas de pr�cipitation";;16.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +375819;"Suivi des champs de blocs";"2015-10-28 00:00:00.0";;;113;"10:55";;;"oct.-15";"BDD_QECB&IVR_Chassiron_20151028_VImport.xlsx";"Non identifi�";"MMP+JBB+RC";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_119";"Concession scientifique";;"Chassiron (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";;"Pluies �parses";;13.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +375886;"Suivi des champs de blocs";"2016-03-10 00:00:00.0";;;115;"11:36";;"Semaine";"mars-16";"BDD_IVR&QECB_Chassiron_20160309&10_VImport.xlsx";"Richard Coz -Adrien Privat - Sarah Olivier";"Richard Coz -Adrien Privat - Marion Carsac";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_119";"Concession scientifique";;"Chassiron (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;8.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";;"Nord-Est";;"Reprise de donn�es Champs Blocs +" +375953;"Suivi des champs de blocs";"2016-09-19 00:00:00.0";;;109;"13:13";;"Semaine";"sept.-16";"BDD_IVR&QECB_Chassiron_20160919&10_VImport.xlsx";"CD/SO";"RC/CB/SO";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_119";"Concession scientifique";;"Chassiron (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"Parc naturel marin de l'estuaire de la Gironde et de la mer des Pertuis";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;17.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +376020;"Suivi des champs de blocs";"2014-11-24 00:00:00.0";;;93;"11:20";;;"nov.-14";"BDD_IVR&QECB_FB_ZP_20141124&25_VImport.xlsx";"Non identifi�";"Josiane POPOVSKY/Pascale FOSSECAVE";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"CPIE littoral basque";;"Pluies �parses";;;;;;;"Reprise de donn�es Champs Blocs +" +376087;"Suivi des champs de blocs";"2015-03-19 00:00:00.0";;;97;"09:30";;;"mars-15";"BDD_IVR&QECB_FlotsBleus_ZP_20150319&21_VFinale.xlsx";"Non identifi�";"Josiane POPOVSKY/Pascale FOSSECAVE";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"CPIE littoral basque";;"Pluie fine";;9.0;"0-Calme-1 km/h-Mer d'huile";;;;"Reprise de donn�es Champs Blocs +" +376154;"Suivi des champs de blocs";"2015-05-18 00:00:00.0";;;101;"11:20";;;"mai-15";"BDD_IVR&QECB_FlotsBleus_ZP_20150518&19_VImport.xlsx";"Non identifi�";"Josiane POPOVSKY";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"CPIE littoral basque";;"Pas de pr�cipitation";;18.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;;"Reprise de donn�es Champs Blocs +" +376221;"Suivi des champs de blocs";"2015-08-03 00:00:00.0";;;104;"13:18";;;"ao�t-15";"BDD_IVR&QECB_FlotsBleus_ZP_20150803_VImport.xlsx";"Non identifi�";"Josiane Popovsky / Pascale FOSSECAVE";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"CPIE littoral basque";;"Pas de pr�cipitation";;23.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +376288;"Suivi des champs de blocs";"2015-09-30 00:00:00.0";;;103;"12:38";;;"sept.-15";"BDD_IVR&QECB_FlotsBleus_ZP_20150928&30_VImport.xlsx";"Non identifi�";"Josiane Popovsky et Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"CPIE littoral basque";;"Pas de pr�cipitation";;18.0;"0-Calme-1 km/h-Mer d'huile";;;;"Reprise de donn�es Champs Blocs +" +376355;"Suivi des champs de blocs";"2016-03-10 00:00:00.0";;;116;"11:17";;"Semaine";"mars-16";"BDD_IVR&QECB_FB_ZP_20160310_VImport.xlsx";"Pascale Fossecave";"Josiane Popovsky et Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"CPIE littoral basque";"25-75% (Nuageux)";"Pas de pr�cipitation";;10.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +376422;"Suivi des champs de blocs";"2016-05-09 00:00:00.0";;;110;"13:05";;"Semaine";"mai-16";"BDD_IVR&QECB_FB_ZP_20160509_VImport.xlsx";"Pascale Fossecave";"Josiane Popovsky et Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"CPIE littoral basque";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;22.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Sud-Est";;"Reprise de donn�es Champs Blocs +" +376489;"Suivi des champs de blocs";"2016-08-22 00:00:00.0";;;98;"13:58";;"Semaine";"ao�t-16";"BDD_IVR&QECB_FB_ZP_20160822_VImport.xlsx";"Pascale Fossecave";"Josiane Popovsky et Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"CPIE littoral basque";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;24.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +376556;"Suivi des champs de blocs";"2016-09-20 00:00:00.0";;;100;"13:38";;"Semaine";"sept.-16";"BDD_IVR&QECB_FB_ZP_20160920_VImport.xlsx";"Pascale Fossecave";"Josiane Popovsky et Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone p�cheurs";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"CPIE littoral basque";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;22.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +376623;"Suivi des champs de blocs";"2015-03-24 00:00:00.0";;;91;"13:00";;;"mars-15";"BDD_IVR&QECB_FlotsBleus_ZF_20150324&25_VImport.xlsx";"Non identifi�";"Josiane Popovsky / Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"CPIE littoral basque";;"Pluie fine";;10.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;"Reprise de donn�es Champs Blocs +" +376690;"Suivi des champs de blocs";"2015-08-17 00:00:00.0";;;84;"12:51";;;"ao�t-15";"BDD_IVR&QECB_FB_ZF_20150817_VImport.xlsx";"Non identifi�";"Josiane Popovsky";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"CPIE littoral basque";;"Pas de pr�cipitation";;23.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +376757;"Suivi des champs de blocs";"2015-10-26 00:00:00.0";;;103;"09:05";;;"oct.-15";"BDD_IVR&QECB_FlotsBleus_ZF_20151026&27_VImport.xlsx";"Non identifi�";"Josiane Popovsky / Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2015";"SYSTEME";"CPIE littoral basque";;"Pas de pr�cipitation";;13.0;"0-Calme-1 km/h-Mer d'huile";;;;"Reprise de donn�es Champs Blocs +" +376824;"Suivi des champs de blocs";"2016-03-08 00:00:00.0";;;101;"09:52";;"Semaine";"mars-16";"BDD_IVR&QECB_FB_ZF_20160308&11_VImport.xlsx";"Pascale Fossecave";"Josiane Popovsky et Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"CPIE littoral basque";"75-100% (Tr�s nuageux)";"Pluies �parses";;5.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +376891;"Suivi des champs de blocs";"2016-08-18 00:00:00.0";;;93;"11:13";;"Semaine";"ao�t-16";"BDD_IVR&QECB_FB_ZF_20160818_VImport.xlsx";"Pascale Fossecave";"Josiane Popovsky et Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"CPIE littoral basque";"75-100% (Tr�s nuageux)";"Pluies �parses";;23.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +376958;"Suivi des champs de blocs";"2016-09-15 00:00:00.0";;;87;"10:09";;"Semaine";"sept.-16";"BDD_IVR&QECB_FB_ZF_20160915&16_VImport.xlsx";"Pascale Fossecave";"Josiane Popovsky et Pascale Fossecave";"C�te basque";"BASQ_01";"Les Flots Bleus";;"Les Flots Bleus (champ de blocs) - zone famille";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"SYSTEME";"CPIE littoral basque";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;15.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"Sud-Est";;"Reprise de donn�es Champs Blocs +" +377025;"Suivi des champs de blocs";"2014-10-08 00:00:00.0";;;109;"14:21";;;"oct.-14";"BDD_IVR&QECB_IlotStMichel_20141008&09_VImport.xlsx";"Non identifi�";"Margaux Pinel, Etienne Rogeau";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"Mission d'�tude du golfe normand-breton";;"Pas de pr�cipitation";;;;;;;"Reprise de donn�es Champs Blocs +" +377052;"Suivi des champs de blocs";"2015-04-18 00:00:00.0";;;108;"14:20";;;"avr.-15";"BDD_IVR&QECB_IlotStMichel_20150418&19_VImport.xlsx";"Non identifi�";"Margaux Pinel, Etienne Rogeau, Maud Bernard";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Mission d'�tude du golfe normand-breton";;"Pas de pr�cipitation";;17.0;;;;;"Reprise de donn�es Champs Blocs +" +377119;"Suivi des champs de blocs";"2015-10-29 00:00:00.0";;;109;"14:46";;;"oct.-15";"BDD_IVR&QECB_IlotStMichel_20151028&29_VImport.xlsx";"Non identifi�";"Margaux Pinel, Florent Corbain, Anais Perucaud, Olivier Abellard, Anne-Gael Planche";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Mission d'�tude du golfe normand-breton";;"Pas de pr�cipitation";;15.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;;"Reprise de donn�es Champs Blocs +" +377186;"Suivi des champs de blocs";"2016-05-07 00:00:00.0";;;113;"15:03";;"Week-end ou Jour F�ri�";"mai-16";"BDD_IVRQECB_IlotStMichel_20160507&08_VImport.xlsx";"R�becca Bauchet, Marie Motte";"R�becca Bauchet, Pauline Poisson";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Mission d'�tude du golfe normand-breton";"25-75% (Nuageux)";"Pas de pr�cipitation";;25.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"Sud-Est";;"Reprise de donn�es Champs Blocs +" +377253;"Suivi des champs de blocs";"2016-10-18 00:00:00.0";;;111;"16:02";;"Semaine";"oct.-16";"BDD_IVRQECB_IlotStMichel_20161017&18_VImport.xlsx";"R�becca Bauchet";"Florent Corbain, R�becca Bauchet";"Golfe Normand Breton";"GONB_00C";"Pointe de la Fosse Eyrand � la Pointe du Champ du Port";;"Champs de blocs de l'�lot Saint-Michel (p�rim�tre �tendu)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Mission d'�tude du golfe normand-breton";"75-100% (Tr�s nuageux)";"Pluie fine";;15.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +377387;"Suivi des champs de blocs";"2015-09-30 00:00:00.0";;;116;"13:32";;;"sept.-15";"BD_ChpsBlocs_20_20150930_Quemenes_VImport.xlsx";"Non identifi�";"TURPIN Yannis, C�cile Lefeuvre, Romain Hubert, Philippe Le Niliot";"Iroise";"PNMI_02";"Archipel de Mol�ne";;"Qu�m�n�s (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +377454;"Suivi des champs de blocs";"2016-04-07 00:00:00.0";;;114;"12:02";;;"avr.-16";"BD_ChpsBlocs_20_20160407_Quemenes_VImport.xlsx";"Non identifi�";"TURPIN Yannis, C�cile Lefeuvre, St�phane Dixneuf, Tiphaine Deheul";"Iroise";"PNMI_02";"Archipel de Mol�ne";;"Qu�m�n�s (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pluie fine";;8.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";;;;"Reprise de donn�es Champs Blocs +" +377521;"Suivi des champs de blocs";"2016-09-17 00:00:00.0";;;108;"12:21";;;"sept.-16";"BD_ChpsBlocs_20_20160917-Quemenes_VImport.xlsx";"Non identifi�";"TURPIN Yannis, Jean Philippe Coeffet, Antoine Besnier";"Iroise";"PNMI_02";"Archipel de Mol�ne";;"Qu�m�n�s (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;17.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +377576;"Suivi des champs de blocs";"2017-04-27 00:00:00.0";;;109;"12:43";;;"avr.-17";"BD_ChpsBlocs_20_20170427_Quemenes_VImport.xlsx";"Non identifi�";"Besnier Antoine,St�phane dixneuf C�cile Lefeuvre, Coeffet jean Philippe, Manon";"Iroise";"PNMI_02";"Archipel de Mol�ne";;"Qu�m�n�s (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;;"0-Calme-1 km/h-Mer d'huile";;;;"Reprise de donn�es Champs Blocs +" +377643;"Suivi des champs de blocs";"2017-09-20 00:00:00.0";;;97;"12:08";;;"sept.-17";"BD_ChpsBlocs_20_20170920_Quemenes_VImport.xlsx";"Non identifi�";"Besnier Antoine, C�cile Lefeuvre";"Iroise";"PNMI_02";"Archipel de Mol�ne";;"Qu�m�n�s (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +377686;"Suivi des champs de blocs";"2017-10-07 00:00:00.0";;;103;"13:02";;;"oct.-17";"BD_ChpsBlocs_20_20171007_Quemenes_VImport.xlsx";"Non identifi�";"Besnier Antoine, Coeffet jean Philippe";"Iroise";"PNMI_02";"Archipel de Mol�ne";;"Qu�m�n�s (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;;"Reprise de donn�es Champs Blocs +" +377717;"Suivi des champs de blocs";"2016-04-08 00:00:00.0";;;118;"12:48";;"Semaine";"avr.-16";"BD_ChpsBlocs_21_20160408_Sein_Goulenez_VImport.xlsx";"Non identifi�";"OG, CLS, CL";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Goulenez (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;10.0;"0-Calme-1 km/h-Mer d'huile";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +377784;"Suivi des champs de blocs";"2016-10-18 00:00:00.0";;;113;"13:28";;"Semaine";"oct.-16";"BD_ChpsBlocs_21_20161018_Sein_Goulenez_VImport.xlsx";"Non identifi�";"OG, CLS, MB, JAP";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Goulenez (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;15.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +377827;"Suivi des champs de blocs";"2017-04-27 00:00:00.0";;;110;"12:43";;"Semaine";"avr.-17";"BD_ChpsBlocs_21_20170427_Sein_Goulenez_Vimport.xlsx";"Non identifi�";"OG, CLS";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Goulenez (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;16.0;"0-Calme-1 km/h-Mer d'huile";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;"Reprise de donn�es Champs Blocs +" +377894;"Suivi des champs de blocs";"2017-11-06 00:00:00.0";;;106;"12:36";;"Semaine";"nov.-17";"BD_ChpsBlocs_21_20171106_Sein_Goulenez_Vimport.xlsx";"Non identifi�";"OG SM ER";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Goulenez (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;14.0;"0-Calme-1 km/h-Mer d'huile";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +377961;"Suivi des champs de blocs";"2015-04-21 00:00:00.0";;;100;"13:57";;;"avr.-15";"BD_ChpsBlocs_22_20150421_Sein_Vimport.xls.xlsx";"Non identifi�";"JAP CLS MB";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Kilaourou (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;18.0;;;;;"Reprise de donn�es Champs Blocs +" +378028;"Suivi des champs de blocs";"2015-09-29 00:00:00.0";;;117;"12:32";;;"sept.-15";"BD_ChpsBlocs_22_20150929_Sein_Vimport.xls.xlsx";"Non identifi�";"JAP LS FG CLS";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Kilaourou (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;18.0;"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";;"Nord-Est";;"Reprise de donn�es Champs Blocs +" +378095;"Suivi des champs de blocs";"2016-04-08 00:00:00.0";;;118;"12:48";;;"avr.-16";"BD_ChpsBlocs_22_20160408_Sein_kilaourou_VImportCorrig�.xlsx";"Non identifi�";"MB MBM FG CLS";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Kilaourou (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;10.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +378162;"Suivi des champs de blocs";"2016-09-19 00:00:00.0";;;111;"13:47";;;"sept.-16";"BD_ChpsBlocs_22_20160919_Sein_kilaourou_VImport.xlsx";"Non identifi�";"MB JAP LS FG CLS";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Kilaourou (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pluies �parses";;15.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;;"Reprise de donn�es Champs Blocs +" +378229;"Suivi des champs de blocs";"2017-04-27 00:00:00.0";;;110;"12:43";;;"avr.-17";"BD_ChpsBlocs_22_20170427_Sein_kilaourou_VImport.xlsx";"Non identifi�";"JAP LS ";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Kilaourou (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;12.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +378280;"Suivi des champs de blocs";"2017-11-06 00:00:00.0";;;106;"12:26";;;"nov.-17";"BD_ChpsBlocs_22_20171106_Sein_kilaourou_VImport.xlsx";"Non identifi�";"MB JAP FG EM";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Kilaourou (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;14.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +378335;"Suivi des champs de blocs";"2014-05-15 00:00:00.0";;;96;"14:43";;;"mai-14";"BDD_IVR&QECB_Verdelet_20140515&17_VImport.xlsx";"Non identifi�";"Franck Delisle, Olivier Massard";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Ilot de Verdelet (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;;;;;;"Reprise de donn�es Champs Blocs +" +378402;"Suivi des champs de blocs";"2014-10-08 00:00:00.0";;;109;"14:18";;;"oct.-14";"BDD_IVR&QECB_Verdelet_20141008&09_VImport.xlsx";"Non identifi�";"Franck Delisle, Vincent Tr�mel";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Ilot de Verdelet (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;;;;;;"Reprise de donn�es Champs Blocs +" +378469;"Suivi des champs de blocs";"2015-03-23 00:00:00.0";;;105;"15:46";;;"mars-15";"BDD_IVR&QECB_Verdelet_20150323_VImport.xlsx";"Non identifi�";"Franck Delisle, Vincent Tr�mel, St�phanie Plaga Lemanski";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Ilot de Verdelet (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;"Reprise de donn�es Champs Blocs +" +378536;"Suivi des champs de blocs";"2015-10-26 00:00:00.0";;;103;"12:17";;;"oct.-15";"BDD_IVR&QECB_Verdelet_20151026&30_VImport.xlsx";"Non identifi�";"Franck Delisle, Anne Priac, L�a Mie";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Ilot de Verdelet (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;18.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +378603;"Suivi des champs de blocs";"2016-04-09 00:00:00.0";;;115;"16:02";;"Week-end ou Jour F�ri�";"avr.-16";"BDD_IVR&QECB_Verdelet_20160410_VImport.xlsx";"Nora Tupinier";"Franck Delisle, Benjamin & Pierline Tournant";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Ilot de Verdelet (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"VivArmor Nature";"25-75% (Nuageux)";"Pas de pr�cipitation";;11.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;"Ouest";;"Reprise de donn�es Champs Blocs +" +378670;"Suivi des champs de blocs";"2016-10-18 00:00:00.0";;;111;"15:58";;"Semaine";"oct.-16";"BDD_IVR&QECB_Verdelet_20161018&19_VImport.xlsx";"Nora Tupinier";"Franck Delisle, Yves Faguet, Bruno Appadoo, Nora Tupinier";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Ilot de Verdelet (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"VivArmor Nature";"25-75% (Nuageux)";"Pluie fine";;12.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Nord";;"Reprise de donn�es Champs Blocs +" +378737;"Suivi des champs de blocs";"2014-05-14 00:00:00.0";;;91;"14:01";;;"mai-14";"BDD_IVR&QECB_Piegu_20140514_VImport.xlsx";"Non identifi�";"Franck Delisle, Olivier Massard";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Pi�gu (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;;;;;;"Reprise de donn�es Champs Blocs +" +378804;"Suivi des champs de blocs";"2014-11-05 00:00:00.0";;;94;"12:02";;;"nov.-14";"BDD_IVR&QECB_Piegu_20141105&06_VImport.xlsx";"Non identifi�";"Franck Delisle, Vincent Tr�mel";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Pi�gu (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"VivArmor Nature";"75-100% (Tr�s nuageux)";"Pluies �parses";;;;;;;"Reprise de donn�es Champs Blocs +" +378871;"Suivi des champs de blocs";"2015-03-19 00:00:00.0";;;105;"12:44";;;"mars-15";"BDD_IVR&QECB_Piegu_20150319_VImport.xlsx";"Non identifi�";"Franck Delisle, St�phanie Plaga Lemanski";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Pi�gu (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";;;;"Reprise de donn�es Champs Blocs +" +378934;"Suivi des champs de blocs";"2015-10-01 00:00:00.0";;;102;"16:44";;;"oct.-15";"BDD_IVR&QECB_Piegu_20151001_VImport.xlsx";"Non identifi�";"Franck Delisle, L�a Mie, Marine Salou";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Pi�gu (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +379001;"Suivi des champs de blocs";"2016-04-06 00:00:00.0";;;103;"13:40";;"Semaine";"avr.-16";"BDD_IVR&QECB_Piegu_20160406_VImport.xlsx";"Nora Tupinier";"Franck Delisle, Dominique Rault, LM";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Pi�gu (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"VivArmor Nature";"25-75% (Nuageux)";"Pas de pr�cipitation";;;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +379068;"Suivi des champs de blocs";"2016-10-16 00:00:00.0";;;111;"14:27";;"Week-end ou Jour F�ri�";"oct.-16";"BDD_IVR&QECB_Piegu_20161016_VImport.xlsx";"Nora Tupinier";"Franck Delisle & Justine Louis";"C�tes d'Armor";"ARMO_042-043";"Pi�gu / Verdelet";;"Pi�gu (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"VivArmor Nature";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;12.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;"Reprise de donn�es Champs Blocs +" +379135;"Suivi des champs de blocs";"2014-04-28 00:00:00.0";;;97;"13:29";;;"avr.-14";"BDD_IVRQECB_PteBilfot_2014042830_VImport.xlsx";"Franck Delisle";"Franck Delisle, Olivier Massard, Christelle Barth";"C�tes d'Armor";"ARMO_078-082-153";"Port Lazo / Pointe de Bilfot";;"Pointe de Bilfot (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;;;;;;"Reprise de donn�es Champs Blocs +" +379202;"Suivi des champs de blocs";"2014-10-10 00:00:00.0";;;102;"13:14";;;"oct.-14";"BDD_IVRQECB_PteBilfot_20141007_VImport.xlsx";"Franck Delisle, Vincent Tr�mel";"Franck Delisle, Vincent Tr�mel";"C�tes d'Armor";"ARMO_078-082-153";"Port Lazo / Pointe de Bilfot";;"Pointe de Bilfot (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"VivArmor Nature";;;;;;;;;"Reprise de donn�es Champs Blocs +" +379269;"Suivi des champs de blocs";"2015-04-18 00:00:00.0";;;110;"14:04";;;"avr.-15";"BDD_IVR&QECB_PteBilfot_20150418_VImport.xlsx";"Non identifi�";"Franck Delisle, Vincent Tr�mel";"C�tes d'Armor";"ARMO_078-082-153";"Port Lazo / Pointe de Bilfot";;"Pointe de Bilfot (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;10.0;"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";;;;"Reprise de donn�es Champs Blocs +" +379336;"Suivi des champs de blocs";"2015-10-27 00:00:00.0";;;111;"12:59";;;"oct.-15";"BDD_IVR&QECB_PteBilfot_20151027_VImport.xlsx";"Non identifi�";"Franck Delisle, L�a Mie, St�phanie Plaga Lemanski";"C�tes d'Armor";"ARMO_078-082-153";"Port Lazo / Pointe de Bilfot";;"Pointe de Bilfot (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;;"0-Calme-1 km/h-Mer d'huile";;;;"Reprise de donn�es Champs Blocs +" +379403;"Suivi des champs de blocs";"2016-04-07 00:00:00.0";;;114;"14:22";;"Semaine";"avr.-16";"BDD_IVR&QECB_PteBilfot_20160407_VImport.xlsx";"Nora Tupinier";"Franck Delisle, Nora Tupinier";"C�tes d'Armor";"ARMO_078-082-153";"Port Lazo / Pointe de Bilfot";;"Pointe de Bilfot (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"VivArmor Nature";"25-75% (Nuageux)";"Pas de pr�cipitation";;;;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +379470;"Suivi des champs de blocs";"2016-10-15 00:00:00.0";;;102;"13:31";;"Semaine";"oct.-16";"BDD_IVR&QECB_PteBilfot_20161015_VImport.xlsx";"Nora Tupinier";"Franck Delisle, Justine Louis, Nora Tupinier";"C�tes d'Armor";"ARMO_078-082-153";"Port Lazo / Pointe de Bilfot";;"Pointe de Bilfot (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"VivArmor Nature";"25-75% (Nuageux)";"Pas de pr�cipitation";;12.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Sud";;"Reprise de donn�es Champs Blocs +" +379537;"Suivi des champs de blocs";"2014-04-29 00:00:00.0";;;99;"13:45";;;"avr.-14";"BDD_IVR&QECB_IlePlate_20140429_VImport.xlsx";"Non identifi�";"Franck Delisle, Olivier Massard, Christelle Barth";"C�tes d'Armor";"ARMO_152";"Sept �les";;"Ile Plate (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"VivArmor Nature";"25-75% (Nuageux)";"Pas de pr�cipitation";;;;;;;"Reprise de donn�es Champs Blocs +" +379604;"Suivi des champs de blocs";"2015-04-17 00:00:00.0";;;101;"12:24";;;"avr.-15";"BDD_IVR&QECB_IlePlate_20150417_VImport.xlsx";"Non identifi�";"Franck Delisle, Vincent Tr�mel";"C�tes d'Armor";"ARMO_152";"Sept �les";;"Ile Plate (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"VivArmor Nature";;"Pas de pr�cipitation";;14.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +379671;"Suivi des champs de blocs";"2015-10-29 00:00:00.0";;;109;"13:44";;;"oct.-15";"BDD_IVR&QECB_IlePlate_20151029_VImport.xlsx";"Non identifi�";"Franck Delisle, L�a Mie";"C�tes d'Armor";"ARMO_152";"Sept �les";;"Ile Plate (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"VivArmor Nature";;"Pluie fine";;;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +379738;"Suivi des champs de blocs";"2016-03-24 00:00:00.0";;;89;"13:24";;"Semaine";"mars-16";"BDD_IVR&QECB_IlePlate_20160324_VImport.xlsx";"Nora Tupinier";"Franck Delisle & L�a Mie";"C�tes d'Armor";"ARMO_152";"Sept �les";;"Ile Plate (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"VivArmor Nature";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;11.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"Sud";;"Reprise de donn�es Champs Blocs +" +379805;"Suivi des champs de blocs";"2016-11-16 00:00:00.0";;;109;"14:09";;"Semaine";"nov.-16";"BDD_IVR&QECB_IlePlate_20161116_VImport.xlsx";"Nora Tupinier";"Franck Delisle & Nora Tupinier";"C�tes d'Armor";"ARMO_152";"Sept �les";;"Ile Plate (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"VivArmor Nature";"25-75% (Nuageux)";"Pluie fine";;12.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Ouest";;"Reprise de donn�es Champs Blocs +" +379872;"Suivi des champs de blocs";"2014-05-17 00:00:00.0";;;;;;;"mai-14";"BD_IVR_Perharidy_17052014_Import.xlsx";;;"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivi IVR";"V2014";"SYSTEME";"CPIE pays de Morlaix-Tregor";;;;;;;;;"Reprise de donn�es Champs Blocs +" +379879;"Suivi des champs de blocs";"2014-09-09 00:00:00.0";;;113;"13:29";;;"sept.-14";"BDD_IVR&QECB_Perharidy_20140909&11_VImport.xlsx";"Non identifi�";"B�n�dicte Compois, C�line Houbin, Nolwenn Malengrau";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"CPIE pays de Morlaix-Tregor";;;;;;;;;"Reprise de donn�es Champs Blocs +" +379934;"Suivi des champs de blocs";"2015-03-19 00:00:00.0";;;97;"11:32";;;"mars-15";"BDD_IVR&QECB_Perharidy_201503&05_VImport.xlsx";"Non identifi�";"Christine BLAIZE, Camille Lesann";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"CPIE pays de Morlaix-Tregor";;"Pas de pr�cipitation";;15.0;"6-Vent frais-39 � 49 km/h-Cr�tes d'�cume blanches.";;;;"Reprise de donn�es Champs Blocs +" +380001;"Suivi des champs de blocs";"2015-09-28 00:00:00.0";;;114;"13:15";;;"sept.-15";"BDD_IVR&QECB_Perharidy_20150928_VImport.xlsx";"Non identifi�";"G�raldine GABILLET, Andrea LAURO, Micha�l TANGHE";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"CPIE pays de Morlaix-Tregor";;"Pas de pr�cipitation";;18.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;;;"Reprise de donn�es Champs Blocs +" +380068;"Suivi des champs de blocs";"2016-03-10 00:00:00.0";;;116;"13:23";;"Semaine";"mars-16";"BDD_IVR&QECB_Perharidy_20160310_VImport.xlsx";"Micha�l Tanghe";"Micha�l Tanghe, Gwladys Daudin, Andrea Lauro";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"CPIE pays de Morlaix-Tregor";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;15.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Ouest";;"Reprise de donn�es Champs Blocs +" +380135;"Suivi des champs de blocs";"2016-09-19 00:00:00.0";;;116;"13:23";;"Semaine";"sept.-16";"BDD_IVR&QECB_Perharidy_20160919_VImport.xlsx";"Micha�l Tanghe";"B�n�dicte Compois et Christine Blaize";"Pays de Morlaix";"MORL_03";"Roscoff - Perharidy";;"Perharidy (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"CPIE pays de Morlaix-Tregor";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;15.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Ouest";;"Reprise de donn�es Champs Blocs +" +380202;"Suivi des champs de blocs";"2014-10-10 00:00:00.0";;;106;"13:13";;;"oct.-14";"BDD_IVR&QECB_Keraliou_20141010&11_VImport.xlsx";"Non identifi�";"Florence S�n�chal, Christian Lejeune, Maud Bernard";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"Brest m�tropole";;;;;;;"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +380269;"Suivi des champs de blocs";"2015-01-22 00:00:00.0";;;109;"12:30";;;"janv.-15";"BDD_IVR_Keraliou_20150122_Import.xlsx";"Non identifi�";"Florence S�n�chal, Christian Le Jeune, Maud Bernard et Elisabeth Merceron";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivi IVR";"V2015";"SYSTEME";"Brest m�tropole";;"Pas de pr�cipitation";;8.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;;;"Reprise de donn�es Champs Blocs +" +380276;"Suivi des champs de blocs";"2015-03-21 00:00:00.0";;;119;"11:52";;;"mars-15";"BDD_IVR&QECB_Keraliou_20150320&21_VImport.xlsx";"Non identifi�";"Peter, Annick, Jean No�l, Christian";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Brest m�tropole";;"Pas de pr�cipitation";;11.0;"7-Grand frais-50 � 61 km/h- Lames d�ferlantes";;;;"Reprise de donn�es Champs Blocs +" +380343;"Suivi des champs de blocs";"2016-03-10 00:00:00.0";;;116;"12:09";;"Semaine";"mars-16";"BDD_IVR&QECB_Keraliou_20160310&11_VImport.xlsx";"Ronan Moine";"Annick,Elisabeth,Florence";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Brest m�tropole";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;10.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;"Reprise de donn�es Champs Blocs +" +380410;"Suivi des champs de blocs";"2016-10-17 00:00:00.0";;;114;"12:42";;"Semaine";"oct.-16";"BDD_IVR&QECB_Keraliou_20161017&18_VImport.xlsx";"Christian Le Jeune";"Annick Postollec, Jean-No�l Leost";"Rade de Brest";"BRES_03";"Le Cosquer Passage > Kernisi (Keraliou)";;"Keraliou (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Brest m�tropole";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;16.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Sud-Ouest";;"Reprise de donn�es Champs Blocs +" +380477;"Suivi des champs de blocs";"2014-10-09 00:00:00.0";;;111;"11:59";;;"oct.-14";"BDD_IVR&QECB_Mousterlin_20141009&10_VImport.xlsx";"Non identifi�";"Agathe Lefranc, Maud Bernard, G�raldine Gaill�re";"Finist�re Sud";"FINS_02";"Pointe de Mousterlin";;"Pointe de Mousterlin (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;;;;;;"Reprise de donn�es Champs Blocs +" +380540;"Suivi des champs de blocs";"2015-03-21 00:00:00.0";;;118;"11:19";;;"mars-15";"BDD_IVR&QECB_Mousterlin_20150320&21_VImport.xlsx";"Non identifi�";"G�raldine GAILLERE, Pauline POISSON";"Finist�re Sud";"FINS_02";"Pointe de Mousterlin";;"Pointe de Mousterlin (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;10.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;"Reprise de donn�es Champs Blocs +" +380607;"Suivi des champs de blocs";"2015-10-28 00:00:00.0";;;113;"10:55";;;"oct.-15";"BDD_IVR&QECB_Mousterlin_2015102728&29_VImport.xlsx";"Non identifi�";"H�lo�se You et Pascal Ragot";"Finist�re Sud";"FINS_02";"Pointe de Mousterlin";;"Pointe de Mousterlin (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;12.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;;"Reprise de donn�es Champs Blocs +" +380670;"Suivi des champs de blocs";"2016-03-10 00:00:00.0";;;115;"11:36";;"Semaine";"mars-16";"BDD_IVR&QECB_Mousterlin_20160310_VImport.xlsx";"H�lo�se You";"Pauline Poisson";"Finist�re Sud";"FINS_02";"Pointe de Mousterlin";;"Pointe de Mousterlin (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Agence des aires marines prot�g�es";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;11.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +380733;"Suivi des champs de blocs";"2016-11-14 00:00:00.0";;;109;"10:05";;"Semaine";"nov.-16";"BDD_IVRQECB_Moust_20161114&15_VImport.xlsx";"H�lo�se You";"H�lo�se You et Mathilde Le Roux";"Finist�re Sud";"FINS_02";"Pointe de Mousterlin";;"Pointe de Mousterlin (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Agence des aires marines prot�g�es";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;13.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Nord-Ouest";;"Reprise de donn�es Champs Blocs +" +380800;"Suivi des champs de blocs";"2014-10-10 00:00:00.0";;;106;"12:43";;;"oct.-14";"BDD_IVR&QECB_SNG_20141010_VImport.xlsx";"Non identifi�";"Pascal Ragot et Marion Diard";"Finist�re Sud";"FINS_12";"Saint Nicolas - Bananec";;"Saint-Nicolas des Gl�nan (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2014";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;;;;;;"Reprise de donn�es Champs Blocs +" +380859;"Suivi des champs de blocs";"2015-03-22 00:00:00.0";;;115;"12:03";;;"mars-15";"BDD_IVR&QECB_SNG_20150322_VImport.xlsx";"Non identifi�";"Pauline POISSON, Bruno FERRE, Tony ROBINET, Pascal RAGOT, Marion DIARD";"Finist�re Sud";"FINS_12";"Saint Nicolas - Bananec";;"Saint-Nicolas des Gl�nan (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2015";"SYSTEME";"Agence des aires marines prot�g�es";;"Pas de pr�cipitation";;13.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";;;"Reprise de donn�es Champs Blocs +" +380926;"Suivi des champs de blocs";"2016-04-08 00:00:00.0";;;;;;;"avr.-16";"BDD_IVR&QECB_SNG_20160411_VImport.xlsx";"H�lo�se You";;"Finist�re Sud";"FINS_12";"Saint Nicolas - Bananec";;"Saint-Nicolas des Gl�nan (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Agence des aires marines prot�g�es";;;;;;;;;"Reprise de donn�es Champs Blocs +" +380973;"Suivi des champs de blocs";"2016-10-18 00:00:00.0";;;114;"12:10";;"Semaine";"oct.-16";"BDD_IVR&QECB_SNG_20161017_VImport.xlsx";"H�lo�se You";"You H�lo�se, Le Roux Mathilde";"Finist�re Sud";"FINS_12";"Saint Nicolas - Bananec";;"Saint-Nicolas des Gl�nan (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"SYSTEME";"Agence des aires marines prot�g�es";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;13.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Ouest";;"Reprise de donn�es Champs Blocs +" +458304;"Suivi des champs de blocs";"2020-09-19 00:00:00.0";"11:20";"13:30";113;;;"Week-end ou Jour F�ri�";"sep-20";"2020-09-19-EGMP-CDB-002";"Sarah Olivier";"Sarah Olivier et Nathan Ropers";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2016";"OLIVIER";"CPIE Marennes-Ol�ron";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;24.0;;;"Sud-Est";"3-peu agit�e-0,5 � 1,25 m"; +477617;"Suivi des champs de blocs";"2020-10-16 00:00:00.0";"11:15";"12:30";103;"11:14";1.0;"Semaine";"oct-20";"2020-10-16-PNMI-CDB-001";"Jean-Andr� PRAT";"Antoine BESNIER +Anna CAPIETTO";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Goulenez (champ de blocs)";"Suivi IVR";"V2016";"PRAT";"Parc naturel marin de la mer d'Iroise";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;"Nord";"2-belle-0,1 � 0,5 m";"Belle journ�e. +Environs 10 p�cheurs sur zone." +477640;"Suivi des champs de blocs";"2020-10-16 00:00:00.0";"10:45";"11:45";103;"11:14";0.74;"Week-end ou Jour F�ri�";"oct-20";"2020-10-16-PNMI-CDB-002";"Jean-Andr� PRAT";"Mickael BUANIC +Livier SCHWEYER";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Kilaourou (champ blocs)";"Suivi IVR";"V2016";"PRAT";"Parc naturel marin de la mer d'Iroise";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;15.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;"Nord";"2-belle-0,1 � 0,5 m";"Beau temps; +P�cheur sur site /contr�les effectu�s � la fin du protocole IVR" +477714;"Suivi des champs de blocs";"2020-03-12 00:00:00.0";"12:00";"13:30";115;"13:14";0.35;"Semaine";"mar-20";"2020-03-12-PNMI-CDB-001";"Jean-Andr� PRAT";"Jean-Andr� PRAT +Livier SCHWEYER";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Goulenez (champ de blocs)";"Suivi IVR";"V2016";"PRAT";"Parc naturel marin de la mer d'Iroise";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;8.0;;;;"2-belle-0,1 � 0,5 m";"Je n'ai pas retrouv� les photos des 5 quadrats +IVR uniquement" +477733;"Suivi des champs de blocs";"2019-03-22 00:00:00.0";"12:30";"13:40";115;"13:38";0.47;"Semaine";"mar-19";"2019-03-22-PNMI-CDB-001";"olivier GALLET";"Olivier GALLET +Livier SCHWEYER +";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Kilaourou (champ blocs)";"Suivi IVR";"V2016";"PRAT";"Parc naturel marin de la mer d'Iroise";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;14.0;;;;"2-belle-0,1 � 0,5 m";"Beau temps +Pas d'information m�t�o de plus � apporter " +477743;"Suivi des champs de blocs";"2019-10-29 00:00:00.0";"10:30";"11:45";109;"11:17";55.0;"Semaine";"oct-19";"2019-10-29-PNMI-CDB-001";"olivier GALLET";"Olivier GALLET +Antoine BOULOGNE";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Kilaourou (champ blocs)";"Suivi IVR";"V2016";"PRAT";"Parc naturel marin de la mer d'Iroise";"75-100% (Tr�s nuageux)";"Pluie continue";;12.0;"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";;;"4-agit�e-1,25 � 2,5 m";"surc�te" +477750;"Suivi des champs de blocs";"2019-10-29 00:00:00.0";"11:00";"12:30";109;"11:27";;"Semaine";"oct-19";"2019-10-29-PNMI-CDB-002";"olivier GALLET";"Jean-Andr� PRAT +Elodie GIACOMINI";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Goulenez (champ de blocs)";"Suivi IVR";"V2016";"PRAT";"Parc naturel marin de la mer d'Iroise";"75-100% (Tr�s nuageux)";"Pluies �parses";;9.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;"4-agit�e-1,25 � 2,5 m";"2 p�cheurs sur la zone; +Pas de photos exploitable (pas de lien entre les photos et les quadrats" +477757;"Suivi des champs de blocs";"2019-03-22 00:00:00.0";"12:45";"13:50";115;"13:37";0.38;"Semaine";"mar-19";"2019-03-22-PNMI-CDB-002";"olivier GALLET";"Jean-Andr� PRAT +Mickael BUANIC";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Goulenez (champ de blocs)";"Suivi IVR";"V2016";"PRAT";"Parc naturel marin de la mer d'Iroise";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;14.0;;;;"2-belle-0,1 � 0,5 m";"Temps agr�able +15 p�cheurs pr�sents avant la mar�e basse" +478379;"Suivi des champs de blocs";"2021-03-31 00:00:00.0";"13:30";"14:30";110;"14:04";0.7;"Semaine";"mar-21";"2021-03-31-PNMI-CDB-001";"Yannis turpin";"Anna capietto. Armel Bonneron";"Iroise";"PNMI_02";"Archipel de Mol�ne";;"Qu�m�n�s (champ blocs)";"Suivi IVR";"V2016";"TURPIN";"Parc naturel marin de la mer d'Iroise";"25-75% (Nuageux)";"Pas de pr�cipitation";;15.0;;;;; +487404;"Suivi des champs de blocs";"2021-03-31 00:00:00.0";"12:30";"13:40";107;"13:47";0.5;"Semaine";"mar-21";"2021-03-31-PNMI-CDB-002";"Jean-Andr� PRAT";"JAP- (Orlane et Etienne, stagiaires)";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Goulenez (champ de blocs)";"Suivi IVR";"V2016";"PRAT";"Parc naturel marin de la mer d'Iroise";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;12.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Sud-Ouest";"2-belle-0,1 � 0,5 m";"Belle journ�e, un peu de monde � la p�che (12 personnes)" +487405;"Suivi des champs de blocs";"2021-03-31 00:00:00.0";"12:30";"13:30";107;"13:47";0.5;"Semaine";"mar-21";"2021-03-31-PNMI-CDB-003";"Jean-Andr� PRAT";"Livier SCHWEYER / Mickael BUANIC";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Kilaourou (champ blocs)";"Suivi IVR";"V2016";"PRAT";"Parc naturel marin de la mer d'Iroise";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;10.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Sud-Ouest";"3-peu agit�e-0,5 � 1,25 m";"Belle journ�e ; 5 p�cheurs sur zone" +488602;"Suivi des champs de blocs";"2021-03-28 00:00:00.0";"10:15";"12:15";97;"11:30";;"Week-end ou Jour F�ri�";"mar-21";"2021-03-28-EGMP-CDB-001";"Sarah Olivier";"Sarah Olivier +Vaiana Mocka";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2016";"GUYONNARD";"CPIE Marennes-Ol�ron";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;7.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;"Sud-Est";;"Suivis comportementaux PNMEGMP 2020-2021" +488609;"Suivi des champs de blocs";"2021-05-27 00:00:00.0";"10:30";"12:40";103;"12:06";;"Semaine";"mai-21";"2021-05-27-EGMP-CDB-001";"Sarah Olivier";"Sarah Olivier +Joachim Jouzeau ";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2016";"GUYONNARD";"CPIE Marennes-Ol�ron";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;20.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;"Nord-Ouest";; +492097;"Suivi des champs de blocs";"2021-03-01 00:00:00.0";"11:10";"11:35";106;"12:16";;"Vacances";"mar-21";"2021-03-01-EGMP-CDB-001";"Sarah Olivier";"Sarah Olivier +Nathan Ropers";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2016";"GUYONNARD";"CPIE Marennes-Ol�ron";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";"Est";;"Suivis comportementaux r�alis�s pour le PNM EGMP" +492115;"Suivi des champs de blocs";"2021-03-28 00:00:00.0";"10:15";"12:05";97;"11:30";;"Week-end ou Jour F�ri�";"mar-21";"2021-03-28-EGMP-CDB-002";"Sarah Olivier";"Jean-Baptiste Bonnin +Thierry Duchamp";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2016";"GUYONNARD";"CPIE Marennes-Ol�ron";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;7.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;"Sud-Est";;"Suivis comportementaux r�alis�s pour le PNM EGMP 2020-2021" +492173;"Suivi des champs de blocs";"2021-04-27 00:00:00.0";"10:25";"12:10";100;"11:43";;"Vacances";"avr-21";"2021-04-27-EGMP-CDB-001";"Sarah Olivier";"Nathan Ropers +Thierry Duchamp";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2016";"GUYONNARD";"CPIE Marennes-Ol�ron";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;18.0;"3-Petite brise-12 � 19 km/h-Tr�s petites vagues. D�ferlement.";;"Nord-Est";; +494454;"Suivi des champs de blocs";"2021-07-26 00:00:00.0";;;94;"13:15";;"Vacances";"jul-21";"2021-07-26-EGMP-CDB-001";"Sarah Olivier";;"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2016";"OLIVIER";"CPIE Marennes-Ol�ron";"25-75% (Nuageux)";"Pas de pr�cipitation";;19.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;"Ouest";; +494456;"Suivi des champs de blocs";"2021-07-26 00:00:00.0";;;94;"13:15";;"Vacances";"jul-21";"2021-07-26-EGMP-CDB-002";"Jean-Baptiste Bonnin";"Jean-Baptiste Bonnin, Louise Haran";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2016";"OLIVIER";"CPIE Marennes-Ol�ron";"25-75% (Nuageux)";"Pas de pr�cipitation";;20.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;"Ouest";; +494799;"Suivi des champs de blocs";"2020-10-16 00:00:00.0";;;;;;"Semaine";"oct-20";"2020-10-16-PNMI-CDB-003";"Benjamin GUYONNET";"Laura HUGUENIN, M�lia DECOMBLE, Benjamin GUYONNET";"Iroise";"PNMI_02";"Archipel de Mol�ne";;"Qu�m�n�s (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"GUYONNET";"Parc naturel marin de la mer d'Iroise";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;"2-belle-0,1 � 0,5 m"; +496510;"Suivi des champs de blocs";"2019-03-22 00:00:00.0";;;115;"12:15";;"Semaine";"mar-19";"2019-03-22-PNMI-CDB-003";"Armel Bonneron";"Karine Tournemille / Anna Capietto";"Iroise";"PNMI_02";"Archipel de Mol�ne";;"Qu�m�n�s (champ blocs)";"Suivi IVR";"V2016";"CAPIETTO";"Parc naturel marin de la mer d'Iroise";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;"0-calme-0 m";"16 p�cheurs 30min avant la basse mer" +496519;"Suivi des champs de blocs";"2019-09-30 00:00:00.0";;;116;"13:06";;"Semaine";"sep-19";"2019-09-30-PNMI-CDB-002";"Armel Bonneron";;"Iroise";"PNMI_02";"Archipel de Mol�ne";;"Qu�m�n�s (champ blocs)";"Suivi IVR";"V2016";"CAPIETTO";"Parc naturel marin de la mer d'Iroise";;;;;;;;; +496643;"Suivi des champs de blocs";"2021-08-23 00:00:00.0";"10:16";"13:00";93;"12:16";;"Vacances";"aou-21";"2021-08-23-EGMP-CDB-001";"Sarah Olivier";"Sarah Olivier et Zachary Gaudin";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivis comportementaux";"V2016";"OLIVIER";"CPIE Marennes-Ol�ron";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;"Nord-Est";; +496659;"Suivi des champs de blocs";"2021-08-23 00:00:00.0";"10:16";"13:00";93;"12:16";;"Vacances";"aou-21";"2021-08-23-EGMP-CDB-002";"Vaiana Mocka";"Vaiana Mocka et Thierry Duchamp";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_116";"Perr� d'Antiochat";;"P�rr� d'Antiochat (champ de blocs)";"Suivis comportementaux";"V2016";"OLIVIER";"CPIE Marennes-Ol�ron";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;22.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;"Nord-Est";; +512043;"Suivi des champs de blocs";"2021-11-03 00:00:00.0";"10:30";"12:00";108;"11:10";1.05;"Semaine";"nov-21";"2021-11-03-PNMI-CDB-001";"Anna Capietto";"Armel Bonneron, H�l�ne Mah�o, Pierre Misko";"Iroise";"PNMI_02";"Archipel de Mol�ne";;"Qu�m�n�s (champ blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"TURPIN";"Parc naturel marin de la mer d'Iroise";"75-100% (Tr�s nuageux)";"Pas de pr�cipitation";;;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";"2-L�g�re brise-6 � 11 km/h-Vaguelettes";"Nord-Ouest";"2-belle-0,1 � 0,5 m"; +512569;"Suivi des champs de blocs";"2021-10-07 00:00:00.0";"10:00";"13:30";107;"12:03";;"Semaine";"oct-21";"2021-10-07-EGMP-CDB-001";"Perrine Bergossi";"CPIE-IODDE : L�a Camus, Jacques Baudouin. PNM EGMP : Sebastien Meslin, Mickael Fleury, Juliette Frigo. B�n�vole : Pierre Lagorce";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_119";"Concession scientifique";;"Chassiron (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"BERGOSSI";"CPIE Marennes-Ol�ron";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;;;;;"Quadrat 1 pas r�alis� car d�couvert trop peu de temps et pas de blocs !" +513924;"Suivi des champs de blocs";"2021-10-07 00:00:00.0";"10:00";"13:30";107;"12:03";;"Semaine";"oct-21";"2021-10-07-EGMP-CDB-002";"Perrine Bergossi";"CPIE-IODDE : Sarah Olivier, Jean-Baptiste Bonnin, Vaiana Mocka. PNM EGMP : Valentin Guyonnard, Anavel Ravaud. B�n�vole : Claire Dufau.";"Estuaire de la Gironde et Mer des Pertuis";"EGMP_114";"La Br�e et la Balise";;"La Br�e-les-Bains (champ de blocs)";"Suivi IVR+QECB - Pertuis et Pays Basque";"V2016";"BERGOSSI";"CPIE Marennes-Ol�ron";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;;;;;"Quadrat 3 non r�alis� par manque de temps !" +526185;"Suivi des champs de blocs";"2021-10-07 00:00:00.0";"10:30";"14:00";107;"12:33";0.85;"Semaine";"oct-21";"2021-10-07-BRES-CDB-003";"Parc naturel r�gional d'Armorique";"Nazar� Das Neves Bicho, Anne Troufl�au, Maud Bernard, Anne Boulet, Jonathan Richir";"Rade de Brest";"BRES_12";"Ch�teau > Pointe de l'Anse du Roz";;;"Suivi IVR+QECB - Bretagne";"V2016";"DAS NEVES BICHO";"Parc naturel r�gional d'Armorique";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;"0-Calme-1 km/h-Mer d'huile";"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Sud-Ouest";; +526197;"Suivi des champs de blocs";"2020-08-20 00:00:00.0";;;99;"12:58";;;"aou-20";"2020-08-20-BRES-CDB-001";"Parc naturel r�gional d'Armorique";"Micha�l Tanghe, Nazar� Das Neves Bicho, Valentine Dupont";"Rade de Brest";"BRES_12";"Ch�teau > Pointe de l'Anse du Roz";;;"Suivis comportementaux";"V2016";"DAS NEVES BICHO";"Parc naturel r�gional d'Armorique";;;;20.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";"Sud-Ouest";; +526834;"Suivi des champs de blocs";"2021-10-08 00:00:00.0";"12:00";"14:00";107;"12:55";0.64;"Semaine";"oct-21";"2021-10-08-PNMI-CDB-002";"Jean-Andr� Prat";"Mickael Buanic ; Titouan Danilo";"Iroise";"PNMI_07";"Chauss�e de Sein";;"Goulenez (champ de blocs)";"Suivi IVR+QECB - Bretagne";"V2016";"CAPIETTO";"Parc naturel marin de la mer d'Iroise";;"Pas de pr�cipitation";;10.0;"0-Calme-1 km/h-Mer d'huile";"0-Calme-1 km/h-Mer d'huile";"Nord-Ouest";"0-calme-0 m"; +527825;"Suivi des champs de blocs";"2020-09-16 00:00:00.0";;;104;"11:54";;"Semaine";"sep-20";"2020-09-16-BRES-CDB-001";"Parc naturel r�gional d'Armorique";"Nazar� Das Neves Bicho, Valentine Dupond";"Rade de Brest";"BRES_12";"Ch�teau > Pointe de l'Anse du Roz";;;"Suivis comportementaux";"V2016";"DAS NEVES BICHO";"Parc naturel r�gional d'Armorique";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;20.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"5-Bonne brise-29 � 38 km/h-Vagues mod�r�es.";;; +527836;"Suivi des champs de blocs";"2021-03-29 00:00:00.0";;;111;"12:42";;"Semaine";"mar-21";"2021-03-29-BRES-CDB-001";"Parc naturel r�gional d'Armorique";"Nazar� Das Neves Bicho, Anne Troufl�au";"Rade de Brest";"BRES_12";"Ch�teau > Pointe de l'Anse du Roz";;;"Suivis comportementaux";"V2016";"DAS NEVES BICHO";"Parc naturel r�gional d'Armorique";;;;14.0;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;"Sud-Est";; +527847;"Suivi des champs de blocs";"2021-04-28 00:00:00.0";;;111;"13:00";;"Semaine";"avr-21";"2021-04-28-BRES-CDB-001";"Parc naturel r�gional d'Armorique";"Micha�l Tanghe, Anne Troufl�au";"Rade de Brest";"BRES_12";"Ch�teau > Pointe de l'Anse du Roz";;;"Suivis comportementaux";"V2016";"DAS NEVES BICHO";"Parc naturel r�gional d'Armorique";"25-75% (Nuageux)";"Pas de pr�cipitation";;13.0;"2-L�g�re brise-6 � 11 km/h-Vaguelettes";;"Nord-Ouest";; +527863;"Suivi des champs de blocs";"2021-08-23 00:00:00.0";;;94;"12:46";1.2;"Semaine";"aou-21";"2021-08-23-BRES-CDB-003";"Parc naturel r�gional d'Armorique";"Franck Oppermann, Anne Troufl�au";"Rade de Brest";"BRES_12";"Ch�teau > Pointe de l'Anse du Roz";;;"Suivis comportementaux";"V2016";"DAS NEVES BICHO";"Parc naturel r�gional d'Armorique";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;;;;;; +527868;"Suivi des champs de blocs";"2021-10-06 00:00:00.0";;;97;"11:53";;"Semaine";"oct-21";"2021-10-06-BRES-CDB-001";"Parc naturel r�gional d'Armorique";"Anne Troufl�au";"Rade de Brest";"BRES_12";"Ch�teau > Pointe de l'Anse du Roz";;;"Suivis comportementaux";"V2016";"DAS NEVES BICHO";"Parc naturel r�gional d'Armorique";"25-75% (Nuageux)";"Pas de pr�cipitation";;;"1-Tr�s l�g�re brise-1 � 5 km/h-Mer rid�e";;;; +527881;"Suivi des champs de blocs";"2020-03-13 00:00:00.0";;;100;"13:57";;"Semaine";"mar-20";"2020-03-13-BRES-CDB-001";"Parc naturel r�gional d'Armorique";"Maud Bernard, Nazar� Das Neves Bicho, Micha�l Tanghe, Maria";"Rade de Brest";"BRES_12";"Ch�teau > Pointe de l'Anse du Roz";;;"Suivi IVR+QECB - Bretagne";"V2016";"DAS NEVES BICHO";"Parc naturel r�gional d'Armorique";"25-75% (Nuageux)";;;8.0;;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";"Sud-Ouest";; +527937;"Suivi des champs de blocs";"2020-09-18 00:00:00.0";;;112;"12:38";;"Semaine";"sep-20";"2020-09-18-BRES-CDB-002";"Parc naturel r�gional d'Armorique";"Maud Bernard, Annick Postollec, Franck Oppermann, Agathe Larzilli�re, Nazar� Das Neves Bicho, Hugo";"Rade de Brest";"BRES_12";"Ch�teau > Pointe de l'Anse du Roz";;;"Suivi IVR+QECB - Bretagne";"V2016";"DAS NEVES BICHO";"Parc naturel r�gional d'Armorique";"0-25% (Peu ou pas nuageux)";"Pas de pr�cipitation";;20.0;"4-Jolie brise-20 � 28 km/h-Petites vagues. Moutons.";;;; +527943;"Suivi des champs de blocs";"2020-09-19 00:00:00.0";;;113;"13:21";;"Week-end ou Jour F�ri�";"sep-20";"2020-09-19-BRES-CDB-003";"Parc naturel r�gional d'Armorique";"Annick Postollec, Nazar� Das Neves Bicho, Micha�l Tanghe";"Rade de Brest";"BRES_12";"Ch�teau > Pointe de l'Anse du Roz";;;"Suivi IVR+QECB - Bretagne";"V2016";"DAS NEVES BICHO";"Parc naturel r�gional d'Armorique";;"Pluie fine";;;"0-Calme-1 km/h-Mer d'huile";;;;