Commit c0b8d73e authored by Dorchies David's avatar Dorchies David
Browse files

Merge branch '19-feature-request-feedback-control' into 'dev'

Resolve "Feature request: feedback control"

Closes #28, #30, #31, and #19

See merge request !11
Showing with 522 additions and 113 deletions
+522 -113
......@@ -16,7 +16,7 @@ knitr::opts_chunk$set(echo = TRUE)
library(airGRiwrm)
```
The package **airGRiwrm** is a modeling tool for integrated water resource management based on the package **airGR** package [See @coron_airgr_2020].
The package **airGRiwrm** is a modeling tool for integrated water resource management based on the package **airGR** package [See @coronSuiteLumpedGR2017].
In a semi-distributive model, the catchment is divided into several sub-catchments. Each sub-catchment is an hydrological entity where a runfall-runoff model produces a flow time series at the outlet of the sub-catchment. Then a hydraulic link is set between sub-catchment outlets to model the flow at the outlet of the whole catchment. The aim of **airGRiwrm** is to organise the structure and schedule the execution of the hydrological and hydraulic sub-models contained in the semi-distributive model.
......@@ -24,7 +24,7 @@ In this vignette, we show how to prepare observation data for the model.
## Description of the example used in this tutorial
The example of this tutorial takes place on the Severn River in United Kingdom. The data set comes from the CAMEL GB database [See @coxon_catchment_2020].
The example of this tutorial takes place on the Severn River in United Kingdom. The data set comes from the CAMEL GB database [See @coxonCatchmentAttributesHydrometeorological2020].
```{r}
data(Severn)
......
......@@ -128,7 +128,7 @@ ParamMichel <- sapply(griwrm$id, function(x) {OutputsCalib[[x]]$Param})
```{r RunModel}
OutputsModels <- RunModel(
InputsModel = InputsModel,
InputsModel,
RunOptions = RunOptions,
Param = ParamMichel
)
......@@ -145,8 +145,9 @@ htmltools::tagList(lapply(
))
```
The resulting flow of each node in m3/s is directly available and can be plotted with these commands:
```{r}
Qm3s <- attr(OutputsModels, "Qm3s")
plot(Qm3s[1:100,])
```
......@@ -23,15 +23,15 @@ library(airGRiwrm)
We can see in vignette 'V02_Calibration_SD_model' that calibration result for the discharge simulated on the Avon at Evesham (Gauging station '54002') and on the Severn at Buildwas (Gauging station '54095') is not satisfactory. These upper basins are heavily influenced by impoundments and inter-basin transfers [@higgs_hydrological_1988].
We can see in vignette 'V02_Calibration_SD_model' that calibration result for the flow simulated on the Avon at Evesham (Gauging station '54002') and on the Severn at Buildwas (Gauging station '54095') is not satisfactory. These upper basins are heavily influenced by impoundments and inter-basin transfers [@higgsHydrologicalChangesRiver1988].
To cope with this influenced flow, we won't try to simulate it with an hydrological model and we will directly inject this discharge measurement in the model.
To cope with this influenced flow, we won't try to simulate it with a hydrological model and we will directly inject in the model the observed flow at these nodes.
## Convert a gauging station into a release spot
### Modifying the GRiwrm object
The production method of the `GRiwrm` object is detailed in the vignette "01_First_network" of the package.
The production method of the `GRiwrm` object is detailed in the vignette "01_First_network" of the package (and also in the documentation, type `?GRiwrm` to access to it).
Run `vignette("01_Structure_SD_model", package = "airGRiwrm")` before this one in order to create the Rdata file containing the `GRiwrmInputsModel` object:
......@@ -42,10 +42,10 @@ load("_cache/V01.RData")
To notify the SD model that the provided flow on a node should be directly used instead of an hydrological model, you only need to declare its model as `NA`:
```{r}
griwrm_OL <- griwrm
griwrm_OL$model[griwrm$id == "54002"] <- NA
griwrm_OL$model[griwrm$id == "54095"] <- NA
griwrm_OL
griwrmV03 <- griwrm
griwrmV03$model[griwrm$id == "54002"] <- NA
griwrmV03$model[griwrm$id == "54095"] <- NA
griwrmV03
```
Here, we keep the area of this basin which means that the discharge will be provided in mm per time step. If the discharge is provided in m<sup>3</sup>/s, then the area should be set to `NA` and downstream basin areas should be modified subsequently.
......@@ -57,7 +57,7 @@ The diagram of the network structure is represented below with:
* in red the node with direct flow injection (no hydrological model)
```{r diagram}
DiagramGRiwrm(griwrm_OL)
DiagramGRiwrm(griwrmV03)
```
### Generate the GRiwrmInputsModel object
......@@ -66,7 +66,7 @@ Since the network description has changed, the `GRiwrmInputsModel` should be gen
```{r}
load("_cache/V01b.RData")
IM_OL <- CreateInputsModel(griwrm_OL, DatesR, Precip, PotEvap, Qobs)
IM_OL <- CreateInputsModel(griwrmV03, DatesR, Precip, PotEvap, Qobs)
```
## Calibration of the new model
......@@ -82,16 +82,21 @@ The **airGR** calibration process is applied on each hydrological node of the `G
```{r Calibration}
OC_OL <- suppressWarnings(
Calibration(IM_OL, RunOptions, InputsCrit, CalibOptions))
Param_OL <- sapply(griwrm$id, function(x) {OC_OL[[x]]$Param})
ParamV03 <- sapply(griwrm$id, function(x) {OC_OL[[x]]$Param})
```
```{r}
save(griwrmV03, ParamV03, file = "_cache/V03.RData")
```
## Run model with this newly calibrated parameters
```{r RunModel}
OM_OL <- RunModel(
InputsModel = IM_OL,
IM_OL,
RunOptions = RunOptions,
Param = Param_OL
Param = ParamV03
)
```
......@@ -108,4 +113,12 @@ htmltools::tagList(lapply(
))
```
The resulting flow of each node in m3/s is directly available and can be plotted with these commands:
```{r}
Qm3s <- attr(OM_OL, "Qm3s")
plot(Qm3s[1:100,])
```
# References
---
title: "Example of a regulated withdrawal (closed-loop control)"
output:
rmarkdown::html_vignette:
toc: true
toc_depth: 2
vignette: >
%\VignetteIndexEntry{Example of a regulated withdrawal (closed-loop control)}
%\VignetteEngine{knitr::rmarkdown}
%\VignetteEncoding{UTF-8}
bibliography: airGRiwrm.bib
---
```{r, include = FALSE}
knitr::opts_chunk$set(
collapse = TRUE,
comment = "#>"
)
```
```{r setup}
library(airGRiwrm)
```
# Presentation of the case study
Starting from the network and the calibration set in the vignette "V03_Open-loop_influenced_flow", we add 2 intake points for irrigation.
Vignettes "V01_Structure_SD_model.Rmd" and "V03_Open-loop_influenced_flow" should be run in order to load input data and parameters of the model:
```{r load_cache}
load("_cache/V01b.RData")
load("_cache/V02.RData")
load("_cache/V03.RData")
```
## Network configuration
The intake points are located:
- on the Severn at 35 km upstream Bewdley (Gauging station '54001');
- on the Severn at 10 km upstream Saxons Lode (Gauging station '54032').
We have to add this 2 nodes in the `GRiwrm` object that describes the network:
```{r griwrm}
griwrmV04 <- rbind(
griwrmV03,
data.frame(
id = c("Irrigation1", "Irrigation2"),
down = c("54001", "54032"),
length = c(35000, 10000),
model = NA,
area = NA
)
)
DiagramGRiwrm(griwrmV04)
```
Nodes in red color are direct injection points (positive or negative flow) in the model, green nodes simulate either sub-basin rainfall-runoff and routing of upstream node flows and grey nodes simulate sub-basin rainfall-runoff flows only.
It's important to notice that even if the points "Irrigation1" and "Irrigation2" are located on Severn such as gauging stations "54095", "54001", "54032", there respective nodes are not represented on the same path in the model. Consequently, with this network configuration, it is not possible to know the value of the flow in the Severn river at "Irrigation1" or "Irrigation2" nodes. These values are only available in nodes "54095", "54001", "54032".
## Irrigation objectives and flow demand at intakes
Irrigation perimeters #1 cover an area of 15 km² and the perimeter #2 an area of 30 km².
The objective of these irrigation system is to cover the deficit in rain [@burtIrrigationPerformanceMeasures1997] with 80% of success. Here's below the calculation of the 8th decile of monthly water need given meteorological data of catchments "54001" and "54032" (unit mm/day) :
```{r monthly_water_need}
dailyWaterNeed <- PotEvap - Precip
dailyWaterNeed <- cbind(as.data.frame(DatesR), dailyWaterNeed[,c("54001", "54032")])
monthlyWaterNeed <- airGR::SeriesAggreg(dailyWaterNeed, "%m", rep("q80",2))
monthlyWaterNeed$DatesR <- as.numeric(format(monthlyWaterNeed$DatesR,"%m"))
names(monthlyWaterNeed)[1] <- "month"
monthlyWaterNeed
```
We bound the irrigation season between April and August, then the need for the crops can the be expressed in m3/s as follow:
```{r}
irrigationObjective <- monthlyWaterNeed
# Conversion in m3/day
irrigationObjective$"54001" <- monthlyWaterNeed$"54001" * 15 * 1E3
irrigationObjective$"54032" <- monthlyWaterNeed$"54032" * 30 * 1E3
# Irrigation period between April and August
irrigationObjective[-seq(4,8),-1] <- 0
# Conversion in m3/s
irrigationObjective[,c(2,3)] <- round(irrigationObjective[,c(2,3)] / 86400, 1)
irrigationObjective$total <- rowSums(irrigationObjective[,c(2,3)])
irrigationObjective
```
With an hypothesis of an efficiency of the irrigation systems of 50% as proposed by @secklerConceptEfficiencyWaterresources2003, the flow demand at intake for each irrigation perimeter is as follow (unit: m3/s):
```{r}
# Apply 50% of efficiency on the water demand
irrigationObjective[,seq(2,4)] <- irrigationObjective[,seq(2,4)] / 0.5
# Display result in m3/s
irrigationObjective
```
## Restriction of irrigation in case of water scarcity
### Minimal environmental flow at the intakes
In UK, abstraction restrictions are driven by Environmental Flow Indicator (EFI) supporting Good Ecological Status (GES) [@klaarDevelopingHydroecologicalModels2014]. Abstraction restriction consists in limiting the proportion of available flow for abstraction in function of the current flow regime (Reference taken for a river highly sensitive to abstraction classified "ASB3").
```{r abstraction restriction rule}
restriction_rule <- data.frame(quantile_natural_flow = c(.05, .3, 0.5, 0.7),
abstraction_rate = c(0.1, 0.15, 0.20, 0.24))
```
The control of the abstraction will be done at the gauging station downstream all the abstraction locations (node "54032"). So we need the flow corresponding to the quantiles of natural flow and flow available for abstraction in each case.
```{r}
quant_m3s32 <- quantile(
Qobs[,"54032"] * griwrmV04[griwrmV04$id == "54032", "area"] / 86.4,
restriction_rule$quantile_natural_flow,
na.rm = TRUE
)
restriction_rule_m3s <- data.frame(
threshold_natural_flow = quant_m3s32,
abstraction_rate = restriction_rule$abstraction_rate
)
matplot(restriction_rule$quantile_natural_flow,
cbind(restriction_rule_m3s$threshold_natural_flow,
restriction_rule$abstraction_rate * restriction_rule_m3s$threshold_natural_flow,
max(irrigationObjective$total)),
log = "x", type = "l",
main = "Quantiles of flow on the Severn at Saxons Lode (54032)",
xlab = "quantiles", ylab = "Flow (m3/s)",
lty = 1, col = rainbow(3, rev = TRUE)
)
legend("topleft", legend = c("Natural flow", "Abstraction limit", "Irrigation max. objective"),
col = rainbow(3, rev = TRUE), lty = 1)
```
The water availability or abstraction restriction depending on the natural flow is calculated with the function below:
```{r}
# A function to enclose the parameters in the function (See: http://adv-r.had.co.nz/Functional-programming.html#closures)
getAvailableAbstractionEnclosed <- function(restriction_rule_m3s) {
function(Qnat) approx(restriction_rule_m3s$threshold_natural_flow,
restriction_rule_m3s$abstraction_rate,
Qnat,
rule = 2)
}
# The function with the parameters inside it :)
getAvailableAbstraction <- getAvailableAbstractionEnclosed(restriction_rule_m3s)
# You can check the storage of the parameters in the function with
as.list(environment(getAvailableAbstraction))
```
### Restriction rules
The figure below shows that restrictions will be imposed to the irrigation perimeter if the natural flow at Saxons Lode is under around 20 m3/s.
Applying restriction on the intake on a real field is always challenging since it's difficult to regulate day by day the flow at the intake. Policy makers often decide to close the irrigation abstraction points in turn several days a week based on the mean flow of the previous week.
The number of authorized days per week for irrigation can be calculated as follow. All the calculation are based on the mean flow measured the week previous the current time step. First, the naturalised flow $N$ is equal to
$$ N = M + I_l $$
with:
- $M$, the measured flow at the downstream gauging station
- $I_l$, the total abstracted flow for irrigation for the last week
Available flow for abstraction $A$ is:
$$A = f_{a}(N)$$
with $f_a$ the availability function calculated from quantiles of natural flow and related restriction rates.
The flow planned for irrigation $Ip$ is then:
$$ I_p = \min (O, A)$$
with $O$ the irrigation objective flow.
The number of day for irrigation $n$ per week is then equal to:
$$ n = \lfloor \frac{I_p}{O} \times 7 \rfloor$$
with $\lfloor x \rfloor$ the function that returns the largest integers not greater than $x$
The rotation of restriction days between the 2 irrigation perimeters is operated as follow:
```{r}
restriction_rotation <- matrix(c(5,7,6,4,2,1,3,3,1,2,4,6,7,5), ncol = 2)
m <- do.call(
rbind,
lapply(seq(0,7), function(x) {
b <- restriction_rotation <= x
rowSums(b)
})
)
# Display the planning of restriction
image(1:ncol(m), 1:nrow(m), t(m), col = heat.colors(3, rev = TRUE),
axes = FALSE, xlab = "week day", ylab = "number of restriction days",
main = "Number of closed irrigation perimeters")
axis(1, 1:ncol(m), unlist(strsplit("SMTWTFS", "")))
axis(2, 1:nrow(m), seq(0,7))
for (x in 1:ncol(m))
for (y in 1:nrow(m))
text(x, y, m[y,x])
```
# Implementation of the model
As for the previous model, we need to set up an `GRiwrmInputsModel` object containing all the model inputs:
```{r}
# a flow is needed for all the nodes in the network
# even if it is overwritten after by a controller
QobsIrrig <- cbind(Qobs, Irrigation1 = 0, Irrigation2 = 0)
IM_Irrig <- CreateInputsModel(griwrmV04, DatesR, Precip, PotEvap, QobsIrrig)
```
# Implementation of the regulation controller
## The supervisor
The simulation is piloted through a `Supervisor` which can contain one or more `Controller`. This supervisor will work with a cycle of 7 days: the measurement are taken on the last 7 days and decisions are taken for each time step for the next seven days.
```{r}
sv <- CreateSupervisor(IM_Irrig, TimeStep = 7L)
```
## The control logic function
We need a controller that measures the flow at Saxon Lodes ("54032") and adapts weekly the abstracted flow at the two irrigation points. The supervisor will stop the simulation every 7 days and provides to the controller the last 7 simulated flow at Saxon Lodes ("54032") (measured variables) and controller should provide "command variables" for the next 7 days for the 2 irrigation points.
A control logic function should be provide to the controller. This control logic function processes the logic of the regulation taking measured flows as input and returning the "command variables". Both measured variables and command variables are of type `matrix` with the variables in columns and the time steps in rows.
In this example, the logic function must do the following tasks:
1. Calculate the objective of irrigation according to the month of the current days of simulation
2. calculate the naturalised flow from the measured flow and the abstracted flow of the previous week
3. calculate the number of days of restriction for each irrigation point
4. Return the abstracted flow for the next week taking into account restriction days
```{r}
fIrrigationFactory <- function(supervisor,
irrigationObjective,
restriction_rule_m3s,
restriction_rotation) {
function(Y) {
# Y is in mm/day and the basin's area is 6864.88 km2
# Calculate the objective of irrigation according to the month of the current days of simulation
month <- as.numeric(format(supervisor$ts.date, "%m"))
U <- irrigationObjective[month, c(2,3)] # m3/s
meanU <- mean(rowSums(U))
if(meanU > 0) {
# calculate the naturalised flow from the measured flow and the abstracted flow of the previous week
lastU <- supervisor$controllers[[supervisor$controller.id]]$U # m3/day
Qnat <- (Y * 6864.88 * 1E3 - rowSums(lastU)) / 86400 # m3/s
# Maximum abstracted flow available
Qrestricted <- mean(
approx(restriction_rule_m3s$threshold_natural_flow,
restriction_rule_m3s$abstraction_rate,
Qnat,
rule = 2)$y * Qnat
)
# Total for irrigation
QIrrig <- min(meanU, Qrestricted)
# Number of days of irrigation
n <- floor(7 * (1 - QIrrig / meanU))
# Apply days off
U[restriction_rotation[seq(nrow(U)),] <= n] <- 0
}
return(-U * 86400) # withdrawal is a negative flow on an upstream node
}
}
```
You can notice that the data required for processing the control logic are enclosed in the function `fIrrigationFactory` which takes the required data as arguments and return the control logic function.
Creating `fIrrigation` by calling `fIrrigationFactory` with the arguments currently in memory save these variables in the environment of the function:
```{r}
fIrrigation <- fIrrigationFactory(supervisor = sv,
irrigationObjective = irrigationObjective,
restriction_rule_m3s = restriction_rule_m3s,
restriction_rotation = restriction_rotation)
```
You can see what data is available in the environment of the function with:
```{r}
str(as.list(environment(fIrrigation)))
```
The `supervisor` variable is itself an environment which means that the variables contained inside it will be updated during the simulation. Some of them are useful for computing the control logic such as:
- `supervisor$ts.index`: indexes of the current time steps of simulation (In `IndPeriod_Run`)
- `supervisor$ts.date`: date/time of the current time steps of simulation
- `supervisor$controller.id`: identifier of the current controller
- `supervisor$controllers`: the `list` of `Controller`
## The controller
The controller contains:
- the location of the measured flows
- the location of the control commands
- the logic control function
```{r}
CreateController(sv,
ctrl.id = "Irrigation",
Y = "54032",
U = c("Irrigation1", "Irrigation2"),
FUN = fIrrigation)
```
# Running the simulation
For running a model with a supervision, you only need to substitute `InputsModel` by a `Supervisor` in the `RunModel` function call.
```{r}
OM_Irrig <- RunModel(sv, RunOptions = RunOptions, Param = ParamV03)
```
Simulated flows can be extracted and plot as follows:
```{r}
Qm3s <- attr(OM_Irrig, "Qm3s")
Qm3s <- Qm3s[Qm3s$DatesR > "2003-03-25" & Qm3s$DatesR < "2003-09-05",]
par(mfrow=c(2,1), mar = c(2.5,4,1,1))
plot(Qm3s[, c("DatesR", "54095", "54001", "54032")], main = "", xlab = "", ylim = c(0,100))
plot(Qm3s[, c("DatesR", "Irrigation1", "Irrigation2")], main = "", xlab = "")
```
We can observe that the irrigations points are alternatively closed some days a week when the flow at node "54032" becomes low.
# References
@misc{coxon_catchment_2020,
title = {Catchment attributes and hydro-meteorological timeseries for 671 catchments across Great Britain ({CAMELS}-{GB})},
rights = {This resource is available under the terms of the Open Government Licence},
url = {https://catalogue.ceh.ac.uk/id/8344e4f3-d2ea-44f5-8afa-86d2987543a9},
abstract = {This dataset provides hydro-meteorological timeseries and landscape attributes for 671 catchments across Great Britain. It collates river flows, catchment attributes and catchment boundaries from the {UK} National River Flow Archive together with a suite of new meteorological timeseries and catchment attributes. Daily timeseries for the time period 1st October 1970 to the 30th September 2015 are provided for a range of hydro-meteorological data (including rainfall, potential evapotranspiration, temperature, radiation, humidity and flow). A comprehensive set of catchment attributes are quantified describing a range of catchment characteristics including topography, climate, hydrology, land cover, soils, hydrogeology, human influences and discharge uncertainty. This dataset is intended for the community as a freely available, easily accessible dataset to use in a wide range of environmental data and modelling analyses. A research paper (Coxon et al, {CAMELS}-{GB}: Hydrometeorological time series and landscape attributes for 671 catchments in Great Britain) describing the dataset in detail will be made available in Earth System Science Data (https://www.earth-system-science-data.net/).},
publisher = {{NERC} Environmental Information Data Centre},
author = {Coxon, G. and Addor, N. and Bloomfield, J.P. and Freer, J. and Fry, M. and Hannaford, J. and Howden, N.J.K. and Lane, R. and Lewis, M. and Robinson, E.L. and Wagener, T. and Woods, R.},
editora = {Coxon, Gemma and Environmental Information Data Centre},
editoratype = {collaborator},
urldate = {2020-12-18},
date = {2020},
langid = {english},
doi = {10.5285/8344E4F3-D2EA-44F5-8AFA-86D2987543A9},
note = {Medium: text/csv Comma-separated values ({CSV}),Shapefile
type: dataset},
keywords = {Hydrology}
@article{burtIrrigationPerformanceMeasures1997,
title = {Irrigation {{Performance Measures}}: {{Efficiency}} and {{Uniformity}}},
shorttitle = {Irrigation {{Performance Measures}}},
author = {Burt, C. M. and Clemmens, A. J. and Strelkoff, T. S. and Solomon, K. H. and Bliesner, R. D. and Hardy, L. A. and Howell, T. A. and Eisenhauer, D. E.},
year = {1997},
month = nov,
volume = {123},
pages = {423--442},
publisher = {{American Society of Civil Engineers}},
issn = {0733-9437},
doi = {10.1061/(ASCE)0733-9437(1997)123:6(423)},
abstract = {It is essential to standardize the definitions and approaches to quantifying various irrigation performance measures. The ASCE Task Committee on Defining Irrigation Efficiency and Uniformity provides a comprehensive examination of various performance indices such as irrigation efficiency, application efficiency, irrigation sagacity, distribution uniformity, and others. Consistency is provided among different irrigation methods and different scales. Clarification of common points of confusion is provided, and methods are proposed whereby the accuracy of numerical values of the performance indicators can be assessed. This issue has two companion papers that provide more detailed information on statistical distribution uniformity and the accuracy of irrigation efficiency estimates.},
copyright = {Copyright \textcopyright{} 1997 American Society of Civil Engineers},
file = {C\:\\Users\\david.dorchies\\Zotero\\storage\\D9Q9VV6J\\Burt et al. - 1997 - Irrigation Performance Measures Efficiency and Un.pdf;C\:\\Users\\david.dorchies\\Zotero\\storage\\5NLYUVSN\\(ASCE)0733-9437(1997)1236(423).html},
journal = {Journal of Irrigation and Drainage Engineering},
language = {EN},
number = {6}
}
@article{coron_suite_2017,
title = {The suite of lumped {GR} hydrological models in an R package},
volume = {94},
issn = {13648152},
url = {https://linkinghub.elsevier.com/retrieve/pii/S1364815217300208},
doi = {10.1016/j.envsoft.2017.05.002},
pages = {166--171},
journaltitle = {Environmental Modelling \& Software},
shortjournal = {Environmental Modelling \& Software},
author = {Coron, L. and Thirel, G. and Delaigue, O. and Perrin, C. and Andréassian, V.},
urldate = {2020-12-18},
date = {2017-08},
langid = {english}
@article{coronSuiteLumpedGR2017,
title = {The Suite of Lumped {{GR}} Hydrological Models in an {{R}} Package},
author = {Coron, L. and Thirel, G. and Delaigue, O. and Perrin, C. and Andr{\'e}assian, V.},
year = {2017},
month = aug,
volume = {94},
pages = {166--171},
issn = {1364-8152},
doi = {10.1016/j.envsoft.2017.05.002},
abstract = {Lumped hydrological models are catchment-scale representations of the transformation of precipitation into discharge. They are widely-used tools for real-time flow forecasting, flood design and climate change impact assessment, and they are often used for training and educational purposes. This article presents an R-package, airGR, to facilitate the implementation of the GR lumped hydrological models (including GR4J) and a snow-accumulation and melt model. The package allows users to calibrate and run hourly to annual models on catchment sets and to analyse their outputs. While the core of the models is implemented in Fortran, the user can manage the input/output data within R. A number of options and plotting functions are proposed to ease automate tests and analyses of the results. The codes are flexible enough to include external models, other calibration routines or efficiency criteria. To illustrate the features of airGR, we present one application example for a French mountainous catchment.},
file = {C\:\\Users\\david.dorchies\\Zotero\\storage\\J94F6IEJ\\Coron et al. - 2017 - The suite of lumped GR hydrological models in an R.pdf;C\:\\Users\\david.dorchies\\Zotero\\storage\\47JDT6WA\\S1364815217300208.html},
journal = {Environmental Modelling \& Software},
keywords = {Calibration,Flow simulation,Hydrological modelling,Lumped models,Parsimony,R package},
language = {en}
}
@misc{coron_airgr_2020,
title = {{airGR}: Suite of {GR} Hydrological Models for Precipitation-Runoff Modelling. R package version 1.4.3.65.},
url = {https://data.inra.fr/citation?persistentId=doi:10.15454/EX11NA},
shorttitle = {{airGR}},
abstract = {Hydrological modelling tools developed at {INRAE}-Antony ({HYCAR} Research Unit, France). The package includes several conceptual rainfall-runoff models ({GR}4H, {GR}5H, {GR}4J, {GR}5J, {GR}6J, {GR}2M, {GR}1A), a snow accumulation and melt model ({CemaNeige}) and the associated functions for their calibration and evaluation. Use help({airGR}) for package description and references.},
publisher = {Portail Data {INRAE}},
author = {Coron, Laurent and Delaigue, Olivier and Thirel, Guillaume and Perrin, Charles and Michel, Claude},
editora = {Delaigue, Olivier},
editoratype = {collaborator},
urldate = {2020-12-18},
date = {2020},
doi = {10.15454/EX11NA},
note = {type: dataset}
@misc{coxonCatchmentAttributesHydrometeorological2020,
title = {Catchment Attributes and Hydro-Meteorological Timeseries for 671 Catchments across {{Great Britain}} ({{CAMELS}}-{{GB}})},
author = {Coxon, G. and Addor, N. and Bloomfield, J.P. and Freer, J. and Fry, M. and Hannaford, J. and Howden, N.J.K. and Lane, R. and Lewis, M. and Robinson, E.L. and Wagener, T. and Woods, R.},
year = {2020},
publisher = {{NERC Environmental Information Data Centre}},
doi = {10.5285/8344E4F3-D2EA-44F5-8AFA-86D2987543A9},
abstract = {This dataset provides hydro-meteorological timeseries and landscape attributes for 671 catchments across Great Britain. It collates river flows, catchment attributes and catchment boundaries from the UK National River Flow Archive together with a suite of new meteorological timeseries and catchment attributes. Daily timeseries for the time period 1st October 1970 to the 30th September 2015 are provided for a range of hydro-meteorological data (including rainfall, potential evapotranspiration, temperature, radiation, humidity and flow). A comprehensive set of catchment attributes are quantified describing a range of catchment characteristics including topography, climate, hydrology, land cover, soils, hydrogeology, human influences and discharge uncertainty. This dataset is intended for the community as a freely available, easily accessible dataset to use in a wide range of environmental data and modelling analyses. A research paper (Coxon et al, CAMELS-GB: Hydrometeorological time series and landscape attributes for 671 catchments in Great Britain) describing the dataset in detail will be made available in Earth System Science Data (https://www.earth-system-science-data.net/).},
collaborator = {Coxon, Gemma and Environmental Information Data Centre},
copyright = {This resource is available under the terms of the Open Government Licence},
keywords = {Hydrology},
language = {en}
}
@article{higgs_hydrological_1988,
title = {Hydrological changes and river regulation in the {UK}},
volume = {2},
issn = {1099-1646},
url = {https://onlinelibrary.wiley.com/doi/abs/10.1002/rrr.3450020312},
doi = {https://doi.org/10.1002/rrr.3450020312},
abstract = {Water levels of streams and rivers in the United Kingdom have been regulated by weirs for more than one thousand years, but regulation of the flow regime by impoundments began in the latter half on the 19th Century. Organized river flow measurements were not undertaken until 1935, and today the average record length is about 20 years. Only three gauging stations have provided data suitable for pre- and post-impoundment comparisons. Other studies have relied on the comparison of regulated and naturalized discharges. In either case climate and land-use changes make evaluation of the hydrological effect of impoundments problematic. This paper reviews research on hydrological changes due to river regulation in the {UK}, and presents a case study of the River Severn to evaluate the influence of Clywedog Reservoir on flood magnitude and frequency. Consequent upon dam completion, on average, median flows have been reduced by about 50per cent; mean annual floods have been reduced by about 30per cent; and low flows have been maintained at about 22 per cent higher than the natural Q95 discharge. However, marked differences exist between rivers. The direct effect of reservoir compensation flows and the indirect effect of inter basin transfers for supply have significantly increased minimum flows in most rivers, although in the case of the latter this involves the discharge of treated effluents. In contrast, the effects of impoundments on flood magnitude and frequency is less clear and on the River Severn, at least, changes in flood hydrology during the past two decades are shown to be more related to climate change than to river regulation.},
pages = {349--368},
number = {3},
journaltitle = {Regulated Rivers: Research \& Management},
author = {Higgs, Gary and Petts, Geoff},
urldate = {2020-12-26},
date = {1988},
langid = {english},
note = {\_eprint: https://onlinelibrary.wiley.com/doi/pdf/10.1002/rrr.3450020312},
keywords = {Floods, Dry weather flow, Flow regime},
file = {Higgs et Petts - 1988 - Hydrological changes and river regulation in the U.pdf:C\:\\Users\\david.dorchies\\Zotero\\storage\\VIG8TKGU\\Higgs et Petts - 1988 - Hydrological changes and river regulation in the U.pdf:application/pdf;Snapshot:C\:\\Users\\david.dorchies\\Zotero\\storage\\74LGCRCE\\rrr.html:text/html}
@article{graftonParadoxIrrigationEfficiency2018,
title = {The Paradox of Irrigation Efficiency},
author = {Grafton, R. Q. and Williams, J. and Perry, C. J. and Molle, F. and Ringler, C. and Steduto, P. and Udall, B. and Wheeler, S. A. and Wang, Y. and Garrick, D. and Allen, R. G.},
year = {2018},
month = aug,
volume = {361},
pages = {748--750},
publisher = {{American Association for the Advancement of Science}},
issn = {0036-8075, 1095-9203},
doi = {10.1126/science.aat9314},
abstract = {Higher efficiency rarely reduces water consumption Higher efficiency rarely reduces water consumption},
chapter = {Policy Forum},
copyright = {Copyright \textcopyright{} 2018, American Association for the Advancement of Science. http://www.sciencemag.org/about/science-licenses-journal-article-reuseThis is an article distributed under the terms of the Science Journals Default License.},
file = {C\:\\Users\\david.dorchies\\Zotero\\storage\\VIHQIB84\\Grafton et al. - 2018 - The paradox of irrigation efficiency.pdf;C\:\\Users\\david.dorchies\\Zotero\\storage\\XDKSCJIX\\748.html},
journal = {Science},
language = {en},
number = {6404},
pmid = {30139857}
}
@article{reynard_flood_2001,
title = {The Flood Characteristics of Large U.K. Rivers: Potential Effects of Changing Climate and Land Use},
volume = {48},
issn = {1573-1480},
url = {https://doi.org/10.1023/A:1010735726818},
doi = {10.1023/A:1010735726818},
shorttitle = {The Flood Characteristics of Large U.K. Rivers},
abstract = {A continuous flow simulation model({CLASSIC}) has been used to assess the potential impactof climate and land use changes on the flood regimesof large U.K. catchments. Climate change scenarios,based on the {HadCM}2 experiments from the {HadleyCentre}, are applied to the Severn and Thames rivers.The analysis shows that, for the 2050s, the climatechange scenarios result in an increase in both thefrequency and magnitude of flooding events in theserivers. The various ways of applying the rainfallscenario can have a significant effect on thesegeneral conclusions, although generally do not affecteither the direction or consistency of the changes.While ‘best guess’ land use changes show little impacton flood response, a 50\% increase in forest covercould counter-act the impact of climate change. Aswould be expected, a large change in the urban coverof the catchments does have a large effect on theflood regimes, increasing both the frequency andmagnitude of floods significantly beyond the changesdue to climate alone. Further research is requiredinto the potential impacts of seasonal changes in thedaily rainfall and potential evaporation regimes, landuse changes and the interaction between the two.},
pages = {343--359},
number = {2},
journaltitle = {Climatic Change},
shortjournal = {Climatic Change},
author = {Reynard, N. S. and Prudhomme, C. and Crooks, S. M.},
urldate = {2020-12-26},
date = {2001-02-01},
langid = {english},
file = {Reynard et al. - 2001 - The Flood Characteristics of Large U.K. Rivers Po.pdf:C\:\\Users\\david.dorchies\\Zotero\\storage\\6CMCZNJV\\Reynard et al. - 2001 - The Flood Characteristics of Large U.K. Rivers Po.pdf:application/pdf}
@techreport{gustardStudyCompensationFlows1987,
title = {A Study of Compensation Flows in the {{UK}}},
author = {Gustard, Alan and Cole, Gwyneth and Marshall, David and Bayliss, Adrian},
year = {1987},
month = nov,
pages = {170},
institution = {{Institute of Hydrology}},
file = {C\:\\Users\\david.dorchies\\Zotero\\storage\\Z3VSBM2Y\\Gustard et al. - 1987 - A study of compensation flows in the UK.pdf}
}
@article{jolley_large-scale_1996,
title = {A Large-Scale Grid-Based Hydrological Model of the Severn and Thames Catchments},
volume = {10},
issn = {1747-6593},
url = {https://onlinelibrary.wiley.com/doi/abs/10.1111/j.1747-6593.1996.tb00043.x},
doi = {https://doi.org/10.1111/j.1747-6593.1996.tb00043.x},
abstract = {This paper addresses the issues of scale and appropriate model complexity for large-scale hydrological models. A grid-based hydrological model, which employs the {UK} Meteorological Office Rainfall and Evaporation Calculation System, is applied to the Severn and Thames catchments using a grid scale of 40 km, and is shown to reproduce the observed mean annual runoff over a 10-year period to within 6\% with no prior calibration. The variation in the model performance is strongly correlated with the linearity of the annual rainfall/runoff relationship and a climate index. At the monthly scale, runoff routing becomes significant, and the introduction of a two-parameter routeing algorithm significantly improves the monthly runoff simulations giving efficiencies of 90\% and 88\% for the Severn and Thames respectively. The results provide guidance to climate modellers looking for efficient and robust land-surface parameterizations, and indicate the potential application of such a modelling scheme to water resource managers.},
pages = {253--262},
number = {4},
journaltitle = {Water and Environment Journal},
author = {Jolley, T. J. and Wheater, H. S.},
urldate = {2020-12-26},
date = {1996},
langid = {english},
note = {\_eprint: https://onlinelibrary.wiley.com/doi/pdf/10.1111/j.1747-6593.1996.tb00043.x},
keywords = {Climate models, runoff, Severn, Thames, water resources, water-balance model},
file = {Jolley et Wheater - 1996 - A Large-Scale Grid-Based Hydrological Model of the.pdf:C\:\\Users\\david.dorchies\\Zotero\\storage\\AKJEZFAY\\Jolley et Wheater - 1996 - A Large-Scale Grid-Based Hydrological Model of the.pdf:application/pdf;Snapshot:C\:\\Users\\david.dorchies\\Zotero\\storage\\4G5L69X5\\j.1747-6593.1996.tb00043.html:text/html}
}
\ No newline at end of file
@article{higgsHydrologicalChangesRiver1988,
title = {Hydrological Changes and River Regulation in the {{UK}}},
author = {Higgs, Gary and Petts, Geoff},
year = {1988},
volume = {2},
pages = {349--368},
issn = {1099-1646},
doi = {10.1002/rrr.3450020312},
abstract = {Water levels of streams and rivers in the United Kingdom have been regulated by weirs for more than one thousand years, but regulation of the flow regime by impoundments began in the latter half on the 19th Century. Organized river flow measurements were not undertaken until 1935, and today the average record length is about 20 years. Only three gauging stations have provided data suitable for pre- and post-impoundment comparisons. Other studies have relied on the comparison of regulated and naturalized discharges. In either case climate and land-use changes make evaluation of the hydrological effect of impoundments problematic. This paper reviews research on hydrological changes due to river regulation in the UK, and presents a case study of the River Severn to evaluate the influence of Clywedog Reservoir on flood magnitude and frequency. Consequent upon dam completion, on average, median flows have been reduced by about 50per cent; mean annual floods have been reduced by about 30per cent; and low flows have been maintained at about 22 per cent higher than the natural Q95 discharge. However, marked differences exist between rivers. The direct effect of reservoir compensation flows and the indirect effect of inter basin transfers for supply have significantly increased minimum flows in most rivers, although in the case of the latter this involves the discharge of treated effluents. In contrast, the effects of impoundments on flood magnitude and frequency is less clear and on the River Severn, at least, changes in flood hydrology during the past two decades are shown to be more related to climate change than to river regulation.},
annotation = {\_eprint: https://onlinelibrary.wiley.com/doi/pdf/10.1002/rrr.3450020312},
file = {C\:\\Users\\david.dorchies\\Zotero\\storage\\Q4EWWR7A\\Higgs et Petts - 1988 - Hydrological changes and river regulation in the U.pdf;C\:\\Users\\david.dorchies\\Zotero\\storage\\CI9TWW3V\\rrr.html},
journal = {Regulated Rivers: Research \& Management},
keywords = {Dry weather flow,Floods,Flow regime},
language = {en},
number = {3}
}
@article{jolleyLargeScaleGridBasedHydrological1996,
title = {A {{Large}}-{{Scale Grid}}-{{Based Hydrological Model}} of the {{Severn}} and {{Thames Catchments}}},
author = {Jolley, T. J. and Wheater, H. S.},
year = {1996},
volume = {10},
pages = {253--262},
issn = {1747-6593},
doi = {10.1111/j.1747-6593.1996.tb00043.x},
abstract = {This paper addresses the issues of scale and appropriate model complexity for large-scale hydrological models. A grid-based hydrological model, which employs the UK Meteorological Office Rainfall and Evaporation Calculation System, is applied to the Severn and Thames catchments using a grid scale of 40 km, and is shown to reproduce the observed mean annual runoff over a 10-year period to within 6\% with no prior calibration. The variation in the model performance is strongly correlated with the linearity of the annual rainfall/runoff relationship and a climate index. At the monthly scale, runoff routing becomes significant, and the introduction of a two-parameter routeing algorithm significantly improves the monthly runoff simulations giving efficiencies of 90\% and 88\% for the Severn and Thames respectively. The results provide guidance to climate modellers looking for efficient and robust land-surface parameterizations, and indicate the potential application of such a modelling scheme to water resource managers.},
annotation = {\_eprint: https://onlinelibrary.wiley.com/doi/pdf/10.1111/j.1747-6593.1996.tb00043.x},
file = {C\:\\Users\\david.dorchies\\Zotero\\storage\\NIH9WIPD\\Jolley et Wheater - 1996 - A Large-Scale Grid-Based Hydrological Model of the.pdf;C\:\\Users\\david.dorchies\\Zotero\\storage\\2T597AZG\\j.1747-6593.1996.tb00043.html},
journal = {Water and Environment Journal},
keywords = {Climate models,runoff,Severn,Thames,water resources,water-balance model},
language = {en},
number = {4}
}
@article{klaarDevelopingHydroecologicalModels2014,
title = {Developing Hydroecological Models to Inform Environmental Flow Standards: A Case Study from {{England}}},
shorttitle = {Developing Hydroecological Models to Inform Environmental Flow Standards},
author = {Klaar, Megan J. and Dunbar, Michael J. and Warren, Mark and Soley, Rob},
year = {2014},
volume = {1},
pages = {207--217},
issn = {2049-1948},
doi = {10.1002/wat2.1012},
abstract = {The concept of defining environmental flow regimes to balance the provision of water resources for both human and environmental needs has gained wide recognition. As the authority responsible for water resource management within England, the Environment Agency (EA) uses the Environmental Flow Indicator (EFI), which represents an allowable percentage deviation from the natural flow to determine where water may be available for new abstractions. In a simplified form, the EFI has been used as the hydrological supporting component of Water Framework Directive classification, to flag where hydrological alteration may be contributing to failure to achieve good ecological status, and to guide further ecological investigation. As the primary information source for the EFI was expert opinion, the EA aims to improve the evidence base linking flow alteration and ecological response, and to use this evidence to develop improved environmental flow criteria and implementation tools. Such tools will be required to make predictions at locations with no or limited ecological monitoring data. Hence empirical statistical models are required that provide a means to describe observed variation in ecological sensitivity to flow change. Models must also strike a balance between generic and local relationships. Multilevel (mixed effects) regression models provide a rich set of capabilities suitable for this purpose. Three brief examples of the application of these techniques in defining empirical relationships between flow alteration and ecological response are provided. Establishment of testable hydrological\textendash ecological relationships provides the framework for improving data collection, analysis, and ultimately water resources management models. This article is categorized under: Water and Life {$>$} Conservation, Management, and Awareness},
annotation = {\_eprint: https://onlinelibrary.wiley.com/doi/pdf/10.1002/wat2.1012},
copyright = {\textcopyright{} 2014 Wiley Periodicals, Inc.},
file = {C\:\\Users\\david.dorchies\\Zotero\\storage\\RNDY5IW9\\wat2.html},
journal = {WIREs Water},
language = {en},
number = {2}
}
@article{reynardFloodCharacteristicsLarge2001,
title = {The {{Flood Characteristics}} of {{Large U}}.{{K}}. {{Rivers}}: {{Potential Effects}} of {{Changing Climate}} and {{Land Use}}},
shorttitle = {The {{Flood Characteristics}} of {{Large U}}.{{K}}. {{Rivers}}},
author = {Reynard, N. S. and Prudhomme, C. and Crooks, S. M.},
year = {2001},
month = feb,
volume = {48},
pages = {343--359},
issn = {1573-1480},
doi = {10.1023/A:1010735726818},
abstract = {A continuous flow simulation model(CLASSIC) has been used to assess the potential impactof climate and land use changes on the flood regimesof large U.K. catchments. Climate change scenarios,based on the HadCM2 experiments from the HadleyCentre, are applied to the Severn and Thames rivers.The analysis shows that, for the 2050s, the climatechange scenarios result in an increase in both thefrequency and magnitude of flooding events in theserivers. The various ways of applying the rainfallscenario can have a significant effect on thesegeneral conclusions, although generally do not affecteither the direction or consistency of the changes.While `best guess' land use changes show little impacton flood response, a 50\% increase in forest covercould counter-act the impact of climate change. Aswould be expected, a large change in the urban coverof the catchments does have a large effect on theflood regimes, increasing both the frequency andmagnitude of floods significantly beyond the changesdue to climate alone. Further research is requiredinto the potential impacts of seasonal changes in thedaily rainfall and potential evaporation regimes, landuse changes and the interaction between the two.},
file = {C\:\\Users\\david.dorchies\\Zotero\\storage\\PZTI9ZQE\\Reynard et al. - 2001 - The Flood Characteristics of Large U.K. Rivers Po.pdf},
journal = {Climatic Change},
language = {en},
number = {2}
}
@incollection{secklerConceptEfficiencyWaterresources2003,
title = {The Concept of Efficiency in Water-Resources Management and Policy.},
booktitle = {Water Productivity in Agriculture: Limits and Opportunities for Improvement},
author = {Seckler, D. and Molden, D. and Sakthivadivel, R.},
editor = {Kijne, J. W. and Barker, R. and Molden, D.},
year = {2003},
pages = {37--51},
publisher = {{CABI}},
address = {{Wallingford}},
doi = {10.1079/9780851996691.0037},
file = {C\:\\Users\\david.dorchies\\Zotero\\storage\\FM69CIK3\\Seckler et al. - 2003 - The concept of efficiency in water-resources manag.pdf},
isbn = {978-0-85199-669-1},
language = {en}
}
Supports Markdown
0% or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment