diff --git a/DESCRIPTION b/DESCRIPTION index ba7b0c5..968f149 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -17,7 +17,7 @@ License: MIT + file LICENSE Encoding: UTF-8 LazyData: true Roxygen: list(markdown = TRUE) -RoxygenNote: 7.2.3 +RoxygenNote: 7.3.1 Imports: clipr, DBI, diff --git a/R/plot.diagram.R b/R/plot.diagram.R index d6b5366..29908d9 100644 --- a/R/plot.diagram.R +++ b/R/plot.diagram.R @@ -87,7 +87,11 @@ plot_diagram <- function(x, bars=FALSE, if (length(col) != ncol(x)-1) col = base::rep_len(col,ncol(x)-1) - cs <- apply(abs(x[, -1]), 2, max) + if(ncol(x) > 2) { + cs <- apply(abs(x[, -1]), 2, max) + } else { + cs <- max(abs(x[, 2])) + } cs <- ifelse(cs > yax_incr, cs, yax_incr) cs <- c(0, 0, cumsum(cs + sum(cs)*0.01 ) )# Adding 1% of the total space to each row diff --git a/R/plot.loo.R b/R/plot.loo.R index 495bf01..94fb589 100644 --- a/R/plot.loo.R +++ b/R/plot.loo.R @@ -149,17 +149,21 @@ plot_loo <- function( x, optima=TRUE, df <- df[, c(1, order(apply(df[, -1], 2, function(x) mean(x[abs(x)>0])), decreasing = ifelse(sort=='incr', FALSE, TRUE)) + 1)] } - df <- df[, c(1, which(apply(df[, -1], 2, function(x) mean(abs(x)[abs(x)>0])) >= filter) + 1)] - - plot_diagram(df, bars=TRUE, - save=save, filename=paste0(strsplit(filename, ifelse(as.png, '.png', '.pdf'))[[1]],'_',clim,ifelse(as.png, '.png', '.pdf')), - width=width, height=height, as.png=as.png, png.res=png.res, - yax_incr=yax_incr2, bar_width=bar_width2, xlim=xlim, - tickAtSample=tickAtSample, - col_pos=col_pos[clim], col_neg=col_neg[clim], - title=title2, src='loo') - - rs[[clim]] <- sort(unlist(lapply(x$reconstructions[[clim]]$loo, function(x) return(mean(x[abs(x)>0]))))) + w <- which(apply(df[, -1], 2, function(x) mean(abs(x)[abs(x)>0])) >= filter) + if(length(w) == 0) { + warning("No taxa remain after filtering. Adjust the filter value to include more taxa.") + } else { + df <- df[, c(1, w + 1)] + plot_diagram(df, bars=TRUE, + save=save, filename=paste0(strsplit(filename, ifelse(as.png, '.png', '.pdf'))[[1]],'_',clim,ifelse(as.png, '.png', '.pdf')), + width=width, height=height, as.png=as.png, png.res=png.res, + yax_incr=yax_incr2, bar_width=bar_width2, xlim=xlim, + tickAtSample=tickAtSample, + col_pos=col_pos[clim], col_neg=col_neg[clim], + title=title2, src='loo') + + rs[[clim]] <- sort(unlist(lapply(x$reconstructions[[clim]]$loo, function(y) if(!unique(as.vector(is.na(y)))){return(mean(y[, var_to_plot][abs(y[, var_to_plot])>0]))}))) + } } return(invisible(rs)) diff --git a/crestr_1.3.1.9000.pdf b/crestr_1.3.1.9000.pdf index 5bbe7ce..479fdee 100644 Binary files a/crestr_1.3.1.9000.pdf and b/crestr_1.3.1.9000.pdf differ diff --git a/docs/404.html b/docs/404.html index c67dc0d..14bef9f 100644 --- a/docs/404.html +++ b/docs/404.html @@ -6,7 +6,7 @@ Page not found (404) • crestr - + @@ -127,7 +127,7 @@

Page not found (404)

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/LICENSE-text.html b/docs/LICENSE-text.html index a5240dc..787cbf8 100644 --- a/docs/LICENSE-text.html +++ b/docs/LICENSE-text.html @@ -1,5 +1,5 @@ -License • crestrLicense • crestr @@ -102,7 +102,7 @@

License

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/LICENSE.html b/docs/LICENSE.html index 64462c2..18124d3 100644 --- a/docs/LICENSE.html +++ b/docs/LICENSE.html @@ -1,5 +1,5 @@ -MIT License • crestrMIT License • crestr @@ -106,7 +106,7 @@

MIT License

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/articles/calibration-data.html b/docs/articles/calibration-data.html index 8b6c671..ec8f6b8 100644 --- a/docs/articles/calibration-data.html +++ b/docs/articles/calibration-data.html @@ -6,7 +6,7 @@ Calibration data for CREST • crestr - + @@ -109,7 +109,7 @@

Calibration data for CREST

Manuel Chevalier

-

2024-03-21

+

2024-06-10

Source: vignettes/calibration-data.Rmd @@ -548,7 +548,7 @@

References

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/articles/community.html b/docs/articles/community.html index 6191c00..5181873 100644 --- a/docs/articles/community.html +++ b/docs/articles/community.html @@ -6,7 +6,7 @@ The crestr community • crestr - + @@ -109,7 +109,7 @@

The crestr community

Manuel Chevalier

-

2024-03-21

+

2024-06-10

Source: vignettes/community.Rmd @@ -207,7 +207,7 @@

crestr workshops

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/articles/databasing-with-crestr.html b/docs/articles/databasing-with-crestr.html index b55c3e8..d18557b 100644 --- a/docs/articles/databasing-with-crestr.html +++ b/docs/articles/databasing-with-crestr.html @@ -6,7 +6,7 @@ Manipulating the _gbif4crest_ calibration data • crestr - + @@ -110,7 +110,7 @@

Manipulating the gbif4crest calibration

Manuel Chevalier

-

2024-03-21

+

2024-06-10

Source: vignettes/databasing-with-crestr.Rmd @@ -238,7 +238,7 @@

Local subset of the calibration

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/articles/get-started.html b/docs/articles/get-started.html index ef55be5..e38b3e6 100644 --- a/docs/articles/get-started.html +++ b/docs/articles/get-started.html @@ -6,7 +6,7 @@ Get started • crestr - + @@ -109,7 +109,7 @@

Get started

Manuel Chevalier

-

2024-03-21

+

2024-06-10

Source: vignettes/get-started.Rmd @@ -250,8 +250,9 @@

The pseudo-data within crestr#> Sample_3 3 0 0 49 0 25 26 0 #> Sample_4 4 0 0 37 0 27 36 0 #> Sample_5 5 0 3 36 3 18 40 0 -#> Sample_6 6 2 2 25 0 21 50 0 - +#> Sample_6 6 2 2 25 0 21 50 0 +
+
 ## the structure of the data frame
 str(crest_ex)
 #> 'data.frame':    20 obs. of  8 variables:
@@ -271,7 +272,7 @@ 

The pseudo-data within crestrpollen-type. Here, the seven pseudo-taxa are ‘identified’ at the species level so that the table looks like the following:

-
+
 crest_ex_pse
 #>   Level      Family    Genus Species ProxyName
 #> 1     3 Randomaceae Randomus  Taxon1    Taxon1
@@ -293,7 +294,7 @@ 

The pseudo-data within crestr -
+
 crest_ex_selection
 #>        bio1 bio12
 #> Taxon1    1     1
@@ -328,7 +329,7 @@ 

Data extraction and calibrationcrestObj vignette. We can also verify that the selectedTaxa table has been modified for Taxon7.


-
+
 reconstr <- crest.get_modern_data(
                         df = crest_ex, # The fossil data
                    pse = crest_ex_pse, # The proxy-species equivalency table
@@ -340,7 +341,7 @@ 

Data extraction and calibration dbname = "crest_example", # The database to extract the data verbose = FALSE # Print status messages )

-
+
 reconstr$inputs$selectedTaxa
 #>        bio1 bio12
 #> Taxon1    1     1
@@ -355,7 +356,7 @@ 

Data extraction and calibration


-
+
 print(reconstr, as='data_extracted')
 #> *
 #> * Summary of the crestObj named ``:
@@ -386,7 +387,7 @@ 

Data extraction and calibration


-
+
 reconstr <- crest.calibrate(
                             reconstr, # A crestObj produced at the last stage
         climateSpaceWeighting = TRUE, # Correct the PDFs for the heteregenous
@@ -395,7 +396,7 @@ 

Data extraction and calibration shape = c("normal", "lognormal"), # The shape of the species PDFs verbose = FALSE # Print status messages )

-
+
 
**Fig. 5**: Distribution of the climate data. The grey histogram represent the abundance of each climate bins in the study area and the black histogram represents how this climate space is sampled by the studied taxa. In a good calibration dataset, the two histograms should be more or less symmetrical. Note: This figure is designed for real data, hence the presence of some African country borders. Just ignore these here.

@@ -424,7 +425,7 @@

Data extraction and calibration


-
+
 plot_taxaCharacteristics(reconstr, taxanames='Taxon2', climate='bio1', h0=0.2)
 plot_taxaCharacteristics(reconstr, taxanames='Taxon6', climate='bio1', h0=0.2)
@@ -443,16 +444,17 @@

Reconstruction and interpretationcrest.reconstruct() function. The results can be accessed from reconstr as follow:


-
+
 reconstr <- crest.reconstruct(
                         reconstr, # A crestObj produced at the previous stage
                   verbose = FALSE # Print status messages
 )
-
+
 names(reconstr)
 #> [1] "inputs"          "parameters"      "modelling"       "reconstructions"
-#> [5] "misc"
-
+#> [5] "misc"
+
+
 head(reconstr$reconstructions$bio1$optima)
 #>   Age   optima     mean
 #> 1   1 15.71142 15.69949
@@ -460,14 +462,16 @@ 

Reconstruction and interpretation#> 3 3 15.71142 15.69949 #> 4 4 15.71142 15.69949 #> 5 5 17.31463 17.29054 -#> 6 6 18.11623 18.12464 - +#> 6 6 18.11623 18.12464

+
+
 str(reconstr$reconstructions$bio1$optima)
 #> 'data.frame':    20 obs. of  3 variables:
 #>  $ Age   : num  1 2 3 4 5 6 7 8 9 10 ...
 #>  $ optima: num  15.7 15.7 15.7 15.7 17.3 ...
-#>  $ mean  : num  15.7 15.7 15.7 15.7 17.3 ...
-
+#>  $ mean  : num  15.7 15.7 15.7 15.7 17.3 ...
+ +
+
 str(reconstr$reconstructions$bio1$likelihood)
-#>  num [1:21, 1:500] 0.00 8.41e-15 8.41e-15 8.41e-15 8.41e-15 ...
-
+#>  num [1:21, 1:500] 0.00 8.41e-15 8.41e-15 8.41e-15 8.41e-15 ...
+
+
 print(reconstr, as='climate_reconstructed')
 #> *
 #> * Summary of the crestObj named ``:
@@ -525,7 +531,7 @@ 

Reconstruction and interpretation -
+
 plot(reconstr, climate = 'bio1')
 plot(reconstr, climate = 'bio12', simplify=TRUE,
         uncertainties=c(0.4, 0.6, 0.8), as.anomaly=TRUE)
@@ -548,9 +554,9 @@ 

Reconstruction and interpretation -
+
-
+
 plot_loo(reconstr, climate = 'bio1')
**Fig. 8**: Leave-One-Out diagram for the reconstructions of bio1.

@@ -569,7 +575,7 @@

Exporting the results


-
+
 export(reconstr, loc=tempdir(), dataname='crest-test')
 list.files(file.path(tempdir(), 'crest-test'))
 #> [1] "bio1"             "bio12"            "crest-test.RData"
@@ -619,7 +625,7 @@

References

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/articles/get-started_files/figure-html/plot-1.png b/docs/articles/get-started_files/figure-html/plot-1.png index 7db5e4f..187fa9d 100644 Binary files a/docs/articles/get-started_files/figure-html/plot-1.png and b/docs/articles/get-started_files/figure-html/plot-1.png differ diff --git a/docs/articles/get-started_files/figure-html/plot-2.png b/docs/articles/get-started_files/figure-html/plot-2.png index 98e372d..17e624d 100644 Binary files a/docs/articles/get-started_files/figure-html/plot-2.png and b/docs/articles/get-started_files/figure-html/plot-2.png differ diff --git a/docs/articles/index.html b/docs/articles/index.html index eadaa7b..7f6863e 100644 --- a/docs/articles/index.html +++ b/docs/articles/index.html @@ -1,5 +1,5 @@ -Articles • crestrArticles • crestr @@ -113,7 +113,7 @@

All vignettes

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/articles/limpopo.html b/docs/articles/limpopo.html index d400670..81c74ec 100644 --- a/docs/articles/limpopo.html +++ b/docs/articles/limpopo.html @@ -6,7 +6,7 @@ Mean Annual Temperature reconstruction from marine core MD96-2048 • crestr - + @@ -110,7 +110,7 @@

Mean Annual Temperature reconstruction from

Manuel Chevalier

-

2024-03-21

+

2024-06-10

Source: vignettes/limpopo.Rmd @@ -142,7 +142,7 @@

2024-03-21

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/articles/technicalities.html b/docs/articles/technicalities.html index 1ec7e3d..c5546e4 100644 --- a/docs/articles/technicalities.html +++ b/docs/articles/technicalities.html @@ -6,7 +6,7 @@ Formatting the data for crestr • crestr - + @@ -109,7 +109,7 @@

Formatting the data for crestr

Manuel Chevalier

-

2024-03-21

+

2024-06-10

Source: vignettes/technicalities.Rmd @@ -492,7 +492,7 @@

The selectedTaxa data frame

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/articles/theory.html b/docs/articles/theory.html index 1b21092..8e072df 100644 --- a/docs/articles/theory.html +++ b/docs/articles/theory.html @@ -6,7 +6,7 @@ A bit of Theory • crestr - + @@ -109,7 +109,7 @@

A bit of Theory

Manuel Chevalier

-

2024-03-21

+

2024-06-10

Source: vignettes/theory.Rmd @@ -296,7 +296,7 @@

References

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/articles/warnings.html b/docs/articles/warnings.html index 36e01c9..e71708d 100644 --- a/docs/articles/warnings.html +++ b/docs/articles/warnings.html @@ -6,7 +6,7 @@ Understanding warnings in crestr • crestr - + @@ -109,7 +109,7 @@

Understanding warnings in crestr

Manuel Chevalier

-

2024-03-21

+

2024-06-10

Source: vignettes/warnings.Rmd @@ -268,7 +268,7 @@

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/authors.html b/docs/authors.html index 901847d..8407a6c 100644 --- a/docs/authors.html +++ b/docs/authors.html @@ -1,5 +1,5 @@ -Authors and Citation • crestrAuthors and Citation • crestr @@ -81,7 +81,7 @@
@@ -120,7 +120,7 @@

Citation

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/index.html b/docs/index.html index f28e6fe..e328503 100644 --- a/docs/index.html +++ b/docs/index.html @@ -6,18 +6,13 @@ A Probabilistic Approach to Reconstruct Past Climates Using Palaeoecological Datasets • crestr - + - + Changelog • crestrChangelog • crestr @@ -233,7 +233,7 @@

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/pkgdown.yml b/docs/pkgdown.yml index 9002b62..f77a6f2 100644 --- a/docs/pkgdown.yml +++ b/docs/pkgdown.yml @@ -1,5 +1,5 @@ pandoc: 3.1.11.1 -pkgdown: 2.0.7 +pkgdown: 2.0.9 pkgdown_sha: ~ articles: calibration-data: calibration-data.html @@ -10,5 +10,5 @@ articles: technicalities: technicalities.html theory: theory.html warnings: warnings.html -last_built: 2024-03-21T16:46Z +last_built: 2024-06-10T09:40Z diff --git a/docs/reference/M1.html b/docs/reference/M1.html index 696ccf7..85a740a 100644 --- a/docs/reference/M1.html +++ b/docs/reference/M1.html @@ -1,7 +1,5 @@ -A shapefile of the world's country borders. Use 'M1 <- terra::unwrap(M1)' to -render the object usable in R. — M1 • crestrA shapefile of the world's country borders. Use 'M1 <- terra::unwrap(M1)' to render the object usable in R. — M1 • crestrDisplays the log of the proxy-species association — PSE_log • crestrDisplays the log of the proxy-species association — PSE_log • crestrReturn the list of oceans and seas. — accBasinNames • crestrReturn the list of oceans and seas. — accBasinNames • crestr @@ -232,7 +232,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/accClimateVariables.html b/docs/reference/accClimateVariables.html index 56bff60..935d391 100644 --- a/docs/reference/accClimateVariables.html +++ b/docs/reference/accClimateVariables.html @@ -1,5 +1,5 @@ -Describes all the variables available in the database. — accClimateVariables • crestrDescribes all the variables available in the database. — accClimateVariables • crestrReturn the list of the continents and associated countries. — accCountryNames • crestrReturn the list of the continents and associated countries. — accCountryNames • crestr @@ -321,7 +321,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/accRealmNames.html b/docs/reference/accRealmNames.html index f4d55ea..bb0b697 100644 --- a/docs/reference/accRealmNames.html +++ b/docs/reference/accRealmNames.html @@ -1,5 +1,5 @@ -Return the list of the realms and associated biomes and ecoregions. — accRealmNames • crestrReturn the list of the realms and associated biomes and ecoregions. — accRealmNames • crestr @@ -2180,7 +2180,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/calib_clim_space.html b/docs/reference/calib_clim_space.html index 2a6c18c..8dc7c7f 100644 --- a/docs/reference/calib_clim_space.html +++ b/docs/reference/calib_clim_space.html @@ -1,5 +1,5 @@ -Calibrate the distribution of the modern climate space. — calib_clim_space • crestrCalibrate the distribution of the modern climate space. — calib_clim_space • crestr @@ -136,7 +136,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/check_coordinates.html b/docs/reference/check_coordinates.html index 88a36a0..3531d7d 100644 --- a/docs/reference/check_coordinates.html +++ b/docs/reference/check_coordinates.html @@ -1,5 +1,5 @@ -Check if the coordinates are correct. — check_coordinates • crestrCheck if the coordinates are correct. — check_coordinates • crestr @@ -132,7 +132,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/cite_climate_data.html b/docs/reference/cite_climate_data.html index e26e08a..ded7ef4 100644 --- a/docs/reference/cite_climate_data.html +++ b/docs/reference/cite_climate_data.html @@ -1,5 +1,5 @@ -Returns the references associated with the climate data used to fit the pdfs. — cite_climate_data • crestrReturns the references associated with the climate data used to fit the pdfs. — cite_climate_data • crestr @@ -125,7 +125,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/cite_crest.html b/docs/reference/cite_crest.html index 693786b..52465cc 100644 --- a/docs/reference/cite_crest.html +++ b/docs/reference/cite_crest.html @@ -1,5 +1,5 @@ -Returns the list of references associated to the reconstruction. — cite_crest • crestrReturns the list of references associated to the reconstruction. — cite_crest • crestr @@ -125,7 +125,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/cite_distrib_data.html b/docs/reference/cite_distrib_data.html index ceec6f5..67c5099 100644 --- a/docs/reference/cite_distrib_data.html +++ b/docs/reference/cite_distrib_data.html @@ -1,5 +1,5 @@ -Returns the references associated with the GBIF data used to fit the pdfs. — cite_distrib_data • crestrReturns the references associated with the GBIF data used to fit the pdfs. — cite_distrib_data • crestr @@ -125,7 +125,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/cite_method.html b/docs/reference/cite_method.html index 02348d4..937770f 100644 --- a/docs/reference/cite_method.html +++ b/docs/reference/cite_method.html @@ -1,5 +1,5 @@ -Returns the references associated with the development of CREST. — cite_method • crestrReturns the references associated with the development of CREST. — cite_method • crestr @@ -125,7 +125,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/climate_from_xy.html b/docs/reference/climate_from_xy.html index b4957f1..8ded673 100644 --- a/docs/reference/climate_from_xy.html +++ b/docs/reference/climate_from_xy.html @@ -1,5 +1,5 @@ -Extract The climate values associated to a set of coordinates. — climate_from_xy • crestrExtract The climate values associated to a set of coordinates. — climate_from_xy • crestr @@ -150,7 +150,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/close_db_connection.html b/docs/reference/close_db_connection.html index 131a44c..72f1fbc 100644 --- a/docs/reference/close_db_connection.html +++ b/docs/reference/close_db_connection.html @@ -1,5 +1,5 @@ -Disconnect the database connection. — close_db_connection • crestrDisconnect the database connection. — close_db_connection • crestr @@ -127,7 +127,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/colour_theme.html b/docs/reference/colour_theme.html index d25ebe7..ca671d0 100644 --- a/docs/reference/colour_theme.html +++ b/docs/reference/colour_theme.html @@ -1,5 +1,5 @@ -Returns a vector of colours — colour_theme • crestrReturns a vector of colours — colour_theme • crestr @@ -127,7 +127,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/connect_local_sqlite3.html b/docs/reference/connect_local_sqlite3.html index db25bf3..1706c83 100644 --- a/docs/reference/connect_local_sqlite3.html +++ b/docs/reference/connect_local_sqlite3.html @@ -1,5 +1,5 @@ -Connect to the gbif4crest calibration database — connect_local_sqlite3 • crestrConnect to the gbif4crest calibration database — connect_local_sqlite3 • crestr @@ -130,7 +130,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/connect_online.html b/docs/reference/connect_online.html index f5d0bff..3b9c0a6 100644 --- a/docs/reference/connect_online.html +++ b/docs/reference/connect_online.html @@ -1,5 +1,5 @@ -Connect to the gbif4crest calibration database — connect_online • crestrConnect to the gbif4crest calibration database — connect_online • crestr @@ -149,7 +149,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/convert2percentages.html b/docs/reference/convert2percentages.html index a3abf67..9c540d9 100644 --- a/docs/reference/convert2percentages.html +++ b/docs/reference/convert2percentages.html @@ -1,5 +1,5 @@ -Convert abundance data into percentage data. — convert2percentages • crestrConvert abundance data into percentage data. — convert2percentages • crestr @@ -143,7 +143,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/convert2presenceAbsence.html b/docs/reference/convert2presenceAbsence.html index cdd2317..fb09c16 100644 --- a/docs/reference/convert2presenceAbsence.html +++ b/docs/reference/convert2presenceAbsence.html @@ -1,5 +1,5 @@ -Convert data into presence/absence data. — convert2presenceAbsence • crestrConvert data into presence/absence data. — convert2presenceAbsence • crestr @@ -147,7 +147,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/copy_crest.html b/docs/reference/copy_crest.html index 2b9ae71..d85d671 100644 --- a/docs/reference/copy_crest.html +++ b/docs/reference/copy_crest.html @@ -1,5 +1,5 @@ -Copy crest data to the clipboard. — copy_crest • crestrCopy crest data to the clipboard. — copy_crest • crestrCreates a spreadsheet with the format required for a PSE. — createPSE • crestrCreates a spreadsheet with the format required for a PSE. — createPSE • crestr @@ -134,7 +134,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/crest.calibrate.html b/docs/reference/crest.calibrate.html index 4c06ed0..02a9af1 100644 --- a/docs/reference/crest.calibrate.html +++ b/docs/reference/crest.calibrate.html @@ -1,5 +1,5 @@ -Fit the species and proxy pdfs — crest.calibrate • crestrFit the species and proxy pdfs — crest.calibrate • crestrExtract distributions from the database — crest.get_modern_data • crestrExtract distributions from the database — crest.get_modern_data • crestrA wrapper for all the crest functions. — crest • crestrA wrapper for all the crest functions. — crest • crestr @@ -310,7 +310,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/crest.reconstruct.html b/docs/reference/crest.reconstruct.html index baa8750..57b0f4c 100644 --- a/docs/reference/crest.reconstruct.html +++ b/docs/reference/crest.reconstruct.html @@ -1,5 +1,5 @@ -Reconstruct climate from fossil data — crest.reconstruct • crestrReconstruct climate from fossil data — crest.reconstruct • crestrFormat a crestObj with private data. — crest.set_modern_data • crestrFormat a crestObj with private data. — crest.set_modern_data • crestr @@ -252,7 +252,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/crest.simplify.html b/docs/reference/crest.simplify.html index 3b0cf18..6aab997 100644 --- a/docs/reference/crest.simplify.html +++ b/docs/reference/crest.simplify.html @@ -1,5 +1,5 @@ -Simplify a crestObj into a dataframe. — crest.simplify • crestrSimplify a crestObj into a dataframe. — crest.simplify • crestr @@ -138,7 +138,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/crestObj.html b/docs/reference/crestObj.html index d6e9ce3..76b55a5 100644 --- a/docs/reference/crestObj.html +++ b/docs/reference/crestObj.html @@ -1,5 +1,5 @@ -Create a crestObj object. — crestObj • crestrCreate a crestObj object. — crestObj • crestr @@ -342,7 +342,7 @@

See also

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/crest_ex.html b/docs/reference/crest_ex.html index 81b9d06..331b841 100644 --- a/docs/reference/crest_ex.html +++ b/docs/reference/crest_ex.html @@ -1,5 +1,5 @@ -Example dataset to run the CREST method for the first time. — crest_ex • crestrExample dataset to run the CREST method for the first time. — crest_ex • crestr @@ -135,7 +135,7 @@

Format

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/crest_ex_pse.html b/docs/reference/crest_ex_pse.html index af3d4a5..a370079 100644 --- a/docs/reference/crest_ex_pse.html +++ b/docs/reference/crest_ex_pse.html @@ -1,5 +1,5 @@ -Example dataset to Extract data from the example database. — crest_ex_pse • crestrExample dataset to Extract data from the example database. — crest_ex_pse • crestr @@ -127,7 +127,7 @@

Format

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/crest_ex_selection.html b/docs/reference/crest_ex_selection.html index 96736df..4bec256 100644 --- a/docs/reference/crest_ex_selection.html +++ b/docs/reference/crest_ex_selection.html @@ -1,5 +1,5 @@ -Example dataset to associate taxa with climate variables. — crest_ex_selection • crestrExample dataset to associate taxa with climate variables. — crest_ex_selection • crestrCrop the dataset obtained from crest.get_modern_data — crop • crestrCrop the dataset obtained from crest.get_modern_data — crop • crestrDownload the gbif4crest_02 dataset from figShare. — dbDownload • crestrDownload the gbif4crest_02 dataset from figShare. — dbDownload • crestr @@ -144,7 +144,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/dbRequest.html b/docs/reference/dbRequest.html index a2e7703..07d5cc2 100644 --- a/docs/reference/dbRequest.html +++ b/docs/reference/dbRequest.html @@ -1,5 +1,5 @@ -Connect to the gbif4crest database — dbRequest • crestrConnect to the gbif4crest database — dbRequest • crestr @@ -142,7 +142,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/dbSubset.html b/docs/reference/dbSubset.html index 7df5e42..4d37258 100644 --- a/docs/reference/dbSubset.html +++ b/docs/reference/dbSubset.html @@ -1,5 +1,5 @@ -Create a subset of the global calibration dataset — dbSubset • crestrCreate a subset of the global calibration dataset — dbSubset • crestr @@ -156,7 +156,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/dot-ecoid2names.html b/docs/reference/dot-ecoid2names.html index 723cba4..9b47aa2 100644 --- a/docs/reference/dot-ecoid2names.html +++ b/docs/reference/dot-ecoid2names.html @@ -1,5 +1,5 @@ -Return biogeographical units associated with a ecoID. — .ecoid2names • crestrReturn biogeographical units associated with a ecoID. — .ecoid2names • crestr @@ -127,7 +127,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/dot-geopoid2names.html b/docs/reference/dot-geopoid2names.html index f2d4d02..97e1899 100644 --- a/docs/reference/dot-geopoid2names.html +++ b/docs/reference/dot-geopoid2names.html @@ -1,5 +1,5 @@ -Return geopolitical units associated with a geopoID. — .geopoid2names • crestrReturn geopolitical units associated with a geopoID. — .geopoid2names • crestr @@ -127,7 +127,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/eqearth_get_ext.html b/docs/reference/eqearth_get_ext.html index 10afb6d..5f2e759 100644 --- a/docs/reference/eqearth_get_ext.html +++ b/docs/reference/eqearth_get_ext.html @@ -1,5 +1,5 @@ -Calculates the extent of the plot in the equal earth projection. — eqearth_get_ext • crestrCalculates the extent of the plot in the equal earth projection. — eqearth_get_ext • crestr @@ -130,7 +130,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/excludeTaxa.html b/docs/reference/excludeTaxa.html index 8b90aa9..da55ac0 100644 --- a/docs/reference/excludeTaxa.html +++ b/docs/reference/excludeTaxa.html @@ -1,5 +1,5 @@ -Excludes the list of taxa from the reconstructions. — excludeTaxa • crestrExcludes the list of taxa from the reconstructions. — excludeTaxa • crestr @@ -154,7 +154,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/explore_calibration_dataset.html b/docs/reference/explore_calibration_dataset.html index 0bc28b0..b28932c 100644 --- a/docs/reference/explore_calibration_dataset.html +++ b/docs/reference/explore_calibration_dataset.html @@ -1,5 +1,5 @@ -Extract distributions from the database — explore_calibration_dataset • crestrExtract distributions from the database — explore_calibration_dataset • crestr @@ -211,7 +211,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/export.html b/docs/reference/export.html index 74c12cb..273c5ca 100644 --- a/docs/reference/export.html +++ b/docs/reference/export.html @@ -1,5 +1,5 @@ -Export the results — export • crestrExport the results — export • crestr @@ -183,7 +183,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/export_pdfs.html b/docs/reference/export_pdfs.html index 6ff32b9..6a5d63e 100644 --- a/docs/reference/export_pdfs.html +++ b/docs/reference/export_pdfs.html @@ -1,5 +1,5 @@ -Export the pdfs fitted for the different taxa. — export_pdfs • crestrExport the pdfs fitted for the different taxa. — export_pdfs • crestr @@ -170,7 +170,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/find.original.name.html b/docs/reference/find.original.name.html index 9412576..7a95a59 100644 --- a/docs/reference/find.original.name.html +++ b/docs/reference/find.original.name.html @@ -1,5 +1,5 @@ -Returns the name of the function argument in the global environment — find.original.name • crestrReturns the name of the function argument in the global environment — find.original.name • crestr @@ -118,7 +118,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/fit_pdfsp.html b/docs/reference/fit_pdfsp.html index 8257fa4..eb31e94 100644 --- a/docs/reference/fit_pdfsp.html +++ b/docs/reference/fit_pdfsp.html @@ -1,5 +1,5 @@ -Fit the species pdfs. — fit_pdfsp • crestrFit the species pdfs. — fit_pdfsp • crestr @@ -178,7 +178,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/fit_xrange.html b/docs/reference/fit_xrange.html index b266dbe..a537bde 100644 --- a/docs/reference/fit_xrange.html +++ b/docs/reference/fit_xrange.html @@ -1,5 +1,5 @@ -Define the climate gradient to fit the pdfs. — fit_xrange • crestrDefine the climate gradient to fit the pdfs. — fit_xrange • crestr @@ -146,7 +146,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/getBasinNames.html b/docs/reference/getBasinNames.html index 46d4d2a..d0af46e 100644 --- a/docs/reference/getBasinNames.html +++ b/docs/reference/getBasinNames.html @@ -1,5 +1,5 @@ -Return the list of oceans and seas. — getBasinNames • crestrReturn the list of oceans and seas. — getBasinNames • crestr @@ -118,7 +118,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/getClimateSpace.html b/docs/reference/getClimateSpace.html index d21531c..d945e8a 100644 --- a/docs/reference/getClimateSpace.html +++ b/docs/reference/getClimateSpace.html @@ -1,5 +1,5 @@ -Extract the distribution of the studied climate gradient(s) across the study area. — getClimateSpace • crestrExtract the distribution of the studied climate gradient(s) across the study area. — getClimateSpace • crestr @@ -206,7 +206,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/getCountryNames.html b/docs/reference/getCountryNames.html index 3c79a52..ed17cd7 100644 --- a/docs/reference/getCountryNames.html +++ b/docs/reference/getCountryNames.html @@ -1,5 +1,5 @@ -Return the list of the continents and associated countries. — getCountryNames • crestrReturn the list of the continents and associated countries. — getCountryNames • crestr @@ -118,7 +118,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/getDistribTaxa.html b/docs/reference/getDistribTaxa.html index 0f870a6..580b110 100644 --- a/docs/reference/getDistribTaxa.html +++ b/docs/reference/getDistribTaxa.html @@ -1,5 +1,5 @@ -Extract taxonID(s) corresponding to the taxonomic description — getDistribTaxa • crestrExtract taxonID(s) corresponding to the taxonomic description — getDistribTaxa • crestrReturn the list of the realms and associated biomes and ecoregions. — getRealmNames • crestrReturn the list of the realms and associated biomes and ecoregions. — getRealmNames • crestr @@ -137,7 +137,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/getSpeciesdiversity.html b/docs/reference/getSpeciesdiversity.html index 17da755..ab9c575 100644 --- a/docs/reference/getSpeciesdiversity.html +++ b/docs/reference/getSpeciesdiversity.html @@ -1,5 +1,5 @@ -Calculates how many species compose the response of each taxon. — getSpeciesdiversity • crestrCalculates how many species compose the response of each taxon. — getSpeciesdiversity • crestr @@ -128,7 +128,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/getTaxaTypeFromTaxID.html b/docs/reference/getTaxaTypeFromTaxID.html index 2e11e5d..63b78b3 100644 --- a/docs/reference/getTaxaTypeFromTaxID.html +++ b/docs/reference/getTaxaTypeFromTaxID.html @@ -1,5 +1,5 @@ -Returns the taxa type corresponding to the taxID. — getTaxaTypeFromTaxID • crestrReturns the taxa type corresponding to the taxID. — getTaxaTypeFromTaxID • crestr @@ -118,7 +118,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/getTaxonID.html b/docs/reference/getTaxonID.html index cc3812d..9141442 100644 --- a/docs/reference/getTaxonID.html +++ b/docs/reference/getTaxonID.html @@ -1,5 +1,5 @@ -Extract taxonID(s) corresponding to the taxonomic description — getTaxonID • crestrExtract taxonID(s) corresponding to the taxonomic description — getTaxonID • crestrExtract taxonID(s) corresponding to the taxonomic description — getTaxonomy • crestrExtract taxonID(s) corresponding to the taxonomic description — getTaxonomy • crestrReturns the taxa type corresponding to the index. — get_taxa_type • crestrReturns the taxa type corresponding to the index. — get_taxa_type • crestr @@ -118,7 +118,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/includeTaxa.html b/docs/reference/includeTaxa.html index 2976dee..4eff9f8 100644 --- a/docs/reference/includeTaxa.html +++ b/docs/reference/includeTaxa.html @@ -1,5 +1,5 @@ -Includes the list of taxa into the reconstructions. — includeTaxa • crestrIncludes the list of taxa into the reconstructions. — includeTaxa • crestr @@ -155,7 +155,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/index.html b/docs/reference/index.html index fcf9c63..45000bc 100644 --- a/docs/reference/index.html +++ b/docs/reference/index.html @@ -1,5 +1,5 @@ -Function reference • crestrFunction reference • crestr @@ -374,8 +374,7 @@

Datasets

M1

-

A shapefile of the world's country borders. Use 'M1 <- terra::unwrap(M1)' to -render the object usable in R.

+

A shapefile of the world's country borders. Use 'M1 <- terra::unwrap(M1)' to render the object usable in R.

crest_ex

@@ -405,7 +404,7 @@

Datasets

pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/is.crestObj.html b/docs/reference/is.crestObj.html index 420cd4d..bbfdd1a 100644 --- a/docs/reference/is.crestObj.html +++ b/docs/reference/is.crestObj.html @@ -1,5 +1,5 @@ -Test if x is a crestObj. — is.crestObj • crestrTest if x is a crestObj. — is.crestObj • crestr @@ -118,7 +118,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/isColourStr.html b/docs/reference/isColourStr.html index f6f5d01..b9792fb 100644 --- a/docs/reference/isColourStr.html +++ b/docs/reference/isColourStr.html @@ -1,5 +1,5 @@ -Test if R can interpret a string as a colour — isColourStr • crestrTest if R can interpret a string as a colour — isColourStr • crestr @@ -129,7 +129,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/loo.html b/docs/reference/loo.html index af0835a..86423cb 100644 --- a/docs/reference/loo.html +++ b/docs/reference/loo.html @@ -1,5 +1,5 @@ -Performs the leave-one-out analysis — loo • crestrPerforms the leave-one-out analysis — loo • crestr @@ -185,7 +185,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/makeTransparent.html b/docs/reference/makeTransparent.html index a3656d2..2a15086 100644 --- a/docs/reference/makeTransparent.html +++ b/docs/reference/makeTransparent.html @@ -1,5 +1,5 @@ -Wrapper function of to add transparency to a colour. — makeTransparent • crestrWrapper function of to add transparency to a colour. — makeTransparent • crestr @@ -135,7 +135,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/meanPositiveValues.html b/docs/reference/meanPositiveValues.html index 5d75f2f..570e4c2 100644 --- a/docs/reference/meanPositiveValues.html +++ b/docs/reference/meanPositiveValues.html @@ -1,5 +1,5 @@ -Calculate the mean of all strictly positive values. — meanPositiveValues • crestrCalculate the mean of all strictly positive values. — meanPositiveValues • crestr @@ -125,7 +125,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/normalise.html b/docs/reference/normalise.html index c6e4b57..91f8ba7 100644 --- a/docs/reference/normalise.html +++ b/docs/reference/normalise.html @@ -1,5 +1,5 @@ -Normalises the percentages — normalise • crestrNormalises the percentages — normalise • crestr @@ -143,7 +143,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/pdf_ranges.html b/docs/reference/pdf_ranges.html index c3a8740..cb09208 100644 --- a/docs/reference/pdf_ranges.html +++ b/docs/reference/pdf_ranges.html @@ -1,5 +1,5 @@ -Calculate the climate tolerance of the taxa from their pdfs. — pdf_ranges • crestrCalculate the climate tolerance of the taxa from their pdfs. — pdf_ranges • crestr @@ -200,7 +200,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/plot.crestObj.html b/docs/reference/plot.crestObj.html index 1b99f5c..cde20d3 100644 --- a/docs/reference/plot.crestObj.html +++ b/docs/reference/plot.crestObj.html @@ -1,5 +1,5 @@ -Plot the reconstructions. — plot.crestObj • crestrPlot the reconstructions. — plot.crestObj • crestr @@ -266,7 +266,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/plot_climateSpace.html b/docs/reference/plot_climateSpace.html index 4746732..7fd8e5a 100644 --- a/docs/reference/plot_climateSpace.html +++ b/docs/reference/plot_climateSpace.html @@ -1,5 +1,5 @@ -Plot the studied climate space. — plot_climateSpace • crestrPlot the studied climate space. — plot_climateSpace • crestr @@ -208,7 +208,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/plot_combinedPDFs.html b/docs/reference/plot_combinedPDFs.html index 44c857a..2a18b44 100644 --- a/docs/reference/plot_combinedPDFs.html +++ b/docs/reference/plot_combinedPDFs.html @@ -1,5 +1,5 @@ -Plot representing how the pdfs combine to produce the reconstruction. — plot_combinedPDFs • crestrPlot representing how the pdfs combine to produce the reconstruction. — plot_combinedPDFs • crestr @@ -228,7 +228,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/plot_diagram.html b/docs/reference/plot_diagram.html index 0719c40..7b0ec7a 100644 --- a/docs/reference/plot_diagram.html +++ b/docs/reference/plot_diagram.html @@ -1,5 +1,5 @@ -Plot stratigraphic data as polygons or barplots. — plot_diagram • crestrPlot stratigraphic data as polygons or barplots. — plot_diagram • crestr @@ -236,7 +236,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/plot_loo.html b/docs/reference/plot_loo.html index 7c61c25..568f3f0 100644 --- a/docs/reference/plot_loo.html +++ b/docs/reference/plot_loo.html @@ -1,5 +1,5 @@ -Plot the results of the leave-one-out analysis. — plot_loo • crestrPlot the results of the leave-one-out analysis. — plot_loo • crestr @@ -255,7 +255,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/plot_map_eqearth.html b/docs/reference/plot_map_eqearth.html index 83b788a..e53e022 100644 --- a/docs/reference/plot_map_eqearth.html +++ b/docs/reference/plot_map_eqearth.html @@ -1,5 +1,5 @@ -Plots raster data in equal earth projection. — plot_map_eqearth • crestrPlots raster data in equal earth projection. — plot_map_eqearth • crestr @@ -189,7 +189,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/plot_scatterPDFs.html b/docs/reference/plot_scatterPDFs.html index fdcafe0..72cb1e5 100644 --- a/docs/reference/plot_scatterPDFs.html +++ b/docs/reference/plot_scatterPDFs.html @@ -1,5 +1,5 @@ -Plot the pdf optima and uncertainty ranges in a climate biplot — plot_scatterPDFs • crestrPlot the pdf optima and uncertainty ranges in a climate biplot — plot_scatterPDFs • crestr @@ -240,7 +240,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/plot_taxaCharacteristics.html b/docs/reference/plot_taxaCharacteristics.html index cc8fe50..81312a2 100644 --- a/docs/reference/plot_taxaCharacteristics.html +++ b/docs/reference/plot_taxaCharacteristics.html @@ -1,5 +1,5 @@ -Plot the distribution and responses of the studied taxa — plot_taxaCharacteristics • crestrPlot the distribution and responses of the studied taxa — plot_taxaCharacteristics • crestr @@ -225,7 +225,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/plot_violinPDFs.html b/docs/reference/plot_violinPDFs.html index 52fa8a5..9efe1a7 100644 --- a/docs/reference/plot_violinPDFs.html +++ b/docs/reference/plot_violinPDFs.html @@ -1,5 +1,5 @@ -Plot the pdfs as violins — plot_violinPDFs • crestrPlot the pdfs as violins — plot_violinPDFs • crestr @@ -220,7 +220,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/reconstr.html b/docs/reference/reconstr.html index 146c495..9880782 100644 --- a/docs/reference/reconstr.html +++ b/docs/reference/reconstr.html @@ -1,5 +1,5 @@ -A crestObj ran with the example dataset. — reconstr • crestrA crestObj ran with the example dataset. — reconstr • crestrReturn the size of the distribution of each composing species of each taxon — taxonComposition • crestrReturn the size of the distribution of each composing species of each taxon — taxonComposition • crestr @@ -134,7 +134,7 @@

Examples

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.

diff --git a/docs/reference/testConnection.html b/docs/reference/testConnection.html index 66b271b..3d4de48 100644 --- a/docs/reference/testConnection.html +++ b/docs/reference/testConnection.html @@ -1,5 +1,5 @@ -Test if a connection can be established with the calibration data — testConnection • crestrTest if a connection can be established with the calibration data — testConnection • crestr @@ -118,7 +118,7 @@

Value

-

Site built with pkgdown 2.0.7.

+

Site built with pkgdown 2.0.9.