An-Chi Ho and Eva Rifà || Contributor: Chihchung Chou
Talk recordings and workshop materials from rstudio::conf(2022)
Also some talks are on youtube
Some announcements:
Some interesting talks…
→ Talk to me if you have a strong reason using Load(), so I can priorotize the development.
Tip: To read files individually, using easyNCDF or ncdf4 package is easier.
When longitude is not continous (e.g., c(0:10, 350:360))
Status: Fixed and merged in master
source('https://earth.bsc.es/gitlab/es/s2dv/-/raw/master/R/PlotEquiMap.R')
DiffCorr() significance test method changed. Three options: “two-sided”, “one-sided-higher”, and “one-sided-lower”.
if (type == 'two-sided') {
output$sign <- ifelse(!is.na(p.value) & p.value <= alpha/2, TRUE, FALSE)
} else if (type == 'one-sided-higher') {
output$sign <- ifelse(!is.na(p.value) & p.value <= alpha & output$diff.corr > 0, TRUE, FALSE)
} else if (type == 'one-sided-lower') {
output$sign <- ifelse(!is.na(p.value) & p.value <= alpha & output$diff.corr < 0, TRUE, FALSE)
}Status: in branch develop-DiffCorr-twosided
Status: in master
Status: in branch develop-Bias
RMS <- function(exp, obs, time_dim = 'sdate', dat_dim = 'dataset',
comp_dim = NULL, limits = NULL, conf = TRUE, conf.lev = 0.95,
ncores = NULL) { … } Status: In master
Shift global longitudes of a data array. Useful for map plotting or aligning datasets.
Status: In master
source("https://earth.bsc.es/gitlab/es/ClimProjDiags/-/raw/master/R/Subset.R")
res <- Subset(array(1:20, dim = c(dat = 1, lat = 4, lon = 5)), along = "lat", indices = 1, drop = T)
dim(res)
#lon
# 5indices is not a list. It returned wrong output before.Subset(array(1:20, dim = c(dat = 1, lat = 4, lon = 5)),
along = c(‘lat’, ‘lon’),
indices = c(1, 1),
drop = T)Status: In master
NEWS - Use the destination grid to decide which indices to take after interpolation. - Bugfix when Start() parameter “return_vars” is not used. - Allow netCDF files to not have calendar attributes (force it to be standard calendar)
EXPECTED NEWS - Change dependency on package s2dverification to s2dv - Bugfix of as.s2dv_cube() for startR object - CST_QuantileMapping improvement - Improve flexibility of time dimensions in s2dv_cube() - CST_Calibration for forecast - CST_BiasCorrection new parameters for dimension flexibility
Next meeting: 6th Oct 2022 (11 am)