From 9220a7f4b474329896833c2d0ad9ced3d52ecc85 Mon Sep 17 00:00:00 2001 From: robinhasse Date: Tue, 15 Aug 2023 08:47:45 +0200 Subject: [PATCH 1/3] Add demand scenarios for CAMPAIGners --- .buildlibrary | 2 +- CITATION.cff | 4 +-- DESCRIPTION | 4 +-- R/calcEDGETrData.R | 4 ++- R/calcFEdemand.R | 15 +++++----- R/convertEDGE.R | 70 ++++++++++++++++++++----------------------- R/readEDGE.R | 12 ++++++-- R/readEDGETransport.R | 6 +++- README.md | 6 ++-- 9 files changed, 66 insertions(+), 57 deletions(-) diff --git a/.buildlibrary b/.buildlibrary index ff7b0455..307018bd 100644 --- a/.buildlibrary +++ b/.buildlibrary @@ -1,4 +1,4 @@ -ValidationKey: '32781942' +ValidationKey: '32901120' AcceptedWarnings: - 'Warning: package ''.*'' was built under R version' - 'Warning: namespace ''.*'' is not available and has been replaced' diff --git a/CITATION.cff b/CITATION.cff index 28a1fd6d..2ab971f8 100644 --- a/CITATION.cff +++ b/CITATION.cff @@ -2,8 +2,8 @@ cff-version: 1.2.0 message: If you use this software, please cite it using the metadata from this file. type: software title: 'mrremind: MadRat REMIND Input Data Package' -version: 0.167.4 -date-released: '2023-08-14' +version: 0.168.0 +date-released: '2023-08-15' abstract: The mrremind packages contains data preprocessing for the REMIND model. authors: - family-names: Baumstark diff --git a/DESCRIPTION b/DESCRIPTION index f3c933ec..304258ea 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,8 +1,8 @@ Type: Package Package: mrremind Title: MadRat REMIND Input Data Package -Version: 0.167.4 -Date: 2023-08-14 +Version: 0.168.0 +Date: 2023-08-15 Authors@R: c( person("Lavinia", "Baumstark", , "lavinia@pik-potsdam.de", role = c("aut", "cre")), person("Renato", "Rodrigues", role = "aut"), diff --git a/R/calcEDGETrData.R b/R/calcEDGETrData.R index 3f6214e8..9f52d9eb 100644 --- a/R/calcEDGETrData.R +++ b/R/calcEDGETrData.R @@ -44,7 +44,9 @@ calcEDGETrData <- function() { 'SSP2EU', 'NAV_ele', 'default', 'SSP2EU', 'NAV_all', 'SSP2EU_lowdem', 'SSP2EU', 'NAV_lce', 'SSP2EU_lowdem', - 'SSP2EU', 'PhOP', 'default' + 'SSP2EU', 'PhOP', 'default', + 'SSP2EU', 'CAMP_lscWeak', 'SSP2EU_demRedWeak', + 'SSP2EU', 'CAMP_lscStrong', 'SSP2EU_demRedStrong' ) ) diff --git a/R/calcFEdemand.R b/R/calcFEdemand.R index 8fd83208..6e658f71 100644 --- a/R/calcFEdemand.R +++ b/R/calcFEdemand.R @@ -666,7 +666,7 @@ calcFEdemand <- function(subtype = "FE", use_ODYM_RECC = FALSE) { # remove missing Navigate scenarios if (subtype %in% c("FE_buildings", "UE_buildings")) { - reminditems <- reminditems[, , grep("SSP2EU_NAV_.{3}\\.rcp", getItems(reminditems, 3), value = TRUE), invert = TRUE] + reminditems <- reminditems[, , grep("SSP2EU_(NAV|CAMP)_[a-z]*\\.rcp", getItems(reminditems, 3), value = TRUE), invert = TRUE] } #Change the scenario names for consistency with REMIND sets @@ -1982,18 +1982,19 @@ calcFEdemand <- function(subtype = "FE", use_ODYM_RECC = FALSE) { description_out <- "useful energy demand in buildings" } if (subtype == "FE") { - # duplicate SSP2EU scenarios of industry for Navigate scenarios + # duplicate SSP2EU scenarios of industry for Navigate and Campaigners scenarios industryItems <- grep("(.*i$)|chemicals|steel|otherInd|cement", getItems(reminditems, 3.2), value = TRUE) nonIndustryItems <- setdiff(getItems(reminditems, 3.2), industryItems) - navigateScenarios <- grep("SSP2EU_NAV_", getItems(reminditems, 3.1), value = TRUE) - nonNavigateScenarios <- setdiff(getItems(reminditems, 3.1), navigateScenarios) + duplScenarios <- grep("SSP2EU_(NAV|CAMP)_", getItems(reminditems, 3.1), value = TRUE) + nonDuplScenarios <- setdiff(getItems(reminditems, 3.1), duplScenarios) reminditems <- mbind( - mselect(reminditems, scenario = nonNavigateScenarios), - mselect(reminditems, scenario = navigateScenarios, item = nonIndustryItems), + mselect(reminditems, scenario = nonDuplScenarios), + mselect(reminditems, scenario = duplScenarios, item = nonIndustryItems), addDim(mselect(reminditems, scenario = "gdp_SSP2EU", item = industryItems, collapseNames = TRUE), - paste0("gdp_SSP2EU_NAV_", c("act", "tec", "ele", "lce", "all")), + c(paste0("gdp_SSP2EU_NAV_", c("act", "tec", "ele", "lce", "all")), + paste0("gdp_SSP2EU_CAMP_", c("weak", "strong"))), "scenario", 3.1) ) } diff --git a/R/convertEDGE.R b/R/convertEDGE.R index 93dd41e0..edba3369 100644 --- a/R/convertEDGE.R +++ b/R/convertEDGE.R @@ -18,11 +18,28 @@ convertEDGE <- function(x, subtype = "FE_stationary") { addSSPnames <- function(x) { do.call("mbind", lapply(c(paste0("SSP", c(1:5, "2EU", "2_lowEn")), paste0("SDP", c("", "_EI", "_RC", "_MC")), - paste0("SSP2EU_NAV_", c("act", "tec", "ele", "lce", "all"))), + paste0("SSP2EU_NAV_", c("act", "tec", "ele", "lce", "all")), + paste0("SSP2EU_CAMP_", c("weak", "strong"))), function(s) setNames(x, paste(s, getNames(x), sep = ".")) )) } + duplScens <- function(x, scens = NULL) { + if (is.null(scens)) { + scens <- list( + gdp_SSP2EU = paste0("gdp_SSP2EU_", + c("NAV_act", "NAV_ele", "NAV_tec", "NAV_lce", "NAV_all", + "CAMP_weak", "CAMP_strong")), + gdp_SSP2 = "gdp_SSP2_lowEn" + ) + } + mbind(x, do.call(mbind, lapply(names(scens), function(from) { + do.call(mbind, lapply(scens[[from]], function(to) { + setItems(x[, , from], 3, to) + })) + }))) + } + renameExtraWeights <- function(magObj, magWeight, mapping) { do.call("mbind", lapply(mapping[["EDGEitems"]], function(itemIN) { if (itemIN %in% getNames(magObj, dim = "item")) { @@ -51,7 +68,7 @@ convertEDGE <- function(x, subtype = "FE_stationary") { rem_years_hist <- seq(1990,2150,5) keep_years <- getYears(x) - struct_mapping_path = toolGetMapping(type = "sectoral", name = "structuremappingIO_outputs.csv", + struct_mapping_path = toolGetMapping(type = "sectoral", name = "structuremappingIO_outputs.csv", returnPathOnly = TRUE, where = "mappingfolder") struct_mapping = read.csv2(struct_mapping_path, na.strings = "") @@ -70,7 +87,7 @@ convertEDGE <- function(x, subtype = "FE_stationary") { # Load the regional mapping which depends upon the model used if (subtype == "FE_stationary"){ - mappingfile <- toolGetMapping(type = "regional", name = "regionmappingREMIND.csv", + mappingfile <- toolGetMapping(type = "regional", name = "regionmappingREMIND.csv", returnPathOnly = TRUE, where = "mappingfolder") mapping <- read.csv2(mappingfile) region_col = which(names(mapping) == "RegionCode") @@ -78,7 +95,7 @@ convertEDGE <- function(x, subtype = "FE_stationary") { }else if (subtype %in% c("FE_buildings")){ - mappingfile <- toolGetMapping(type = "regional", name = "regionmappingEDGE.csv", + mappingfile <- toolGetMapping(type = "regional", name = "regionmappingEDGE.csv", returnPathOnly = TRUE, where = "mappingfolder") mapping <- read.csv2(mappingfile) region_col = which(names(mapping) == "RegionCodeEUR_ETP") @@ -89,15 +106,8 @@ convertEDGE <- function(x, subtype = "FE_stationary") { #--- Load the Weights #--- First load the GDP data. Set average2020 to False to get yearly data as far as possible. wg <- calcOutput("GDP", average2020 = FALSE, aggregate = FALSE) - # duplicate SSP2 for SSP2_lowEn an SSP2EU for Navigate scenarios - wg <- mbind( - wg, - do.call("mbind", lapply(paste0("gdp_SSP2EU_NAV_", c("act", "tec", "ele", "lce", "all")), - function(navScen) { - setItems(wg[,, "gdp_SSP2EU"], 3, navScen) - })), - setItems(wg[,, "gdp_SSP2"], 3, "gdp_SSP2_lowEn") - ) + # duplicate SSP2 for SSP2_lowEn an SSP2EU for Navigate and Campaigners scenarios + wg <- duplScens(wg) getNames(wg) <- gsub("gdp_", "", getNames(wg)) @@ -258,13 +268,14 @@ convertEDGE <- function(x, subtype = "FE_stationary") { } else if(subtype %in% c("Capital")){ - mappingfile <- toolGetMapping(type = "regional", name = "regionmappingEDGE.csv", + mappingfile <- toolGetMapping(type = "regional", name = "regionmappingEDGE.csv", returnPathOnly = TRUE, where = "mappingfolder") mapping <- read.csv2(mappingfile) region_col = which(names(mapping) == "RegionCodeEUR_ETP") iso_col = which(names(mapping) == "CountryCode") - x = x[,getYears(x,T)[which(getYears(x,T) <= 2100)],] + x <- x[,getYears(x,T)[which(getYears(x,T) <= 2100)],] + getItems(x, 3.1) <- paste0("gdp_", getItems(x, 3.1)) wg <- calcOutput("GDP", aggregate=F) wfe <- calcOutput("FEdemand", subtype = "FE", aggregate = F) @@ -299,7 +310,7 @@ convertEDGE <- function(x, subtype = "FE_stationary") { } else if(subtype %in% c("CapitalUnit")){ - mappingfile <- toolGetMapping(type = "regional", name = "regionmappingEDGE.csv", + mappingfile <- toolGetMapping(type = "regional", name = "regionmappingEDGE.csv", returnPathOnly = TRUE, where = "mappingfolder") mapping <- read.csv2(mappingfile) region_col = which(names(mapping) == "RegionCodeEUR_ETP") @@ -313,7 +324,7 @@ convertEDGE <- function(x, subtype = "FE_stationary") { } else if(subtype %in% c("ES_buildings")){ - mappingfile <- toolGetMapping(type = "regional", name = "regionmappingEDGE.csv", + mappingfile <- toolGetMapping(type = "regional", name = "regionmappingEDGE.csv", returnPathOnly = TRUE, where = "mappingfolder") mapping <- read.csv2(mappingfile) region_col = which(names(mapping) == "RegionCodeEUR_ETP") @@ -322,23 +333,15 @@ convertEDGE <- function(x, subtype = "FE_stationary") { select_years = intersect(getYears(x,as.integer = T),rem_years_hist) wg <- calcOutput("GDP", years = select_years, aggregate = FALSE) - # duplicate SSP2 for SSP2_lowEn an SSP2EU for Navigate scenarios - wg <- mbind( - wg, - do.call("mbind", lapply(paste0("gdp_SSP2EU_NAV_", c("act", "tec", "ele", "lce", "all")), - function(navScen) { - setItems(wg[,, "gdp_SSP2EU"], 3, navScen) - })), - setItems(wg[,, "gdp_SSP2"], 3, "gdp_SSP2_lowEn") - ) - + # duplicate SSP2 for SSP2_lowEn an SSP2EU for Navigate and Campaigners scenarios + wg <- duplScens(wg) getNames(wg) = gsub("gdp_","", getNames(wg)) x = toolAggregate(x[,select_years,],mappingfile, weight = wg[,,getNames(x,dim=1)], from = region_col, to = iso_col ) result = x } else if (subtype == "Floorspace") { - mappingfile <- toolGetMapping(type = "regional", name = "regionmappingEDGE.csv", + mappingfile <- toolGetMapping(type = "regional", name = "regionmappingEDGE.csv", returnPathOnly = TRUE, where = "mappingfolder") mapping <- read.csv2(mappingfile) region_col = which(names(mapping) == "RegionCodeEUR_ETP") @@ -348,15 +351,8 @@ convertEDGE <- function(x, subtype = "FE_stationary") { wp <- calcOutput("Population", years = rem_years_hist, aggregate = FALSE) getSets(wp) <- gsub("variable", "scenario", getSets(wp)) getItems(wp, "scenario") <- gsub("pop_", "gdp_", getItems(wp, "scenario")) - # duplicate SSP2 for SSP2_lowEn an SSP2EU for Navigate scenarios - wp <- mbind( - wp, - do.call("mbind", lapply(paste0("gdp_SSP2EU_NAV_", c("act", "tec", "ele", "lce", "all")), - function(navScen) { - setItems(wp[,, "gdp_SSP2EU"], 3, navScen) - })), - setItems(wp[,, "gdp_SSP2"], 3, "gdp_SSP2_lowEn") - ) + # duplicate SSP2 for SSP2_lowEn an SSP2EU for Navigate and Campaigners scenarios + wp <- duplScens(wp) x <- toolAggregate(x[, rem_years_hist, ], mappingfile, weight = wp, from = region_col, to = iso_col ) diff --git a/R/readEDGE.R b/R/readEDGE.R index 2ba105cd..1c17f9ae 100644 --- a/R/readEDGE.R +++ b/R/readEDGE.R @@ -20,7 +20,9 @@ readEDGE <- function(subtype = c("FE_stationary", "FE_buildings", "Capital", "Ca ver <- "1.12" scenarios <- list( SSPs = paste0("SSP", 1:5), - SSP2s = paste0("SSP2", c("EU", "_lowEn", paste0("EU_NAV_", c("act", "tec", "ele", "lce", "all")))), + SSP2s = paste0("SSP2", c("EU", "_lowEn", + paste0("EU_NAV_", c("act", "tec", "ele", "lce", "all")), + paste0("EU_CAMP_", c("weak", "strong")))), SDPs = paste0("SDP", c("", "_EI", "_MC", "_RC"))) addDim <- function(x, addnm, dim, dimCode = 3.2) { @@ -50,7 +52,8 @@ readEDGE <- function(subtype = c("FE_stationary", "FE_buildings", "Capital", "Ca data <- read.csv(file.path(ver, "capitalProjections.csv")) data <- as.magpie(data) data <- collapseNames(data) - getSets(data) <- c("region", "year", "scenario")}, + getItems(data, 3.1) <- sub("gdp_", "", getItems(data, 3.1)) + getSets(data) <- c("region", "year", "scenario", "variable")}, CapitalUnit = { mcapitalunitCap <- read.csv(file.path(ver, "capitalUnitCost_cap.csv")) mcapitalunitCap$type <- "cap" @@ -73,6 +76,9 @@ readEDGE <- function(subtype = c("FE_stationary", "FE_buildings", "Capital", "Ca getSets(data) <- c("region", "year", "scenario", "item")} ) - data <- mselect(data, scenario = Reduce(c, scenarios)) + if ("scenario" %in% getSets(data)) { + data <- mselect(data, scenario = Reduce(c, scenarios)) + } + return(data) } diff --git a/R/readEDGETransport.R b/R/readEDGETransport.R index 854ce7e0..29655bd1 100644 --- a/R/readEDGETransport.R +++ b/R/readEDGETransport.R @@ -61,7 +61,11 @@ readEDGETransport <- function(subtype = "logit_exponent") { dt[.("gdp_SSP2EU_lowdem", "gdp_SSP2EU", "NAV_all"), nomatch=NULL][ , DEM_scenario := "gdp_SSP2EU_NAV_all"], dt[.("gdp_SSP2EU_lowdem", "gdp_SSP2EU", "NAV_lce"), nomatch=NULL][ - , DEM_scenario := "gdp_SSP2EU_NAV_lce"] + , DEM_scenario := "gdp_SSP2EU_NAV_lce"], + dt[.("gdp_SSP2EU_demRedWeak", "gdp_SSP2EU", "CAMP_lscWeak"), nomatch=NULL][ + , DEM_scenario := "gdp_SSP2EU_CAMP_weak"], + dt[.("gdp_SSP2EU_demRedStrong", "gdp_SSP2EU", "CAMP_lscStrong"), nomatch=NULL][ + , DEM_scenario := "gdp_SSP2EU_CAMP_strong"] ) setkeyv(dt, "DEM_scenario") dt[.("gdp_SSP2EU_lowdem"), DEM_scenario := "gdp_SSP2_lowEn"] diff --git a/README.md b/README.md index e5b93890..1fb56162 100644 --- a/README.md +++ b/README.md @@ -1,6 +1,6 @@ # MadRat REMIND Input Data Package -R package **mrremind**, version **0.167.4** +R package **mrremind**, version **0.168.0** [![CRAN status](https://www.r-pkg.org/badges/version/mrremind)](https://cran.r-project.org/package=mrremind) [![R build status](https://github.com/pik-piam/mrremind/workflows/check/badge.svg)](https://github.com/pik-piam/mrremind/actions) [![codecov](https://codecov.io/gh/pik-piam/mrremind/branch/master/graph/badge.svg)](https://app.codecov.io/gh/pik-piam/mrremind) [![r-universe](https://pik-piam.r-universe.dev/badges/mrremind)](https://pik-piam.r-universe.dev/builds) @@ -39,7 +39,7 @@ In case of questions / problems please contact Lavinia Baumstark . +Baumstark L, Rodrigues R, Levesque A, Oeser J, Bertram C, Mouratiadou I, Malik A, Schreyer F, Soergel B, Rottoli M, Mishra A, Dirnaichner A, Pehl M, Giannousakis A, Klein D, Strefler J, Feldhaus L, Brecha R, Rauner S, Dietrich J, Bi S, Benke F, Weigmann P, Richters O, Hasse R, Fuchs S, Mandaroux R (2023). _mrremind: MadRat REMIND Input Data Package_. R package version 0.168.0, . A BibTeX entry for LaTeX users is @@ -48,7 +48,7 @@ A BibTeX entry for LaTeX users is title = {mrremind: MadRat REMIND Input Data Package}, author = {Lavinia Baumstark and Renato Rodrigues and Antoine Levesque and Julian Oeser and Christoph Bertram and Ioanna Mouratiadou and Aman Malik and Felix Schreyer and Bjoern Soergel and Marianna Rottoli and Abhijeet Mishra and Alois Dirnaichner and Michaja Pehl and Anastasis Giannousakis and David Klein and Jessica Strefler and Lukas Feldhaus and Regina Brecha and Sebastian Rauner and Jan Philipp Dietrich and Stephen Bi and Falk Benke and Pascal Weigmann and Oliver Richters and Robin Hasse and Sophie Fuchs and Rahel Mandaroux}, year = {2023}, - note = {R package version 0.167.4}, + note = {R package version 0.168.0}, url = {https://github.com/pik-piam/mrremind}, } ``` From ee45e0a75fb23e463d31e271417aeec3fa3de32f Mon Sep 17 00:00:00 2001 From: jmuessel Date: Thu, 2 Nov 2023 13:18:22 +0100 Subject: [PATCH 2/3] Intorduced Campaigners Scenarios --- R/calcEDGETrData.R | 12 ++++++------ R/readEDGETransport.R | 8 ++++---- 2 files changed, 10 insertions(+), 10 deletions(-) diff --git a/R/calcEDGETrData.R b/R/calcEDGETrData.R index 9f52d9eb..695e722f 100644 --- a/R/calcEDGETrData.R +++ b/R/calcEDGETrData.R @@ -24,7 +24,7 @@ calcEDGETrData <- function() { expand_grid( SSP_scen = c("SSP1", "SSP2", "SSP5", "SSP2EU", "SDP"), tech_scen = c("Mix1", "Mix2", "Mix3", "Mix4"), - DEM_scenario = c("default", "SSP2EU_lowdem")), + DEM_scenario = c("default", "SSP2EU_demRedWeak", "SSP2EU_demRedStrong")), ## SHAPE scenarios are coupled to specific technologies tribble( @@ -34,16 +34,16 @@ calcEDGETrData <- function() { 'SDP_RC', 'Mix3', 'default', 'SSP2EU', 'HydrHype4', 'default', 'SSP2EU', 'ECEMF_HighEl_HighEff', 'default', - 'SSP2EU', 'ECEMF_HighEl_LifestCha', 'SSP2EU_lowdem', + 'SSP2EU', 'ECEMF_HighEl_LifestCha', 'SSP2EU_demRedStrong', 'SSP2EU', 'ECEMF_HighEl_ModEff', 'default', 'SSP2EU', 'ECEMF_HighH2_HighEff', 'default', - 'SSP2EU', 'ECEMF_HighH2_LifestCha', 'SSP2EU_lowdem', + 'SSP2EU', 'ECEMF_HighH2_LifestCha', 'SSP2EU_demRedStrong', 'SSP2EU', 'ECEMF_HighH2_ModEff', 'default', - 'SSP2EU', 'NAV_act', 'SSP2EU_lowdem', + 'SSP2EU', 'NAV_act', 'SSP2EU_demRedStrong', 'SSP2EU', 'NAV_tec', 'default', 'SSP2EU', 'NAV_ele', 'default', - 'SSP2EU', 'NAV_all', 'SSP2EU_lowdem', - 'SSP2EU', 'NAV_lce', 'SSP2EU_lowdem', + 'SSP2EU', 'NAV_all', 'SSP2EU_demRedStrong', + 'SSP2EU', 'NAV_lce', 'SSP2EU_demRedStrong', 'SSP2EU', 'PhOP', 'default', 'SSP2EU', 'CAMP_lscWeak', 'SSP2EU_demRedWeak', 'SSP2EU', 'CAMP_lscStrong', 'SSP2EU_demRedStrong' diff --git a/R/readEDGETransport.R b/R/readEDGETransport.R index 29655bd1..ccbff2c7 100644 --- a/R/readEDGETransport.R +++ b/R/readEDGETransport.R @@ -56,11 +56,11 @@ readEDGETransport <- function(subtype = "logit_exponent") { , DEM_scenario := "gdp_SSP2EU_NAV_ele"], dt[.("gdp_SSP2EU", "gdp_SSP2EU", "NAV_tec"), nomatch=NULL][ , DEM_scenario := "gdp_SSP2EU_NAV_tec"], - dt[.("gdp_SSP2EU_lowdem", "gdp_SSP2EU", "NAV_act"), nomatch=NULL][ + dt[.("gdp_SSP2EU_demRedStrong", "gdp_SSP2EU", "NAV_act"), nomatch=NULL][ , DEM_scenario := "gdp_SSP2EU_NAV_act"], - dt[.("gdp_SSP2EU_lowdem", "gdp_SSP2EU", "NAV_all"), nomatch=NULL][ + dt[.("gdp_SSP2EU_demRedStrong", "gdp_SSP2EU", "NAV_all"), nomatch=NULL][ , DEM_scenario := "gdp_SSP2EU_NAV_all"], - dt[.("gdp_SSP2EU_lowdem", "gdp_SSP2EU", "NAV_lce"), nomatch=NULL][ + dt[.("gdp_SSP2EU_demRedStrong", "gdp_SSP2EU", "NAV_lce"), nomatch=NULL][ , DEM_scenario := "gdp_SSP2EU_NAV_lce"], dt[.("gdp_SSP2EU_demRedWeak", "gdp_SSP2EU", "CAMP_lscWeak"), nomatch=NULL][ , DEM_scenario := "gdp_SSP2EU_CAMP_weak"], @@ -68,7 +68,7 @@ readEDGETransport <- function(subtype = "logit_exponent") { , DEM_scenario := "gdp_SSP2EU_CAMP_strong"] ) setkeyv(dt, "DEM_scenario") - dt[.("gdp_SSP2EU_lowdem"), DEM_scenario := "gdp_SSP2_lowEn"] + dt[.("gdp_SSP2EU_demRedStrong"), DEM_scenario := "gdp_SSP2_lowEn"] scens <- unique(dt$DEM_scenario) return(dt) } From 09b339f10dbc745495057bbebf80943198d530e1 Mon Sep 17 00:00:00 2001 From: jmuessel Date: Thu, 2 Nov 2023 13:43:16 +0100 Subject: [PATCH 3/3] buildLibrary --- .buildlibrary | 2 +- CITATION.cff | 4 ++-- DESCRIPTION | 4 ++-- README.md | 6 +++--- 4 files changed, 8 insertions(+), 8 deletions(-) diff --git a/.buildlibrary b/.buildlibrary index 3c38e7d1..65d6cb9d 100644 --- a/.buildlibrary +++ b/.buildlibrary @@ -1,4 +1,4 @@ -ValidationKey: '33534842' +ValidationKey: '33623730' AcceptedWarnings: - 'Warning: package ''.*'' was built under R version' - 'Warning: namespace ''.*'' is not available and has been replaced' diff --git a/CITATION.cff b/CITATION.cff index 459c6e06..5f2dff58 100644 --- a/CITATION.cff +++ b/CITATION.cff @@ -2,8 +2,8 @@ cff-version: 1.2.0 message: If you use this software, please cite it using the metadata from this file. type: software title: 'mrremind: MadRat REMIND Input Data Package' -version: 0.170.6 -date-released: '2023-10-27' +version: 0.171.0 +date-released: '2023-11-02' abstract: The mrremind packages contains data preprocessing for the REMIND model. authors: - family-names: Baumstark diff --git a/DESCRIPTION b/DESCRIPTION index f88bb8b2..fae6dd59 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,8 +1,8 @@ Type: Package Package: mrremind Title: MadRat REMIND Input Data Package -Version: 0.170.6 -Date: 2023-10-27 +Version: 0.171.0 +Date: 2023-11-02 Authors@R: c( person("Lavinia", "Baumstark", , "lavinia@pik-potsdam.de", role = c("aut", "cre")), person("Renato", "Rodrigues", role = "aut"), diff --git a/README.md b/README.md index 0ccb7a47..0495928e 100644 --- a/README.md +++ b/README.md @@ -1,6 +1,6 @@ # MadRat REMIND Input Data Package -R package **mrremind**, version **0.170.6** +R package **mrremind**, version **0.171.0** [![CRAN status](https://www.r-pkg.org/badges/version/mrremind)](https://cran.r-project.org/package=mrremind) [![R build status](https://github.com/pik-piam/mrremind/workflows/check/badge.svg)](https://github.com/pik-piam/mrremind/actions) [![codecov](https://codecov.io/gh/pik-piam/mrremind/branch/master/graph/badge.svg)](https://app.codecov.io/gh/pik-piam/mrremind) [![r-universe](https://pik-piam.r-universe.dev/badges/mrremind)](https://pik-piam.r-universe.dev/builds) @@ -39,7 +39,7 @@ In case of questions / problems please contact Lavinia Baumstark . +Baumstark L, Rodrigues R, Levesque A, Oeser J, Bertram C, Mouratiadou I, Malik A, Schreyer F, Soergel B, Rottoli M, Mishra A, Dirnaichner A, Pehl M, Giannousakis A, Klein D, Strefler J, Feldhaus L, Brecha R, Rauner S, Dietrich J, Bi S, Benke F, Weigmann P, Richters O, Hasse R, Fuchs S, Mandaroux R (2023). _mrremind: MadRat REMIND Input Data Package_. R package version 0.171.0, . A BibTeX entry for LaTeX users is @@ -48,7 +48,7 @@ A BibTeX entry for LaTeX users is title = {mrremind: MadRat REMIND Input Data Package}, author = {Lavinia Baumstark and Renato Rodrigues and Antoine Levesque and Julian Oeser and Christoph Bertram and Ioanna Mouratiadou and Aman Malik and Felix Schreyer and Bjoern Soergel and Marianna Rottoli and Abhijeet Mishra and Alois Dirnaichner and Michaja Pehl and Anastasis Giannousakis and David Klein and Jessica Strefler and Lukas Feldhaus and Regina Brecha and Sebastian Rauner and Jan Philipp Dietrich and Stephen Bi and Falk Benke and Pascal Weigmann and Oliver Richters and Robin Hasse and Sophie Fuchs and Rahel Mandaroux}, year = {2023}, - note = {R package version 0.170.6}, + note = {R package version 0.171.0}, url = {https://github.com/pik-piam/mrremind}, } ```