diff --git a/.gitignore b/.gitignore index a7bae72be..82e43dd6e 100644 --- a/.gitignore +++ b/.gitignore @@ -12,6 +12,7 @@ temp .cache/ .local/ .config/ +.vs/ *.Rproj tmp* reports diff --git a/DESCRIPTION b/DESCRIPTION index 96c32c1e0..dea488ce6 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -43,7 +43,6 @@ Imports: Suggests: austraits, leaflet, - ggbeeswarm, bibtex, knitr, bench, diff --git a/R/process.R b/R/process.R index 982a6658d..eae38731e 100644 --- a/R/process.R +++ b/R/process.R @@ -1201,14 +1201,15 @@ process_format_methods <- function(metadata, dataset_id, sources, contributors) type = str_replace_all(.data$source_key, "_[:digit:]+", ""), source_id = metadata$source %>% util_list_to_df2() %>% - dplyr::select(.data$key) - ) + purrr::pluck("key") + ) source_primary_key <- metadata$source$primary$key - source_secondary_keys <- citation_types %>% dplyr::filter(.data$type == "secondary") %>% dplyr::select(.data$source_id) %>% as.vector() - source_secondary_keys <- source_secondary_keys$source_id$key %>% as.vector() - source_original_dataset_keys <- citation_types %>% dplyr::filter(.data$type == "original") %>% dplyr::select(.data$source_id) %>% as.vector() - source_original_dataset_keys <- source_original_dataset_keys$source_id$key %>% as.vector() + source_secondary_keys <- citation_types %>% + dplyr::filter(.data$type == "secondary") %>% + purrr::pluck("source_id") + + source_original_dataset_keys <- citation_types %>% dplyr::filter(.data$type == "original") %>% purrr::pluck("source_id") # combine collectors to add into the methods table collectors_tmp <- @@ -1247,12 +1248,12 @@ process_format_methods <- function(metadata, dataset_id, sources, contributors) source_primary_citation = bib_print(sources[[source_primary_key]]), source_secondary_key = source_secondary_keys %>% paste(collapse = "; "), source_secondary_citation = ifelse(length(source_secondary_keys) == 0, NA_character_, - purrr::map_chr(sources[source_secondary_keys], bib_print) %>% paste(collapse = "; ") %>% + purrr::map_chr(source_secondary_keys, ~sources[[.x]] %>% bib_print) %>% paste(collapse = "; ") %>% stringr::str_replace_all("\\.;", ";") ), source_original_dataset_key = source_original_dataset_keys %>% paste(collapse = "; "), source_original_dataset_citation = ifelse(length(source_original_dataset_keys) == 0, NA_character_, - purrr::map_chr(sources[source_original_dataset_keys], bib_print) %>% paste(collapse = "; ") %>% + purrr::map_chr(source_original_dataset_keys, ~sources[[.x]] %>% bib_print) %>% paste(collapse = "; ") %>% stringr::str_replace_all("\\.;", ";") ) ) @@ -1458,9 +1459,14 @@ build_update_taxonomy <- function(austraits_raw, taxa) { austraits_raw$taxonomic_updates %>% dplyr::left_join(by = "cleaned_name", taxa %>% dplyr::select(.data$cleaned_name, .data$cleaned_scientific_name_id, .data$cleaned_name_taxonomic_status, - .data$cleaned_name_alternative_taxonomic_status, .data$taxon_id, .data$taxon_name) + .data$cleaned_name_alternative_taxonomic_status, .data$taxon_id, .data$taxon_name, .data$taxon_rank) ) %>% + dplyr::mutate( + taxonomic_resolution = ifelse(!is.na(.data$taxonomic_resolution) & .data$taxonomic_resolution != .data$taxon_rank, .data$taxon_rank, .data$taxonomic_resolution), + taxonomic_resolution = ifelse(is.na(.data$taxonomic_resolution), .data$taxon_rank, .data$taxonomic_resolution) + ) %>% dplyr::distinct() %>% + dplyr::select(-.data$taxon_rank) %>% dplyr::arrange(.data$cleaned_name) @@ -1468,11 +1474,13 @@ build_update_taxonomy <- function(austraits_raw, taxa) { austraits_raw$traits %>% dplyr::rename(cleaned_name = .data$taxon_name) %>% dplyr::left_join(by = "cleaned_name", - taxa %>% dplyr::select(.data$cleaned_name, .data$taxon_name) + taxa %>% dplyr::select(.data$cleaned_name, .data$taxon_name, .data$taxon_rank) ) %>% dplyr::select(.data$dataset_id, .data$taxon_name, dplyr::everything()) %>% - dplyr::mutate(taxon_name = ifelse(is.na(.data$taxon_name), .data$cleaned_name, .data$taxon_name)) %>% - dplyr::mutate(taxon_name = ifelse(stringr::str_detect(.data$cleaned_name, "\\["), .data$cleaned_name, .data$taxon_name)) %>% + dplyr::mutate( + taxon_name = ifelse(is.na(.data$taxon_name), .data$cleaned_name, .data$taxon_name), + taxon_name = ifelse(stringr::str_detect(.data$cleaned_name, "\\["), .data$cleaned_name, .data$taxon_name) + ) %>% dplyr::select(-.data$cleaned_name) # names, identifiers for all genera @@ -1501,31 +1509,33 @@ build_update_taxonomy <- function(austraits_raw, taxa) { taxa %>% dplyr::select(.data$taxon_name, .data$taxon_rank, .data$family) %>% dplyr::distinct() %>% util_df_convert_character() ) + species_tmp <- species_tmp %>% - dplyr::mutate( + dplyr::mutate( # if no taxonomic resolution is specified, then the name's taxonomic resolution is the taxon_rank for the taxon name - taxon_rank = ifelse(!is.na(.data$taxonomic_resolution), .data$taxonomic_resolution, .data$taxon_rank), + taxonomic_resolution = ifelse(.data$taxon_name %in% taxa$cleaned_name, taxa$taxon_rank[match(.data$taxon_name, taxa$cleaned_name)], taxonomic_resolution), + taxon_rank = ifelse(!is.na(.data$taxon_rank), .data$taxonomic_resolution, .data$taxon_rank), # field trinomial is only filled in if taxonomic resolution is an infraspecific name - trinomial = ifelse(.data$taxon_rank %in% c("trinomial", "Subspecies", "Forma", "Varietas"), + trinomial = ifelse(.data$taxon_rank %in% c("Subspecies", "Forma", "Varietas"), stringr::str_split_fixed(.data$taxon_name, "\\[",2)[,1] %>% stringr::str_trim(), NA), # field binomial is filled in if taxonomic resolution is an infraspecific name or a binomial # all taxon names that have "extra" information (beyond the actual name) have been formatted to have that information in square brackets '[]', # so these can be used as a delimitor to extract the actual name - binomial = ifelse(.data$taxon_rank %in% c("binomial", "Species"), + binomial = ifelse(.data$taxon_rank %in% c("Species"), stringr::str_split_fixed(.data$taxon_name, "\\[",2)[,1] %>% stringr::str_trim(), NA), - binomial = ifelse(.data$taxon_rank %in% c("trinomial", "Subspecies", "Forma", "Varietas", "Series"), + binomial = ifelse(.data$taxon_rank %in% c("Subspecies", "Forma", "Varietas", "Series"), stringr::word(.data$taxon_name, start = 1, end = 2), .data$binomial), binomial = stringr::str_trim(.data$binomial), # genus filled in for all names that have a taxonomic of genus or more detailed genus = ifelse(!.data$taxon_rank %in% c("Familia", "family"), ifelse(stringr::word(.data$taxon_name, 1) == "x", stringr::word(.data$taxon_name, start = 1, end = 2), stringr::word(.data$taxon_name, 1)), NA), family = ifelse(.data$taxon_rank %in% c("Familia", "family"), stringr::word(.data$taxon_name, 1), .data$family), # identify which name is to be matched to the various identifiers, distribution information, etc. in the taxa file - name_to_match_to = ifelse(.data$taxon_rank %in% c("trinomial", "Subspecies", "Forma", "Varietas"), .data$trinomial, NA), - name_to_match_to = ifelse(is.na(.data$name_to_match_to) & .data$taxon_rank %in% c("binomial", "Species"), .data$binomial, .data$name_to_match_to), + name_to_match_to = ifelse(.data$taxon_rank %in% c("Subspecies", "Forma", "Varietas"), .data$trinomial, NA), + name_to_match_to = ifelse(is.na(.data$name_to_match_to) & .data$taxon_rank %in% c("Species"), .data$binomial, .data$name_to_match_to), name_to_match_to = ifelse(is.na(.data$name_to_match_to) & .data$taxon_rank %in% c("genus", "Genus"), .data$genus, .data$name_to_match_to), name_to_match_to = ifelse(is.na(.data$name_to_match_to) & is.na(.data$taxon_rank), .data$genus, .data$name_to_match_to), name_to_match_to = ifelse(is.na(.data$name_to_match_to) & .data$taxon_rank %in% c("family", "Familia"), .data$family, .data$name_to_match_to) - ) %>% + ) %>% # remove family, taxon_rank; they are about to be merged back in, but matches will now be possible to more rows select(-.data$taxon_rank, - .data$taxonomic_resolution) %>% rename(family_tmp = .data$family) %>% @@ -1558,7 +1568,6 @@ build_update_taxonomy <- function(austraits_raw, taxa) { .data$taxonomic_status, .data$scientific_name, .data$scientific_name_authorship, .data$taxon_id, .data$scientific_name_id) - austraits_raw$taxa <- species_tmp %>% dplyr::bind_rows() %>% @@ -1566,10 +1575,10 @@ build_update_taxonomy <- function(austraits_raw, taxa) { dplyr::distinct(.data$taxon_name, .keep_all = TRUE) # only now, at the very end, can `taxonomic_resolution` be removed from the traits table - + austraits_raw$traits <- austraits_raw$traits %>% - dplyr::select(-.data$taxonomic_resolution) + dplyr::select(-.data$taxonomic_resolution, -.data$taxon_rank) austraits_raw$excluded_data <- austraits_raw$excluded_data %>% diff --git a/config/metadata.yml b/config/metadata.yml index 7e83b5b2c..13d499f9c 100644 --- a/config/metadata.yml +++ b/config/metadata.yml @@ -1,7 +1,7 @@ metadata: title: 'AusTraits: a curated plant trait database for the Australian flora' description: "AusTraits is a transformative database, containing measurements on the traits of Australia's plant taxa, standardised from hundreds of disconnected primary sources. While this repository contains the harmonised data, the raw data and code used to build the resource are also available on the project's GitHub repository,http://traitecoevo.github.io/austraits.build. Further information on the project is available in the associated publication and at the project website https://austraits.org." - version: "4.0.0" + version: "4.1.0" doi: 10.5281/zenodo.3568417 structure_URI: https://github.com/traitecoevo/austraits.build geo_location: @@ -10,15 +10,20 @@ metadata: language: en related_identifiers: - related_identifier_type: url - identifier: https://github.com/traitecoevo/austraits.build/tree/v4.0.0 + identifier: https://github.com/traitecoevo/austraits.build/tree/v4.1.0 relation_type: isCompiledBy resource_type: dataset - related_identifier_type: doi identifier: 10.1038/s41597-021-01006-6 relation_type: isCitedBy - resource_type: publication-article + resource_type: publication-article + - related_identifier_type: doi + identifier: 10.5281/zenodo.3568417 + relation_type: isVersionOf + resource_type: dataset references: "Falster, Gallagher et al (2021) *AusTraits, a curated plant trait database for the Australian flora*. Scientific Data 8: 254, https://doi.org/10.1038/s41597-021-01006-6" publisher: Zenodo + publication_year: 2022 publication_date: 27 Nov 2022 license: rights: CC-BY-4.0 diff --git a/config/taxon_list.csv b/config/taxon_list.csv index 1cf625ff1..508acd457 100644 --- a/config/taxon_list.csv +++ b/config/taxon_list.csv @@ -1876,7 +1876,6 @@ Acmella grandiflora,APC,https://id.biodiversity.org.au/name/apni/116563,accepted Acmella grandiflora var. brachyglossa,APC,https://id.biodiversity.org.au/name/apni/141019,accepted,NA,Acmella grandiflora var. brachyglossa,https://id.biodiversity.org.au/taxon/apni/51267206,(Benth.) R.K.Jansen,Varietas,accepted,Asteraceae,"WA, NT, Qld, NSW",native,Acmella grandiflora var. brachyglossa (Benth.) R.K.Jansen,https://id.biodiversity.org.au/name/apni/141019 Acmella grandiflora var. discoidea,APC,https://id.biodiversity.org.au/name/apni/153975,accepted,NA,Acmella grandiflora var. discoidea,https://id.biodiversity.org.au/node/apni/2918791,R.K.Jansen,Varietas,accepted,Asteraceae,"WA, NT, Qld",native,Acmella grandiflora var. discoidea R.K.Jansen,https://id.biodiversity.org.au/name/apni/153975 Acmella uliginosa,APC,https://id.biodiversity.org.au/name/apni/205610,accepted,NA,Acmella uliginosa,https://id.biodiversity.org.au/node/apni/2896645,(Sw.) Cass.,Species,accepted,Asteraceae,Qld (formerly naturalised),naturalised,Acmella uliginosa (Sw.) Cass.,https://id.biodiversity.org.au/name/apni/205610 -Acmena smithii Rheophytic race,APNI,https://id.biodiversity.org.au/name/apni/229743,unplaced by APC,NA,Acmena smithii Rheophytic race,NA,NA,Species,unplaced by APC,Myrtaceae,NA,NA,Acmena smithii Rheophytic race,https://id.biodiversity.org.au/name/apni/229743 Acmena smithii Small-leaved race,APNI,https://id.biodiversity.org.au/name/apni/229744,unplaced by APC,NA,Acmena smithii Small-leaved race,NA,NA,Species,unplaced by APC,Myrtaceae,NA,NA,Acmena smithii Small-leaved race,https://id.biodiversity.org.au/name/apni/229744 Acmena smithii Type form,APNI,https://id.biodiversity.org.au/name/apni/229741,unplaced by APC,NA,Acmena smithii Type form,NA,NA,Species,unplaced by APC,Myrtaceae,NA,NA,Acmena smithii Type form,https://id.biodiversity.org.au/name/apni/229741 Acmena sp. (Cooper Creek GS 1419),APNI,https://id.biodiversity.org.au/name/apni/50032374,unplaced by APC,NA,Acmena sp. (Cooper Creek GS 1419),NA,NA,Species,unplaced by APC,Myrtaceae,NA,NA,Acmena sp. (Cooper Creek GS 1419),https://id.biodiversity.org.au/name/apni/50032374 @@ -7823,7 +7822,6 @@ Callitriche sonderi,APC,https://id.biodiversity.org.au/name/apni/97938,accepted, Callitriche stagnalis,APC,https://id.biodiversity.org.au/name/apni/97950,accepted,NA,Callitriche stagnalis,https://id.biodiversity.org.au/node/apni/2918603,Scop.,Species,accepted,Plantaginaceae,"WA (naturalised), SA (naturalised), Qld (naturalised), NSW (naturalised), ACT (doubtfully naturalised), Vic (naturalised), Tas (naturalised)",naturalised,Callitriche stagnalis Scop.,https://id.biodiversity.org.au/name/apni/97950 Callitriche cyclocarpa,APC,https://id.biodiversity.org.au/name/apni/97866,taxonomic synonym,NA,Callitriche umbonata,https://id.biodiversity.org.au/node/apni/2900062,Hegelm.,Species,accepted,Plantaginaceae,"SA, NSW, Vic, Tas",native,Callitriche umbonata Hegelm.,https://id.biodiversity.org.au/name/apni/97962 Callitriche umbonata,APC,https://id.biodiversity.org.au/name/apni/97962,accepted,NA,Callitriche umbonata,https://id.biodiversity.org.au/node/apni/2900062,Hegelm.,Species,accepted,Plantaginaceae,"SA, NSW, Vic, Tas",native,Callitriche umbonata Hegelm.,https://id.biodiversity.org.au/name/apni/97962 -Callitris,APC,https://id.biodiversity.org.au/name/apni/97985,accepted,NA,Callitris,https://id.biodiversity.org.au/taxon/apni/51687694,Vent.,Genus,accepted,Cupressaceae,"WA, NT, SA, Qld, NSW, ACT, Vic (native and naturalised), Tas",native and naturalised,Callitris Vent.,https://id.biodiversity.org.au/name/apni/97985 Callitris sp.,APC,https://id.biodiversity.org.au/name/apni/97985,accepted,NA,Callitris,https://id.biodiversity.org.au/taxon/apni/51687694,Vent.,Genus,accepted,Cupressaceae,"WA, NT, SA, Qld, NSW, ACT, Vic (native and naturalised), Tas",native and naturalised,Callitris Vent.,https://id.biodiversity.org.au/name/apni/97985 Callitris sp. [Callitris glaucophylla - Callitris verrucosa; White_2020],APC,https://id.biodiversity.org.au/name/apni/97985,accepted,NA,Callitris,https://id.biodiversity.org.au/taxon/apni/51687694,Vent.,Genus,accepted,Cupressaceae,"WA, NT, SA, Qld, NSW, ACT, Vic (native and naturalised), Tas",native and naturalised,Callitris Vent.,https://id.biodiversity.org.au/name/apni/97985 Callitris sp. [Fonseca_2000],APC,https://id.biodiversity.org.au/name/apni/97985,accepted,NA,Callitris,https://id.biodiversity.org.au/taxon/apni/51687694,Vent.,Genus,accepted,Cupressaceae,"WA, NT, SA, Qld, NSW, ACT, Vic (native and naturalised), Tas",native and naturalised,Callitris Vent.,https://id.biodiversity.org.au/name/apni/97985 @@ -9036,7 +9034,6 @@ Chaetanthus tenellus,APC,https://id.biodiversity.org.au/name/apni/169679,accepte Chaetospora subbulbosa,APNI,https://id.biodiversity.org.au/name/apni/51361294,unplaced by APC,NA,Chaetospora subbulbosa,NA,NA,Species,unplaced by APC,Cyperaceae,NA,NA,Chaetospora subbulbosa (Benth.) K.L.Wilson & R.L.Barrett,https://id.biodiversity.org.au/name/apni/51361294 Chamaecrista,APC,https://id.biodiversity.org.au/name/apni/118411,accepted,NA,Chamaecrista,https://id.biodiversity.org.au/taxon/apni/51435638,Moench,Genus,accepted,Fabaceae,"WA (native and naturalised), NT (native and naturalised), Qld (native and naturalised), NSW (native and naturalised), LHI (native and naturalised)",native and naturalised,Chamaecrista Moench,https://id.biodiversity.org.au/name/apni/118411 Chamaecrista sp. [Cassia harneyi Specht],APC,https://id.biodiversity.org.au/name/apni/118411,accepted,NA,Chamaecrista,https://id.biodiversity.org.au/taxon/apni/51435638,Moench,Genus,accepted,Fabaceae,"WA (native and naturalised), NT (native and naturalised), Qld (native and naturalised), NSW (native and naturalised), LHI (native and naturalised)",native and naturalised,Chamaecrista Moench,https://id.biodiversity.org.au/name/apni/118411 -Chamaecrista,APC,https://id.biodiversity.org.au/name/apni/118411,accepted,NA,Chamaecrista,https://id.biodiversity.org.au/taxon/apni/51435638,Moench,Genus,accepted,Fabaceae,"WA (native and naturalised), NT (native and naturalised), Qld (native and naturalised), NSW (native and naturalised), LHI (native and naturalised)",native and naturalised,Chamaecrista Moench,https://id.biodiversity.org.au/name/apni/118411 Chamaecrista absus,APC,https://id.biodiversity.org.au/name/apni/118546,accepted,NA,Chamaecrista absus,https://id.biodiversity.org.au/taxon/apni/51250680,(L.) H.S.Irwin & Barneby,Species,accepted,Fabaceae,"WA, NT, Qld",native,Chamaecrista absus (L.) H.S.Irwin & Barneby,https://id.biodiversity.org.au/name/apni/118546 Chamaecrista absus var. absus,APC,https://id.biodiversity.org.au/name/apni/154498,accepted,NA,Chamaecrista absus var. absus,https://id.biodiversity.org.au/taxon/apni/51250669,NA,Varietas,accepted,Fabaceae,"WA, NT, Qld",native,Chamaecrista absus (L.) H.S.Irwin & Barneby var. absus,https://id.biodiversity.org.au/name/apni/154498 Chamaecrista biddulphiana,APC,https://id.biodiversity.org.au/name/apni/154363,accepted,NA,Chamaecrista biddulphiana,https://id.biodiversity.org.au/taxon/apni/51285103,Pedley,Species,accepted,Fabaceae,"Qld, NSW",native,Chamaecrista biddulphiana Pedley,https://id.biodiversity.org.au/name/apni/154363 @@ -12078,8 +12075,6 @@ Cyrtococcum oxyphyllum,APC,https://id.biodiversity.org.au/name/apni/100108,accep Cyrtococcum patens,APC,https://id.biodiversity.org.au/name/apni/124444,accepted,NA,Cyrtococcum patens,https://id.biodiversity.org.au/node/apni/2918837,(L.) A.Camus,Species,accepted,Poaceae,Qld,native,Cyrtococcum patens (L.) A.Camus,https://id.biodiversity.org.au/name/apni/124444 Cyrtomium,APC,https://id.biodiversity.org.au/name/apni/100131,accepted,NA,Cyrtomium,https://id.biodiversity.org.au/node/apni/2898409,C.Presl,Genus,accepted,Dryopteridaceae,"WA (naturalised), SA (naturalised), Qld (naturalised), NSW (naturalised), LHI (naturalised), Vic (naturalised)",naturalised,Cyrtomium C.Presl,https://id.biodiversity.org.au/name/apni/100131 Cyrtomium falcatum,APC,https://id.biodiversity.org.au/name/apni/100142,accepted,NA,Cyrtomium falcatum,https://id.biodiversity.org.au/node/apni/2891874,(L.f.) C.Presl,Species,accepted,Dryopteridaceae,"WA (naturalised), SA (naturalised), Qld (naturalised), ACT (naturalised)",naturalised,Cyrtomium falcatum (L.f.) C.Presl,https://id.biodiversity.org.au/name/apni/100142 -Cyrtomium falcatum 'Rochfordii',APC,https://id.biodiversity.org.au/name/apni/226042,accepted,NA,Cyrtomium falcatum 'Rochfordii',https://id.biodiversity.org.au/node/apni/2900486,NA,[unranked],accepted,Dryopteridaceae,"NSW (naturalised), LHI (naturalised), Vic (formerly naturalised)",naturalised,Cyrtomium falcatum 'Rochfordii',https://id.biodiversity.org.au/name/apni/226042 -Cyrtomium falcatum 'Rochfordii',APC,https://id.biodiversity.org.au/name/apni/226042,accepted,NA,Cyrtomium falcatum 'Rochfordii',https://id.biodiversity.org.au/node/apni/2900486,NA,[unranked],accepted,Dryopteridaceae,"NSW (naturalised), LHI (naturalised), Vic (formerly naturalised)",naturalised,Cyrtomium falcatum 'Rochfordii',https://id.biodiversity.org.au/name/apni/226042 Cyrtostylis,APC,https://id.biodiversity.org.au/name/apni/100153,accepted,NA,Cyrtostylis,https://id.biodiversity.org.au/taxon/apni/51458892,R.Br.,Genus,accepted,Orchidaceae,"WA, SA, Qld, NSW, ACT, Vic, Tas",native,Cyrtostylis R.Br.,https://id.biodiversity.org.au/name/apni/100153 Cyrtostylis sp.,APC,https://id.biodiversity.org.au/name/apni/100153,accepted,NA,Cyrtostylis,https://id.biodiversity.org.au/taxon/apni/51458892,R.Br.,Genus,accepted,Orchidaceae,"WA, SA, Qld, NSW, ACT, Vic, Tas",native,Cyrtostylis R.Br.,https://id.biodiversity.org.au/name/apni/100153 Acianthus huegelii,APC,https://id.biodiversity.org.au/name/apni/73201,nomenclatural synonym,NA,Cyrtostylis huegelii,https://id.biodiversity.org.au/taxon/apni/51401348,Endl.,Species,accepted,Orchidaceae,WA,native,Cyrtostylis huegelii Endl.,https://id.biodiversity.org.au/name/apni/100165 @@ -13050,8 +13045,6 @@ Dicarpidium sp. Mt Leake (T.Willing 469),APC,https://id.biodiversity.org.au/name Dicarpidium sp. Purnululu (K.A.Menkhorst 766),APC,https://id.biodiversity.org.au/name/apni/244499,accepted,NA,Dicarpidium sp. Purnululu (K.A.Menkhorst 766),https://id.biodiversity.org.au/node/apni/2889116,WA Herbarium,Species,accepted,Malvaceae,WA,native,Dicarpidium sp. Purnululu (K.A.Menkhorst 766) WA Herbarium,https://id.biodiversity.org.au/name/apni/244499 Dicentra,APC,https://id.biodiversity.org.au/name/apni/168349,accepted,NA,Dicentra,https://id.biodiversity.org.au/node/apni/2914469,Bernh.,Genus,accepted,Papaveraceae,Vic (doubtfully naturalised),naturalised,Dicentra Bernh.,https://id.biodiversity.org.au/name/apni/168349 Dicentra formosa,APC,https://id.biodiversity.org.au/name/apni/203065,accepted,NA,Dicentra formosa,https://id.biodiversity.org.au/node/apni/2888669,(Andrews) Walp.,Species,accepted,Papaveraceae,Vic (doubtfully naturalised),naturalised,Dicentra formosa (Andrews) Walp.,https://id.biodiversity.org.au/name/apni/203065 -Dicentra formosa subsp. formosa 'Alba',APC,https://id.biodiversity.org.au/name/apni/203067,accepted,NA,Dicentra formosa subsp. formosa 'Alba',https://id.biodiversity.org.au/node/apni/2901541,NA,[unranked],accepted,Papaveraceae,Vic (doubtfully naturalised),naturalised,Dicentra formosa subsp. formosa 'Alba',https://id.biodiversity.org.au/name/apni/203067 -Dicentra formosa subsp. formosa 'Alba',APC,https://id.biodiversity.org.au/name/apni/203067,accepted,NA,Dicentra formosa subsp. formosa 'Alba',https://id.biodiversity.org.au/node/apni/2901541,NA,[unranked],accepted,Papaveraceae,Vic (doubtfully naturalised),naturalised,Dicentra formosa subsp. formosa 'Alba',https://id.biodiversity.org.au/name/apni/203067 Dichanthium,APC,https://id.biodiversity.org.au/name/apni/101128,accepted,NA,Dichanthium,https://id.biodiversity.org.au/node/apni/2888892,P.Willemet,Genus,accepted,Poaceae,"WA (native and naturalised), NT (native and naturalised), SA, Qld (native and naturalised), NSW, ACT, Vic, Tas (naturalised)",native and naturalised,Dichanthium P.Willemet,https://id.biodiversity.org.au/name/apni/101128 Dichanthium sp.,APC,https://id.biodiversity.org.au/name/apni/101128,accepted,NA,Dichanthium,https://id.biodiversity.org.au/node/apni/2888892,P.Willemet,Genus,accepted,Poaceae,"WA (native and naturalised), NT (native and naturalised), SA, Qld (native and naturalised), NSW, ACT, Vic, Tas (naturalised)",native and naturalised,Dichanthium P.Willemet,https://id.biodiversity.org.au/name/apni/101128 Dichanthium annulatum,APC,https://id.biodiversity.org.au/name/apni/101198,accepted,NA,Dichanthium annulatum,https://id.biodiversity.org.au/node/apni/2905880,(Forssk.) Stapf,Species,accepted,Poaceae,"WA (naturalised), NT (naturalised), Qld (naturalised), NSW (doubtfully naturalised)",naturalised,Dichanthium annulatum (Forssk.) Stapf,https://id.biodiversity.org.au/name/apni/101198 @@ -13960,8 +13953,6 @@ Dodonaea truncatiales,APC,https://id.biodiversity.org.au/name/apni/72648,accepte Dodonaea uncinata,APC,https://id.biodiversity.org.au/name/apni/72687,accepted,NA,Dodonaea uncinata,https://id.biodiversity.org.au/node/apni/2916526,J.G.West,Species,accepted,Sapindaceae,Qld,native,Dodonaea uncinata J.G.West,https://id.biodiversity.org.au/name/apni/72687 Dodonaea vestita,APC,https://id.biodiversity.org.au/name/apni/72696,accepted,NA,Dodonaea vestita,https://id.biodiversity.org.au/node/apni/2913240,Hook.,Species,accepted,Sapindaceae,Qld,native,Dodonaea vestita Hook.,https://id.biodiversity.org.au/name/apni/72696 Dodonaea viscosa,APC,https://id.biodiversity.org.au/name/apni/72727,accepted,NA,Dodonaea viscosa,https://id.biodiversity.org.au/taxon/apni/51447278,Jacq.,Species,accepted,Sapindaceae,"WA, CoI, ChI, NT, SA, Qld, NSW, LHI, NI, ACT, Vic, Tas",native,Dodonaea viscosa Jacq.,https://id.biodiversity.org.au/name/apni/72727 -Dodonaea viscosa 'Purpurea',APC,https://id.biodiversity.org.au/name/apni/173618,accepted,NA,Dodonaea viscosa 'Purpurea',https://id.biodiversity.org.au/node/apni/2918457,NA,[unranked],accepted,Sapindaceae,Vic (doubtfully naturalised),naturalised,Dodonaea viscosa 'Purpurea',https://id.biodiversity.org.au/name/apni/173618 -Dodonaea viscosa 'Purpurea',APC,https://id.biodiversity.org.au/name/apni/173618,accepted,NA,Dodonaea viscosa 'Purpurea',https://id.biodiversity.org.au/node/apni/2918457,NA,[unranked],accepted,Sapindaceae,Vic (doubtfully naturalised),naturalised,Dodonaea viscosa 'Purpurea',https://id.biodiversity.org.au/name/apni/173618 Dodonaea viscosa subsp. angustifolia,APC,https://id.biodiversity.org.au/name/apni/72751,accepted,NA,Dodonaea viscosa subsp. angustifolia,https://id.biodiversity.org.au/node/apni/7871961,(L.f.) J.G.West,Subspecies,accepted,Sapindaceae,"Qld, NSW, Vic",native,Dodonaea viscosa subsp. angustifolia (L.f.) J.G.West,https://id.biodiversity.org.au/name/apni/72751 Dodonaea viscosa subsp. angustissima,APC,https://id.biodiversity.org.au/name/apni/72764,accepted,NA,Dodonaea viscosa subsp. angustissima,https://id.biodiversity.org.au/node/apni/2920748,(DC.) J.G.West,Subspecies,accepted,Sapindaceae,"WA, NT, SA, Qld, NSW, ACT, Vic",native,Dodonaea viscosa subsp. angustissima (DC.) J.G.West,https://id.biodiversity.org.au/name/apni/72764 Dodonaea viscosa subsp. burmanniana,APC,https://id.biodiversity.org.au/name/apni/72794,accepted,NA,Dodonaea viscosa subsp. burmanniana,https://id.biodiversity.org.au/node/apni/7872877,(DC.) J.G.West,Subspecies,accepted,Sapindaceae,"Qld, NSW, LHI",native,Dodonaea viscosa subsp. burmanniana (DC.) J.G.West,https://id.biodiversity.org.au/name/apni/72794 @@ -14425,8 +14416,6 @@ Echinochloa microstachya,APC,https://id.biodiversity.org.au/name/apni/97334,acce Echinochloa oryzoides,APC,https://id.biodiversity.org.au/name/apni/97353,accepted,NA,Echinochloa oryzoides,https://id.biodiversity.org.au/node/apni/2908058,(Ard.) Fritsch,Species,accepted,Poaceae,"WA (naturalised), Qld (doubtfully naturalised), NSW (naturalised), Tas (doubtfully naturalised)",naturalised,Echinochloa oryzoides (Ard.) Fritsch,https://id.biodiversity.org.au/name/apni/97353 Echinochloa picta,APC,https://id.biodiversity.org.au/name/apni/116557,accepted,NA,Echinochloa picta,https://id.biodiversity.org.au/node/apni/2907904,P.W.Michael,Species,accepted,Poaceae,Qld,native,Echinochloa picta P.W.Michael,https://id.biodiversity.org.au/name/apni/116557 Echinochloa polystachya,APC,https://id.biodiversity.org.au/name/apni/176166,accepted,NA,Echinochloa polystachya,https://id.biodiversity.org.au/node/apni/2903283,(Kunth) Hitchc.,Species,accepted,Poaceae,"NT (naturalised), Qld (naturalised), NSW (naturalised)",naturalised,Echinochloa polystachya (Kunth) Hitchc.,https://id.biodiversity.org.au/name/apni/176166 -Echinochloa polystachya 'Amity',APC,https://id.biodiversity.org.au/name/apni/224581,accepted,NA,Echinochloa polystachya 'Amity',https://id.biodiversity.org.au/node/apni/2905441,NA,[unranked],accepted,Poaceae,"Qld (naturalised), NSW (naturalised)",naturalised,Echinochloa polystachya 'Amity',https://id.biodiversity.org.au/name/apni/224581 -Echinochloa polystachya 'Amity',APC,https://id.biodiversity.org.au/name/apni/224581,accepted,NA,Echinochloa polystachya 'Amity',https://id.biodiversity.org.au/node/apni/2905441,NA,[unranked],accepted,Poaceae,"Qld (naturalised), NSW (naturalised)",naturalised,Echinochloa polystachya 'Amity',https://id.biodiversity.org.au/name/apni/224581 Echinochloa pyramidalis,APC,https://id.biodiversity.org.au/name/apni/97372,accepted,NA,Echinochloa pyramidalis,https://id.biodiversity.org.au/node/apni/2903937,(Lam.) Hitchc. & Chase,Species,accepted,Poaceae,"WA (naturalised), SA (naturalised), Qld (naturalised), NSW (naturalised)",naturalised,Echinochloa pyramidalis (Lam.) Hitchc. & Chase,https://id.biodiversity.org.au/name/apni/97372 Echinochloa telmatophila,APC,https://id.biodiversity.org.au/name/apni/115572,accepted,NA,Echinochloa telmatophila,https://id.biodiversity.org.au/node/apni/2895207,P.W.Michael & Vickery,Species,accepted,Poaceae,"WA (naturalised), Qld, NSW, NI (naturalised)",native and naturalised,Echinochloa telmatophila P.W.Michael & Vickery,https://id.biodiversity.org.au/name/apni/115572 Echinochloa turneriana,APC,https://id.biodiversity.org.au/name/apni/115602,accepted,NA,Echinochloa turneriana,https://id.biodiversity.org.au/node/apni/2914293,(Domin) J.M.Black,Species,accepted,Poaceae,"NT, SA, Qld, NSW",native,Echinochloa turneriana (Domin) J.M.Black,https://id.biodiversity.org.au/name/apni/115602 @@ -20004,8 +19993,6 @@ Grevillea polyacida,APC,https://id.biodiversity.org.au/name/apni/111139,accepted Grevillea polybotrya,APC,https://id.biodiversity.org.au/name/apni/111152,accepted,NA,Grevillea polybotrya,https://id.biodiversity.org.au/node/apni/2899532,Meisn.,Species,accepted,Proteaceae,WA,native,Grevillea polybotrya Meisn.,https://id.biodiversity.org.au/name/apni/111152 Grevillea polybractea,APC,https://id.biodiversity.org.au/name/apni/111194,accepted,NA,Grevillea polybractea,https://id.biodiversity.org.au/node/apni/2920926,H.B.Will.,Species,accepted,Proteaceae,"NSW, Vic",native,Grevillea polybractea H.B.Will.,https://id.biodiversity.org.au/name/apni/111194 Grevillea polychroma,APC,https://id.biodiversity.org.au/name/apni/199020,accepted,NA,Grevillea polychroma,https://id.biodiversity.org.au/node/apni/2911353,(Molyneux & Stajsic) Molyneux & Stajsic,Species,accepted,Proteaceae,Vic,native,Grevillea polychroma (Molyneux & Stajsic) Molyneux & Stajsic,https://id.biodiversity.org.au/name/apni/199020 -Grevillea 'Poorinda Constance',APC,https://id.biodiversity.org.au/name/apni/174350,accepted,NA,Grevillea 'Poorinda Constance',https://id.biodiversity.org.au/taxon/apni/51445423,NA,[unranked],accepted,Proteaceae,Vic (naturalised),naturalised,Grevillea 'Poorinda Constance',https://id.biodiversity.org.au/name/apni/174350 -Grevillea 'Poorinda Constance',APC,https://id.biodiversity.org.au/name/apni/174350,accepted,NA,Grevillea 'Poorinda Constance',https://id.biodiversity.org.au/taxon/apni/51445423,NA,[unranked],accepted,Proteaceae,Vic (naturalised),naturalised,Grevillea 'Poorinda Constance',https://id.biodiversity.org.au/name/apni/174350 Grevillea prasina,APC,https://id.biodiversity.org.au/name/apni/111262,accepted,NA,Grevillea prasina,https://id.biodiversity.org.au/node/apni/2900853,McGill.,Species,accepted,Proteaceae,"WA, NT",native,Grevillea prasina McGill.,https://id.biodiversity.org.au/name/apni/111262 Grevillea preissii,APC,https://id.biodiversity.org.au/name/apni/111266,accepted,NA,Grevillea preissii,https://id.biodiversity.org.au/node/apni/2887115,Meisn.,Species,accepted,Proteaceae,WA,native,Grevillea preissii Meisn.,https://id.biodiversity.org.au/name/apni/111266 Grevillea preissii subsp. glabrilimba,APC,https://id.biodiversity.org.au/name/apni/164337,accepted,NA,Grevillea preissii subsp. glabrilimba,https://id.biodiversity.org.au/node/apni/2904625,Olde & Marriott,Subspecies,accepted,Proteaceae,WA,native,Grevillea preissii subsp. glabrilimba Olde & Marriott,https://id.biodiversity.org.au/name/apni/164337 @@ -22245,8 +22232,6 @@ Hylocereus undatus,APC,https://id.biodiversity.org.au/name/apni/63603,accepted,N Hymenachne,APC,https://id.biodiversity.org.au/name/apni/65287,accepted,NA,Hymenachne,https://id.biodiversity.org.au/node/apni/2900977,P.Beauv.,Genus,accepted,Poaceae,"NT (native and naturalised), Qld",native and naturalised,Hymenachne P.Beauv.,https://id.biodiversity.org.au/name/apni/65287 Hymenachne acutigluma,APC,https://id.biodiversity.org.au/name/apni/65300,accepted,NA,Hymenachne acutigluma,https://id.biodiversity.org.au/node/apni/2914792,(Steud.) Gilliland,Species,accepted,Poaceae,"NT, Qld",native,Hymenachne acutigluma (Steud.) Gilliland,https://id.biodiversity.org.au/name/apni/65300 Hymenachne amplexicaulis,APC,https://id.biodiversity.org.au/name/apni/65315,accepted,NA,Hymenachne amplexicaulis,https://id.biodiversity.org.au/node/apni/2895414,(Rudge) Nees,Species,accepted,Poaceae,"NT (naturalised), Qld (naturalised), NSW (naturalised)",naturalised,Hymenachne amplexicaulis (Rudge) Nees,https://id.biodiversity.org.au/name/apni/65315 -Hymenachne amplexicaulis 'Olive',APC,https://id.biodiversity.org.au/name/apni/229435,accepted,NA,Hymenachne amplexicaulis 'Olive',https://id.biodiversity.org.au/node/apni/2904205,NA,[unranked],accepted,Poaceae,NSW (naturalised),naturalised,Hymenachne amplexicaulis 'Olive',https://id.biodiversity.org.au/name/apni/229435 -Hymenachne amplexicaulis 'Olive',APC,https://id.biodiversity.org.au/name/apni/229435,accepted,NA,Hymenachne amplexicaulis 'Olive',https://id.biodiversity.org.au/node/apni/2904205,NA,[unranked],accepted,Poaceae,NSW (naturalised),naturalised,Hymenachne amplexicaulis 'Olive',https://id.biodiversity.org.au/name/apni/229435 Hymenachne x calamitosa,APC,https://id.biodiversity.org.au/name/apni/231687,accepted,NA,Hymenachne x calamitosa,https://id.biodiversity.org.au/node/apni/2899877,J.R.Clarkson,Species,accepted,Poaceae,Qld,native,Hymenachne x calamitosa J.R.Clarkson,https://id.biodiversity.org.au/name/apni/231687 Hymenasplenium,APC,https://id.biodiversity.org.au/name/apni/211507,accepted,NA,Hymenasplenium,https://id.biodiversity.org.au/taxon/apni/51431737,Hayata,Genus,accepted,Aspleniaceae,Qld,native,Hymenasplenium Hayata,https://id.biodiversity.org.au/name/apni/211507 Hymenasplenium excisum,APC,https://id.biodiversity.org.au/name/apni/51251680,accepted,NA,Hymenasplenium excisum,https://id.biodiversity.org.au/taxon/apni/51431743,(C.Presl) S.Linds.,Species,accepted,Aspleniaceae,Qld,native,Hymenasplenium excisum (C.Presl) S.Linds.,https://id.biodiversity.org.au/name/apni/51251680 @@ -26259,8 +26244,6 @@ Panicum maximum,APC,https://id.biodiversity.org.au/name/apni/97097,basionym,basi Megathyrsus maximus var. coloratus,APC,https://id.biodiversity.org.au/name/apni/183744,accepted,NA,Megathyrsus maximus var. coloratus,https://id.biodiversity.org.au/node/apni/2901597,(C.T.White) B.K.Simon & S.W.L.Jacobs,Varietas,accepted,Poaceae,"NT (naturalised), Qld (naturalised)",naturalised,Megathyrsus maximus var. coloratus (C.T.White) B.K.Simon & S.W.L.Jacobs,https://id.biodiversity.org.au/name/apni/183744 Megathyrsus maximus var. maximus,APC,https://id.biodiversity.org.au/name/apni/183745,accepted,nomenclatural synonym,Megathyrsus maximus var. maximus,https://id.biodiversity.org.au/node/apni/2904138,NA,Varietas,accepted,Poaceae,"WA (naturalised), NT (naturalised), Qld (naturalised), NSW (naturalised)",naturalised,Megathyrsus maximus (Jacq.) B.K.Simon & S.W.L.Jacobs var. maximus,https://id.biodiversity.org.au/name/apni/183745 Panicum maximum var. maximum,APC,https://id.biodiversity.org.au/name/apni/97133,nomenclatural synonym,nomenclatural synonym,Megathyrsus maximus var. maximus,https://id.biodiversity.org.au/node/apni/2904138,NA,Varietas,accepted,Poaceae,"WA (naturalised), NT (naturalised), Qld (naturalised), NSW (naturalised)",naturalised,Megathyrsus maximus (Jacq.) B.K.Simon & S.W.L.Jacobs var. maximus,https://id.biodiversity.org.au/name/apni/183745 -Megathyrsus maximus var. maximus 'Hamil',APC,https://id.biodiversity.org.au/name/apni/224608,accepted,NA,Megathyrsus maximus var. maximus 'Hamil',https://id.biodiversity.org.au/node/apni/2919817,NA,[unranked],accepted,Poaceae,Qld (naturalised),naturalised,Megathyrsus maximus var. maximus 'Hamil',https://id.biodiversity.org.au/name/apni/224608 -Megathyrsus maximus var. maximus 'Hamil',APC,https://id.biodiversity.org.au/name/apni/224608,accepted,NA,Megathyrsus maximus var. maximus 'Hamil',https://id.biodiversity.org.au/node/apni/2919817,NA,[unranked],accepted,Poaceae,Qld (naturalised),naturalised,Megathyrsus maximus var. maximus 'Hamil',https://id.biodiversity.org.au/name/apni/224608 Megathyrsus maximus var. pubiglumis,APC,https://id.biodiversity.org.au/name/apni/183743,accepted,taxonomic synonym,Megathyrsus maximus var. pubiglumis,https://id.biodiversity.org.au/node/apni/2910762,(K.Schum.) B.K.Simon & S.W.L.Jacobs,Varietas,accepted,Poaceae,"NT (naturalised), SA (naturalised), Qld (naturalised), NSW (naturalised), NI (naturalised)",naturalised,Megathyrsus maximus var. pubiglumis (K.Schum.) B.K.Simon & S.W.L.Jacobs,https://id.biodiversity.org.au/name/apni/183743 Panicum maximum var. trichoglume,APC,https://id.biodiversity.org.au/name/apni/97149,taxonomic synonym,taxonomic synonym,Megathyrsus maximus var. pubiglumis,https://id.biodiversity.org.au/node/apni/2910762,(K.Schum.) B.K.Simon & S.W.L.Jacobs,Varietas,accepted,Poaceae,"NT (naturalised), SA (naturalised), Qld (naturalised), NSW (naturalised), NI (naturalised)",naturalised,Megathyrsus maximus var. pubiglumis (K.Schum.) B.K.Simon & S.W.L.Jacobs,https://id.biodiversity.org.au/name/apni/183743 Meiogyne,APC,https://id.biodiversity.org.au/name/apni/171503,accepted,NA,Meiogyne,https://id.biodiversity.org.au/taxon/apni/51266677,Miq.,Genus,accepted,Annonaceae,"WA, NT, Qld, NSW",native,Meiogyne Miq.,https://id.biodiversity.org.au/name/apni/171503 @@ -29751,7 +29734,6 @@ Persoonia x [Persoonia chamaepeuce x confertiflora; White_2020],APC,https://id.b Persoonia x [Persoonia levis X linearis; White_2020],APC,https://id.biodiversity.org.au/name/apni/111160,accepted,NA,Persoonia,https://id.biodiversity.org.au/taxon/apni/51429033,Sm.,Genus,accepted,Proteaceae,"WA, NT, Qld, NSW, ACT, Vic, Tas",native,Persoonia Sm.,https://id.biodiversity.org.au/name/apni/111160 Persoonia x [Persoonia levis x myrtilloides subsp. myrtilloides; White_2020],APC,https://id.biodiversity.org.au/name/apni/111160,accepted,NA,Persoonia,https://id.biodiversity.org.au/taxon/apni/51429033,Sm.,Genus,accepted,Proteaceae,"WA, NT, Qld, NSW, ACT, Vic, Tas",native,Persoonia Sm.,https://id.biodiversity.org.au/name/apni/111160 Persoonia x [Persoonia sericea x terminalis; White_2020],APC,https://id.biodiversity.org.au/name/apni/111160,accepted,NA,Persoonia,https://id.biodiversity.org.au/taxon/apni/51429033,Sm.,Genus,accepted,Proteaceae,"WA, NT, Qld, NSW, ACT, Vic, Tas",native,Persoonia Sm.,https://id.biodiversity.org.au/name/apni/111160 -Persoonia,APC,https://id.biodiversity.org.au/name/apni/111160,accepted,NA,Persoonia,https://id.biodiversity.org.au/taxon/apni/51429033,Sm.,Genus,accepted,Proteaceae,"WA, NT, Qld, NSW, ACT, Vic, Tas",native,Persoonia Sm.,https://id.biodiversity.org.au/name/apni/111160 Persoonia acerosa,APC,https://id.biodiversity.org.au/name/apni/111571,accepted,NA,Persoonia acerosa,https://id.biodiversity.org.au/node/apni/2911724,Sieber ex Schult. & Schult.f.,Species,accepted,Proteaceae,NSW,native,Persoonia acerosa Sieber ex Schult. & Schult.f.,https://id.biodiversity.org.au/name/apni/111571 Persoonia acerosa x Persoonia levis,APC,https://id.biodiversity.org.au/name/apni/196968,accepted,NA,Persoonia acerosa x Persoonia levis,https://id.biodiversity.org.au/node/apni/2898517,Sieber ex Schult. & Schult.f. x Persoonia levis (Cav.) Domin,Species,accepted,Proteaceae,NSW,native,Persoonia acerosa Sieber ex Schult. & Schult.f. x Persoonia levis (Cav.) Domin,https://id.biodiversity.org.au/name/apni/196968 Persoonia acicularis,APC,https://id.biodiversity.org.au/name/apni/111594,accepted,NA,Persoonia acicularis,https://id.biodiversity.org.au/node/apni/2907315,F.Muell.,Species,accepted,Proteaceae,WA,native,Persoonia acicularis F.Muell.,https://id.biodiversity.org.au/name/apni/111594 @@ -30987,9 +30969,7 @@ Plantago turrifera,APC,https://id.biodiversity.org.au/name/apni/79077,accepted,N Plantago varia,APC,https://id.biodiversity.org.au/name/apni/79100,accepted,NA,Plantago varia,https://id.biodiversity.org.au/node/apni/2890708,R.Br.,Species,accepted,Plantaginaceae,"SA, Qld, NSW, ACT, Vic, Tas",native,Plantago varia R.Br.,https://id.biodiversity.org.au/name/apni/79100 Platanaceae,APC,https://id.biodiversity.org.au/name/apni/128870,accepted,NA,Platanaceae,https://id.biodiversity.org.au/node/apni/2892018,T.Lestib.,Familia,accepted,Platanaceae,"WA (naturalised), ACT (doubtfully naturalised)",naturalised,Platanaceae T.Lestib.,https://id.biodiversity.org.au/name/apni/128870 Platanus,APC,https://id.biodiversity.org.au/name/apni/128871,accepted,NA,Platanus,https://id.biodiversity.org.au/node/apni/2913021,L.,Genus,accepted,Platanaceae,"WA (naturalised), ACT (doubtfully naturalised)",naturalised,Platanus L.,https://id.biodiversity.org.au/name/apni/128871 -Platanus x hispanica 'Acerifolia',APC,https://id.biodiversity.org.au/name/apni/201864,accepted,NA,Platanus x hispanica 'Acerifolia',https://id.biodiversity.org.au/node/apni/2916742,NA,[unranked],accepted,Platanaceae,"WA (naturalised), ACT (doubtfully naturalised)",naturalised,Platanus x hispanica 'Acerifolia',https://id.biodiversity.org.au/name/apni/201864 Platanus x hispanica,APC,https://id.biodiversity.org.au/name/apni/201863,nomenclatural synonym,NA,Platanus x hispanica 'Acerifolia',https://id.biodiversity.org.au/node/apni/2916742,NA,[unranked],accepted,Platanaceae,"WA (naturalised), ACT (doubtfully naturalised)",naturalised,Platanus x hispanica 'Acerifolia',https://id.biodiversity.org.au/name/apni/201864 -Platanus x hispanica 'Acerifolia',APC,https://id.biodiversity.org.au/name/apni/201864,accepted,NA,Platanus x hispanica 'Acerifolia',https://id.biodiversity.org.au/node/apni/2916742,NA,[unranked],accepted,Platanaceae,"WA (naturalised), ACT (doubtfully naturalised)",naturalised,Platanus x hispanica 'Acerifolia',https://id.biodiversity.org.au/name/apni/201864 Platostoma,APC,https://id.biodiversity.org.au/name/apni/199216,accepted,NA,Platostoma,https://id.biodiversity.org.au/node/apni/8764318,P.Beauv.,Genus,accepted,Lamiaceae,Qld,native,Platostoma P.Beauv.,https://id.biodiversity.org.au/name/apni/199216 Platostoma longicorne,APC,https://id.biodiversity.org.au/name/apni/199217,accepted,NA,Platostoma longicorne,https://id.biodiversity.org.au/node/apni/8764313,(F.Muell.) A.J.Paton,Species,accepted,Lamiaceae,Qld,native,Platostoma longicorne (F.Muell.) A.J.Paton,https://id.biodiversity.org.au/name/apni/199217 Platycapnos,APC,https://id.biodiversity.org.au/name/apni/79214,accepted,NA,Platycapnos,https://id.biodiversity.org.au/node/apni/2887214,(DC.) Bernh.,Genus,accepted,Papaveraceae,SA (doubtfully naturalised),naturalised,Platycapnos (DC.) Bernh.,https://id.biodiversity.org.au/name/apni/79214 @@ -34610,11 +34590,7 @@ Salix cinerea subsp. cinerea,APC,https://id.biodiversity.org.au/name/apni/199935 Salix cinerea subsp. cinerea x Salix x reichardtii,APC,https://id.biodiversity.org.au/name/apni/7863613,accepted,NA,Salix cinerea subsp. cinerea x Salix x reichardtii,https://id.biodiversity.org.au/node/apni/7863964,L. subsp. cinerea x Salix x reichardtii A.Kern.,Species,accepted,Salicaceae,Vic (naturalised),naturalised,Salix cinerea L. subsp. cinerea x Salix x reichardtii A.Kern.,https://id.biodiversity.org.au/name/apni/7863613 Salix cinerea subsp. oleifolia,APC,https://id.biodiversity.org.au/name/apni/199938,accepted,NA,Salix cinerea subsp. oleifolia,https://id.biodiversity.org.au/node/apni/2891110,Macreight,Subspecies,accepted,Salicaceae,"Vic (naturalised), Tas (naturalised)",naturalised,Salix cinerea subsp. oleifolia Macreight,https://id.biodiversity.org.au/name/apni/199938 Salix humboldtiana,APNI,https://id.biodiversity.org.au/name/apni/171831,unplaced by APC,NA,Salix humboldtiana,NA,NA,Species,unplaced by APC,Salicaceae,NA,NA,Salix humboldtiana Willd.,https://id.biodiversity.org.au/name/apni/171831 -Salix humboldtiana 'Pyramidalis',APC,https://id.biodiversity.org.au/name/apni/171832,accepted,NA,Salix humboldtiana 'Pyramidalis',https://id.biodiversity.org.au/node/apni/2894174,NA,[unranked],accepted,Salicaceae,"WA (naturalised), Qld (doubtfully naturalised), NSW (naturalised)",naturalised,Salix humboldtiana 'Pyramidalis',https://id.biodiversity.org.au/name/apni/171832 -Salix humboldtiana 'Pyramidalis',APC,https://id.biodiversity.org.au/name/apni/171832,accepted,NA,Salix humboldtiana 'Pyramidalis',https://id.biodiversity.org.au/node/apni/2894174,NA,[unranked],accepted,Salicaceae,"WA (naturalised), Qld (doubtfully naturalised), NSW (naturalised)",naturalised,Salix humboldtiana 'Pyramidalis',https://id.biodiversity.org.au/name/apni/171832 Salix matsudana,APNI,https://id.biodiversity.org.au/name/apni/165877,unplaced by APC,NA,Salix matsudana,NA,NA,Species,unplaced by APC,Salicaceae,NA,NA,Salix matsudana Koidz.,https://id.biodiversity.org.au/name/apni/165877 -Salix matsudana 'Tortuosa',APC,https://id.biodiversity.org.au/name/apni/165878,accepted,NA,Salix matsudana 'Tortuosa',https://id.biodiversity.org.au/node/apni/2900787,NA,[unranked],accepted,Salicaceae,"WA (naturalised), SA (naturalised), NSW (naturalised), ACT (doubtfully naturalised), Vic (naturalised), Tas (naturalised)",naturalised,Salix matsudana 'Tortuosa',https://id.biodiversity.org.au/name/apni/165878 -Salix matsudana 'Tortuosa',APC,https://id.biodiversity.org.au/name/apni/165878,accepted,NA,Salix matsudana 'Tortuosa',https://id.biodiversity.org.au/node/apni/2900787,NA,[unranked],accepted,Salicaceae,"WA (naturalised), SA (naturalised), NSW (naturalised), ACT (doubtfully naturalised), Vic (naturalised), Tas (naturalised)",naturalised,Salix matsudana 'Tortuosa',https://id.biodiversity.org.au/name/apni/165878 Salix matsudana x (Salix matsudana x Salix alba),APC,https://id.biodiversity.org.au/name/apni/7865098,accepted,NA,Salix matsudana x (Salix matsudana x Salix alba),https://id.biodiversity.org.au/node/apni/7865449,Koidz. x (Salix matsudana Koidz. x Salix alba L.,Species,accepted,Salicaceae,NSW (naturalised),naturalised,Salix matsudana Koidz. x (Salix matsudana Koidz. x Salix alba L.),https://id.biodiversity.org.au/name/apni/7865098 Salix matsudana x Salix alba,APC,https://id.biodiversity.org.au/name/apni/177293,accepted,NA,Salix matsudana x Salix alba,https://id.biodiversity.org.au/node/apni/7865868,Koidz. x Salix alba L.,Species,accepted,Salicaceae,"NSW (naturalised), Vic (naturalised)",naturalised,Salix matsudana Koidz. x Salix alba L.,https://id.biodiversity.org.au/name/apni/177293 Salix glaucophylloides,APC,https://id.biodiversity.org.au/name/apni/171841,misapplied,NA,Salix myricoides,https://id.biodiversity.org.au/node/apni/2920195,Muhl.,Species,accepted,Salicaceae,ACT (doubtfully naturalised),naturalised,Salix myricoides Muhl.,https://id.biodiversity.org.au/name/apni/191238 @@ -34625,19 +34601,11 @@ Salix viminalis,APC,https://id.biodiversity.org.au/name/apni/117082,accepted,NA, Salix x calodendron,APC,https://id.biodiversity.org.au/name/apni/171844,accepted,NA,Salix x calodendron,https://id.biodiversity.org.au/node/apni/2895394,Wimm.,Species,accepted,Salicaceae,"SA (naturalised), NSW (naturalised), Tas (naturalised)",naturalised,Salix x calodendron Wimm.,https://id.biodiversity.org.au/name/apni/171844 Salix x fragilis,APC,https://id.biodiversity.org.au/name/apni/59805,accepted,taxonomic synonym,Salix x fragilis,https://id.biodiversity.org.au/node/apni/2890685,L.,Species,accepted,Salicaceae,"SA (naturalised), NSW (naturalised), ACT (naturalised), Vic (naturalised), Tas (naturalised)",naturalised,Salix x fragilis L.,https://id.biodiversity.org.au/name/apni/59805 Salix x rubens,APC,https://id.biodiversity.org.au/name/apni/59827,taxonomic synonym,taxonomic synonym,Salix x fragilis,https://id.biodiversity.org.au/node/apni/2890685,L.,Species,accepted,Salicaceae,"SA (naturalised), NSW (naturalised), ACT (naturalised), Vic (naturalised), Tas (naturalised)",naturalised,Salix x fragilis L.,https://id.biodiversity.org.au/name/apni/59805 -Salix x fragilis nothovar. fragilis,APC,https://id.biodiversity.org.au/name/apni/171839,accepted,NA,Salix x fragilis nothovar. fragilis,https://id.biodiversity.org.au/node/apni/2911547,NA,Nothovarietas,accepted,Salicaceae,"NSW (naturalised), ACT (naturalised), Vic (naturalised), Tas (naturalised)",naturalised,Salix x fragilis L. nothovar. fragilis,https://id.biodiversity.org.au/name/apni/171839 -Salix x fragilis nothovar. fragilis,APC,https://id.biodiversity.org.au/name/apni/171839,accepted,NA,Salix x fragilis nothovar. fragilis,https://id.biodiversity.org.au/node/apni/2911547,NA,Nothovarietas,accepted,Salicaceae,"NSW (naturalised), ACT (naturalised), Vic (naturalised), Tas (naturalised)",naturalised,Salix x fragilis L. nothovar. fragilis,https://id.biodiversity.org.au/name/apni/171839 -Salix x fragilis nothovar. furcata,APC,https://id.biodiversity.org.au/name/apni/199940,accepted,NA,Salix x fragilis nothovar. furcata,https://id.biodiversity.org.au/node/apni/2901940,Gaudin,Nothovarietas,accepted,Salicaceae,Vic (naturalised),naturalised,Salix x fragilis nothovar. furcata Gaudin,https://id.biodiversity.org.au/name/apni/199940 -Salix x fragilis nothovar. furcata,APC,https://id.biodiversity.org.au/name/apni/199940,accepted,NA,Salix x fragilis nothovar. furcata,https://id.biodiversity.org.au/node/apni/2901940,Gaudin,Nothovarietas,accepted,Salicaceae,Vic (naturalised),naturalised,Salix x fragilis nothovar. furcata Gaudin,https://id.biodiversity.org.au/name/apni/199940 Salix x fragilis x Salix nigra,APC,https://id.biodiversity.org.au/name/apni/7864356,accepted,NA,Salix x fragilis x Salix nigra,https://id.biodiversity.org.au/node/apni/7864706,L. x Salix nigra Marshall,Species,accepted,Salicaceae,NSW (naturalised),naturalised,Salix x fragilis L. x Salix nigra Marshall,https://id.biodiversity.org.au/name/apni/7864356 Salix x mollisima,APC,https://id.biodiversity.org.au/name/apni/226271,accepted,NA,Salix x mollisima,https://id.biodiversity.org.au/node/apni/2894285,Ehrh.,Species,accepted,Salicaceae,Vic (doubtfully naturalised),naturalised,Salix x mollisima Ehrh.,https://id.biodiversity.org.au/name/apni/226271 Salix x pendulina,APC,https://id.biodiversity.org.au/name/apni/171836,accepted,NA,Salix x pendulina,https://id.biodiversity.org.au/node/apni/2891360,Wender.,Species,accepted,Salicaceae,"SA (naturalised), NSW (naturalised), Vic (naturalised)",naturalised,Salix x pendulina Wender.,https://id.biodiversity.org.au/name/apni/171836 Salix x reichardtii,APC,https://id.biodiversity.org.au/name/apni/171843,accepted,NA,Salix x reichardtii,https://id.biodiversity.org.au/node/apni/2915224,A.Kern.,Species,accepted,Salicaceae,"SA (naturalised), NSW (naturalised), Vic (naturalised), Tas (naturalised)",naturalised,Salix x reichardtii A.Kern.,https://id.biodiversity.org.au/name/apni/171843 Salix x sepulcralis,APC,https://id.biodiversity.org.au/name/apni/171833,accepted,NA,Salix x sepulcralis,https://id.biodiversity.org.au/node/apni/2913826,Simonk.,Species,accepted,Salicaceae,"NSW (naturalised), Vic (naturalised)",naturalised,Salix x sepulcralis Simonk.,https://id.biodiversity.org.au/name/apni/171833 -Salix x sepulcralis nothovar. chrysocoma,APC,https://id.biodiversity.org.au/name/apni/171835,accepted,NA,Salix x sepulcralis nothovar. chrysocoma,https://id.biodiversity.org.au/node/apni/2896116,(Dode) Meikle,Nothovarietas,accepted,Salicaceae,"SA (naturalised), NSW (naturalised), Vic (naturalised)",naturalised,Salix x sepulcralis nothovar. chrysocoma (Dode) Meikle,https://id.biodiversity.org.au/name/apni/171835 -Salix x sepulcralis nothovar. chrysocoma,APC,https://id.biodiversity.org.au/name/apni/171835,accepted,NA,Salix x sepulcralis nothovar. chrysocoma,https://id.biodiversity.org.au/node/apni/2896116,(Dode) Meikle,Nothovarietas,accepted,Salicaceae,"SA (naturalised), NSW (naturalised), Vic (naturalised)",naturalised,Salix x sepulcralis nothovar. chrysocoma (Dode) Meikle,https://id.biodiversity.org.au/name/apni/171835 -Salix x sepulcralis nothovar. sepulcralis,APC,https://id.biodiversity.org.au/name/apni/171834,accepted,NA,Salix x sepulcralis nothovar. sepulcralis,https://id.biodiversity.org.au/node/apni/2911971,NA,Nothovarietas,accepted,Salicaceae,"SA (naturalised), Vic (naturalised)",naturalised,Salix x sepulcralis Simonk. nothovar. sepulcralis,https://id.biodiversity.org.au/name/apni/171834 -Salix x sepulcralis nothovar. sepulcralis,APC,https://id.biodiversity.org.au/name/apni/171834,accepted,NA,Salix x sepulcralis nothovar. sepulcralis,https://id.biodiversity.org.au/node/apni/2911971,NA,Nothovarietas,accepted,Salicaceae,"SA (naturalised), Vic (naturalised)",naturalised,Salix x sepulcralis Simonk. nothovar. sepulcralis,https://id.biodiversity.org.au/name/apni/171834 Salix x sericans,APC,https://id.biodiversity.org.au/name/apni/171842,accepted,NA,Salix x sericans,https://id.biodiversity.org.au/node/apni/2900994,Tausch ex A.Kern.,Species,accepted,Salicaceae,NSW (naturalised),naturalised,Salix x sericans Tausch ex A.Kern.,https://id.biodiversity.org.au/name/apni/171842 Salomonia,APC,https://id.biodiversity.org.au/name/apni/59861,accepted,NA,Salomonia,https://id.biodiversity.org.au/node/apni/2910370,Lour.,Genus,accepted,Polygalaceae,"WA, NT, Qld",native,Salomonia Lour.,https://id.biodiversity.org.au/name/apni/59861 Salomonia ciliata,APC,https://id.biodiversity.org.au/name/apni/117095,accepted,NA,Salomonia ciliata,https://id.biodiversity.org.au/node/apni/2915486,(L.) DC.,Species,accepted,Polygalaceae,"WA, NT, Qld",native,Salomonia ciliata (L.) DC.,https://id.biodiversity.org.au/name/apni/117095 diff --git a/config/traits.yml b/config/traits.yml index 69b7ac530..d591951a5 100644 --- a/config/traits.yml +++ b/config/traits.yml @@ -19,18 +19,18 @@ traits: bark_delta13C: description: Bark carbon stable isotope signature type: numeric - units: per mille + units: '{delta}[ppth]' label: Bark carbon (C) isotope signature (delta 13C) allowed_values_min: -50.0 allowed_values_max: 0.0 bark_delta15N: description: Bark nitrogen stable isotope signature type: numeric - units: per mille + units: '{delta}[ppth]' label: Bark nitrogen (N) isotope signature (delta 15N) allowed_values_min: -25.0 allowed_values_max: 75.0 - bark_mass_area: + bark_dry_mass_per_surface_area: description: Bark mass per unit surface area of stem type: numeric units: g/cm2 @@ -164,14 +164,14 @@ traits: bark_thickness_index: description: Thickness of the bark (2 times a single thickness measure) of the stem divided by stem diameter, adjust for increasing bark thickness with increasing stem diameter. (based on Lawes) type: numeric - units: dimensionless + units: mm/mm label: Scaled bark thickness allowed_values_min: 0.001 allowed_values_max: 1 bark_ash_per_dry_mass: description: Bark ash content per dry mass, where bark ash is the component of the bark remaining after combustion. type: numeric - units: '%' + units: g/g label: Bark ash content per dry mass allowed_values_min: 0.01 allowed_values_max: 100.0 @@ -210,7 +210,7 @@ traits: label: Depth below ground (negative number) or height above ground (positive number) from which buds emerge following a disturbance (i.e. fire) allowed_values_min: -100 allowed_values_max: 100 - calcicole_status: + plant_tolerance_calcicole: description: Dichotonmous variable, defining plants as calcifuge (intolerant of basic soils) versus calcicole (tolerant of basic soils, such as calcareous sands and limestone derived soils) type: categorical label: Calcicole versus calcifuge status @@ -318,7 +318,7 @@ traits: leaf_rubisco_N_per_total_leaf_N: description: Percentage of N accounted for by Rubisco type: numeric - units: '%' + units: g/g label: Percentage of N accounted for by Rubisco allowed_values_min: 5 allowed_values_max: 50 @@ -339,7 +339,7 @@ traits: leaf_thylakoid_N_per_total_leaf_N: description: Percentage of N accounted for by thylakoid proteins type: numeric - units: '%' + units: g/g label: Percentage of N accounted for by thylakoid proteins allowed_values_min: 5 allowed_values_max: 30 @@ -395,42 +395,42 @@ traits: atmospheric_CO2_concentration: description: Ambient CO2 concentration (external CO2 concentration) type: numeric - units: umolCO2/mol + units: umol{CO2}/mol label: ambient CO2 concentration allowed_values_min: 50.0 allowed_values_max: 1000.0 leaf_chloroplast_CO2_concentration: description: CO2 concentration inside chloroplasts type: numeric - units: umolCO2/umol + units: umol{CO2}/umol label: CO2 concentration inside chloroplasts allowed_values_min: 50.0 allowed_values_max: 1000.0 leaf_intercellular_CO2_concentration_at_Aambient: description: CO2 concentration in interstitial spaces under ambient conditions type: numeric - units: umolCO2/mol + units: umol{CO2}/mol label: internal CO2 concentration under ambient conditions allowed_values_min: 50.0 allowed_values_max: 1300.0 leaf_intercellular_CO2_concentration_at_Amax: description: CO2 concentration in interstitial spaces during Amax measurement type: numeric - units: umolCO2/mol + units: umol{CO2}/mol label: internal CO2 concentration during Amax measurement allowed_values_min: 50.0 allowed_values_max: 2100.0 leaf_intercellular_CO2_concentration_at_Asat: description: CO2 concentration in interstitial spaces during Asat measurement type: numeric - units: umolCO2/mol + units: umol{CO2}/mol label: internal CO2 concentration during Asat measurement allowed_values_min: 10.0 allowed_values_max: 1300.0 leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio: description: Ratio of internal to external CO2 concentrations type: numeric - units: umolCO2 internal/umolCO2 ambient + units: umol{CO2_internal}/umol{CO2_ambient} label: Ratio of internal to external CO2 concentrations allowed_values_min: 0.0 allowed_values_max: 1.3 @@ -474,14 +474,14 @@ traits: establishment_light_environment_index: description: The minimum light environment required by seedlings for establishment, scaled from 0 to 8. 0 indicates `No direct light, extremely low levels of transmitted/reflected light, such as beneath dense fern or palm fronds close to ground level.`; 0.5 indicates `No direct light, very low levels of transmitted light`; 1 indicates `Rare or no exposure to direct light from lateral sources, and low levels of transmitted light.`; 2 indicates `Low lateral light and low–moderate transmitted light with <10% of inverted cone exposed to lateral sources of direct light, plus low to moderate levels of transmitted light`; 3 indicates `Low-moderate lateral & moderate transmitted light, wit <5% exposure of the focal crown to vertical direct light, and <15 % of inverted cone exposed to lateral sources of direct light, plus moderate transmitted light.`; 4 indicates `Moderate lateral light & moderate–high transmitted light, with 5 – 10% exposure of focal crown to direct vertical light, plus 2-20% exposure of inverted cone to lateral sources of direct light, plus moderate to high levels of transmitted light.`; 5 indicates `Moderate vertical light and moderate–high lateral light, with 5 – 20% exposure of focal crown to direct vertical light, plus one or both of, i. 10-40% exposure of 90-degree inverted cone to lateral sources of direct light, ii. exposure to high levels of transmitted light`; 6 indicates `Moderate-High vertical and high lateral light, with 10-30% of vertical projection of the crown exposed to vertical light, and lateral light exposure for > 40% of 90-degree inverted cone`, 7 indicates `High vertical and lateral light, with 30-80% of vertical projection of the crown exposed to vertical light, or exposure to lateral sources of direct light for > 60 % of a 90-degree inverted cone encompassing the focal crown.`; 8 indicates `Full light exposure of crown, with > 80% of the vertical projection of the crown exposed to vertical light.` (reference, Wells 2012). type: numeric - units: dimensionless + units: '{dimensionless}' label: Canopy light environment required for seedling establishment allowed_values_min: 0 allowed_values_max: 8 reproductive_light_environment_index: description: The minimum light environment required by seedlings for reproduction, scaled from 0 to 8. 0 indicates `No direct light, extremely low levels of transmitted/reflected light, such as beneath dense fern or palm fronds close to ground level.`; 0.5 indicates `No direct light, very low levels of transmitted light`; 1 indicates `Rare or no exposure to direct light from lateral sources, and low levels of transmitted light.`; 2 indicates `Low lateral light and low–moderate transmitted light with <10% of inverted cone exposed to lateral sources of direct light, plus low to moderate levels of transmitted light`; 3 indicates `Low–moderate lateral & moderate transmitted light, wit <5% exposure of the focal crown to vertical direct light, and <15 % of inverted cone exposed to lateral sources of direct light, plus moderate transmitted light.`; 4 indicates `Moderate lateral light & moderate–high transmitted light, with 5 – 10% exposure of focal crown to direct vertical light, plus 2-20% exposure of inverted cone to lateral sources of direct light, plus moderate to high levels of transmitted light.`; 5 indicates `Moderate vertical light and moderate–high lateral light, with 5 – 20% exposure of focal crown to direct vertical light, plus one or both of, i. 10-40% exposure of 90-degree inverted cone to lateral sources of direct light, ii. exposure to high levels of transmitted light`; 6 indicates `Moderate-High vertical and high lateral light, with 10-30% of vertical projection of the crown exposed to vertical light, and lateral light exposure for > 40% of 90-degree inverted cone`, 7 indicates `High vertical and lateral light, with 30-80% of vertical projection of the crown exposed to vertical light, or exposure to lateral sources of direct light for > 60 % of a 90-degree inverted cone encompassing the focal crown.`; 8 indicates `Full light exposure of crown, with > 80% of the vertical projection of the crown exposed to vertical light.` (reference, Wells 2012). type: numeric - units: dimensionless + units: '{dimensionless}' label: Canopy light environment required for reproduction allowed_values_min: 0 allowed_values_max: 8 @@ -602,21 +602,21 @@ traits: leaf_epidermal_cell_density_abaxial: description: Epidermal cell density on the lower leaf surface type: numeric - units: count/mm2 + units: '{count}/mm2' label: Epidermal cell density on the lower leaf surface allowed_values_min: 100 allowed_values_max: 10000 leaf_epidermal_cell_density_adaxial: description: Epidermal cell density on the upper leaf surface type: numeric - units: count/mm2 + units: '{count}/mm2' label: Epidermal cell density on the upper leaf surface allowed_values_min: 100 allowed_values_max: 10000 leaf_epidermal_cell_density_both_sides: description: Epidermal cell density averaged across the upper and lower leaf surfaces type: numeric - units: count/mm2 + units: '{count}/mm2' label: Epidermal cell density averaged across the upper and lower leaf surfaces allowed_values_min: 100 allowed_values_max: 10000 @@ -702,7 +702,7 @@ traits: fire_flame_duration: description: Flame duration for a single leaf. Time from the first visible flame until no more flames could be seen (seconds) type: numeric - units: seconds + units: s label: Flame duration for a single leaf. allowed_values_min: 0.1 allowed_values_max: 200 @@ -713,10 +713,10 @@ traits: label: Fuel bed bulk density. allowed_values_min: 0.001 allowed_values_max: 1.0 - fire_fuel_comsumption: + fire_fuel_consumption: description: Proportion of fuel that was consumed by fire. type: numeric - units: '%' + units: g/g label: Proportion of fuel that was consumed by fire allowed_values_min: 1 allowed_values_max: 100 @@ -730,21 +730,21 @@ traits: fire_smoulder_duration: description: Smoulder duration for a single leaf. Time from the end of the last visible flame until the glowing phase died out (seconds) type: numeric - units: seconds + units: s label: Smoulder duration for a single leaf. allowed_values_min: 0.1 allowed_values_max: 1000 fire_total_burn_duration: description: Sum of flame duration and smoulder duration for a single leaf. type: numeric - units: seconds + units: s label: Sum of flame duration and smoulder duration for a single leaf. allowed_values_min: 0.1 allowed_values_max: 1500 fire_time_to_ignition: description: Time to ignition for a single leaf. Time from ignition source contacting leaf (or other material) until ignition occurs. type: numeric - units: seconds + units: s label: Time to ignition allowed_values_min: 0.1 allowed_values_max: 100 @@ -762,7 +762,7 @@ traits: flower_count_maximum: description: Maximum flower number produced type: numeric - units: count + units: '{count}' label: Maximum flower number allowed_values_min: 0 allowed_values_max: 1000000 @@ -799,14 +799,14 @@ traits: flower_perianth_parts_count: description: The total number of perianth parts, including sepals, petals, or any form of tepal. A value of zero was scored when the perianth is absent. In flowers with perianth whorls fused along their complete length (e.g., Convolvulus), perianth parts are counted based on merism (e.g., if a calyx has 5 distinct sepals and the corolla is entirely fused, then the corolla is often interpreted to consist of five fused petals), anatomy (e.g., number of vascular traces), development (e.g., number of primordia), or comparison with closely related taxa. (Definition derived from Schoenenberger et al. (2020) for their character '201. Number of perianth parts (C1)') type: numeric - units: count + units: '{count}' label: Number of perianth parts allowed_values_min: 0 allowed_values_max: 1000 flower_perianth_fusion: description: Fusion of perianth organs (congenital or postgenital) at anthesis, recorded on a continuous scale, from 0 (free parts) to 1 (parts fused along their entire length). Partial fusion was recorded using an approximate number between these two extremes (e.g., 0.1 corresponds to basal fusion, 0.5 to fusion along half of the length of perianth parts). In case of multiple whorls, this trait records within-whorl fusion. For example, if organs within each whorl are fused along their entire length, a trait value of 1 is recorded. In cases where organs of two whorls are fused into a common tubular structure, such as frequently observed in monocots (e.g., Polygonatum), the perianth is considered to be fused. If the two (or more) whorls differed in their extent of fusion, a range of trait values may be recorded. For example, if the calyx is only basally fused, up to 10% of its length, but the corolla is entirely fused, a range of 0.1 to 1 is recorded as the trait value for the species. (Definition derived from Schoenenberger et al. (2020) for their character '204. Fusion of perianth (C1)') type: numeric - units: n/n + units: '{dimensionless}' label: Fusion of perianth allowed_values_min: 0 allowed_values_max: 1 @@ -833,14 +833,14 @@ traits: flower_perianth_whorls_count: description: The number of perianth whorls as a continuous trait (with integer values of 1 and above). Not applicable when perianth phyllotaxis is spiral or irregular or when the perianth is absent. (Definition derived from Schoenenberger et al. (2020) for their character '231. Number of perianth whorls (C1)') type: numeric - units: count + units: '{count}' label: Number of perianth whorls allowed_values_min: 0 allowed_values_max: 15 flower_perianth_merism: description: The number of perianth parts in each whorl, recorded as a continuous trait (with integer values of 1 and above). Not applicable when perianth phyllotaxis is spiral or irregular or when the perianth is absent. (Definition derived from Schoenenberger et al. (2020) for their character '232. Perianth merism (C1)') type: numeric - units: count + units: '{count}' label: Number of perianth parts in each whorl (Perianth merism) allowed_values_min: 0 allowed_values_max: 50 @@ -862,7 +862,7 @@ traits: flower_fertile_stamens_count: description: Count of fertile stamens in bisexual or male flowers; does not score female flowers. (Definition derived from Schoenenberger et al. (2020) for their character '301. Number of fertile stamens (C1)') type: numeric - units: count + units: '{count}' label: Number of fertile stamens allowed_values_min: 0 allowed_values_max: 10000 @@ -886,14 +886,14 @@ traits: flower_filament_fusion: description: Fusion of stamen (and staminode) filaments among each other at anthesis (congenitally or postgenitally) is recorded on a continuous scale, from 0 (free filaments) to 1 (filaments fused along their entire length). Partial fusion is recorded using an approximate number between these two extremes (e.g., 0.1 corresponds to basal fusion, 0.5 to fusion along half of the length of filaments). (Definition derived from Schoenenberger et al. (2020) for their character '306. Fusion of filaments (C1)') type: numeric - units: n/n + units: '{dimensionless}' label: Fusion of filaments allowed_values_min: 0 allowed_values_max: 1 flower_filament_fusion_to_inner_perianth: description: The fusion of filaments with the innermost perianth organs at anthesis on a continuous scale, from 0 (filaments completely free from perianth) to 1 (filaments fused along their entire length with the perianth; the 'entire length' of the filament is defined as the distance between the floral base and the joint between filament and anther). Partial fusion is recorded using an approximate number between these two extremes (e.g., 0.1 corresponds to basal fusion, 0.5 to fusion along half of the length of perianth parts). If two (or more) stamen whorls (including staminodial whorls) differ in their extent of filament fusion with the perianth, this trait is recorded as a range of values. For example, if the filaments of an outermost stamen whorl are fused, up to 90% of their length, but an inner whorl only up to 50%, the trait is assigned a range of 0.5 to 0.9. The rationale for this is to provide a general trait that allows comparison of fusion among all angiosperms. (Definition derived from Schoenenberger et al. (2020) for their character '308. Fusion of filaments to inner perianth series (C1)') type: numeric - units: n/n + units: '{dimensionless}' label: Fusion of filaments to inner perianth series allowed_values_min: 0 allowed_values_max: 1 @@ -951,14 +951,14 @@ traits: flower_androecium_structural_whorls_count: description: The number of whorls, considering both fertile stamens and staminodes. In cases of stamen fascicles, the count of whorls of fascicles is recorded. This character is not applicable for spiral or irregular stamen arrangements, or when there is a single structural stamen (i.e., one stamen, no staminodes; e.g., Chloranthus, Chloranthaceae). (Definition derived from Schoenenberger et al. (2020) for their character '331. Number of androecium structural whorls (C1)') type: numeric - units: count + units: '{count}' label: Number of androecium structural whorls allowed_values_min: 0 allowed_values_max: 100 flower_androecium_structural_merism: description: The number of stamens or stamen bundles (fascicles) in one whorl, considering both fertile stamens and staminodes. This character is not applicable for spiral or irregular stamen arrangements, nor when there is a single structural stamen (i.e., one stamen, no staminodes; e.g., Chloranthus, Chloranthaceae). (Definition derived from Schoenenberger et al. (2020) for their character '332. Androecium structural merism (C1)') type: numeric - units: count + units: '{count}' label: Number of androecium parts in each whorl (Androecium structural merism) allowed_values_min: 0 allowed_values_max: 100 @@ -973,14 +973,14 @@ traits: flower_structural_carpels_count: description: Number of fertile or sterile carpels in bisexual or female flowers, recorded as a continuous character (with integer values of 1 and above). Includes the number of co-occurring carpellodes (sterile carpels) because this number is often more easily obtained from the literature than the actual number of fertile carpels. However, the number of carpellodes in male flowers is ignored for this character. In multicarpellate, unilocular gynoecia with complete carpel fusion up to the stigma (e.g., Primula), it may be difficult to assess the number of carpels unequivocally. In such cases, the number of carpels is scored only if it is well established based on anatomical or developmental investigations. Similarly, in gynoecia where one or more carpels are reduced (e.g., in the pseudomonomerous gynoecia of some Arecaceae, Stauffer et al., 2002), the total number of structural carpels is only scored when unequivocally determined in the literature. (Definition derived from Schoenenberger et al. (2020) for their character '401. Number of structural carpels (C1)') type: numeric - units: count + units: '{count}' label: CNumber of structural carpels allowed_values_min: 0 allowed_values_max: 10000 flower_ovary_fusion: description: Degree of ovary fusion expressed as a fraction of the total length of the ovary (from the floral base to the apex of the ovary). Fusion of styles and stigmas is not taken into account for this trait. Not applicable when there is a single carpel. (Definition derived from Schoenenberger et al. (2020) for their character '403. Fusion of ovaries (C1)') type: numeric - units: n/n + units: '{dimensionless}' label: Fusion of ovaries allowed_values_min: 0 allowed_values_max: 1 @@ -1000,14 +1000,14 @@ traits: flower_style_fusion: description: The degree of fusion of styles at anthesis, recorded on a continuous scale, from 0 (free styles) to 1 (styles fused along their entire length, but excluding the stigmatic region). Partial fusion is recorded using an approximate number between these two extremes (e.g., 0.1 corresponds to basal fusion, 0.5 to fusion along half of the total length of the styles). This character is not applicable in unicarpellate flowers. (Definition derived from Schoenenberger et al. (2020) for their character '406. Fusion of styles (C1)') type: numeric - units: n/n + units: '{dimensionless}' label: Fusion of styles allowed_values_min: 0 allowed_values_max: 1 flower_ovules_per_functional_carpel_count: description: Number of ovules per carpel recorded as a continuous character (with integer values of 1 and above). Reduced (sterile) carpels are not taken into account here. (Definition derived from Schoenenberger et al. (2020) for their character '411. Number of ovules per functional carpel (C1)') type: numeric - units: count + units: '{count}' label: Number of ovules per functional carpel allowed_values_min: 0 allowed_values_max: 100000 @@ -1026,7 +1026,7 @@ traits: flower_pollen_apertures_count: description: A pollen aperture is a structurally delimited region of the pollen grain wall through which the pollen tube emerges during pollen germination and which plays a role in harmomegathy. Here we report the number of apertures per pollen grain as a continuous character. A value of zero is scored when pollen is inaperturate (i.e. when there is no distinct aperture). Aperturate pollen is scored with integer values of 1 and above. (Definition derived from Schoenenberger et al. (2020) for their character '5000. Number of apertures (C1)') type: numeric - units: count + units: '{count}' label: Number of pollen grain apertures allowed_values_min: 0 allowed_values_max: 100 @@ -1044,35 +1044,35 @@ traits: sulcus: Pollen aperture shape is elongate and grooved and positioned at the pole syncolpus: Pollen grain with two or more simple (or compound) colpi, the ends of which join at the pole ulcus: Pollen aperture shape is round and pore-like and positioned at the pole - leaf_fluorescence_Jmax_per_mass: + leaf_photosynthesis_Jmax_per_mass: description: Capacity for photosynthetic electron transport, measured through chlorophyll fluorescence, on a per mass basis type: numeric units: umol/g/s label: Capacity for photosynthetic electron transport, measured through chlorophyll fluorescence, on a per mass basis allowed_values_min: 0 allowed_values_max: 3 - leaf_fluorescence_Vcmax_per_mass: + leaf_photosynthesis_Vcmax_per_mass: description: Maximum carboxylase activity of ribulose 1,5-bisphosphate carboxylase/oxygenase (Rubisco), measured through chlorophyll fluorescence, on a per mass basis type: numeric - units: umol/g + units: umol/g/s label: Maximum carboxylase activity of ribulose 1,5-bisphosphate carboxylase/oxygenase (Rubisco), measured through chlorophyll fluorescence, on a per mass basis allowed_values_min: 0 allowed_values_max: 1 - leaf_fluorescence_Jmax_over_Vcmax: + leaf_photosynthesis_Jmax_over_Vcmax: description: Ratio of photosynthetic electron transport capacity to maximum Rubisco activity, measured through chlorophyll fluorescence; this is the maximum quantum yield of PSII (Maxwell & Johnson 2000, doi.org/10.1093/jexbot/51.345.659) type: numeric - units: dimensionless + units: '{dimensionless}' label: Ratio of photosynthetic electron transport capacity to maximum Rubisco activity, measured through chlorophyll fluorescence allowed_values_min: 0 allowed_values_max: 5 - leaf_fluorescence_Jmax_per_area: + leaf_photosynthesis_Jmax_per_area: description: Capacity for photosynthetic electron transport, calculated from an A-Ci response curve, on an area basis type: numeric units: umol/m2/s label: Capacity for photosynthetic electron transport, calculated from an A-Ci response curve, on an area basis allowed_values_min: 1 allowed_values_max: 500 - leaf_fluorescence_Vcmax_per_area: + leaf_photosynthesis_Vcmax_per_area: description: Maximum carboxylase activity of ribulose 1,5-bisphosphate carboxylase/oxygenase (Rubisco), calculated from an A-Ci response curve, on an area basis type: numeric units: umol/m2/s @@ -1229,21 +1229,21 @@ traits: fire_time_from_fire_to_fruit: description: Elapsed time from fire to fruiting type: numeric - units: months + units: mo label: Elapsed time from fire to fruiting allowed_values_min: 1 allowed_values_max: 500 leaf_fluorescence_fv_over_fm: description: Chlorophyll fluorescence measurement that indicates whether plant stress affects photo-system II in a dark adapted state type: numeric - units: x/x + units: '{dimensionless}' label: Fv/Fm allowed_values_min: 0.2 allowed_values_max: 1 seed_germination: description: Proportion of seeds in a sample that germinated under conditions specified under methods or contextual conditions. type: numeric - units: n/n + units: '{count}/{count}' label: Germination (proportion) allowed_values_min: 0 allowed_values_max: 1 @@ -1277,49 +1277,6 @@ traits: label: Plant genome size allowed_values_min: 0.5 allowed_values_max: 100.0 - glaucous: - description: Variable indicating if a plant's leaves are glaucous or not - type: categorical - label: Glaucous - allowed_values_levels: - '0': not glaucous - '1': glaucous - growth_habit: - description: Variable that defines a combination of growth habit and plant vegetative reproductive potential - type: categorical - label: Growth habit - allowed_values_levels: - climbing: Plant that climbs - compact: - creeper: Creeper that roots along stems - cushion-forming: - decumbent: - dense: - erect: - hummock: - mat_forming: - open: - procumbent: - prostrate: Plants that lie flat on the ground - rhizomatous: Plants having modified underground stems - rosette: - scandent: - scrambling: - shrubby: - spindly: - sprawling: Leaning upon some object or lying on the ground; possible overlap in meaning with either scandent/climbing or prostrate - spreading: - stoloniferous: Plants having horizontal branches from the base of the plant that produce new plants from buds at its tip or nodes - trailing: - tufted: A dense clump attached at the base or growing close together; can refer to grasses, shrubs, or trees - twining: - growth_substrate: - description: Trait indicating the substrate on which a plant grows or its growth medium - type: categorical - label: Growth substrate - allowed_values_levels: - aquatic: Plant grows in water - epiphytic: Plant grows on another plant leaf_guard_cell_length: description: Length of guard cells type: numeric @@ -1330,11 +1287,11 @@ traits: huber_value: description: Sapwood area to leaf area ratio type: numeric - units: mm2_sapwood/mm2_leaf + units: mm2{sapwood}/mm2{leaf} label: Huber value allowed_values_min: 0.000001 allowed_values_max: 0.2 - hypocotyl_type: + seedling_hypocotyl_hairs: description: Binary variable distinguishing between glabrous versus hairy hypocotyls (the embryonic axis to which the cotyeledons are attached). type: categorical label: Hypocotyl type @@ -1355,17 +1312,17 @@ traits: label: Lower hypodermis thickness allowed_values_min: 1.0 allowed_values_max: 100.0 - inundation_tolerance: + plant_tolerance_inundation: description: Ability of taxon to tolerate being under water type: categorical label: Inundation tolerance allowed_values_levels: not_applicable: Taxa is not typically confronted with beng inundated and its response is unknown. - '<1_month': Taxa able to tolerate being inundated for less than 1 month. + 'less_than_1_month': Taxa able to tolerate being inundated for less than 1 month. '1-6_months': Taxa able to tolerate being inundated for 1-6 months. - '>6_months': Taxa able to tolerate being inundated for more than 6 months. + 'greater_than_6_months': Taxa able to tolerate being inundated for more than 6 months. aquatic: Taxa truly aquatic and able to be permanantly inundated. - flood_regime_classification: + plant_flood_regime_classification: description: Functional group classification scheme used to categorise taxa into seven groups based on their growth and germination responses to flood regime. Based on Brock and Casanova (1997) and Casanova (2011). notes: Change name to `water plant functional groups` references: Brock and Casanova 1997 (ISBN 008043200X); Casanova 2011 (doi.org/10.1111/j.1365-2427.2011.02680.x) @@ -1384,7 +1341,7 @@ traits: description: The inclination angle of the upper (adaxial) leaf lamina surface relative to a horizontal plane, such that a leaf surface facing the solar zenith has an angle of 0. notes: This trait records the slope of the leaf lamina relative to the ground surface. The angle between a stem and the leaf lamina is a separate trait, `leaf_axil_angle`. Complanate leaves can be scored as having a `leaf_inclination_angle` of 0. type: numeric - units: degrees + units: deg label: Leaf inclination angle, relative to horizontal allowed_values_min: -90 allowed_values_max: 90 @@ -1392,7 +1349,7 @@ traits: description: The angle between a shoot and a leaf that branches from the shoot axis. notes: This trait records the angle between the upper surface of a leaf and the stem to which it is attached. The slope of the leaf lamina relative to the solar zenith is a separate trait, `leaf_inclination_angle`. type: numeric - units: degrees + units: deg label: Angle between a leaf and stem allowed_values_min: 0 allowed_values_max: 180 @@ -1493,7 +1450,7 @@ traits: leaf_ash_per_dry_mass: description: Leaf ash content per dry mass, where leaf ash is the component of the leaf remaining after combustion. type: numeric - units: '%' + units: g/g label: Leaf ash content per dry mass allowed_values_min: 0.01 allowed_values_max: 100.0 @@ -1528,21 +1485,21 @@ traits: leaf_cell_wall_fraction: description: Fraction of total leaf biomass that is cell wall material type: numeric - units: dimensionless + units: mg/mg label: Leaf cell wall fraction (fraction of cell wall material recovered from total leaf biomass) allowed_values_min: 0.1 allowed_values_max: 1.0 leaf_cell_wall_N_per_cell_wall_dry_mass: description: Proportion of leaf cell wall material that is nitrogen type: numeric - units: mmolN/g + units: mmol{N}/g label: Leaf cell wall nitrogen concentration allowed_values_min: 0.1 allowed_values_max: 10.0 leaf_cell_wall_N_per_leaf_N: description: Proportion of all N in leaves that is found in the leaf cell walls type: numeric - units: dimensionless + units: mg/mg label: Leaf cell wall nitrogen fraction allowed_values_min: 0.01 allowed_values_max: 1.0 @@ -1584,63 +1541,63 @@ traits: leaf_dark_respiration_per_area: description: Leaf respiration rate per unit leaf area, in the dark type: numeric - units: umolCO2/m2/s + units: umol{CO2}/m2/s label: Leaf respiration rate per unit leaf area, in the dark allowed_values_min: 1.0e-03 allowed_values_max: 15.0 leaf_dark_respiration_per_dry_mass: description: Leaf respiration rate per unit leaf dry mass, in the dark type: numeric - units: umolCO2/g/s + units: umol{CO2}/g/s label: Leaf respiration rate per unit leaf dry mass, in the dark allowed_values_min: 1.0e-03 allowed_values_max: 1.0 stem_respiration_per_dry_mass: description: Stem respiration rate per unit dry mass type: numeric - units: umolCO2/g/s + units: umol{CO2}/g/s label: Stem respiration rate per unit dry mass allowed_values_min: 1.0e-02 allowed_values_max: 10.0 leaf_light_respiration_per_area: description: Leaf respiration rate per unit leaf area, in the light type: numeric - units: umolCO2/m2/s + units: umol{CO2}/m2/s label: Leaf respiration rate per unit leaf area, in the light allowed_values_min: 1.0e-05 allowed_values_max: 10000.0 leaf_delta13C: description: Leaf carbon stable isotope signature type: numeric - units: per mille + units: '{delta}[ppth]' label: Leaf carbon (C) isotope signature (delta 13C) allowed_values_min: -50.0 allowed_values_max: 0.0 leaf_delta15N: description: Leaf nitrogen stable isotope signature type: numeric - units: per mille + units: '{delta}[ppth]' label: Leaf nitrogen (N) isotope signature (delta 15N) allowed_values_min: -25.0 allowed_values_max: 75.0 leaf_xylem_delta15N: description: Xylem nitrogen stable isotope signature from leaves type: numeric - units: per mille + units: '{delta}[ppth]' label: Xylem nitrogen (N) isotope signature (delta 15N) from leaves allowed_values_min: -25.0 allowed_values_max: 75.0 leaf_delta18O: description: Leaf oxygen stable isotope signature type: numeric - units: per mille + units: '{delta}[ppth]' label: Leaf oxygen (O) isotope signature (delta 18O) allowed_values_min: -10.0 allowed_values_max: 50.0 stem_water_delta18O: description: Oxygen stable isotope signature of stem water type: numeric - units: per mille + units: '{delta}[ppth]' label: Oxygen stable isotope signature (d18O) of stem water allowed_values_min: -10.0 allowed_values_max: 50.0 @@ -1728,17 +1685,17 @@ traits: allowed_values_levels: glabrous: Juvenile phase leaves do not have hairs (trichomes). hairy: Juvenile phase leaves have hairs (trichomes). - leaf_hydraulic_conductivity: + leaf_specific_conductance: description: Measure of how efficiently water is transported through the leaf, determined as the ratio of water flow rate through the leaf to the difference in water potential across the leaf, standardised to leaf area. type: numeric - units: mmol/m2/s/MPa + units: mmol/m2/MPa/s label: Leaf hydraulic conductivity allowed_values_min: 0.1 allowed_values_max: 100.0 leaf_hydraulic_vulnerability: description: Leaf water potential value at which leaf hydraulic conductance has declined by 50% from the mean maximum rate type: numeric - units: neg_MPa + units: MPa label: Leaf hydraulic vulnerability allowed_values_min: .001 allowed_values_max: 40 @@ -1768,7 +1725,7 @@ traits: description: Duration of time that an individual leaf is attached to the stem and physiologically functional. notes: Leaf lifespan is the inverse of the rate of leaf turnover. For some species, leaflets or other portions of a leaf may be censused rather than the entire leaf lamina. type: numeric - units: month + units: mo label: Leaf lifespan (longevity) allowed_values_min: 1.0 allowed_values_max: 1000.0 @@ -1871,14 +1828,14 @@ traits: leaf_mesophyll_conductance_per_area: description: Rate of CO2 movement between chloroplasts and sub-stomatal cavities (intracellular space), per unit leaf area type: numeric - units: mmolCO2/g/s + units: mmol{CO2}/g/s label: Mesophyll conductance per unit leaf area allowed_values_min: 0.01 allowed_values_max: 1 leaf_mesophyll_conductance_per_mass: description: Rate of CO2 movement between chloroplasts and sub-stomatal cavities (intracellular space), per unit leaf mass type: numeric - units: molCO2/m2/s + units: mol{CO2}/m2/s label: Mesophyll conductance per unit leaf mass allowed_values_min: 0.01 allowed_values_max: 10 @@ -1968,28 +1925,28 @@ traits: leaf_photosynthetic_nitrogen_use_efficiency_maximum: description: Ratio of photosynthesis (CO2 assimilation rate) to leaf nitrogen content at saturating light and CO2 conditions type: numeric - units: umolCO2/molN/s + units: umol{CO2}/mol{N}/s label: Leaf photosynthesis rate per unit leaf nitrogen (N) content (photosynthetic nitrogen use efficiency, PNUE) at saturating light and CO2 conditions allowed_values_min: 1.0 allowed_values_max: 1000.0 leaf_photosynthetic_nitrogen_use_efficiency_saturated: description: Ratio of photosynthesis (CO2 assimilation rate) to leaf nitrogen content at saturating light conditions but ambient CO2 conditions type: numeric - units: umolCO2/molN/s + units: umol{CO2}/mol{N}/s label: Leaf photosynthesis rate per unit leaf nitrogen (N) content (photosynthetic nitrogen use efficiency, PNUE) at saturating light conditions but ambient CO2 conditions allowed_values_min: 1.0 allowed_values_max: 1000.0 leaf_photosynthetic_phosphorus_use_efficiency_maximum: description: Ratio of photosynthesis (CO2 assimilation rate) to leaf phosphorus content at saturating light and CO2 conditions type: numeric - units: umolCO2/molP/s + units: umol{CO2}/mol{P}/s label: Leaf photosynthesis rate per unit leaf phosphorus (P) content (photosynthetic phosphorus use efficiency, PPUE) at saturating light and CO2 conditions allowed_values_min: 100.0 allowed_values_max: 100000.0 leaf_photosynthetic_phosphorus_use_efficiency_saturated: description: Ratio of photosynthesis (CO2 assimilation rate) to leaf phosphorus content at saturating light conditions but ambient CO2 conditions type: numeric - units: umolCO2/molP/s + units: umol{CO2}/mol{P}/s label: Leaf photosynthesis rate per unit leaf phosphorus (P) content (photosynthetic phosphorus use efficiency, PPUE) at saturating light conditions but ambient CO2 conditions allowed_values_min: 10.0 allowed_values_max: 100000.0 @@ -2071,7 +2028,7 @@ traits: leaf_specific_conductivity: description: Kl; the ratio of leaf hydraulic conductivity to the leaf area distil to the segment type: numeric - units: 10^4 x kg/m/s/MPa + units: 10^4.kg/m/MPa/s label: Leaf specific hydraulic conductivity (Kl) allowed_values_min: 0.1 allowed_values_max: 500.0 @@ -2086,42 +2043,42 @@ traits: whole_plant_transpiration: description: Rate of water loss per plant, as calculated across longer periods of time under experimental conditions. type: numeric - units: g/day/cm2 + units: g/cm2/d label: Whole plant transpiration allowed_values_min: .01 allowed_values_max: 1000 leaf_transpiration: description: Rate of water loss from leaf under ambient conditions type: numeric - units: mmolH2O/m2/s + units: mmol{H2O}/m2/s label: Leaf transpiration under ambient conditions allowed_values_min: 0.0001 allowed_values_max: 10000.0 leaf_transpiration_at_Amax: description: Rate of water loss from leaf during Amax measurement type: numeric - units: mmolH2O/m2/s + units: mmol{H2O}/m2/s label: Leaf transpiration during Amax measurement allowed_values_min: 0.0001 allowed_values_max: 10000.0 leaf_transpiration_at_Asat: description: Rate of water loss from leaf during Asat measurement type: numeric - units: mmolH2O/m2/s + units: mmol{H2O}/m2/s label: Leaf transpiration during Asat measurement allowed_values_min: 0.0001 allowed_values_max: 10000.0 leaf_dark_transpiration_per_area: description: Leaf transpiration rate per unit leaf area, in the dark type: numeric - units: mmolH2O/m2/s + units: mmol{H2O}/m2/s label: Leaf transpiration rate per unit leaf area, in the dark allowed_values_min: 0.0001 allowed_values_max: 10000.0 leaf_turgor_loss_point: description: Water potential at which a leaf loses turgor type: numeric - units: neg_MPa + units: MPa label: Leaf turgor loss point allowed_values_min: .01 allowed_values_max: 100 @@ -2301,7 +2258,7 @@ traits: lifespan: description: Broad categories of plant life span, in years type: numeric - units: years + units: a label: Life span (years) allowed_values_min: 0.1 allowed_values_max: 10000 @@ -2325,7 +2282,7 @@ traits: modified_NDVI: description: Modified normalized difference vegetation index (modified NDVI), based on Landsat data type: numeric - units: dimensionless + units: '{dimensionless}' label: modified normalized difference vegetation index (modified NDVI) allowed_values_min: 0.1 allowed_values_max: 1 @@ -2409,7 +2366,7 @@ traits: leaf_palisade_layer_number: description: Number of layers of palisade cells type: numeric - units: count + units: '{count}' label: Number of layers of palisade cells allowed_values_min: 1 allowed_values_max: 10 @@ -2456,42 +2413,42 @@ traits: leaf_photosynthetic_rate_per_area_ambient: description: Rate at which a plant consumes carbon dioxide through photosynthesis, per unit leaf area type: numeric - units: umolCO2/m2/s + units: umol{CO2}/m2/s label: Leaf photosynthesis rate per unit leaf area allowed_values_min: 0.25 allowed_values_max: 50 leaf_photosynthetic_rate_per_area_maximum: description: Rate at which a plant consumes carbon dioxide through photosynthesis at saturating light and CO2 conditions, per unit leaf area type: numeric - units: umolCO2/m2/s + units: umol{CO2}/m2/s label: Leaf photosynthesis rate per unit leaf area at saturating light and CO2 conditions allowed_values_min: 0.25 allowed_values_max: 85 leaf_photosynthetic_rate_per_area_saturated: description: Rate at which a plant consumes carbon dioxide through photosynthesis at saturating light conditions but ambient CO2 conditions, per unit leaf area type: numeric - units: umolCO2/m2/s + units: umol{CO2}/m2/s label: Leaf photosynthesis rate per unit leaf area at saturating light conditions allowed_values_min: 0.01 allowed_values_max: 100 leaf_photosynthetic_rate_per_dry_mass_ambient: description: Maximum rate at which a plant consumes carbon dioxide through photosynthesis, per unit leaf dry mass type: numeric - units: umolCO2/g/s + units: umol{CO2}/g/s label: Leaf photosynthesis rate per unit leaf dry mass allowed_values_min: 0.01 allowed_values_max: 1.0 leaf_photosynthetic_rate_per_dry_mass_maximum: description: Maximum rate at which a plant consumes carbon dioxide through photosynthesis at saturating light and CO2 conditions, per unit leaf dry mass type: numeric - units: umolCO2/g/s + units: umol{CO2}/g/s label: Leaf photosynthesis rate per unit leaf dry mass at saturating light and CO2 conditions allowed_values_min: 0.01 allowed_values_max: 1.0 leaf_photosynthetic_rate_per_dry_mass_saturated: description: Maximum rate at which a plant consumes carbon dioxide through photosynthesis at saturating light conditions but ambient CO2 conditions, per unit leaf dry mass type: numeric - units: umolCO2/g/s + units: umol{CO2}/g/s label: Leaf photosynthesis rate per unit leaf dry mass at saturating light conditions allowed_values_min: 0.001 allowed_values_max: 1.0 @@ -2616,7 +2573,7 @@ traits: ploidy: description: Chromosome ploidy type: numeric - units: count + units: '{count}' label: Chromosome ploidy allowed_values_min: 1 allowed_values_max: 4 @@ -2704,42 +2661,42 @@ traits: reproductive_maturity: description: Age of plants at reproductive maturity. type: numeric - units: years + units: a label: Age of plants at reproductive maturity allowed_values_min: 0 allowed_values_max: 1000 reproductive_maturity_secondary_after_fire: description: For species that survive a fire, the number of years post-disturbance required to resprout and re-reach reproductive maturity. type: numeric - units: years + units: a label: Years required to reach secondary reproductive maturity following disturbance (fire) allowed_values_min: .1 allowed_values_max: 100 leaf_N_resorption: description: Nitrogen resorption from leaves type: numeric - units: dimensionless + units: mg/mg label: Nitrogen resorption from leaves allowed_values_min: -1.1 allowed_values_max: 1 leaf_P_resorption: description: Phosphorus resorption from leaves type: numeric - units: dimensionless + units: mg/mg label: Phosphorus resorption from leaves allowed_values_min: -1.1 allowed_values_max: 1 fire_response_numeric: description: Proportion of individuals in a population that resprout following a fire. type: numeric - units: dimensionless + units: '{count}/{count}' label: Proportion of individuals in a population that resprout allowed_values_min: 0 allowed_values_max: 1 fire_response_stem_ratio: description: Ratio of stem count post-fire to pre-fire at an individual or population level; this trait is appropriate to use for plants that have many stems from the base (shrubs, herbs, graminoids) where the number of stems before and after fire is censused. It is effectively a continuous measure of resprouting strength conditioned on initial size type: numeric - units: dimensionless + units: '{count}/{count}' label: Ratio of stem count post-fire to pre-fire allowed_values_min: 0 allowed_values_max: 4 @@ -2767,21 +2724,21 @@ traits: root_delta13C: description: Root carbon stable isotope signature type: numeric - units: per mille + units: '{delta}[ppth]' label: Root carbon (C) isotope signature (delta 13C) allowed_values_min: -50.0 allowed_values_max: 0.0 root_delta15N: description: Root nitrogen stable isotope signature type: numeric - units: per mille + units: '{delta}[ppth]' label: Root nitrogen (N) isotope signature (delta 15N) allowed_values_min: -25.0 allowed_values_max: 75.0 root_xylem_delta15N: description: Xylem nitrogen stable isotope signature from roots type: numeric - units: per mille + units: '{delta}[ppth]' label: Xylem nitrogen (N) isotope signature (delta 15N) from roots allowed_values_min: -25.0 allowed_values_max: 75.0 @@ -2795,7 +2752,7 @@ traits: root_distribution_coefficient: description: Root biomass depth distribution coefficient ('B' from Gale & Grigal (1987), where high values indicate root biomass allocated deeper in the soil). type: numeric - units: dimensionless + units: '{dimensionless}' label: Root biomass depth distribution coefficient allowed_values_min: 0.5 allowed_values_max: 1.0 @@ -2837,7 +2794,7 @@ traits: root_shoot_ratio: description: Ratio of root dry mass to shoot dry mass type: numeric - units: mg_root/mg_shoot + units: mg{root}/mg{shoot} label: Root to shoot ratio (dry mass) allowed_values_min: 0.01 allowed_values_max: 15.0 @@ -2874,8 +2831,8 @@ traits: label: Root wood density allowed_values_min: 0.05 allowed_values_max: 10.0 - salt_tolerance: - description: Salt-tolerance categories; Also see 'soil_salinity_tolerance' for studies reporting actual soil salinity levels taxa can tolerate. Kew data on salt tolerance included in 'water_tolerance' trait + plant_tolerance_salt: + description: Salt-tolerance categories; Also see 'plant_tolerance_soil_salinity' for studies reporting actual soil salinity levels taxa can tolerate. Kew data on salt tolerance included in 'water_tolerance' trait type: categorical label: Salt tolerance strategies allowed_values_levels: @@ -2889,28 +2846,28 @@ traits: sapwood_specific_conductivity: description: Ks; Describes the flow rate of water (kg/s) along a stem for a given drop in pressure (1/MPa), normalised to the length of the segment (1/m). Calculated as hydraulic conductivity divided by the sapwood cross-sectional area where the measurement is taken. type: numeric - units: kg/m/s/MPa + units: kg/m/MPa/s label: Sapwood specific conductivity (Ks) allowed_values_min: 0.01 allowed_values_max: 500 sapwood_specific_conductivity_theoretical: description: Theoretical Ks or Kp; Describes the theoretical flow rate of water (kg/s) along a stem for a given drop in pressure (1/MPa). Calculated as theoretical Kh, calculated based on Hagen-Poiseuille's law, divided by the microscopically determined cross-sectional area without bark and pit. type: numeric - units: kg/m/s/MPa + units: kg/m/MPa/s label: Theoretical sapwood specific conductivity (Ks) allowed_values_min: 0.05 allowed_values_max: 5000 - stem_transverse_branch_area_specific_conductivity: + stem_specific_conductivity: description: Describes the flow rate of water (kg/s) along a stem for a given drop in pressure (1/MPa), normalised to the length of the segment (1/m). Calculated as hydraulic conductivity divided by the transverse branch area where the measurement is taken. type: numeric - units: kg/m/s/MPa + units: kg/m/MPa/s label: Sapwood specific conductivity (Ks) allowed_values_min: 0.01 allowed_values_max: 500 seed_count: description: Number of seeds produced by a plant type: numeric - units: 'n' + units: '{count}' label: Seed count allowed_values_min: 0 allowed_values_max: 100000.0 @@ -3065,7 +3022,7 @@ traits: seed_viability: description: Proportion of mature seeds in a sample that are capable of germinating under suitable conditions. type: numeric - units: n/n + units: '{count}/{count}' label: Seed viability allowed_values_min: 0.0 allowed_values_max: 1.0 @@ -3096,7 +3053,7 @@ traits: description: Seed longevity type: numeric label: Seed longevity - units: years + units: a allowed_values_min: 0.01 allowed_values_max: 1000.0 seed_longevity_categorical: @@ -3128,14 +3085,14 @@ traits: serotiny_low: Plant displays a low level of serotiny serotiny_moderate: Plant displays a moderate level of serotiny serotiny_high: Plant displays a high level of serotiny - seedling_first_leaf: + seedling_first_node_leaf_type: description: Binary variable distinguishing between seedlings where the first leaf is scale-like (cataphyll) versus leaf-like. type: categorical label: First leaf style allowed_values_levels: scale-like: When the first leaf at germination is scale-like, also referred to as a cataphyll leaf-like: When the first leaf at germination is leaf-like - seedling_first_node: + seedling_first_node_leaf_count: description: Binary variable distinguishing between seedlings where the leaves at the first node are single versus paired. type: categorical label: Leaf count at first node @@ -3159,7 +3116,7 @@ traits: leaf_senesced_C_per_dry_mass: description: Senesced leaf carbon (C) content per unit leaf dry mass type: numeric - units: '%' + units: g/g label: Senesced leaf carbon (C) content per unit leaf dry mass allowed_values_min: 10.0 allowed_values_max: 100.0 @@ -3254,17 +3211,17 @@ traits: label: Senesced leaf zinc (Zn) content per unit leaf dry mass allowed_values_min: 0 allowed_values_max: 100.0 - snow_tolerance: + plant_tolerance_snow: description: Description of a taxon's tolerance to snow cover type: categorical label: Snow tolerance allowed_values_levels: - not_applicable: Taxa is virtually never confronted with snow in nature and the response is unknown - intolerant: Taxa is frost tender and known to be killed by any snow - days: Taxa can tolerate snow for days (typically less than 1 week) - weeks: Taxa can tolerate snow for weeks (typically less than 1 month) - months: Taxa can tolerate snow for months - soil_salinity_tolerance: + not_applicable: Taxa is virtually never confronted with snow in nature and the response is unknown. + intolerant: Taxa is frost tender and known to be killed by any snow. + days: Taxa can tolerate being covered by snow for days (typically less than 1 week). + weeks: Taxa can tolerate being covered by snow for weeks (typically less than 1 month). + months: Taxa can tolerate being covered by snow for months. + plant_tolerance_soil_salinity: description: Maximum salinity tolerated by a taxon, reported as the conductivity of the soil type: numeric units: dS/m @@ -3441,18 +3398,18 @@ traits: stem_count_categorical: description: Number of stems present, expressed in groups, where categories were 1=1; 2-3=2; 4-10=3; 11-30=4; and >30=5. Used by Peter Vesk. type: numeric - units: count + units: '{count}' label: Stem Count, categorical allowed_values_min: 0 allowed_values_max: 5 - stem_cross_section_area: + stem_cross_sectional_area: description: Cross-sectional area of the stem type: numeric units: mm2 label: Stem cross-sectional area allowed_values_min: 1.0 allowed_values_max: 1000.0 - stem_cross_section_area_no_bark: + sapwood_cross_sectional_area: description: Cross-sectional area of the stem once bark is removed type: numeric units: mm2 @@ -3469,7 +3426,7 @@ traits: stem_hydraulic_conductivity: description: Kh; Measure of how efficiently water is transported through the leaf, determined as the ratio of water flow rate through the leaf to the difference in water potential across the leaf, standardised to leaf area; units same as mg*m/s/MPa type: numeric - units: 10^6 x kg*m/s/MPa + units: 10^6.kg.m/MPa/s label: Hydraulic conductivity (Kh) allowed_values_min: 0.01 allowed_values_max: 2000.0 @@ -3487,7 +3444,7 @@ traits: label: Stem nitrogen (N) content per unit stem dry mass allowed_values_min: 0.1 allowed_values_max: 1000.0 - stem_basal_diameter: + plant_diameter_breast_height: description: Diameter at the base of the plant, usually "DBH" except in short plants; only "maximum" values are included type: numeric units: mm @@ -3504,42 +3461,42 @@ traits: leaf_stomatal_conductance_per_area_ambient: description: Rate of water loss through stomata under ambient conditions, per unit leaf area type: numeric - units: mmolH2O/m2/s + units: mmol{H2O}/m2/s label: Stomatal conductance per unit leaf area under ambient conditions allowed_values_min: 0.1 allowed_values_max: 2000 leaf_stomatal_conductance_per_area_at_Amax: description: Rate of water loss through stomata, per unit leaf area under saturated light and CO2 conditions type: numeric - units: mmolH2O/m2/s + units: mmol{H2O}/m2/s label: Stomatal conductance per unit leaf area under saturated light and CO2 conditions allowed_values_min: 0.1 allowed_values_max: 2000 leaf_stomatal_conductance_per_area_at_Asat: description: Rate of water loss through stomata, per unit leaf area under saturated light conditions type: numeric - units: mmolH2O/m2/s + units: mmol{H2O}/m2/s label: Stomatal conductance per unit leaf area under saturated light conditions allowed_values_min: 0.1 allowed_values_max: 2000 leaf_stomatal_density_abaxial: description: Stomatal density on the lower leaf surface type: numeric - units: count/mm2 + units: '{count}/mm2' label: Stomatal density on the lower leaf surface allowed_values_min: 1 allowed_values_max: 1000 leaf_stomatal_density_adaxial: description: Stomatal density on the upper leaf surface type: numeric - units: count/mm2 + units: '{count}/mm2' label: Stomatal density on the upper leaf surface allowed_values_min: 0 allowed_values_max: 1000 leaf_stomatal_density_average: description: Stomatal density averaged across both leaf surfaces type: numeric - units: count/mm2 + units: '{count}/mm2' label: Stomatal density averaged across both leaf surfaces allowed_values_min: 0 allowed_values_max: 1000 @@ -3566,7 +3523,7 @@ traits: labels: Fraction of shoot dry mass that is stems (versus leaves) allowed_values_min: 0 allowed_values_max: 1 - root_tap_root_status: + root_system_type: description: Binary variable describing whether or not a plant has a tap root type: categorical label: Tap root @@ -3581,14 +3538,14 @@ traits: label: Thickest root diameter allowed_values_min: 0.01 allowed_values_max: 1000 - twig_area: + branch_terminal_twig_cross_sectional_area: description: Cross-sectional area of the terminal twig type: numeric units: mm2 label: Terminal twig cross-sectional area allowed_values_min: 0.05 allowed_values_max: 50 - twig_length: + branch_terminal_twig_length: description: Length of the terminal twig type: numeric units: mm @@ -3633,94 +3590,94 @@ traits: stem_vessel_density: description: Count of vessels per area in stems type: numeric - units: count/mm2 + units: '{count}/mm2' label: Count of vessels per area in stems allowed_values_min: 0.4 allowed_values_max: 2000 leaf_vessel_density: description: Count of vessels per area in leaves type: numeric - units: count/mm2 + units: '{count}/mm2' label: Count of vessels per area in leaves allowed_values_min: 1 allowed_values_max: 50000 stem_vessel_lumen_fraction: description: Fraction of xylem vessels comprised of lumen type: numeric - units: dimensionless + units: um2/um2 label: Fraction of xylem vessels comprised of lumen allowed_values_min: 0.001 allowed_values_max: 1.0 stem_vessel_multiple_fraction: description: Vmf; A vessel grouping index, the number of groups of vessels (vessels in direct contact with one another) divided by the total number of vessels (Scholz et al. 2013). A Vmf value approximating 1 denotes a tendency towards solitary vessels. type: numeric - units: dimensionless + units: '{count}/{count}' label: Index for the tendency of vessels to occur in clusters (smaller value) versus occur as solitary vessels (1) allowed_values_min: 0.001 allowed_values_max: 1.0 stem_vessel_non_lumen_fraction: description: Fraction of xylem vessels comprised of non-lumen type: numeric - units: dimensionless + units: um2/um2 label: Fraction of xylem vessels comprised of non-lumen allowed_values_min: 0.001 allowed_values_max: 1.0 stem_vessel_wall_fraction: description: Fraction of xylem vessels comprised of cell wall type: numeric - units: dimensionless + units: um2/um2 label: Fraction of xylem vessels comprised of cell wall allowed_values_min: 0.001 allowed_values_max: 1.0 stem_xylem_vulnerability_index: description: The ratio of vessel diameter to vessel density, as an index of sap conductance and susceptibility to vessel cavitation type: numeric - units: dimensionless + units: '{dimensionless}' label: Ratio of vessel diameter to vessel density allowed_values_min: 0.05 allowed_values_max: 1000.0 - water_logging_tolerance: + plant_tolerance_water_logged_soils: description: Ability of taxon to tolerate water-logged soils type: categorical label: Water-logging tolerance allowed_values_levels: not_applicable: Taxa is not typically confronted with waterlogging and its response is unknown - '<1_month': Taxa able to tolerate less than 1 month of waterlogging + 'less_than_1_month': Taxa able to tolerate less than 1 month of waterlogging '1-6_months': Taxa able to tolerate 1-6 months of waterlogging - '>6_months': Taxa able to tolerate more than 6 months of waterlogging + 'greater_than_6_months': Taxa able to tolerate more than 6 months of waterlogging aquatic: Taxa truly aquatic and able to be permanantly inundated wood_axial_parenchyma_fraction: description: Fraction of wood comprised of axial parenchyma type: numeric - units: dimensionless + units: um2/um2 label: Fraction of wood comprised of axial parenchyma allowed_values_min: 0.001 allowed_values_max: 1.0 wood_conduit_fraction: description: Fraction of wood comprised of all conduits type: numeric - units: dimensionless + units: um2/um2 label: Fraction of wood comprised of all conduits allowed_values_min: 0.01 allowed_values_max: 1.0 wood_fibre_fraction: description: Fraction of wood comprised of fibres type: numeric - units: dimensionless + units: um2/um2 label: Fraction of wood comprised of fibres allowed_values_min: 0.01 allowed_values_max: 1.0 - wood_ray_fraction: + wood_ray_parenchyma_fraction: description: Fraction of wood comprised of rays type: numeric - units: dimensionless + units: um2/um2 label: Fraction of wood comprised of rays allowed_values_min: 0.01 allowed_values_max: 1.0 wood_tracheid_fraction: description: Fraction of wood comprised of tracheids type: numeric - units: dimensionless + units: um2/um2 label: Fraction of wood comprised of tracheids allowed_values_min: 0.0 allowed_values_max: 1.0 @@ -3728,7 +3685,7 @@ traits: description: Angle between a leaf's secondary vein and its primary vein (midrib). notes: For a palmate leaf, the main veins radiating from the base are generally referred to as primary veins, with secondary veins branching off each primary vein. type: numeric - units: degrees + units: deg label: Angle of secondary veins allowed_values_min: 0 allowed_values_max: 180 @@ -3736,7 +3693,7 @@ traits: description: A measure of vein density, which is the number of veins intersecting the perimeter of a square divided by the perimeter of the square. notes: .na type: numeric - units: count/mm + units: '{count}/mm' label: Leaf vein frequency allowed_values_min: 0.01 allowed_values_max: 20 @@ -3759,7 +3716,7 @@ traits: leaf_water_band_index: description: Water band index, the ratio of the reflectance at 970 nm / 900 nm, recorded from the spectro-radiometer. type: numeric - units: dimensionless + units: '{dimensionless}' label: Water band index allowed_values_min: 1 allowed_values_max: 1.1 @@ -3808,35 +3765,35 @@ traits: leaf_water_use_efficiency_integrated: description: WUE; Rate of carbon dioxide uptake relative to water loss, per unit leaf area. This measures how much biomass is produced relative to transpiration, and is therefore an integrated measure of water use efficiency. (Calculated as biomass production / transpiration) type: numeric - units: g H2O/g biomass + units: g{H2O}/g{biomass} label: Integrated water use efficiency allowed_values_min: 0.1 allowed_values_max: 200.0 leaf_water_use_efficiency_intrinsic: description: PWUE calculated as Aarea/gs; Ratio of photosynthesis (CO2 assimilation rate) to stomatal conductance (gs). This is intrinsic water use efficiency. type: numeric - units: umolCO2/mmolH2O + units: umol{CO2}/mmol{H2O} label: Leaf photosynthesis rate per unit stomatal conductance (photosynthetic water use efficiency, PWUE, or intrinsic WUE) allowed_values_min: 0.001 allowed_values_max: 2.0 leaf_water_use_efficiency_photosynthetic: description: PWUE calculated as Aarea/E; Ratio of photosynthesis (CO2 assimilation rate) to leaf transpiration (E; water loss). This is also termed instantaneous water use efficiency. type: numeric - units: umolCO2/mmolH2O + units: umol{CO2}/mmol{H2O} label: Leaf photosynthesis rate per unit leaf transpiration (photosynthetic water use efficiency, PWUE, or instantaneous WUE) allowed_values_min: 0.1 allowed_values_max: 200.0 wood_delta13C: description: Wood carbon stable isotope signature type: numeric - units: per mille + units: '{delta}[ppth]' label: Wood carbon (C) isotope signature (delta 13C) allowed_values_min: -50.0 allowed_values_max: 0.0 wood_delta15N: description: Wood nitrogen stable isotope signature type: numeric - units: per mille + units: '{delta}[ppth]' label: Wood nitrogen (N) isotope signature (delta 15N) allowed_values_min: -25.0 allowed_values_max: 75.0 diff --git a/config/unit_conversions.csv b/config/unit_conversions.csv index 0d59f9c1a..f49a88177 100644 --- a/config/unit_conversions.csv +++ b/config/unit_conversions.csv @@ -3,10 +3,11 @@ unit_from,unit_to,function %,g/g,x*0.01 %,mg/mg,x*0.01 %,mg/kg,x*10000 -%,n/n,x*0.01 -%,dimensionless,x*.01 -years,month,x*12 -count/m2,count/mm2,x*1/1000000 +%,{dimensionless},x*.01 +%,{count}/{count},x*.01 +{dimensionless},{count}/{count},x*1 +a,mo,x*12 +{count}/m2,{count}/mm2,x*1/1000000 cm,m,x*0.01 cm,mm,x*10 um,mm,x*0.001 @@ -17,6 +18,9 @@ m2,mm2,x*1000000 mm,m,x*0.001 g,mg,x*1000 um/2,um,x*2 +mm2/mm2,um2/um2,x*1 +%,um2/um2,x*.01 +{dimensionless},um2/um2,x*1 mg/mg,mg/g,x*1000 g/g,mg/mg,x*1 mg/mg,g/g,x*1 @@ -38,7 +42,7 @@ m/g,cm/mg,x*0.1 cm/mg,m/g,x*10 cm/g,m/g,x*1/100 mm/g,m/g,x*1/1000 -mg_shoot/mg_root,mg_root/mg_shoot,1/x +mg{shoot}/mg{root},mg{root}/mg{shoot},1/x kg/m2,mm2/mg,1/x g/m2,mm2/mg,1/x*1000 mg/cm2,mm2/mg,1/x*100 @@ -63,9 +67,9 @@ mg/m2,g/m2,x*0.001 g/cm2,g/m2,x*10000 g/dm2,g/m2,x*100 mg/mm2,g/m2,x*1000 -molH2O/m2,g/m2,x*18 -mmolN/m2,g/m2,x*14.0067/1000 -mmolP/m2,g/m2,x*30.973761/1000 +mol{H2O}/m2,g/m2,x*18 +mmol{N}/m2,g/m2,x*14.0067/1000 +mmol{P}/m2,g/m2,x*30.973761/1000 kg/m3,mg/mm3,x*0.001 g/cm3,mg/mm3,x*1 ug/mm3,mg/mm3,x*1/1000 @@ -78,44 +82,44 @@ mmol/g,mmol/kg,x*1/1000 mol/kg,umol/g,x*1000 nmol/g/s,umol/g/s,x*0.001 mol/m2/s,mmol/m2/s,x*1000 -mmol/m2/s/MPa,mmol/m2/s/MPa,x*1 -kg/m2/s/Mpa,mmol/m2/s/MPa,x*18015200 -umolCO2/molH2O/m2/s,mmolCO2/molH2O/m2/s,x*1/1000 -ppm,umolCO2/mol,x*1 -umolCO2/kg/s,umolCO2/g/s,x*0.001 -mmolCO2/g/s,umolCO2/g/s,x*1000 -nmolCO2/g/s,umolCO2/g/s,x*0.001 -neg_umolCO2/g/s,umolCO2/g/s,x*-1 -mmolCO2/m2/s,umolCO2/m2/s,x*1000 -mmolCO2/m2/s,umolCO2/m2/s,x*1000 -nmolCO2/m2/s,umolCO2/m2/s,x*1/1000 -neg_umolCO2/m2/s,umolCO2/m2/s,x*-1 -molCO2/m2/d,umolCO2/m2/s,x*11.57407 -umolCO2/umolH2O,umolCO2/mmolH2O,x*1/1000 -mmolCO2/molH2O,umolCO2/mmolH2O,x*1 -umolCO2/molH2O,umolCO2/mmolH2O,x*1/1000 -umolCO2/nmolH2O,umolCO2/umolH2O,x*1/1000 -umolCO2/mmolH2O,umolCO2/umolH2O,x*1/1000 -umolCO2/umolH2O,umolCO2/nmolH2O,x*1000 -umolCO2/gN/s,umolCO2/molN/s,x*14.0067 -umolCO2/gP/s,umolCO2/molP/s,x*30.973761 -mmolCO2/molP/s,umolCO2/molP/s,x*1000 -umolH2O/m2/s,mmolH2O/m2/s,x*0.001 -molH2O/m2/s,mmolH2O/m2/s,x*1000 -molH2O/m2/d,mmolH2O/m2/s,x*0.011574 -molH2O/m2/s,mmolH2O/m2/s,x*1000 -molH2O/m2/s,umolH2O/m2/s,x*1000000 -mmol/m2/s,umolH2O/m2/s,x*1000 -mmolH2O/m2/s,umolH2O/m2/s,x*1000 -nmolH2O/m2/s,umolH2O/m2/s,x*1/1000 -cm2_leaf/cm2_sapwood,mm2_sapwood/mm2_leaf,1/x -mm2_leaf/mm2_sapwood,mm2_sapwood/mm2_leaf,1/x -cm2_leaf/mm2_sapwood,mm2_sapwood/mm2_leaf,x*1/100 -cm2_sapwood/m2_leaf,mm2_sapwood/mm2_leaf,x*1/10000 -10^4 x mm2_sapwood/mm2_leaf,mm2_sapwood/mm2_leaf,x*1/10000 +mmol/m2/MPa/s,mmol/m2/MPa/s,x*1 +kg/m2/MPa/s,mmol/m2/MPa/s,x*18015200 +umol{CO2}/mol{H2O}/m2/s,mmol{CO2}/mol{H2O}/m2/s,x*1/1000 +ppm,umol{CO2}/mol,x*1 +ppm,umol/mol,x*1 +umol{CO2}/kg/s,umol{CO2}/g/s,x*0.001 +mmol{CO2}/g/s,umol{CO2}/g/s,x*1000 +nmol{CO2}/g/s,umol{CO2}/g/s,x*0.001 +neg_umol{CO2}/g/s,umol{CO2}/g/s,x*-1 +mmol{CO2}/m2/s,umol{CO2}/m2/s,x*1000 +mmol{CO2}/m2/s,umol{CO2}/m2/s,x*1000 +nmol{CO2}/m2/s,umol{CO2}/m2/s,x*1/1000 +neg_umol{CO2}/m2/s,umol{CO2}/m2/s,x*-1 +mol{CO2}/m2/d,umol{CO2}/m2/s,x*11.57407 +umol{CO2}/umol{H2O},umol{CO2}/mmol{H2O},x*1/1000 +mmol{CO2}/mol{H2O},umol{CO2}/mmol{H2O},x*1 +umol{CO2}/mol{H2O},umol{CO2}/mmol{H2O},x*1/1000 +umol{CO2}/nmol{H2O},umol{CO2}/umol{H2O},x*1/1000 +umol{CO2}/mmol{H2O},umol{CO2}/umol{H2O},x*1/1000 +umol{CO2}/umol{H2O},umol{CO2}/nmol{H2O},x*1000 +umol{CO2}/g{N}/s,umol{CO2}/mol{N}/s,x*14.0067 +umol{CO2}/g{P}/s,umol{CO2}/mol{P}/s,x*30.973761 +mmol{CO2}/mol{P}/s,umol{CO2}/mol{P}/s,x*1000 +umol{H2O}/m2/s,mmol{H2O}/m2/s,x*0.001 +mol{H2O}/m2/s,mmol{H2O}/m2/s,x*1000 +mol{H2O}/m2/d,mmol{H2O}/m2/s,x*0.011574 +mol{H2O}/m2/s,mmol{H2O}/m2/s,x*1000 +mol{H2O}/m2/s,umol{H2O}/m2/s,x*1000000 +mmol/m2/s,umol{H2O}/m2/s,x*1000 +mmol{H2O}/m2/s,umol{H2O}/m2/s,x*1000 +nmol{H2O}/m2/s,umol{H2O}/m2/s,x*1/1000 +cm2{leaf}/cm2{sapwood},mm2{sapwood}/mm2{leaf},1/x +mm2{leaf}/mm2{sapwood},mm2{sapwood}/mm2{leaf},1/x +cm2{leaf}/mm2{sapwood},mm2{sapwood}/mm2{leaf},x*1/100 +cm2{sapwood}/m2{leaf},mm2{sapwood}/mm2{leaf},x*1/10000 +10^4.mm2{sapwood}/mm2{leaf},mm2{sapwood}/mm2{leaf},x*1/10000 MPa,Pa,x*1000 neg_MPa,MPa,x*-1 -MPa,neg_MPa,x*-1 MN/m2,MPa,x*1 N/m2,MPa,x*1/1000 mJ/m,N,x*1/1000 @@ -124,22 +128,22 @@ kJ/m2,N/m,x*1000 J/m2,N/m,x*1 100xJ/m2,N/m,x*100 kN/m,N/m,x*1000 -10^1*kN/m,N/m,x*100 -10^1*MN/m2,N/m2,x*100000 +10^1.kN/m,N/m,x*100 +10^1.MN/m2,N/m2,x*100000 MJ/m2/m,N/m2,x*1000000 MN/m2,N/m2,x*1000000 -mg/m/s/MPa,10^4 x kg/m/s/MPa,x*1/100 -kg/m/s/MPa,10^4 x kg/m/s/MPa,x*10000 -10^4 x ml*cm/s/MPa/cm2,10^4 x kg/m/s/MPa,x*0.1 -10^3 x kg/m/s/MPa,10^4 x kg/m/s/MPa,x*10 -ml*cm/s/MPa/cm2,10^4 x kg/m/s/MPa,x*100 -kg/m/s/pa ,kg/m/s/MPa,x*1/1000 -10^6 x kg/m/s/MPa,kg/m/s/MPa,x*1/1000000 -10^4 x kg/m/s/MPa,kg/m/s/MPa,x*1/10000 -10^1 x kg/m/s/MPa,kg/m/s/MPa,x*0.1 -ml*cm/s/MPa/cm2,kg/m/s/MPa,x*0.1 -ml*cm/s/MPa,10^6 x kg*m/s/MPa,x*100 -mg*cm/s/MPa,10^6 x kg*m/s/MPa,x*1/100 -kg*m/s/MPa,10^6 x kg*m/s/MPa,x*1000000 -10^4 x kg*m/s/MPa,10^6 x kg*m/s/MPa,x*100 -10^7 x kg*m/s/MPa,10^6 x kg*m/s/MPa,x*1/10 +mg/m/MPa/s,10^4.kg/m/MPa/s,x*1/100 +kg/m/MPa/s,10^4.kg/m/MPa/s,x*10000 +10^4.ml/cm/MPa/s,10^4.kg/m/MPa/s,x*0.1 +10^3.kg/m/MPa/s,10^4.kg/m/MPa/s,x*10 +ml/cm/MPa/s,10^4.kg/m/MPa/s,x*100 +kg/m/Pa/s,kg/m/MPa/s,x*1/1000 +10^6.kg/m/MPa/s,kg/m/MPa/s,x*1/1000000 +10^4.kg/m/MPa/s,kg/m/MPa/s,x*1/10000 +10^1.kg/m/MPa/s,kg/m/MPa/s,x*0.1 +ml/cm/MPa/s,kg/m/MPa/s,x*0.1 +ml.cm/MPa/s,10^6.kg.m/MPa/s,x*100 +mg.cm/MPa/s,10^6.kg.m/MPa/s,x*1/100 +kg.m/MPa/s,10^6.kg.m/MPa/s,x*1000000 +10^4.kg.m/MPa/s,10^6.kg.m/MPa/s,x*100 +10^7.kg.m/MPa/s,10^6.kg.m/MPa/s,x*1/10 diff --git a/data/ABRS_1981/metadata.yml b/data/ABRS_1981/metadata.yml index b1009afbf..78d82c2b7 100644 --- a/data/ABRS_1981/metadata.yml +++ b/data/ABRS_1981/metadata.yml @@ -517,5 +517,8 @@ taxonomic_updates: reason: match_14. Automatic alignment with species-level canonical name in APC accepted when notes are ignored (2022-11-12) taxonomic_resolution: Species -exclude_observations: .na +exclude_observations: +- variable: taxon_name + find: Platanus x hispanica 'Acerifolia' + reason: excluding cultivars questions: .na diff --git a/data/ABRS_2022/data.csv b/data/ABRS_2022/data.csv index 2b02a6847..8f7d43e54 100644 --- a/data/ABRS_2022/data.csv +++ b/data/ABRS_2022/data.csv @@ -1726,7 +1726,7 @@ Alyxia,Alyxia tetanifolia," erect, rigid shrub to 2 m high. ",perennial,inferred Alyxia,Alyxia gynopogon," shrub to 3 m high, rarely climbing. ",perennial,inferred_from_genus,,,shrub,shrub,,,,,climbing,climbing,woody, Alyxia,Alyxia ruscifolia," erect, rigid shrub to 5 m high. ",perennial,inferred_from_genus,,,shrub,shrub,,,,,erect,erect,woody, Alyxia,Alyxia sharpei," erect, rigid shrub to 3 m high. ",perennial,inferred_from_genus,,,shrub,shrub,,,,,erect,erect,woody, -Alyxia,Alyxia spicata, scandent subshrub or woody liane. ,perennial,inferred_from_genus,,,subshrub climber_woody,subshrub liane,,,,,climbing,scandent,, +Alyxia,Alyxia spicata, scandent subshrub or woody liane. ,perennial,inferred_from_genus,,,subshrub climber_woody,subshrub liane,,,,,climbing,scandent,woody, Alyxia,Alyxia ilicifolia subsp. ilicifolia, ,perennial,inferred_from_genus,,,shrub,inferred_from_species,,,,,,,woody, Alyxia,Alyxia ilicifolia subsp. magnifolia, ,perennial,inferred_from_genus,,,shrub,inferred_from_species,,,,,,,woody, Alyxia,Alyxia ruscifolia subsp. major, ,perennial,inferred_from_genus,,,shrub,inferred_from_species,,,,,,,woody, @@ -2063,10 +2063,10 @@ Aquilegia,Aquilegia vulgaris," Plants 40-100 cm high, ",perennial,inferred_from_ Arabidella,Arabidella," annual herbs or perennial shrubs, glabrous, ",annual perennial,annual perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, Arabidella,Arabidella eremigena," herb to 35 cm tall, many-stemmed, prostrate to erect. ",,,,,herb,herb,,,,,erect prostrate,erect prostrate,herbaceous, Arabidella,Arabidella filifolia," straggling shrub to 1 m tall, glaucous; ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, -Arabidella,Arabidella glaucescens," woody undershrub to 1 m tall, erect; ",,,,,subshrub,undershrub,,,,,erect,erect,, +Arabidella,Arabidella glaucescens," woody undershrub to 1 m tall, erect; ",,,,,subshrub,undershrub,,,,,erect,erect,woody, Arabidella,Arabidella nasturtium," herb, many-stemmed, to 50 cm tall; ",,,,,herb,herb,,,,,,,herbaceous, Arabidella,Arabidella procumbens," herb, many-stemmed, usually prostrate, glabrous; ",,,,,herb,herb,,,,,prostrate,prostrate,herbaceous, -Arabidella,Arabidella trisecta," woody undershrub to 60 cm tall, erect; ",,,,,subshrub,undershrub,,,,,erect,erect,, +Arabidella,Arabidella trisecta," woody undershrub to 60 cm tall, erect; ",,,,,subshrub,undershrub,,,,,erect,erect,woody, Arabidopsis,Arabidopsis, annual herbs. ,annual,annual,,,herb,herbs,,,,,,,herbaceous, Arabidopsis,Arabidopsis thaliana," slender herb to 70 cm tall, simple or branched, ",annual,inferred_from_genus,,,herb,herb,,,,,,,herbaceous, Araceae,Araceae," massive to slender climbers or hemiepiphytes, arborescent to geophytic and rhizomatous to cormous, terrestrial, lithophytic or aquatic herbs. ",,,,,herb geophyte climber,herbs geophytic climbers,hemiepiphyte lithophyte aquatic terrestrial,hemiepiphytes lithophytic aquatic terrestrial,,,rhizomatous arborescent,rhizomatous arborescent,herbaceous, @@ -2369,11 +2369,11 @@ Asterolasia,Asterolasia phebalioides," open to compact shrub to 50 cm high, dens Asterolasia,Asterolasia rivularis, erect shrub to 1.5 m high. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Asterolasia,Asterolasia rupestris, erect shrub to 1.5 m high. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Asterolasia,Asterolasia trymalioides, prostrate to erect shrub to 1 m high. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect prostrate,erect prostrate,woody, -Asterolasia,Asterolasia pallida," woody perennial to 1 m high, sometimes rhizomatous. ",perennial,perennial,,,subshrub,inferred_from_genus,,,,,rhizomatous,rhizomatous,, +Asterolasia,Asterolasia pallida," woody perennial to 1 m high, sometimes rhizomatous. ",perennial,perennial,,,subshrub,inferred_from_genus,,,,,rhizomatous,rhizomatous,woody, Asterolasia,Asterolasia rupestris subsp. recurva, ,,,,,subshrub,inferred_from_genus,,,,,,,, -Asterolasia,Asterolasia squamuligera, slender woody perennial to 50 cm high. ,perennial,perennial,,,subshrub,inferred_from_genus,,,,,,,, +Asterolasia,Asterolasia squamuligera, slender woody perennial to 50 cm high. ,perennial,perennial,,,subshrub,inferred_from_genus,,,,,,,woody, Asterolasia,Asterolasia asteriscophora subsp. asteriscophora, ,,,,,subshrub,inferred_from_genus,,,,,,,, -Asterolasia,Asterolasia drummondii, woody perennial to 50 cm high. ,perennial,perennial,,,subshrub,inferred_from_genus,,,,,,,, +Asterolasia,Asterolasia drummondii, woody perennial to 50 cm high. ,perennial,perennial,,,subshrub,inferred_from_genus,,,,,,,woody, Asterolasia,Asterolasia rupestris subsp. rupestris, ,,,,,subshrub,inferred_from_genus,,,,,,,, Asterolasia,Asterolasia asteriscophora subsp. albiflora, ,,,,,subshrub,inferred_from_genus,,,,,,,, Asterolasia,Asterolasia pallida subsp. hyalina, ,perennial,inferred_from_species,,,subshrub,inferred_from_genus,,,,,,,, @@ -3044,24 +3044,24 @@ Bolbitis,Bolbitis quoyana, ,,,,,fern,inferred_from_genus,,,,,,,herbaceous,infer Bolbitis,Bolbitis taylorii, ,,,,,fern,inferred_from_genus,,,,,,,herbaceous,inferred_from_growth_form Boraginaceae,Boraginaceae," annual to perennial herbs, rarely shrubs or trees; tap-rooted or rhizomatous; ",annual perennial,annual perennial,,,herb shrub tree,herbs shrubs trees,,,,,rhizomatous,rhizomatous,woody herbaceous, Boronia,Boronia," perennial herbs or shrubs, rarely small trees (muelleri), ",perennial,perennial,,,herb shrub tree,herbs shrubs trees,,,,,,,woody herbaceous, -Boronia,Boronia anceps, erect glabrous perennial to 60 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Boronia,Boronia barkeriana," erect, woody perennial to 1 m high, glabrous apart from flowers. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Boronia,Boronia busselliana," slender erect, glabrous, perennial to 40 cm high. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Boronia,Boronia coerulescens," erect, woody perennial to 0.5 m high. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Boronia,Boronia defoliata," woody perennial to 0.6 m high, glabrous except on flowers. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Boronia,Boronia dichotoma, erect perennial to 70 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Boronia,Boronia exilis," erect, slender-stemmed perennial circa 1 m high. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Boronia,Boronia fastigiata, erect glabrous perennial to 40 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Boronia,Boronia humifusa, low growing wiry perennial. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Boronia,Boronia juncea, erect perennial 20-80 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Boronia,Boronia penicillata," branched woody perennial to 30 cm high, ",perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Boronia,Boronia ramosa," slender woody perennial to 30 cm high, glabrous or puberulous. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Boronia,Boronia spathulata, erect glabrous perennial to 1 m high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Boronia,Boronia subsessilis," woody perennial to 0.3 m high, glabrous except stamens. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Boronia,Boronia tenuior, erect glabrous perennial to 1 m high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Boronia,Boronia tenuis," woody perennial to 0.6 m high, glabrous except stamens. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Boronia,Boronia tetragona, erect glabrous perennial to 70 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Boronia,Boronia parviflora," weakly ascending herb or subshrub to 50 cm high, glabrous apart from flowers. ",perennial,inferred_from_genus,,,herb subshrub,herb subshrub,,,,,decumbent,ascending,herbaceous, +Boronia,Boronia anceps, erect glabrous perennial to 60 cm high. ,perennial,perennial,,,,inferred_from_life_history,,,,,erect,erect,, +Boronia,Boronia barkeriana," erect, woody perennial to 1 m high, glabrous apart from flowers. ",perennial,perennial,,,,inferred_from_life_history,,,,,erect,erect,woody, +Boronia,Boronia busselliana," slender erect, glabrous, perennial to 40 cm high. ",perennial,perennial,,,,inferred_from_life_history,,,,,erect,erect,, +Boronia,Boronia coerulescens," erect, woody perennial to 0.5 m high. ",perennial,perennial,,,,inferred_from_life_history,,,,,erect,erect,woody, +Boronia,Boronia defoliata," woody perennial to 0.6 m high, glabrous except on flowers. ",perennial,perennial,,,,inferred_from_life_history,,,,,,,woody, +Boronia,Boronia dichotoma, erect perennial to 70 cm high. ,perennial,perennial,,,,inferred_from_life_history,,,,,erect,erect,, +Boronia,Boronia exilis," erect, slender-stemmed perennial circa 1 m high. ",perennial,perennial,,,,inferred_from_life_history,,,,,erect,erect,, +Boronia,Boronia fastigiata, erect glabrous perennial to 40 cm high. ,perennial,perennial,,,,inferred_from_life_history,,,,,erect,erect,, +Boronia,Boronia humifusa, low growing wiry perennial. ,perennial,perennial,,,,inferred_from_life_history,,,,,,,, +Boronia,Boronia juncea, erect perennial 20-80 cm high. ,perennial,perennial,,,,inferred_from_life_history,,,,,erect,erect,, +Boronia,Boronia penicillata," branched woody perennial to 30 cm high, ",perennial,perennial,,,,inferred_from_life_history,,,,,,,woody, +Boronia,Boronia ramosa," slender woody perennial to 30 cm high, glabrous or puberulous. ",perennial,perennial,,,,inferred_from_life_history,,,,,,,woody, +Boronia,Boronia spathulata, erect glabrous perennial to 1 m high. ,perennial,perennial,,,,inferred_from_life_history,,,,,erect,erect,, +Boronia,Boronia subsessilis," woody perennial to 0.3 m high, glabrous except stamens. ",perennial,perennial,,,,inferred_from_life_history,,,,,,,woody, +Boronia,Boronia tenuior, erect glabrous perennial to 1 m high. ,perennial,perennial,,,,inferred_from_life_history,,,,,erect,erect,, +Boronia,Boronia tenuis," woody perennial to 0.6 m high, glabrous except stamens. ",perennial,perennial,,,,inferred_from_life_history,,,,,,,woody, +Boronia,Boronia tetragona, erect glabrous perennial to 70 cm high. ,perennial,perennial,,,,inferred_from_life_history,,,,,erect,erect,, +Boronia,Boronia parviflora," weakly ascending herb or subshrub to 50 cm high, glabrous apart from flowers. ",perennial,inferred_from_genus,,,herb subshrub,herb subshrub,,,,,decumbent,ascending,, Boronia,Boronia inflexa subsp. grandiflora, shrub to 1.5 m high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Boronia,Boronia anemonifolia subsp. wadbilligensis, shrub to 2 m high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Boronia,Boronia amabilis, erect shrub to 2 m high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,erect,erect,woody, @@ -3120,7 +3120,7 @@ Boronia,Boronia kalumburuensis, erect shrub to 50 cm high. ,perennial,inferred_f Boronia,Boronia excelsa, erect shrub to 3 m high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,erect,erect,woody, Boronia,Boronia adamsiana," erect shrub to 1 m high, ",perennial,inferred_from_genus,,,shrub,shrub,,,,,erect,erect,woody, Boronia,Boronia thujona," erect, woody shrub or small tree to 4 m high, glabrous apart from flowers. ",perennial,inferred_from_genus,,,shrub tree,shrub tree,,,,,erect,erect,woody, -Boronia,Boronia elisabethiae, semi-erect to weakly spreading woody subshrub to 50 cm long. ,perennial,inferred_from_genus,,,subshrub,subshrub,,,,,erect spreading,erect spreading,, +Boronia,Boronia elisabethiae, semi-erect to weakly spreading woody subshrub to 50 cm long. ,perennial,inferred_from_genus,,,subshrub,subshrub,,,,,erect spreading,erect spreading,woody, Boronia,Boronia albiflora, shrub to 50 cm high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Boronia,Boronia pulchella, slender virgate shrub to 1 m high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Boronia,Boronia corynophylla, spreading shrub to 30 cm high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,spreading,spreading,woody, @@ -3190,7 +3190,7 @@ Boronia,Boronia minutipinna, erect shrub to 50 cm high. ,perennial,inferred_from Boronia,Boronia nana," weakly erect or spreading, glabrous to pubescent subshrub to 1 m long. ",perennial,inferred_from_genus,,,subshrub,subshrub,,,,,erect spreading,erect spreading,, Boronia,Boronia warrumbunglensis, shrub to 1 m high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Boronia,Boronia westringioides, erect shrub to 75 cm high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,erect,erect,woody, -Boronia,Boronia filifolia," erect or weakwoody shrub to 1 m high, glabrous apart from flowers. ",perennial,inferred_from_genus,,,shrub,shrub,,,,,erect,erect,soft_wood woody,weakwoody +Boronia,Boronia filifolia," erect or weakwoody shrub to 1 m high, glabrous apart from flowers. ",perennial,inferred_from_genus,,,shrub,shrub,,,,,erect,erect,soft_wood,weakwoody Boronia,Boronia virgata, virgate shrub to 1 m high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Boronia,Boronia granitica, shrub to 1.5 m high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Boronia,Boronia squamipetala, erect shrub to 1 m high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,erect,erect,woody, @@ -3248,9 +3248,9 @@ Boronia,Boronia oxyantha var. oxyantha, ,perennial,inferred_from_genus,,,shrub, Boronia,Boronia oxyantha var. brevicalyx, ,perennial,inferred_from_genus,,,shrub,inferred_from_species,,,,,,,woody, Boronia,Boronia purdieana subsp. purdieana, ,perennial,inferred_from_genus,,,shrub,inferred_from_species,,,,,,,woody, Boronia,Boronia purdieana subsp. calcicola, ,perennial,inferred_from_genus,,,shrub,inferred_from_species,,,,,,,woody, -Boronia,Boronia ramosa subsp. lesueurana, ,perennial,inferred_from_genus,,,herb,inferred_from_species,,,,,,,herbaceous, -Boronia,Boronia ramosa subsp. anethifolia, ,perennial,inferred_from_genus,,,herb,inferred_from_species,,,,,,,herbaceous, -Boronia,Boronia ramosa subsp. ramosa, ,perennial,inferred_from_genus,,,herb,inferred_from_species,,,,,,,herbaceous, +Boronia,Boronia ramosa subsp. lesueurana, ,perennial,inferred_from_genus,,,,inferred_from_species,,,,,,,woody, +Boronia,Boronia ramosa subsp. anethifolia, ,perennial,inferred_from_genus,,,,inferred_from_species,,,,,,,woody, +Boronia,Boronia ramosa subsp. ramosa, ,perennial,inferred_from_genus,,,,inferred_from_species,,,,,,,woody, Boronia,Boronia scabra subsp. scabra, ,perennial,inferred_from_genus,,,shrub,inferred_from_species,,,,,,,woody, Boronia,Boronia scabra subsp. condensata, ,perennial,inferred_from_genus,,,shrub,inferred_from_species,,,,,,,woody, Boronia,Boronia scabra subsp. attenuata, ,perennial,inferred_from_genus,,,shrub,inferred_from_species,,,,,,,woody, @@ -5793,8 +5793,8 @@ Dictymia,Dictymia brownii, ,,,,,fern,inferred_from_genus,,,,,,,herbaceous,infer Dictyoneura,Dictyoneura," small trees, monoecious. ",perennial,inferred_from_growth_form,,,tree,trees,,,monoecious,monoecious,,,woody, Dictyoneura,Dictyoneura obtusa, tree to 3 m high. ,perennial,inferred_from_growth_form,,,tree,tree,,,monoecious,inferred_from_genus,,,woody, Didiereaceae,Didiereaceae," shrubs to small trees, sometimes scandent , sometimes ca in appearance ; dioecious , monoecious, or hermaphroditic; ",perennial,inferred_from_growth_form,,,shrub tree,shrubs trees,,,dioecious monoecious,dioecious monoecious,climbing,scandent,woody, -Didymanthus,Didymanthus roei, small woody perennial circa 30 cm high. ,perennial,perennial,,,herb,inferred_from_genus_life_history,,,,,,,herbaceous, -Didymanthus,Didymanthus, woody perennial. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Didymanthus,Didymanthus roei, small woody perennial circa 30 cm high. ,perennial,perennial,,,herb,inferred_from_genus_life_history,,,,,,,woody, +Didymanthus,Didymanthus, woody perennial. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,woody, Didymoplexis,Didymoplexis," leafless terrestrial orchids with a fleshy root system consisting of slender, interconnected, elongated rhizomes with roots arising from apex; ",perennial,inferred_from_family,,,herb,orchids,terrestrial,terrestrial,,,rhizomatous,rhizomes,herbaceous, Didymoplexis,Didymoplexis micradenia, ,perennial,inferred_from_family,,,herb,inferred_from_genus,terrestrial,inferred_from_genus,,,,,herbaceous, Didymoplexis,Didymoplexis pallens, ,perennial,inferred_from_family,,,herb,inferred_from_genus,terrestrial,inferred_from_genus,,,,,herbaceous, @@ -5817,10 +5817,10 @@ Dimeria,Dimeria ornithopoda, annual with culms 5-40 cm high; ,annual,annual,,,he Dimeria,Dimeria acinaciformis, annual with culms 10-40 cm high; ,annual,annual,,,herb graminoid,inferred_from_genus_life_history,,,,,,,herbaceous, Dimeria,Dimeria, compactly or loosely tufted annuals or perennials. ,annual perennial,annuals perennials,,,herb graminoid,inferred_from_life_history,,,,,,,herbaceous, Dimocarpus,Dimocarpus, shrubs or trees. mostly monoecious. ,perennial,inferred_from_growth_form,,,shrub tree,shrubs trees,,,monoecious,monoecious,,,woody, -Dimocarpus,Dimocarpus longan, tree to 10 (-40) m high. ,perennial,inferred_from_growth_form,,,tree,tree,,,monoecious,inferred_from_genus,,,woody, -Dimocarpus,Dimocarpus australianus, tree to 20 m high. ,perennial,inferred_from_growth_form,,,tree,tree,,,monoecious,inferred_from_genus,,,woody, +Dimocarpus,Dimocarpus longan, tree to 10 (-40) m high. ,perennial,inferred_from_growth_form,,,tree,tree,,,,inferred_from_genus,,,woody, +Dimocarpus,Dimocarpus australianus, tree to 20 m high. ,perennial,inferred_from_growth_form,,,tree,tree,,,,inferred_from_genus,,,woody, Dimorphotheca,Dimorphotheca, annual or perennial herbs or shrubs. ,annual perennial,annual perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, -Dimorphotheca,Dimorphotheca ecklonis," perennial upright subshrub, 20-100 (-125) cm high, corymbosely branched. basally woody; ",perennial,perennial,,,subshrub,subshrub,,,,,,,, +Dimorphotheca,Dimorphotheca ecklonis," perennial upright subshrub, 20-100 (-125) cm high, corymbosely branched. basally woody; ",perennial,perennial,,,subshrub,subshrub,,,,,,,woody_base, Dimorphotheca,Dimorphotheca fruticosa," perennial subshrub, straggling, mat-forming, 25-45 (-60) cm high. basally woody. ",perennial,perennial,,,subshrub,subshrub,,,,,mat-forming,matforming,, Dimorphotheca,Dimorphotheca jucunda," perennial subshrub, 20-50 cm high. ",perennial,perennial,,,subshrub,subshrub,,,,,,,, Dimorphotheca,Dimorphotheca pluvialis," annual herb, to 40 cm high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, @@ -7116,9 +7116,9 @@ Eucalyptus,Eucalyptus glomerosa, mallee to 5 m tall. forming a lignotuber. ,pere Eucalyptus,Eucalyptus gomphocephala, tree to 40 m. ,perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, Eucalyptus,Eucalyptus gongylocarpa, tree to 16 m. ,perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, Eucalyptus,Eucalyptus goniantha, mallee or tree to 3.5 m. ,perennial,inferred_from_growth_form,,,mallee tree,mallee tree,,,,,,,woody, -Eucalyptus,Eucalyptus goniantha subsp. goniantha, ,,,,,,,,,,,,,, +Eucalyptus,Eucalyptus goniantha subsp. goniantha, ,,,,,,,,,,,,,woody, Eucalyptus,Eucalyptus goniantha subsp. kynoura, stunted mallee to 1 m tall. forming a lignotuber. ,perennial,inferred_from_growth_form,,,mallee,mallee,,,,,,,woody,inferred_from_growth_form -Eucalyptus,Eucalyptus goniantha subsp. semiglobosa, ,,,,,,,,,,,,,, +Eucalyptus,Eucalyptus goniantha subsp. semiglobosa, ,,,,,,,,,,,,,woody, Eucalyptus,Eucalyptus goniocalyx," tree to 15 m, often straggly. ",perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, Eucalyptus,Eucalyptus goniocalyx subsp. exposa, mallees to 6 m tall. forming a lignotuber. ,perennial,inferred_from_growth_form,,,mallee,mallees,,,,,,,woody,inferred_from_growth_form Eucalyptus,Eucalyptus goniocalyx subsp. goniocalyx, tree to 15 m tall. forming a lignotuber. ,perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, @@ -7194,8 +7194,8 @@ Eucalyptus,Eucalyptus xanthonema, mallee or small tree to 3.5 m. ,perennial,infe Eucalyptus,Eucalyptus xanthonema subsp. apposita, mallee to 3 m tall. forming a lignotuber. ,perennial,inferred_from_growth_form,,,mallee,mallee,,,,,,,woody,inferred_from_growth_form Eucalyptus,Eucalyptus youngiana, tree or mallee to 11 m. ,perennial,inferred_from_growth_form,,,mallee tree,mallee tree,,,,,,,woody, Eucalyptus,Eucalyptus yumbarrana, mallee or tree to 5 m. ,perennial,inferred_from_growth_form,,,mallee tree,mallee tree,,,,,,,woody, -Eucalyptus,Eucalyptus yumbarrana subsp. striata, buds strongly glaucous; ,,,,,,,,,,,,,, -Eucalyptus,Eucalyptus yumbarrana subsp. yumbarrana," buds smooth, . ",,,,,,,,,,,,,, +Eucalyptus,Eucalyptus yumbarrana subsp. striata, buds strongly glaucous; ,,,,,,,,,,,,,woody, +Eucalyptus,Eucalyptus yumbarrana subsp. yumbarrana," buds smooth, . ",,,,,,,,,,,,,woody, Eucalyptus,Eucalyptus zygophylla," tree or shrub to 2.5 m, rarely to 8 m. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, Eucalyptus,Eucalyptus approximans subsp. codonocarpa, ,perennial,inferred_from_growth_form,,,mallee,inferred_from_species,,,,,,,woody,inferred_from_growth_form Eucalyptus,Eucalyptus terminalis," tree to 15 m, sometimes crooked. ",perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, @@ -7504,9 +7504,9 @@ Eucalyptus,Eucalyptus erosa, tree to 30 m tall. forming a lignotuber. ,perennial Eucalyptus,Eucalyptus erythrandra, mallee or small tree to 5 m tall. forming a lignotuber. ,perennial,inferred_from_growth_form,,,mallee tree,mallee tree,,,,,,,woody, Eucalyptus,Eucalyptus erythrocorys, tree to 8 m. ,perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, Eucalyptus,Eucalyptus erythronema, mallee or small tree to 6 m. ,perennial,inferred_from_growth_form,,,mallee tree,mallee tree,,,,,,,woody, -Eucalyptus,Eucalyptus erythronema subsp. erythronema, ,,,,,,,,,,,,,, +Eucalyptus,Eucalyptus erythronema subsp. erythronema, ,,,,,,,,,,,,,woody, Eucalyptus,Eucalyptus erythronema subsp. inornata, mallee or tree to 6 m tall. forming a lignotuber. ,perennial,inferred_from_growth_form,,,mallee tree,mallee tree,,,,,,,woody, -Eucalyptus,Eucalyptus erythronema var. marginata, ,,,,,,,,,,,,,, +Eucalyptus,Eucalyptus erythronema var. marginata, ,,,,,,,,,,,,,woody, Eucalyptus,Eucalyptus erythrophloia, tree to 15 m. ,perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, Eucalyptus,Eucalyptus eudesmioides," mallee, usually to 3 m, occasionally a tree to 6 m. ",perennial,inferred_from_growth_form,,,mallee tree,mallee tree,,,,,,,woody, Eucalyptus,Eucalyptus eudesmioides subsp. eudesmioides," mallee to 6 m tall, usually less than 4 m. forming a lignotuber. ",perennial,inferred_from_growth_form,,,mallee,mallee,,,,,,,woody,inferred_from_growth_form @@ -8183,7 +8183,7 @@ Ficus,Ficus tinctoria subsp. tinctoria," tree or banyan to circa 15 m high, or s Ficus,Ficus macrophylla, tree to 55 m high with wide-spreading crown; ,perennial,inferred_from_growth_form,,,tree,tree,epiphyte,inferred_from_genus,,,spreading,spreading,woody, Ficus,Ficus triradiata, large strangler to 25 m high. mostly glabrous. ,,,,,,,epiphyte,inferred_from_genus,,,,,, Ficus,Ficus subpuberula, muchbranched tree to 13 m high; ,perennial,inferred_from_growth_form,,,tree,tree,epiphyte,inferred_from_genus,,,,,woody, -Ficus,Ficus pumila," woody creeper climbing by adventitious roots, generally villous. ",,,,,,,epiphyte,inferred_from_genus,,,climbing,climbing,, +Ficus,Ficus pumila," woody creeper climbing by adventitious roots, generally villous. ",,,,,,,epiphyte,inferred_from_genus,,,climbing,climbing,woody, Ficus,Ficus virens, deciduous banyan with few aerial roots or strangler to over 30 m high. ,,,,,,,epiphyte,inferred_from_genus,,,,,, Ficus,Ficus virgata," tree to 10 (-30) m high, often a strangler. ",perennial,inferred_from_growth_form,,,tree,tree,epiphyte,inferred_from_genus,,,,,woody, Ficus,Ficus pleurocarpa, tree to 15 (-35) m high. ,perennial,inferred_from_growth_form,,,tree,tree,epiphyte,inferred_from_genus,,,,,woody, @@ -8444,7 +8444,7 @@ Gentianella,Gentianella brevisepala, Plant monocarpic; caudex small. ,,,,,herb,i Gentianella,Gentianella diemensis," Plant plietesial or polycarpic with short, robust caudex. ",,,,,herb,inferred_from_genus,,,,,,,herbaceous, Gentianella,Gentianella muelleriana subsp. muelleriana," caudex ± robust, simple or very shortly branched. ",,,,,herb,inferred_from_genus,,,,,,,herbaceous, Gentianella,Gentianella muelleriana," Plant plietesial, or polycarpic and occasionally bearing remains of last year's flower-stems. caudex becoming robust. ",,,,,herb,inferred_from_genus,,,,,,,herbaceous, -Gentianella,Gentianella eichleri, Plant monocarpic; caudex becoming robust-woody. ,,,,,herb,inferred_from_genus,,,,,,,herbaceous, +Gentianella,Gentianella eichleri, Plant monocarpic; caudex becoming robust-woody. ,,,,,herb,inferred_from_genus,,,,,,,woody_root herbaceous, Gentianella,Gentianella pleurogynoides, Plant monocarpic; caudex almost obsolete to subrobust. ,,,,,herb,inferred_from_genus,,,,,,,herbaceous, Geococcus,Geococcus, annual herb. ,annual,annual,,,herb,herb,,,,,,,herbaceous, Geococcus,Geococcus pusillus," prostrate herb with short lateral stems, ",annual,inferred_from_genus,,,herb,herb,,,,,prostrate,prostrate,herbaceous, @@ -8560,7 +8560,7 @@ Gonocarpus,Gonocarpus confertifolius, annual or perennial herb 7-30 cm tall. ,an Gonocarpus,Gonocarpus cordiger, perennial herb or small subshrub 30-45 cm tall. ,perennial,perennial,,,herb subshrub,herb subshrub,,,,,,,herbaceous, Gonocarpus,Gonocarpus diffusus, slender ascending or procumbent herb 17-40 cm tall. ,,,,,herb,herb,,,,,decumbent prostrate,ascending procumbent,herbaceous, Gonocarpus,Gonocarpus eremophilus, perennial herb 25-35 cm tall. ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Gonocarpus,Gonocarpus ericifolius, semi-woody subshrub 10-15 cm tall. ,,,,,subshrub,subshrub,,,,,,,, +Gonocarpus,Gonocarpus ericifolius, semi-woody subshrub 10-15 cm tall. ,,,,,subshrub,subshrub,,,,,,,soft_wood, Gonocarpus,Gonocarpus hexandrus," prostrate, ascending or erect perennial herb or small shrub 0.25-2 m tall. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect decumbent prostrate,erect ascending prostrate,woody herbaceous, Gonocarpus,Gonocarpus hexandrus subsp. hexandrus, perennial herb 8-37 cm tall. ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, Gonocarpus,Gonocarpus hexandrus subsp. integrifolius, perennial herb or subshrub. ,perennial,perennial,,,herb subshrub,herb subshrub,,,,,,,herbaceous, @@ -8664,7 +8664,7 @@ Goodenia,Goodenia vernicosa," erect shrub to 1 m tall, viscid, becoming varnishe Goodenia,Goodenia vilmorinae," ascending to erect, annual herb to 40 cm tall, ",annual,annual,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, Goodenia,Goodenia virgata," erect to ascending herb, virgate, to 40 cm tall. ",,,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, Goodenia,Goodenia viridula, asending undershrub to 40 cm tall. ,,,,,subshrub,undershrub,,,,,,,, -Goodenia,Goodenia viscida," erect perennial to 40 cm tall, glandular, viscid; stock woody. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, +Goodenia,Goodenia viscida," erect perennial to 40 cm tall, glandular, viscid; stock woody. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,woody_root herbaceous, Goodenia,Goodenia viscidula," erect, annual herb to 25 cm tall, viscid. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Goodenia,Goodenia watsonii," perennial to 50 cm tall, ",perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Goodenia,Goodenia willisiana," erect or ascending herb to 20 cm tall, whitish tomentose. ",,,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, @@ -8735,7 +8735,7 @@ Goodenia,Goodenia glabra," prostrate to decumbent herb, ",,,,,herb,herb,,,,,decu Goodenia,Goodenia glandulosa," erect, perennial herb to 50 cm tall. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Goodenia,Goodenia glareicola," erect, perennial herb to 30 cm tall, glabrous or glaucous. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Goodenia,Goodenia glauca," erect herb to 20 cm tall, glaucous, glabrous or sparsely strigose. ",,,,,herb,herb,,,,,erect,erect,herbaceous, -Goodenia,Goodenia gloeophylla," erect, slightly woody subshrub to 50 cm tall, viscid, ",,,,,subshrub,subshrub,,,,,erect,erect,, +Goodenia,Goodenia gloeophylla," erect, slightly woody subshrub to 50 cm tall, viscid, ",,,,,subshrub,subshrub,,,,,erect,erect,soft_wood, Goodenia,Goodenia glomerata," erect herb to 50 cm tall, woodybase, yellowish to grey villous, glabrescent. ",,,,,herb,herb,,,,,erect,erect,woody_base herbaceous,woodybase Goodenia,Goodenia goodeniacea," prostrate herb, ±perennial; ",,,,,herb,herb,,,,,prostrate,prostrate,herbaceous, Goodenia,Goodenia gracilis," annual or perennial herb to 50 cm tall, almost glabrous; tap root to 50 cm long. ",annual perennial,annual perennial,,,herb,herb,,,,,,,herbaceous, @@ -9646,7 +9646,7 @@ Haloragis,Haloragis glauca, perennial herb 30-50 cm tall. ,perennial,perennial,, Haloragis,Haloragis gossei, herbaceous annual 20-40 cm tall. ,annual,annual,,,herb,inferred_from_life_history,,,,,,,herbaceous, Haloragis,Haloragis hamata, erect shrub 35-55 cm tall. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Haloragis,Haloragis heterophylla, perennial herb 15-50 cm tall. ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Haloragis,Haloragis milesiae," woody, robust subshrub to 1.2 m tall; ",,,,,subshrub,subshrub,,,,,,,, +Haloragis,Haloragis milesiae," woody, robust subshrub to 1.2 m tall; ",,,,,subshrub,subshrub,,,,,,,woody, Haloragis,Haloragis myriocarpa, perennial herb 30-60 cm tall. ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, Haloragis,Haloragis odontocarpa, annual herb 30-45 cm tall. ,annual,annual,,,herb,herb,,,,,,,herbaceous, Haloragis,Haloragis platycarpa, perennial herb 30 cm tall. ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -9693,7 +9693,7 @@ Halosarcia,Halosarcia cupuliformis, small shrub circa 25 cm high. ,perennial,inf Halosarcia,Halosarcia doleiformis, spreading shrub to 50 cm high. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, Halosarcia,Halosarcia entrichoma, dwarf decumbent shrub. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,decumbent,decumbent,woody, Halosarcia,Halosarcia fimbriata, shrub to 1 m high with ascending branches. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,decumbent,ascending,woody, -Halosarcia,Halosarcia flabelliformis, woody perennial to 20 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Halosarcia,Halosarcia flabelliformis, woody perennial to 20 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,woody, Halosarcia,Halosarcia fontinalis, shrub to 70 cm high. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Halosarcia,Halosarcia halocnemoides, spreading or erect shrub to 50 cm high. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading,erect spreading,woody, Halosarcia,Halosarcia indica, decumbent perennial to stout erect shrub. ,perennial,perennial,,,shrub,shrub,,,,,erect decumbent,erect decumbent,woody, @@ -10222,7 +10222,7 @@ Hypsophila,Hypsophila," shrubs or trees, glabrous. ",perennial,inferred_from_gro Hypsophila,Hypsophila dielsiana, tree to 10 m. ,perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, Hypsophila,Hypsophila halleyana, stunted shrub or tree to 12 m. ,perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, Icacinaceae,Icacinaceae," trees, shrubs or bisexual, polygamous or dioecious. ",perennial,inferred_from_growth_form,,,shrub tree,shrubs trees,,,dioecious polygamous,dioecious polygamous,,,woody, -Ichnocarpus,Ichnocarpus," perennial woody lianes or subshrubs, evergreen; latex white. ",perennial,perennial,,,subshrub climber_woody,subshrubs lianes,,,,,,,, +Ichnocarpus,Ichnocarpus," perennial woody lianes or subshrubs, evergreen; latex white. ",perennial,perennial,,,subshrub climber_woody,subshrubs lianes,,,,,,,woody, Ichnocarpus,Ichnocarpus frutescens, liane. ,perennial,inferred_from_genus,,,climber_woody,liane,,,,,,,woody,inferred_from_growth_form Ichnocarpus,Ichnocarpus rhombifolius, scandent epiphytic liane. ,perennial,inferred_from_genus,,,climber_woody,liane,epiphyte,epiphytic,,,climbing,scandent,woody,inferred_from_growth_form Idiospermum,Idiospermum," tree, andromonoecious. ",perennial,inferred_from_growth_form,,,tree,tree,,,andromonoecious,andromonoecious,,,woody, @@ -10750,7 +10750,7 @@ Leptocarpus,Leptocarpus roycei," herb, dioecious, caespitose, perennial, forming Leptocarpus,Leptocarpus decipiens," herb, dioecious, caespitose, perennial, forming slender and few-stemmed tufts to large dense tussocks to 40 cm across; ",perennial,perennial,,,herb tussock graminoid,herb tussocks,,,dioecious,dioecious,caespitose tufted dense,caespitose tussocks tufts dense,herbaceous, Leptocarpus,Leptocarpus crebriculmis," herb, dioecious, caespitose, perennial, forming large dense tussocks to 0.8 (-1) m across. ",perennial,perennial,,,herb tussock graminoid,herb tussocks,,,dioecious,dioecious,caespitose dense,caespitose tussocks dense,herbaceous, Leptocarpus,Leptocarpus tenax," herb, dioecious, rhizomatous perennial. ",perennial,perennial,,,herb graminoid,herb,,,dioecious,dioecious,rhizomatous,rhizomatous,herbaceous, -Leptocarpus,Leptocarpus thysananthus," herb, dioecious, perennial, forming large dense tussocks to 1.8 m high and 1 m across with hard woody interlacing rhizomes. ",perennial,perennial,,,herb tussock graminoid,herb tussocks,,,dioecious,dioecious,caespitose rhizomatous dense,tussocks rhizomes dense,herbaceous, +Leptocarpus,Leptocarpus thysananthus," herb, dioecious, perennial, forming large dense tussocks to 1.8 m high and 1 m across with hard woody interlacing rhizomes. ",perennial,perennial,,,herb tussock graminoid,herb tussocks,,,dioecious,dioecious,caespitose rhizomatous dense,tussocks rhizomes dense,woody_root herbaceous, Leptocarpus,Leptocarpus tephrinus," herb, dioecious, rhizomatous, perennial, forming diffuse patches to 30 cm across. ",perennial,perennial,,,herb graminoid,herb,,,dioecious,dioecious,rhizomatous,rhizomatous,herbaceous, Leptocarpus,Leptocarpus," herbs, dioecious, perennial, caespitose or with elongated rhizomes. ",perennial,perennial,,,herb graminoid,herbs,,,dioecious,dioecious,caespitose rhizomatous,caespitose rhizomes,herbaceous, Leptocarpus,Leptocarpus scoparius," herb, dioecious, caespitose, perennial, forming dense tussocks to 20 cm diam. at base. ",perennial,perennial,,,herb tussock graminoid,herb tussocks,,,dioecious,dioecious,caespitose dense,caespitose tussocks dense,herbaceous, @@ -11136,9 +11136,9 @@ Lythraceae,Lythraceae," herbs, shrubs or trees. ",,,,,herb shrub tree,herbs shru Lythrum,Lythrum," herbs or subshrubs, annual or perennial. ",annual perennial,annual perennial,,,herb subshrub,herbs subshrubs,,,,,,,herbaceous, Lythrum,Lythrum hyssopifolia," herb, annual, decumbent or ascending, glabrous. ",annual,annual,,,herb,herb,,,,,decumbent,decumbent ascending,herbaceous, Lythrum,Lythrum junceum," perennial herb, decumbent to ascending, glabrous. ",perennial,perennial,,,herb,herb,,,,,decumbent,decumbent ascending,herbaceous, -Lythrum,Lythrum paradoxum," woody herb, erect, to 60 cm high, glabrous. ",,,,,herb,herb,,,,,erect,erect,herbaceous, +Lythrum,Lythrum paradoxum," woody herb, erect, to 60 cm high, glabrous. ",,,,,herb,herb,,,,,erect,erect,woody herbaceous, Lythrum,Lythrum salicaria," herb, erect, , perennial below, ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Lythrum,Lythrum wilsonii," woody herb or subshrub to 50 cm high, minutely scabrous. ",,,,,herb subshrub,herb subshrub,,,,,,,herbaceous, +Lythrum,Lythrum wilsonii," woody herb or subshrub to 50 cm high, minutely scabrous. ",,,,,herb subshrub,herb subshrub,,,,,,,woody, Macadamia,Macadamia," trees to 40 m tall, sometimes multistemmed, ",perennial,inferred_from_growth_form,,,tree,trees,,,,,,,woody, Macadamia,Macadamia claudiensis, tree 25-30 m tall. ,perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, Macadamia,Macadamia grandis," tree 10-40 m tall, ",perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, @@ -11232,7 +11232,7 @@ Maireana,Maireana erioclada, shrub to 60 cm high. ,perennial,inferred_from_genus Maireana,Maireana ovata, small densely branched shrub to 30 cm. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Maireana,Maireana," perennial herbs or shrubss or small shrubs, ",perennial,perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, Maireana,Maireana carnosa," erect perennial to 30 cm high, woodybase. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,woody_base herbaceous,woodybase -Maireana,Maireana cheelii, small erect caespitose perennial with woody stock and swollen tap-root. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect caespitose,erect caespitose,herbaceous, +Maireana,Maireana cheelii, small erect caespitose perennial with woody stock and swollen tap-root. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect caespitose,erect caespitose,woody_root herbaceous, Maireana,Maireana ciliata," decumbent to erect perennial with woodybase and slender taproot, to 10 cm high. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect decumbent,erect decumbent,woody_base herbaceous,woodybase Maireana,Maireana coronata," decumbent to erect perennial with woodybase and slender taproot, circa 15 cm high. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect decumbent,erect decumbent,woody_base herbaceous,woodybase Maireana,Maireana dichoptera, erect perennial to 20 cm high with woodybase. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,woody_base herbaceous,woodybase @@ -11241,7 +11241,7 @@ Maireana,Maireana eriosphaera," erect loosely branched perennial to 30 cm high, Maireana,Maireana excavata, decumbent perennial with stout taproot. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,decumbent,decumbent,herbaceous, Maireana,Maireana humillima, decumbent perennial with a woodybase. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,decumbent,decumbent,woody_base herbaceous,woodybase Maireana,Maireana lobiflora," decumbent perennial herb with woodyrootstock, or small shrub to 50 cm high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,decumbent,decumbent,woody_root woody herbaceous,woodyrootstock -Maireana,Maireana luehmannii, woody divaricately branched perennial to 40 cm. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Maireana,Maireana luehmannii, woody divaricately branched perennial to 40 cm. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,woody, Maireana,Maireana marginata, prostrate to decumbent perennial with a woody stock. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,decumbent prostrate,decumbent prostrate,herbaceous, Maireana,Maireana pentagona," prostrate to decumbent perennial with a small woodybase and a long fleshy taproot, circa 10 cm high. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,decumbent prostrate,decumbent prostrate,woody_base herbaceous,woodybase Maireana,Maireana scleroptera, prostrate to erect perennial to 30 cm high with a woodybase. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect prostrate,erect prostrate,woody_base herbaceous,woodybase @@ -11714,7 +11714,7 @@ Monochoria,Monochoria vaginalis, ,,,,,,,,,,,,,, Monococcus,Monococcus," shrubs, monoecious or dioecious. ",perennial,inferred_from_growth_form,,,shrub,shrubs,,,dioecious monoecious,dioecious monoecious,,,woody, Monococcus,Monococcus echinophorus," shrub to 2.5 m high, straggling to erect, sometimes climbing. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect climbing,erect climbing,woody, Monoculus,Monoculus," annual herbs, ",annual,annual,,,herb,herbs,,,,,,,herbaceous, -Monoculus,Monoculus monstrosus," erect herb, aromatic. basally woody, 20-50 (-60) cm high; ",annual,inferred_from_genus,,,herb,herb,,,,,erect,erect,herbaceous, +Monoculus,Monoculus monstrosus," erect herb, aromatic. basally woody, 20-50 (-60) cm high; ",annual,inferred_from_genus,,,herb,herb,,,,,erect,erect,woody_base herbaceous, Monodia,Monodia," perennial, caespitose, hummock-forming. ",perennial,perennial,,,hummock,hummock,,,,,caespitose,caespitose,woody,inferred_from_growth_form Monogramma,Monogramma dareicarpa, ,,,,,fern,inferred_from_family,,,,,,,herbaceous,inferred_from_growth_form Monogramma,Monogramma acrocarpa, ,,,,,fern,inferred_from_family,,,,,,,herbaceous,inferred_from_growth_form @@ -13209,8 +13209,8 @@ Pimelea,Pimelea calcicola, shrub 0.2-1 m high. ,annual,inferred_from_family,,,sh Pimelea,Pimelea brevistyla, shrub usually 0.3-1.3 m high. ,annual,inferred_from_family,,,shrub,shrub,,,,,,,woody, Pimelea,Pimelea decora, perennial herb with woodybase. ,perennial,perennial,,,herb,herb,,,,,,,woody_base herbaceous,woodybase Pimelea,Pimelea haematostachya, perennial herb with woodybase. ,perennial,perennial,,,herb,herb,,,,,,,woody_base herbaceous,woodybase -Pimelea,Pimelea simplex, herb or semi-woody annual 5-50 cm high. ,annual,annual,,,herb,herb,,,,,,,herbaceous, -Pimelea,Pimelea trichostachya," annual semi-woody herb, 15-75 cm high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, +Pimelea,Pimelea simplex, herb or semi-woody annual 5-50 cm high. ,annual,annual,,,herb,herb,,,,,,,soft_wood herbaceous, +Pimelea,Pimelea trichostachya," annual semi-woody herb, 15-75 cm high. ",annual,annual,,,herb,herb,,,,,,,soft_wood herbaceous, Pimelea,Pimelea biflora, prostrate mat-forming undershrub. ,annual,inferred_from_family,,,subshrub,undershrub,,,,,mat-forming prostrate,matforming prostrate,, Pimelea,Pimelea glauca, shrub from ±prostrate to l m high. ,annual,inferred_from_family,,,shrub,shrub,,,,,,,woody, Pimelea,Pimelea holroydii," shrub 0.3-1 m high, single-stemmed at base. ",annual,inferred_from_family,,,shrub,shrub,,,,,,,woody, @@ -13482,7 +13482,7 @@ Pleurocarpaea,Pleurocarpaea fasciculata," erect shrub, (50-) 80-100 cm high. ",p Pleurocarpaea,Pleurocarpaea denticulata, erect shrub to 80 cm high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,erect,erect,woody, Pleurostylia,Pleurostylia, bisexual trees or shrubs. ,perennial,inferred_from_growth_form,,,shrub tree,shrubs trees,,,,,,,woody, Pleurostylia,Pleurostylia opposita, shrub or tree to 15 m; ,perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, -Plinthanthesis,Plinthanthesis paradoxa, Plants with base forming a hard woody bole. ,perennial,inferred_from_genus,,,herb graminoid,inferred_from_genus_life_history,,,,,,,herbaceous, +Plinthanthesis,Plinthanthesis paradoxa, Plants with base forming a hard woody bole. ,perennial,inferred_from_genus,,,herb graminoid,inferred_from_genus_life_history,,,,,,,woody_base, Plinthanthesis,Plinthanthesis," perennials, caespitose, bisexual. ",perennial,perennials,,,herb graminoid,inferred_from_life_history,,,,,caespitose,caespitose,herbaceous, Plinthanthesis,Plinthanthesis rodwayi, ,perennial,inferred_from_genus,,,herb graminoid,inferred_from_genus_life_history,,,,,,,herbaceous, Plinthanthesis,Plinthanthesis urvillei, ,perennial,inferred_from_genus,,,herb graminoid,inferred_from_genus_life_history,,,,,,,herbaceous, @@ -14277,8 +14277,8 @@ Sarcostemma,Sarcostemma, perennial subshrubs or vines; latex white. ,perennial,p Sarcostemma,Sarcostemma viminale subsp. brunonianum, woody liane; ,perennial,inferred_from_genus,,,climber_woody,liane,,,,,,,woody,inferred_from_growth_form Sarcostemma,Sarcostemma brevipedicellatum," succulent subshrub or scrambler, . ",perennial,inferred_from_genus,,,subshrub,subshrub,,,,,,,, Sarcostemma,Sarcostemma esculentum, slender vine. ,perennial,inferred_from_genus,,,climber_herbaceous,vine,,,,,,,herbaceous, -Sarcostemma,Sarcostemma viminale subsp. australe, subshrub; ,perennial,inferred_from_genus,,,subshrub,subshrub,,,,,,,, -Sarcostemma,Sarcostemma viminale, succulent woody liane or erect or sprawling subshrub. ,perennial,inferred_from_genus,,,subshrub climber_woody,subshrub liane,,,,,erect sprawling,erect sprawling,, +Sarcostemma,Sarcostemma viminale subsp. australe, subshrub; ,perennial,inferred_from_genus,,,subshrub,subshrub,,,,,,,woody, +Sarcostemma,Sarcostemma viminale, succulent woody liane or erect or sprawling subshrub. ,perennial,inferred_from_genus,,,subshrub climber_woody,subshrub liane,,,,,erect sprawling,erect sprawling,woody, Sarcotoechia,Sarcotoechia, monoecious trees. ,perennial,inferred_from_growth_form,,,tree,trees,,,monoecious,monoecious,,,woody, Sarcotoechia,Sarcotoechia serrata, tree to 11 m high. ,perennial,inferred_from_growth_form,,,tree,tree,,,monoecious,inferred_from_genus,,,woody, Sarcotoechia,Sarcotoechia lanceolata, tree to 30 m high. ,perennial,inferred_from_growth_form,,,tree,tree,,,monoecious,inferred_from_genus,,,woody, @@ -14302,7 +14302,7 @@ Scaevola,Scaevola repens var. angustifolia," prostrate shrub, ",perennial,inferr Scaevola,Scaevola revoluta," spreading subshrub to 70 cm tall, ",perennial,inferred_from_genus,,,subshrub,subshrub,,,,,spreading,spreading,, Scaevola,Scaevola restiacea, erect or divaricate subshrub to 50 cm tall; ,perennial,inferred_from_genus,,,subshrub,subshrub,,,,,erect,erect,, Scaevola,Scaevola collina," erect subshrub to 50 cm tall, almost glabrous. ",perennial,inferred_from_genus,,,subshrub,subshrub,,,,,erect,erect,, -Scaevola,Scaevola albida," prostrate to ascending herb to 50 cm tall, often woody basally. ",perennial,inferred_from_genus,,,herb,herb,,,,,decumbent prostrate,ascending prostrate,herbaceous, +Scaevola,Scaevola albida," prostrate to ascending herb to 50 cm tall, often woody basally. ",perennial,inferred_from_genus,,,herb,herb,,,,,decumbent prostrate,ascending prostrate,woody_base herbaceous, Scaevola,Scaevola aemula, ascending to decumbent herb to 50 cm tall; ,perennial,inferred_from_genus,,,herb,herb,,,,,decumbent,decumbent ascending,herbaceous, Scaevola,Scaevola spicigera," subshrub to 50 cm tall, tomentose. ",perennial,inferred_from_genus,,,subshrub,subshrub,,,,,,,, Scaevola,Scaevola globosa," sprawling shrub to 70 cm high and 1 m across, pubescence , ",perennial,inferred_from_genus,,,shrub,shrub,,,,,sprawling,sprawling,woody, @@ -14343,7 +14343,7 @@ Scaevola,Scaevola myrtifolia," spreading shrub to 1.5 m tall, slightly viscid wh Scaevola,Scaevola macrostachya, spreading shrub to 60 cm tall. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,spreading,spreading,woody, Scaevola,Scaevola virgata," subshrub, usually muchbranched, to 45 cm high. ",perennial,inferred_from_genus,,,subshrub,subshrub,,,,,,,, Scaevola,Scaevola tomentosa," divaricate shrub to 1.5 m tall, often with dwarf branchlets, ",perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, -Scaevola,Scaevola parvibarbata," erect herb to 50 cm tall, woody basally. ",perennial,inferred_from_genus,,,herb,herb,,,,,erect,erect,herbaceous, +Scaevola,Scaevola parvibarbata," erect herb to 50 cm tall, woody basally. ",perennial,inferred_from_genus,,,herb,herb,,,,,erect,erect,woody_base herbaceous, Scaevola,Scaevola macrophylla," erect herb to 40 cm tall, woodybase. ",perennial,inferred_from_genus,,,herb,herb,,,,,erect,erect,woody_base herbaceous,woodybase Scaevola,Scaevola tenuifolia," decumbent to prostrate herb, to 1 m diam., hispid with short, stiff, ",perennial,inferred_from_genus,,,herb,herb,,,,,decumbent prostrate,decumbent prostrate,herbaceous, Scaevola,Scaevola laciniata," erect subshrub to 1 m tall, ",perennial,inferred_from_genus,,,subshrub,subshrub,,,,,erect,erect,, @@ -14436,7 +14436,7 @@ Scleroglossum,Scleroglossum, ,,,,,fern,inferred_from_family,,,,,,,herbaceous,in Scleroglossum,Scleroglossum wooroonooran, ,,,,,fern,inferred_from_family,,,,,,,herbaceous,inferred_from_growth_form Sclerolaena,Sclerolaena burbidgeae, rounded perennial to 20 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Sclerolaena,Sclerolaena calcarata," rounded perennial branching from base, circa 25 cm high, glabrous to pilose. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Sclerolaena,Sclerolaena convexula, erect woody perennial to 30 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, +Sclerolaena,Sclerolaena convexula, erect woody perennial to 30 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,woody, Sclerolaena,Sclerolaena cornishiana, intricately branched annual or perennial herb. ,annual perennial,annual perennial,,,herb,herb,,,,,,,herbaceous, Sclerolaena,Sclerolaena," perennial herbs or small shrubs, ",perennial,perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, Sclerolaena,Sclerolaena alata, erect perennial circa 20 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, @@ -14463,7 +14463,7 @@ Sclerolaena,Sclerolaena muelleri, sprawling perennial to 60 cm high. ,perennial, Sclerolaena,Sclerolaena muricata," rounded annual or perennial to 1 m high, intricately and divaricately branched, glabrous to villous or woolly. ",annual perennial,annual perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Sclerolaena,Sclerolaena napiformis, erect perennial circa 30 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, Sclerolaena,Sclerolaena parallelicuspis, rounded perennial to 20 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Sclerolaena,Sclerolaena parviflora, erect woody perennial to 30 cm high. sparsely appressed-hirtellous. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, +Sclerolaena,Sclerolaena parviflora, erect woody perennial to 30 cm high. sparsely appressed-hirtellous. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,woody, Sclerolaena,Sclerolaena patenticuspis, rounded perennial circa 20 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Sclerolaena,Sclerolaena ramulosa," perennial herb to 30 cm high, ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Sclerolaena,Sclerolaena recurvicuspis, rounded glabrous perennial circa 30 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, @@ -14473,13 +14473,13 @@ Sclerolaena,Sclerolaena tricuspis," shrub to 1 m high, glabrous except pubescenc Sclerolaena,Sclerolaena walkeri, small shrub circa 30 cm high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Sclerolaena,Sclerolaena brevifolia," small erect shrub circa 30 cm high, ±hirtellous all over or eventually almost glabrous. ",perennial,inferred_from_genus,,,shrub,shrub,,,,,erect,erect,woody, Sclerolaena,Sclerolaena muricata var. muricata," Plant glabrous or almost so, glaucous. ",perennial,inferred_from_genus,,,herb,inferred_from_species,,,,,,,herbaceous, -Sclerolaena,Sclerolaena costata, small woody perennial to 30 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Sclerolaena,Sclerolaena costata, small woody perennial to 30 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,woody, Sclerolaena,Sclerolaena bicornis, intricately branched shrub to circa 50 cm high. ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Sclerolaena,Sclerolaena johnsonii," bushy intricately-branched annual or perennial, glabrous. ",annual perennial,annual perennial,,,herb,inferred_from_life_history,,,,,bushy,bushy,herbaceous, -Sclerolaena,Sclerolaena lanicuspis, woody perennial circa 25 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Sclerolaena,Sclerolaena lanicuspis, woody perennial circa 25 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,woody, Sclerolaena,Sclerolaena tatei," rounded perennial circa 50 cm high, usually dioecious. ",perennial,perennial,,,herb,inferred_from_life_history,,,dioecious,dioecious,,,herbaceous, -Sclerolaena,Sclerolaena tetracuspis," sprawling intricately-branched woody perennial, glabrous. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,sprawling,sprawling,herbaceous, -Sclerolaena,Sclerolaena tetragona, small erect woody perennial to 30 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, +Sclerolaena,Sclerolaena tetracuspis," sprawling intricately-branched woody perennial, glabrous. ",perennial,perennial,,,herb,inferred_from_life_history,,,,,sprawling,sprawling,woody, +Sclerolaena,Sclerolaena tetragona, small erect woody perennial to 30 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,woody, Sclerolaena,Sclerolaena tridens," open perennial to 30 cm high, ",perennial,perennial,,,herb,inferred_from_life_history,,,,,open,open,herbaceous, Sclerolaena,Sclerolaena tubata, erect tufted perennial to 25 cm high with fleshy taproot. sparsely hirtellous to glabrous. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, Sclerolaena,Sclerolaena uniflora, perennial herb to 20 cm high. ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -15229,7 +15229,7 @@ Stenopetalum,Stenopetalum nutans," annual or biennial herb to 50 cm, decumbent t Stenopetalum,Stenopetalum pedicellare," annual herb to 50 cm, slender, straggling, almost glabrous to papillose. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Stenopetalum,Stenopetalum robustum," annual herb to 100 cm, straggling, almost glabrous to papillose. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Stenopetalum,Stenopetalum sphaerocarpum," annual herb to 30 cm, wiry, straggling, glabrous or sparsely papillose. ",annual,annual,,,herb,herb,,,,,,,herbaceous, -Stenopetalum,Stenopetalum velutinum," annual, woody herb to 65 cm, erect. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, +Stenopetalum,Stenopetalum velutinum," annual, woody herb to 65 cm, erect. ",annual,annual,,,herb,herb,,,,,erect,erect,woody, Stephania,Stephania tuberosa, ,,,,,,,,,dioecious,inferred_from_family,,,, Stephania,Stephania japonica, root . ,,,,,,,,,dioecious,inferred_from_family,,,, Stephania,Stephania bancroftii," root tuberous, subglobose, circa 25 cm diam. ",,,,,,,,,dioecious,inferred_from_family,,,, @@ -15696,9 +15696,9 @@ Thinopyrum,Thinopyrum distichum, Plants rhizomatous. ,perennial,inferred_from_ge Thinopyrum,Thinopyrum," perennials, rhizomatous or caespitose, erect, rigid, glaucous, bisexual. ",perennial,perennials,,,herb graminoid,inferred_from_life_history,,,,,erect caespitose rhizomatous,erect caespitose rhizomatous,herbaceous, Thlaspi,Thlaspi, annual herbs. ,annual,annual,,,herb,herbs,,,,,,,herbaceous, Thlaspi,Thlaspi arvense," annual or rarely biennial herb 10-60 cm tall, erect, simple or branched, glabrous, somewhat foetid. ",annual biennial,annual biennial,,,herb,herb,,,,,erect,erect,herbaceous, -Threlkeldia,Threlkeldia," small woody perennials, glabrous except axillary pubescence. ",perennial,perennials,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Threlkeldia,Threlkeldia diffusa, muchbranched prostrate to erect perennial to 30 cm high. ,perennial,perennial,,,herb,inferred_from_genus_life_history,,,,,erect prostrate,erect prostrate,herbaceous, -Threlkeldia,Threlkeldia inchoata," rounded muchbranched perennial to 30 cm high, ",perennial,perennial,,,herb,inferred_from_genus_life_history,,,,,,,herbaceous, +Threlkeldia,Threlkeldia," small woody perennials, glabrous except axillary pubescence. ",perennial,perennials,,,herb,inferred_from_life_history,,,,,,,woody, +Threlkeldia,Threlkeldia diffusa, muchbranched prostrate to erect perennial to 30 cm high. ,perennial,perennial,,,herb,inferred_from_genus_life_history,,,,,erect prostrate,erect prostrate,woody, +Threlkeldia,Threlkeldia inchoata," rounded muchbranched perennial to 30 cm high, ",perennial,perennial,,,herb,inferred_from_genus_life_history,,,,,,,woody, Thrixspermum,Thrixspermum, epiphytic orchids ranging from sparsely branched to muchbranched bushy clumps. ,perennial,inferred_from_family,,,herb,orchids,epiphyte,epiphytic,,,bushy,bushy,herbaceous, Thrixspermum,Thrixspermum platystachys, Plants forming coarse straggly hanging clumps with numerous tangled roots. ,perennial,inferred_from_family,,,herb,inferred_from_genus,epiphyte,inferred_from_genus,,,,,herbaceous, Thrixspermum,Thrixspermum carinatifolium, Plants form straggly clumps with numerous wiry roots. ,perennial,inferred_from_family,,,herb,inferred_from_genus,epiphyte,inferred_from_genus,,,,,herbaceous, @@ -16356,11 +16356,11 @@ Wollastonia,Wollastonia uniflora," straggling perennial herb, or scandent subshr Wollemia,Wollemia nobilis, tree to 40 m tall; ,perennial,inferred_from_growth_form,,,tree,tree,,,monoecious,inferred_from_genus,,,woody, Wollemia,Wollemia," monoecious, glabrous trees. ",perennial,inferred_from_growth_form,,,tree,trees,,,monoecious,monoecious,,,woody, Wrightia,Wrightia pubescens," shrub or tree to 35 m high, deciduous. ",perennial,inferred_from_genus,,,shrub tree,shrub tree,,,,,,,woody, -Wrightia,Wrightia pubescens subsp. penicillata, ,perennial,inferred_from_genus,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Wrightia,Wrightia pubescens subsp. penicillata, ,perennial,inferred_from_genus,,,,inferred_from_life_history,,,,,,,herbaceous, Wrightia,Wrightia," perennial shrubs or trees, evergreen or deciduous; latex white. ",perennial,perennial,,,shrub tree,shrubs trees,,,,,,,woody, Wrightia,Wrightia saligna," shrub or small tree to 7 m high, evergreen. ",perennial,inferred_from_genus,,,shrub tree,shrub tree,,,,,,,woody, Wrightia,Wrightia versicolor," tree to 20 m high, deciduous. ",perennial,inferred_from_genus,,,tree,tree,,,,,,,woody, -Wrightia,Wrightia pubescens subsp. pubescens, ,perennial,inferred_from_genus,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Wrightia,Wrightia pubescens subsp. pubescens, ,perennial,inferred_from_genus,,,,inferred_from_life_history,,,,,,,herbaceous, Wrightia,Wrightia laevis subsp. millgar," tree to 40 m high, evergreen. ",perennial,inferred_from_genus,,,tree,tree,,,,,,,woody, Wurmbea,Wurmbea monantha," Plant to 20 cm tall, usually less than 10 cm. ",,,,,herb,inferred_from_genus,,,,,,,herbaceous, Wurmbea,Wurmbea deserticola, Plant 7-24 cm tall. ,,,,,herb,inferred_from_genus,,,,,,,herbaceous, diff --git a/data/ABRS_2022/metadata.yml b/data/ABRS_2022/metadata.yml index a46c990d3..fc8905fa3 100644 --- a/data/ABRS_2022/metadata.yml +++ b/data/ABRS_2022/metadata.yml @@ -399,10 +399,6 @@ taxonomic_updates: reason: match_14. Automatic alignment with species-level name known by APC when notes are ignored (2022-11-22) taxonomic_resolution: Species -- find: Platanus xhispanica 'Acerifolia' - replace: Platanus x hispanica 'Acerifolia' - reason: Manual alignment with canonical species name in APC (Elizabeth Wenk, 2022-11-21) - taxonomic_resolution: Species - find: Pterostylis xaenigma replace: Pterostylis x aenigma reason: match_07_fuzzy. Fuzzy alignment with accepted canonical name in APC (2022-11-22) @@ -570,4 +566,7 @@ exclude_observations: Group, Strumosa Group, Thelemanniana Group, Trifida Group, Trifurcata Group, Triloba Group, Trineura Group, Ulicina Group, Undulata Group, Wickhamii Group reason: not species in APC/APNI +- variable: taxon_name + find: Platanus xhispanica 'Acerifolia' + reason: excluding cultivars questions: .na diff --git a/data/Ahrens_2019/metadata.yml b/data/Ahrens_2019/metadata.yml index 517976876..6cdf19ed3 100644 --- a/data/Ahrens_2019/metadata.yml +++ b/data/Ahrens_2019/metadata.yml @@ -155,7 +155,7 @@ locations: contexts: .na traits: - var_in: WBI - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: leaf_water_band_index entity_type: individual value_type: raw @@ -181,7 +181,7 @@ traits: efficiency (RUE) and the xanthophyll cycle (Gamon, Serrano, & Surfus, 1997; Garbulsky, Penuelas, Gamon, Inoue, & Filella, 2011). - var_in: mND705 - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: modified_NDVI entity_type: individual value_type: raw @@ -197,7 +197,7 @@ traits: and is closely related to fraction of absorbed photosynthetically active radiation (FPAR) (Myneni et al., 2002; Peng & Gitelson, 2012). - var_in: d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw diff --git a/data/Apgaua_2015/metadata.yml b/data/Apgaua_2015/metadata.yml index 4f92f6ef8..5c410e65b 100644 --- a/data/Apgaua_2015/metadata.yml +++ b/data/Apgaua_2015/metadata.yml @@ -70,7 +70,7 @@ locations: contexts: .na traits: - var_in: Theoretical Specific Conductivity (kg s-1 MPa-1) - unit_in: 10^6 x kg/m/s/MPa + unit_in: 10^6.kg/m/MPa/s trait_name: sapwood_specific_conductivity_theoretical entity_type: individual value_type: raw @@ -123,7 +123,7 @@ traits: (Nikon DS-Fi2). On the digital photographs, vessels were measured for area (vessel area, VA) and density (vessel density, VD) using imaging software GIMP 2.8.10. - var_in: Vessel Density (nm m-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: stem_vessel_density entity_type: individual value_type: raw @@ -145,7 +145,7 @@ traits: (Nikon DS-Fi2). On the digital photographs, vessels were measured for area (vessel area, VA) and density (vessel density, VD) using imaging software GIMP 2.8.10. - var_in: Vessel Fraction (unitless) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: stem_vessel_lumen_fraction entity_type: individual value_type: raw @@ -169,7 +169,7 @@ traits: From the vessel areas and cross sectional areas of digital images, we computed the vessel fraction (VF = VA - VD, total cross-sectional area used for sap transport). - var_in: Vulnerability Index (unitless) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -291,7 +291,7 @@ traits: 20 replicates per individual of sun-exposed leaves were obtained from the tree canopy. Leaf thickness was measured using a calliper, avoiding major veins. - var_in: d13C (per mille) - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw diff --git a/data/Apgaua_2017/metadata.yml b/data/Apgaua_2017/metadata.yml index 0cea23195..d61859e1a 100644 --- a/data/Apgaua_2017/metadata.yml +++ b/data/Apgaua_2017/metadata.yml @@ -221,7 +221,7 @@ traits: be if it is to have the same total conductivity for the same number of conduits as the sampled stem. - var_in: Vessel density (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: stem_vessel_density entity_type: individual value_type: raw @@ -243,7 +243,7 @@ traits: interstudy comparability, we calculated vessel diameters from vessel areas, and from these, we obtained mean (d; lm) and maximum diameters (dmax) for each species. - var_in: Vessel fraction (unitless) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: stem_vessel_lumen_fraction entity_type: individual value_type: raw @@ -265,7 +265,7 @@ traits: interstudy comparability, we calculated vessel diameters from vessel areas, and from these, we obtained mean (d; lm) and maximum diameters (dmax) for each species. - var_in: Theoretical specific xylem hydraulic conductivity (kg s-1 MPa-1) - unit_in: 10^6 x kg/m/s/MPa + unit_in: 10^6.kg/m/MPa/s trait_name: sapwood_specific_conductivity_theoretical entity_type: individual value_type: raw @@ -294,7 +294,7 @@ traits: into AusTraits; that is, the units used are '10^6 x kg/m/s/MPa' versus 'kg/s/MPa' in the manuscript.) - var_in: Vulnerability index (unitless) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: stem_xylem_vulnerability_index entity_type: individual value_type: raw @@ -316,7 +316,7 @@ traits: a vulnerability index (VI = d/VD; susceptibility to cavitation; Scholz et al. 2013) for each species. - var_in: Vessel Multiple Fraction (unitless) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: stem_vessel_multiple_fraction entity_type: individual value_type: raw @@ -341,7 +341,7 @@ traits: of vessels (Scholz et al. 2013). A Vmf value approximating 1 denotes a tendency towards solitary vessels. - var_in: Intrinsic water-use efficiency (umol mol-1 ) - unit_in: umolCO2/molH2O + unit_in: umol{CO2}/mol{H2O} trait_name: leaf_water_use_efficiency_intrinsic entity_type: individual value_type: raw @@ -369,7 +369,7 @@ traits: were strongly correlated with WUEi (Pearson correlation, r = 0_847, P < 0_0001), we use only the latter in our analyses. - var_in: d13c (per mille) - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw diff --git a/data/Blackman_2010/metadata.yml b/data/Blackman_2010/metadata.yml index e10b8328e..46bc77dbc 100644 --- a/data/Blackman_2010/metadata.yml +++ b/data/Blackman_2010/metadata.yml @@ -113,8 +113,8 @@ traits: placed in an oven at 70C for at least 3 d, and LMA was calculated as the ratio between the dry leaf mass and leaf area. - var_in: Kleaf_mmol_m2_s_Mpa - unit_in: mmol/m2/s/MPa - trait_name: leaf_hydraulic_conductivity + unit_in: mmol/m2/MPa/s + trait_name: leaf_specific_conductance entity_type: population value_type: mean basis_of_value: measurement diff --git a/data/Bloomfield_2018/metadata.yml b/data/Bloomfield_2018/metadata.yml index c3df1938e..06ac8026f 100644 --- a/data/Bloomfield_2018/metadata.yml +++ b/data/Bloomfield_2018/metadata.yml @@ -237,7 +237,7 @@ contexts: description: Measurement made at an elevated CO2 concentration of 1500 ppm. traits: - var_in: A400.a - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: value_type_column @@ -257,7 +257,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: A1500.a - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_maximum entity_type: individual value_type: value_type_column @@ -277,7 +277,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: Rdark.a - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: individual value_type: value_type_column @@ -297,7 +297,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: E400.a - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: value_type_column @@ -317,7 +317,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: E1500.a - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Amax entity_type: individual value_type: value_type_column @@ -337,7 +337,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: Edark.a - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_dark_transpiration_per_area entity_type: individual value_type: value_type_column @@ -357,7 +357,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: gs400 - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: value_type_column @@ -377,7 +377,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: gs1500 - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Amax entity_type: individual value_type: value_type_column @@ -397,7 +397,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: Ci.Ca - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: individual value_type: value_type_column @@ -417,7 +417,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: Ci400 - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: value_type_column @@ -437,7 +437,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: Ci1500 - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Amax entity_type: individual value_type: value_type_column @@ -530,7 +530,7 @@ traits: colorimetric analysis using a flow injection system (QuikChem 8500, Lachat Instruments, Loveland, Colorado, USA). - var_in: A400.m - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: individual value_type: value_type_column @@ -550,7 +550,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: A1500.m - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_maximum entity_type: individual value_type: value_type_column @@ -570,7 +570,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: Rdark.m - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_dark_respiration_per_dry_mass entity_type: individual value_type: value_type_column @@ -633,7 +633,7 @@ traits: was hot-digested in acid-peroxide before colorimetric analysis using a flow injection system (QuikChem 8500, Lachat Instruments, Loveland, Colorado, USA). - var_in: A400.N - unit_in: umolCO2/gN/s + unit_in: umol{CO2}/g{N}/s trait_name: leaf_photosynthetic_nitrogen_use_efficiency_saturated entity_type: individual value_type: value_type_column @@ -653,7 +653,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: A400.P - unit_in: umolCO2/gP/s + unit_in: umol{CO2}/g{P}/s trait_name: leaf_photosynthetic_phosphorus_use_efficiency_saturated entity_type: individual value_type: value_type_column @@ -673,7 +673,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: wue400 - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: leaf_water_use_efficiency_photosynthetic entity_type: individual value_type: value_type_column @@ -693,7 +693,7 @@ traits: air temperatures to counter the effect of transpirational cooling and to ensure leaf and ambient air temperatures were similar. - var_in: wue1500 - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: leaf_water_use_efficiency_photosynthetic entity_type: individual value_type: value_type_column diff --git a/data/Buckton_2019/metadata.yml b/data/Buckton_2019/metadata.yml index d573921a4..fa2d97702 100644 --- a/data/Buckton_2019/metadata.yml +++ b/data/Buckton_2019/metadata.yml @@ -127,7 +127,7 @@ traits: replicates: .na methods: expert knowledge and literature - var_in: Aa - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: mean @@ -145,7 +145,7 @@ traits: umol CO2 mol-1 N s-1) was calculated as the mass-based assimilation rate (Amass) divided by total N concentration per unit leaf dry mass (Nmass). - var_in: gs - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: mean @@ -163,7 +163,7 @@ traits: umol CO2 mol-1 N s-1) was calculated as the mass-based assimilation rate (Amass) divided by total N concentration per unit leaf dry mass (Nmass). - var_in: WUEi - unit_in: umolCO2/molH2O + unit_in: umol{CO2}/mol{H2O} trait_name: leaf_water_use_efficiency_intrinsic entity_type: individual value_type: mean @@ -181,7 +181,7 @@ traits: umol CO2 mol-1 N s-1) was calculated as the mass-based assimilation rate (Amass) divided by total N concentration per unit leaf dry mass (Nmass). - var_in: CiCa - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: individual value_type: mean @@ -199,7 +199,7 @@ traits: umol CO2 mol-1 N s-1) was calculated as the mass-based assimilation rate (Amass) divided by total N concentration per unit leaf dry mass (Nmass). - var_in: Amass - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: individual value_type: mean @@ -217,7 +217,7 @@ traits: umol CO2 mol-1 N s-1) was calculated as the mass-based assimilation rate (Amass) divided by total N concentration per unit leaf dry mass (Nmass). - var_in: PNUE - unit_in: umolCO2/molN/s + unit_in: umol{CO2}/mol{N}/s trait_name: leaf_photosynthetic_nitrogen_use_efficiency_saturated entity_type: individual value_type: mean @@ -235,7 +235,7 @@ traits: umol CO2 mol-1 N s-1) was calculated as the mass-based assimilation rate (Amass) divided by total N concentration per unit leaf dry mass (Nmass). - var_in: Ci - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: mean @@ -253,7 +253,7 @@ traits: umol CO2 mol-1 N s-1) was calculated as the mass-based assimilation rate (Amass) divided by total N concentration per unit leaf dry mass (Nmass). - var_in: WUE - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: leaf_water_use_efficiency_photosynthetic entity_type: individual value_type: mean @@ -410,7 +410,7 @@ traits: Bethesda, MD, USA, http://imagej.nih.gov/ij/, 1997-2014). Sapwood was differentiated from bark and pith based on colour and general appearance - var_in: S_true15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: wood_delta15N entity_type: individual value_type: raw @@ -440,7 +440,7 @@ traits: to the internationally accepted standards of Vienna PeeDee belemnite (VPDB) and air for carbon and nitrogen, respectively. - var_in: S_true13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: wood_delta13C entity_type: individual value_type: raw @@ -470,7 +470,7 @@ traits: to the internationally accepted standards of Vienna PeeDee belemnite (VPDB) and air for carbon and nitrogen, respectively. - var_in: L_true13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -485,7 +485,7 @@ traits: to the internationally accepted standards of Vienna PeeDee belemnite (VPDB) and air for carbon and nitrogen, respectively. - var_in: L_true15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw @@ -625,7 +625,7 @@ traits: Bethesda, MD, USA, http://imagej.nih.gov/ij/, 1997-2014). Sapwood was differentiated from bark and pith based on colour and general appearance - var_in: X_Tot_Ratio - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -645,7 +645,7 @@ traits: Bethesda, MD, USA, http://imagej.nih.gov/ij/, 1997-2014). Sapwood was differentiated from bark and pith based on colour and general appearance - var_in: d18O - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: stem_water_delta18O entity_type: individual value_type: raw diff --git a/data/Catford_2014/metadata.yml b/data/Catford_2014/metadata.yml index 4a75920ea..9cfc63aa3 100644 --- a/data/Catford_2014/metadata.yml +++ b/data/Catford_2014/metadata.yml @@ -240,7 +240,7 @@ traits: require inundation some stage in life cycle - var_in: aquatic_terrestrial_detailed unit_in: .na - trait_name: flood_regime_classification + trait_name: plant_flood_regime_classification entity_type: species value_type: mode basis_of_value: expert_score @@ -337,13 +337,13 @@ substitutions: - trait_name: vegetative_reproduction_ability find: 0 replace: not_vegetative -- trait_name: flood_regime_classification +- trait_name: plant_flood_regime_classification find: tda replace: terrestrial_damp -- trait_name: flood_regime_classification +- trait_name: plant_flood_regime_classification find: tdr replace: terrestrial_dry -- trait_name: flood_regime_classification +- trait_name: plant_flood_regime_classification find: amphibious replace: amphibious - trait_name: dispersal_syndrome diff --git a/data/Cernusak_2006/metadata.yml b/data/Cernusak_2006/metadata.yml index 4be216f02..f3e989d41 100644 --- a/data/Cernusak_2006/metadata.yml +++ b/data/Cernusak_2006/metadata.yml @@ -113,7 +113,7 @@ contexts: - value: 2 traits: - var_in: R25_stem - unit_in: umolCO2/g/s + unit_in: umol{CO2}/g/s trait_name: stem_respiration_per_dry_mass entity_type: individual value_type: mean @@ -161,7 +161,7 @@ traits: 48 dendrometer bands installed initially, 14 were found to have seized in the wetseason conditions; these trees were excluded from the analyses of stem growth. - var_in: Photosynthesis (umol m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: mean @@ -187,7 +187,7 @@ traits: to conditions within the cuvette, and short enough to avoid a significant alteration of stomatal conductance. - var_in: Stomatal conductance (mol m-2 s-1) - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: mean @@ -213,7 +213,7 @@ traits: to conditions within the cuvette, and short enough to avoid a significant alteration of stomatal conductance. - var_in: Ci (umol mol-1) - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: mean @@ -239,7 +239,7 @@ traits: to conditions within the cuvette, and short enough to avoid a significant alteration of stomatal conductance. - var_in: Transpiration (mmol m-2 s-1) - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: mean @@ -265,7 +265,7 @@ traits: to conditions within the cuvette, and short enough to avoid a significant alteration of stomatal conductance. - var_in: leaf respiraton at 30degC - unit_in: neg_umolCO2/m2/s + unit_in: neg_umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: individual value_type: mean @@ -300,7 +300,7 @@ traits: replicates: .na methods: sourced from Chen 2002 - var_in: SW area per leaf area (cm2 m-2) - unit_in: cm2_sapwood/m2_leaf + unit_in: cm2{sapwood}/m2{leaf} trait_name: huber_value entity_type: individual value_type: raw diff --git a/data/Cernusak_2011/metadata.yml b/data/Cernusak_2011/metadata.yml index f61373b14..46ba5f34c 100644 --- a/data/Cernusak_2011/metadata.yml +++ b/data/Cernusak_2011/metadata.yml @@ -131,7 +131,7 @@ traits: Devices, Cambridge, UK). Leaves were dried at 70 deg C to constant mass, and leaf dry mass was determined to the nearest mg. - var_in: d13C (per mille) - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -181,7 +181,7 @@ traits: automated molybdate colorimetry (Lachat Quickchem 8500, Hach Ltd, Loveland, CO, USA). - var_in: leaf N area (mmol m-2) - unit_in: mmolN/m2 + unit_in: mmol{N}/m2 trait_name: leaf_N_per_area entity_type: individual value_type: raw @@ -194,7 +194,7 @@ traits: Technologies, Valencia, CA, USA). These analyses were performed in the Stable Isotope Core Laboratory, Washington State University, Pullman, WA, USA. - var_in: leaf P area (mmol m-2) - unit_in: mmolP/m2 + unit_in: mmol{P}/m2 trait_name: leaf_P_per_area entity_type: individual value_type: raw @@ -238,7 +238,7 @@ traits: with measurements made at other leaf temperatures. - var_in: Vcmax at 25 deg C (umol m-2 s-1) unit_in: umol/m2/s - trait_name: leaf_fluorescence_Vcmax_per_area + trait_name: leaf_photosynthesis_Vcmax_per_area entity_type: individual value_type: raw basis_of_value: measurement @@ -273,7 +273,7 @@ traits: with measurements made at other leaf temperatures. - var_in: J at 25 deg C (umol e- m-2 s-1) unit_in: umol/m2/s - trait_name: leaf_fluorescence_Jmax_per_area + trait_name: leaf_photosynthesis_Jmax_per_area entity_type: individual value_type: raw basis_of_value: measurement @@ -291,7 +291,7 @@ traits: leaf temperature and the column 'Tleaf (deg C)' indicates the leaf temperatures during gas exchange measurements. - var_in: Asat_umol_m-2_s-1 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -330,7 +330,7 @@ traits: Gas exchange measurements were taken between 0800 h and 1700 h local time at each site.' - var_in: g_at_Asat_mol_m-2_s-1 - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -369,7 +369,7 @@ traits: Gas exchange measurements were taken between 0800 h and 1700 h local time at each site.' - var_in: ci_over_ca_at_Asat - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: individual value_type: raw @@ -408,7 +408,7 @@ traits: Gas exchange measurements were taken between 0800 h and 1700 h local time at each site.' - var_in: ci_at_Asat_umol_mol-1 - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: raw @@ -447,7 +447,7 @@ traits: Gas exchange measurements were taken between 0800 h and 1700 h local time at each site.' - var_in: trans_at_Asat_mmol_m-2_s-1 - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: raw @@ -486,7 +486,7 @@ traits: Gas exchange measurements were taken between 0800 h and 1700 h local time at each site.' - var_in: Amax_umol_m-2_s-1 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_maximum entity_type: individual value_type: raw @@ -525,7 +525,7 @@ traits: Gas exchange measurements were taken between 0800 h and 1700 h local time at each site.' - var_in: g_at_Amax_mol_m-2_s-1 - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Amax entity_type: individual value_type: raw @@ -564,7 +564,7 @@ traits: Gas exchange measurements were taken between 0800 h and 1700 h local time at each site.' - var_in: trans_at_Amax_mmol_m-2_s-1 - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Amax entity_type: individual value_type: raw @@ -603,7 +603,7 @@ traits: Gas exchange measurements were taken between 0800 h and 1700 h local time at each site.' - var_in: Rd- light curve (umol m-2 s-1) - unit_in: neg_umolCO2/m2/s + unit_in: neg_umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: individual value_type: raw @@ -641,7 +641,7 @@ traits: Gas exchange measurements were taken between 0800 h and 1700 h local time at each site.' - var_in: Amax- light curve (umol m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: .na entity_type: individual value_type: raw diff --git a/data/Cheal_2017/metadata.yml b/data/Cheal_2017/metadata.yml index da7f36079..fc2bb7dc6 100644 --- a/data/Cheal_2017/metadata.yml +++ b/data/Cheal_2017/metadata.yml @@ -206,7 +206,7 @@ traits: and reproductive maturity (mostly > 2 years), can establish in long-unburnt vegetation, but can also establish immediately after fire. - var_in: SPP LIFE 3, 10, 20, 50, 100 (F=inadequate data) - unit_in: years + unit_in: a trait_name: lifespan entity_type: species value_type: bin diff --git a/data/Cheesman_2020/metadata.yml b/data/Cheesman_2020/metadata.yml index e39cf0954..aabb66649 100644 --- a/data/Cheesman_2020/metadata.yml +++ b/data/Cheesman_2020/metadata.yml @@ -208,7 +208,7 @@ traits: Pavia, Italy) coupled to a Nu Horizon Isotope Ratio Mass Spectrometer (Nu, Wrexham, UK) at the University of Adelaide. - var_in: d15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw @@ -222,7 +222,7 @@ traits: Pavia, Italy) coupled to a Nu Horizon Isotope Ratio Mass Spectrometer (Nu, Wrexham, UK) at the University of Adelaide. - var_in: d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -236,7 +236,7 @@ traits: Pavia, Italy) coupled to a Nu Horizon Isotope Ratio Mass Spectrometer (Nu, Wrexham, UK) at the University of Adelaide. - var_in: Photo - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -248,7 +248,7 @@ traits: using a Licor 6400 Portable Photosynthesis machine (LI-COR, Lincoln, NE, USA). - var_in: Vcmax unit_in: umol/m2/s - trait_name: leaf_fluorescence_Vcmax_per_area + trait_name: leaf_photosynthesis_Vcmax_per_area entity_type: individual value_type: raw basis_of_value: measurement @@ -259,7 +259,7 @@ traits: using a Licor 6400 Portable Photosynthesis machine (LI-COR, Lincoln, NE, USA). - var_in: jmax unit_in: umol/m2/s - trait_name: leaf_fluorescence_Jmax_per_area + trait_name: leaf_photosynthesis_Jmax_per_area entity_type: individual value_type: raw basis_of_value: measurement @@ -269,7 +269,7 @@ traits: irradiance (A-I) curves) were made on at least two leaves of 71 species collected, using a Licor 6400 Portable Photosynthesis machine (LI-COR, Lincoln, NE, USA). - var_in: Cond - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -300,7 +300,7 @@ traits: depth (perpendicular to plane of leaf lamina) were measured on individual leaves using a micrometer before removal and drying at 60 deg C for 72h; petiole height - var_in: UI_Av - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -327,7 +327,7 @@ traits: index, a comparative measure of the perimeter of a cell compared to the perimeter of a circle with the same area, has been calculated following (Kuerschner, 1997). - var_in: CA_Av - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw diff --git a/data/Choat_2006/metadata.yml b/data/Choat_2006/metadata.yml index cbd822f98..982d1b3b3 100644 --- a/data/Choat_2006/metadata.yml +++ b/data/Choat_2006/metadata.yml @@ -139,7 +139,7 @@ contexts: - value: '18:00:00' traits: - var_in: A - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_ambient entity_type: individual value_type: mean @@ -178,7 +178,7 @@ traits: the leaf area distal to the branch was measured with a CI-203 leaf area meter (CID, Camas, WA). - var_in: E - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration entity_type: individual value_type: mean @@ -217,7 +217,7 @@ traits: the leaf area distal to the branch was measured with a CI-203 leaf area meter (CID, Camas, WA). - var_in: gs - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_ambient entity_type: individual value_type: mean @@ -334,7 +334,7 @@ traits: the leaf area distal to the branch was measured with a CI-203 leaf area meter (CID, Camas, WA). - var_in: Ves Count - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: stem_vessel_density entity_type: individual value_type: raw @@ -402,7 +402,7 @@ traits: replicates: .na methods: sourced from literature - var_in: Ks (kg m-1 MPa-1 s-1) - unit_in: kg/m/s/MPa + unit_in: kg/m/MPa/s trait_name: sapwood_specific_conductivity entity_type: population value_type: mean @@ -434,7 +434,7 @@ traits: value (HV) was determined as the ratio of transverse area of sapwood to the distal leaf area. - var_in: KL (kg m-1 MPa-1 s-1) - unit_in: kg/m/s/MPa + unit_in: kg/m/MPa/s trait_name: leaf_specific_conductivity entity_type: population value_type: mean @@ -453,7 +453,7 @@ traits: longer than maximum vessel length, shaved at both ends with a sharp razor blade and transferred quickly to the apparatus. The segments were flushed with perfusing solution (degassed 10mMKCl, pH 6.7, filtered to 0.22 um) for 30min at 100 kPa. - This solutionwas chosen in order to minimise the hydrogel response of angiosperm + This solution was chosen in order to minimise the hydrogel response of angiosperm pit membranes (Zwieniecki et al. 2001). Measurements of Kh were then made with a gravity induced, low pressure (~10 kPa) application of solution from a secondary reservoir. Hydraulic conductivity (Kh, kg s-1 MPa-1 m) was calculated from Kh=F/(delta @@ -466,7 +466,7 @@ traits: value (HV) was determined as the ratio of transverse area of sapwood to the distal leaf area. - var_in: Kh - unit_in: kg*m/s/MPa + unit_in: kg.m/MPa/s trait_name: stem_hydraulic_conductivity entity_type: population value_type: mean @@ -498,7 +498,7 @@ traits: value (HV) was determined as the ratio of transverse area of sapwood to the distal leaf area. - var_in: Huber value - unit_in: mm2_sapwood/mm2_leaf + unit_in: mm2{sapwood}/mm2{leaf} trait_name: huber_value entity_type: population value_type: mean diff --git a/data/Clarke_2009/metadata.yml b/data/Clarke_2009/metadata.yml index 467df7960..8c2b6c3ca 100644 --- a/data/Clarke_2009/metadata.yml +++ b/data/Clarke_2009/metadata.yml @@ -256,7 +256,7 @@ traits: of Gill and Bradstock (1992). life_stage: adult - var_in: Primary juvenile period - unit_in: years + unit_in: a trait_name: reproductive_maturity entity_type: population value_type: minimum @@ -271,7 +271,7 @@ traits: of flowering and fruiting of species after fire. life_stage: adult - var_in: Secondary juvenile period - unit_in: years + unit_in: a trait_name: reproductive_maturity_secondary_after_fire entity_type: population value_type: minimum diff --git a/data/Cooper_2013/metadata.yml b/data/Cooper_2013/metadata.yml index 8168f51c6..b5bbc1e6c 100644 --- a/data/Cooper_2013/metadata.yml +++ b/data/Cooper_2013/metadata.yml @@ -102,7 +102,7 @@ traits: methods: reference book - var_in: stem diameter unit_in: m - trait_name: stem_basal_diameter + trait_name: plant_diameter_breast_height entity_type: species value_type: maximum basis_of_value: measurement @@ -180,7 +180,7 @@ traits: value_type: maximum basis_of_value: measurement replicates: .na - methods: measurement + methods: reference book - var_in: min seed length unit_in: mm trait_name: seed_length diff --git a/data/Crous_2013/metadata.yml b/data/Crous_2013/metadata.yml index 055d78a55..7a13816df 100644 --- a/data/Crous_2013/metadata.yml +++ b/data/Crous_2013/metadata.yml @@ -205,7 +205,7 @@ contexts: traits: - var_in: Vcmax unit_in: umol/m2/s - trait_name: leaf_fluorescence_Vcmax_per_area + trait_name: leaf_photosynthesis_Vcmax_per_area entity_type: individual value_type: maximum basis_of_value: measurement @@ -247,7 +247,7 @@ traits: replicates: .na methods: leaf temperature during gas exchange measurements - var_in: Rd - unit_in: neg_umolCO2/m2/s + unit_in: neg_umol{CO2}/m2/s trait_name: leaf_light_respiration_per_area entity_type: individual value_type: raw @@ -305,7 +305,7 @@ traits: to analyse for total %N and %C on a microdigestion apparatus interfacing a CHN elemental analyser (TruSpec; LECO Corp., St. Joseph, MI, USA). - var_in: A390 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -341,7 +341,7 @@ traits: on how humidity was controlled in the experimental chambers to minimize stomatal closure. - var_in: A630 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_maximum entity_type: individual value_type: raw @@ -392,7 +392,7 @@ traits: to analyse for total %N and %C on a microdigestion apparatus interfacing a CHN elemental analyser (TruSpec; LECO Corp., St. Joseph, MI, USA). - var_in: Agrow - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: .na entity_type: individual value_type: raw @@ -400,7 +400,7 @@ traits: replicates: 1 methods: Photosynthesis rate (in umol m-2 s-1) at growth CO2 concentration - var_in: g_grow - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -435,7 +435,7 @@ traits: chambers to minimize stomatal closure. - var_in: Jmax unit_in: umol/m2/s - trait_name: leaf_fluorescence_Jmax_per_area + trait_name: leaf_photosynthesis_Jmax_per_area entity_type: individual value_type: maximum basis_of_value: measurement @@ -470,7 +470,7 @@ traits: chambers to minimize stomatal closure. - var_in: Jmax25 unit_in: umol/m2/s - trait_name: leaf_fluorescence_Jmax_per_area + trait_name: leaf_photosynthesis_Jmax_per_area entity_type: individual value_type: raw basis_of_value: measurement @@ -505,7 +505,7 @@ traits: chambers to minimize stomatal closure. - var_in: Vcmax25 unit_in: umol/m2/s - trait_name: leaf_fluorescence_Vcmax_per_area + trait_name: leaf_photosynthesis_Vcmax_per_area entity_type: individual value_type: raw basis_of_value: measurement @@ -539,7 +539,7 @@ traits: See manuscript for additional details on how humidity was controlled in the experimental chambers to minimize stomatal closure. - var_in: Rd25 - unit_in: neg_umolCO2/m2/s + unit_in: neg_umol{CO2}/m2/s trait_name: leaf_light_respiration_per_area entity_type: individual value_type: raw diff --git a/data/Cunningham_1999/metadata.yml b/data/Cunningham_1999/metadata.yml index acf642371..00015ba37 100644 --- a/data/Cunningham_1999/metadata.yml +++ b/data/Cunningham_1999/metadata.yml @@ -647,7 +647,7 @@ traits: replicates: .na methods: see manuscript - var_in: Phenolics (relative index) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: .na value_type: .na @@ -655,7 +655,7 @@ traits: replicates: .na methods: see manuscript - var_in: Tannins (relative index) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: .na value_type: .na diff --git a/data/Curran_2009/metadata.yml b/data/Curran_2009/metadata.yml index 048550c19..ab079ed11 100644 --- a/data/Curran_2009/metadata.yml +++ b/data/Curran_2009/metadata.yml @@ -217,7 +217,7 @@ traits: to minimise any effects of time of day. Stomatal conductance was measured during January, March and August 2003. - var_in: stomatal_conductance_per_area_ambient - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_ambient entity_type: individual value_type: mean @@ -272,7 +272,7 @@ traits: drying the leaves to constant mass at 80 deg C. Two to three leaves were measured per individual and the average calculated. - var_in: leaf angle to horizontal (deg) - unit_in: degrees + unit_in: deg trait_name: leaf_inclination_angle entity_type: individual value_type: mean diff --git a/data/Denton_2007/metadata.yml b/data/Denton_2007/metadata.yml index bffe07bbd..9b8543573 100644 --- a/data/Denton_2007/metadata.yml +++ b/data/Denton_2007/metadata.yml @@ -363,7 +363,7 @@ traits: at 80 deg C. basis_of_record: field - var_in: Leaf lifespan (months) - unit_in: month + unit_in: mo trait_name: leaf_lifespan entity_type: individual value_type: raw diff --git a/data/Dong_2017/metadata.yml b/data/Dong_2017/metadata.yml index effd834ed..d4deb60c8 100644 --- a/data/Dong_2017/metadata.yml +++ b/data/Dong_2017/metadata.yml @@ -397,7 +397,7 @@ traits: from AusTraits 2021-10-28. These appear to be bulked numbers including multiple leaves.] - var_in: d13c - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: population value_type: mean @@ -427,7 +427,7 @@ traits: the Stable Isotope Core Laboratory of Washington State University, USA. The value is a bulked value based on collections from 5-6 individuals. - var_in: d15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: population value_type: mean @@ -486,7 +486,7 @@ traits: were derived from the reported delta13C values using the standard formula. The value is a bulked value based on collections from 5-6 individuals. - var_in: ci_ca - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: population value_type: mean diff --git a/data/Du_2018/metadata.yml b/data/Du_2018/metadata.yml index 0c98e757a..17c41bb36 100644 --- a/data/Du_2018/metadata.yml +++ b/data/Du_2018/metadata.yml @@ -100,7 +100,7 @@ contexts: week (Monday, Wednesday, and Friday). traits: - var_in: ET (g H2O/day/cm2) - unit_in: g/day/cm2 + unit_in: g/cm2/d trait_name: whole_plant_transpiration entity_type: individual value_type: raw @@ -147,7 +147,7 @@ traits: growth rate (RGR) of WW and WD treatments and was determined as follows, (final dry mass - initial dry mass)/(initial dry mass/d). - var_in: RGR(mg g-1day-1) - unit_in: mg/g/day + unit_in: mg/g/d trait_name: .na.character entity_type: individual value_type: raw diff --git a/data/Duan_2015/metadata.yml b/data/Duan_2015/metadata.yml index 5b1479627..441da591e 100644 --- a/data/Duan_2015/metadata.yml +++ b/data/Duan_2015/metadata.yml @@ -189,7 +189,7 @@ contexts: description: Plants grown at elevated temperatures, 30/22 deg C (day/night). traits: - var_in: Photo (umol m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -207,7 +207,7 @@ traits: across C and species treatments), representing the environmental conditions in the glasshouse during the day. - var_in: Cond (mol m-2 s-1) - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -225,7 +225,7 @@ traits: across C and species treatments), representing the environmental conditions in the glasshouse during the day. - var_in: Ci (umol mol-1) - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: raw @@ -243,7 +243,7 @@ traits: across C and species treatments), representing the environmental conditions in the glasshouse during the day. - var_in: Trmmol (mmol m-2 s-1) - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: raw @@ -261,7 +261,7 @@ traits: across C and species treatments), representing the environmental conditions in the glasshouse during the day. - var_in: CiCa - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: individual value_type: raw @@ -279,7 +279,7 @@ traits: across C and species treatments), representing the environmental conditions in the glasshouse during the day. - var_in: Rdark (umol m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: individual value_type: raw @@ -426,7 +426,7 @@ traits: Ireland Ltd, Wicklow, Ireland). Soluble sugars were determined on the supernatants by the anthrone method (Ebell 1969). - var_in: root_shoot_ratio - unit_in: mg_root/mg_shoot + unit_in: mg{root}/mg{shoot} trait_name: root_shoot_ratio entity_type: individual value_type: raw diff --git a/data/Dwyer_2017/metadata.yml b/data/Dwyer_2017/metadata.yml index 8b906d03c..791a4e34d 100644 --- a/data/Dwyer_2017/metadata.yml +++ b/data/Dwyer_2017/metadata.yml @@ -213,7 +213,7 @@ traits: dried at 60 deg C for 72 hours and weighed using a microbalance (Sartorius AG, Goettingen, Germany). - var_in: max_height - unit_in: cm + unit_in: mm trait_name: plant_height entity_type: population value_type: maximum diff --git a/data/Eamus_1998/metadata.yml b/data/Eamus_1998/metadata.yml index 84ca84d7a..1e1335e01 100644 --- a/data/Eamus_1998/metadata.yml +++ b/data/Eamus_1998/metadata.yml @@ -95,7 +95,7 @@ traits: replicates: .na methods: assume reference book - var_in: leaf lifespan (months) - unit_in: months + unit_in: mo trait_name: leaf_lifespan entity_type: population value_type: mean @@ -154,7 +154,7 @@ traits: Instruments, Milwaukee, WI). Leaf area was determined with a leaf area meter (Delta-T Devices, Cambridge, U.K.). - var_in: Amass (nmol/g/s) - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: population value_type: mean @@ -167,7 +167,7 @@ traits: when assimilation rate is maximal in this environment (Eamus and Cole 1997, Prior et al. 1997a, 1997b). Leaves were then dried at 70 deg C and weighed. - var_in: Aarea (micromol/m2/s) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: population value_type: mean @@ -183,7 +183,7 @@ traits: to the laboratory (typically 2--4 h). Leaf area was determined with a leaf area meter (Delta-T Devices, Cambridge, U.K.). - var_in: Rdmass - unit_in: umolCO2/g/s + unit_in: umol{CO2}/g/s trait_name: leaf_dark_respiration_per_dry_mass entity_type: population value_type: mean @@ -191,7 +191,7 @@ traits: replicates: 7 methods: Not in published methods, although results published. - var_in: Rdarea - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: population value_type: mean @@ -199,7 +199,7 @@ traits: replicates: 7 methods: Not in published methods, although results published. - var_in: transpiration_rate_mmolH20_s-1 - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: population value_type: mean @@ -215,7 +215,7 @@ traits: to the laboratory (typically 2--4 h). Leaf area was determined with a leaf area meter (Delta-T Devices, Cambridge, U.K.). - var_in: NUE - unit_in: umolCO2/molN/s + unit_in: umol{CO2}/mol{N}/s trait_name: leaf_photosynthetic_nitrogen_use_efficiency_saturated entity_type: population value_type: mean @@ -231,7 +231,7 @@ traits: to the laboratory (typically 2--4 h). Leaf area was determined with a leaf area meter (Delta-T Devices, Cambridge, U.K.). - var_in: stomatal conductance - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: population value_type: mean diff --git a/data/Eamus_1999/metadata.yml b/data/Eamus_1999/metadata.yml index 0c2070981..9e74f0d0f 100644 --- a/data/Eamus_1999/metadata.yml +++ b/data/Eamus_1999/metadata.yml @@ -158,7 +158,7 @@ traits: Instruments, Milwaukee, WI).The area of fresh leaves was measured with a Delta-T Devices leaf area meter (Cambridge, U.K.). - var_in: Amass (nmol/g/s) - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: population value_type: mean @@ -173,7 +173,7 @@ traits: and early February (mid-wet season). Leaves were dried at 70 deg C to constant weight. - var_in: Aarea (micromol/m2/s) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: population value_type: mean diff --git a/data/EsperonRodriguez_2019/metadata.yml b/data/EsperonRodriguez_2019/metadata.yml index ce7e4503a..3728714ee 100644 --- a/data/EsperonRodriguez_2019/metadata.yml +++ b/data/EsperonRodriguez_2019/metadata.yml @@ -64,7 +64,7 @@ locations: contexts: .na traits: - var_in: fv/fm - unit_in: x/x + unit_in: '{dimensionless}' trait_name: leaf_fluorescence_fv_over_fm entity_type: individual value_type: raw @@ -74,7 +74,7 @@ traits: Fv/Fm was measured at pre-dawn using a MINI-PAM-II Photosynthesis Yield Analayzer (Heinz Walz Gmbh, Germany) - var_in: gS (mmol m-2 s-1) - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_ambient entity_type: individual value_type: raw diff --git a/data/EsperonRodriguez_2020/metadata.yml b/data/EsperonRodriguez_2020/metadata.yml index 6f090c72f..8fdd42a9a 100644 --- a/data/EsperonRodriguez_2020/metadata.yml +++ b/data/EsperonRodriguez_2020/metadata.yml @@ -134,7 +134,7 @@ traits: methods: Specific leaf area (SLA) was calculated by dividing the surface area of the fresh leaf and dry mass (Cornelissen et al. 2003) - var_in: HV (m-4) - unit_in: mm2_sapwood/mm2_leaf + unit_in: mm2{sapwood}/mm2{leaf} trait_name: huber_value entity_type: individual value_type: raw @@ -143,7 +143,7 @@ traits: methods: The Huber value (HV) as the ratio of the sapwood cross-sectional area to the supported leaf area distal to the measured branch segment. - var_in: _13C (a) - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw diff --git a/data/Everingham_2020/metadata.yml b/data/Everingham_2020/metadata.yml index 1426be8d3..3c2b5a8d4 100644 --- a/data/Everingham_2020/metadata.yml +++ b/data/Everingham_2020/metadata.yml @@ -574,7 +574,7 @@ traits: accessions were 100 % non-viable and data for these species is limited to seed mass and seed shape. - var_in: Photo (Asat; umol CO2 m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: mean @@ -605,7 +605,7 @@ traits: umol CO2 m-2 s-1) derived from photosynthesis equations by von Caemmerer and Farquhar [57]. We also recorded stomatal conductance (gs; mmol H2O m-2 s-1). - var_in: Conductance (gs; mmol H2O m-2 s-1) - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: mean @@ -636,7 +636,7 @@ traits: umol CO2 m-2 s-1) derived from photosynthesis equations by von Caemmerer and Farquhar [57]. We also recorded stomatal conductance (gs; mmol H2O m-2 s-1). - var_in: Ci - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: mean @@ -667,7 +667,7 @@ traits: umol CO2 m-2 s-1) derived from photosynthesis equations by von Caemmerer and Farquhar [57]. We also recorded stomatal conductance (gs; mmol H2O m-2 s-1). - var_in: Roottoshoot - unit_in: mg_root/mg_shoot + unit_in: mg{root}/mg{shoot} trait_name: root_shoot_ratio entity_type: individual value_type: raw diff --git a/data/Falster_2003/metadata.yml b/data/Falster_2003/metadata.yml index 78466b20d..e66b62ba4 100644 --- a/data/Falster_2003/metadata.yml +++ b/data/Falster_2003/metadata.yml @@ -103,7 +103,7 @@ traits: replicates: .na methods: expert opinion - var_in: MLA - unit_in: degrees + unit_in: deg trait_name: leaf_inclination_angle entity_type: population value_type: mean @@ -207,7 +207,7 @@ traits: average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles - var_in: Leaf No. - unit_in: count + unit_in: '{count}' trait_name: .na entity_type: population value_type: mean diff --git a/data/Falster_2005_1/metadata.yml b/data/Falster_2005_1/metadata.yml index 0d34dd531..7857f3ed7 100644 --- a/data/Falster_2005_1/metadata.yml +++ b/data/Falster_2005_1/metadata.yml @@ -146,7 +146,7 @@ traits: published (Osunkoya et al. 1994; Grubb et al. 1998) and unpublished (P. Juniper, CSIRO Atherton) sources. - var_in: LASA10 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean @@ -189,7 +189,7 @@ traits: the distance from the branch tip at which stem cross-sectional area reached 10 mm2 varied from 64 to 995 mm.' - var_in: LASA250 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean @@ -232,7 +232,7 @@ traits: the distance from the branch tip at which stem cross-sectional area reached 10 mm2 varied from 64 to 995 mm.' - var_in: LASA50 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean @@ -275,7 +275,7 @@ traits: the distance from the branch tip at which stem cross-sectional area reached 10 mm2 varied from 64 to 995 mm.' - var_in: LASA1000 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean diff --git a/data/Falster_2005_2/metadata.yml b/data/Falster_2005_2/metadata.yml index 9d6ee574c..a637a7709 100644 --- a/data/Falster_2005_2/metadata.yml +++ b/data/Falster_2005_2/metadata.yml @@ -172,7 +172,7 @@ traits: using field material supplemented with additional data from a global seed mass database, compiled and maintained by Angela Moles (Moles and Westoby 2003). - var_in: LASA10 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean @@ -215,7 +215,7 @@ traits: the distance from the branch tip at which stem cross-sectional area reached 10 mm2 varied from 64 to 995 mm.' - var_in: LASA250 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean @@ -258,7 +258,7 @@ traits: the distance from the branch tip at which stem cross-sectional area reached 10 mm2 varied from 64 to 995 mm.' - var_in: LASA50 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean @@ -301,7 +301,7 @@ traits: the distance from the branch tip at which stem cross-sectional area reached 10 mm2 varied from 64 to 995 mm.' - var_in: LASA1000 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean diff --git a/data/Farrell_2013/metadata.yml b/data/Farrell_2013/metadata.yml index 8d9c39a1e..95bf9d1f2 100644 --- a/data/Farrell_2013/metadata.yml +++ b/data/Farrell_2013/metadata.yml @@ -166,7 +166,7 @@ traits: potential measurements of S. pachyphyllum were not captured in this experiment due to high leaf succulence. - var_in: Shoot:Root - unit_in: mg_shoot/mg_root + unit_in: mg{shoot}/mg{root} trait_name: root_shoot_ratio entity_type: individual value_type: raw @@ -214,7 +214,7 @@ traits: used to determine root mass fraction (RMF, g root g-1 total plant), leaf area ratio (LAR, m2 leaf kg-1 plant) and specific leaf area (SLA m2 kg-1 leaf). - var_in: WUE - unit_in: g H2O/g biomass + unit_in: g{H2O}/g{biomass} trait_name: leaf_water_use_efficiency_integrated entity_type: individual value_type: raw @@ -229,7 +229,7 @@ traits: unit biomass (E) was determined by dividing cumulative transpiration by final biomass (dry weight) at the end of the experiment. (units are g H2O/g biomass.) - var_in: RGR mg g/day - unit_in: mg*g/day + unit_in: mg.g/d trait_name: .na entity_type: individual value_type: raw @@ -245,7 +245,7 @@ traits: used to determine root mass fraction (RMF, g root g-1 total plant), leaf area ratio (LAR, m2 leaf kg-1 plant) and specific leaf area (SLA m2 kg-1 leaf). - var_in: Daily transpiration g H20/leaf area cm2 - unit_in: g/day/cm2 + unit_in: g/cm2/d trait_name: whole_plant_transpiration entity_type: individual value_type: raw @@ -324,7 +324,7 @@ traits: used to determine root mass fraction (RMF, g root g-1 total plant), leaf area ratio (LAR, m2 leaf kg-1 plant) and specific leaf area (SLA m2 kg-1 leaf). - var_in: Stomatal density Upper surface - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_stomatal_density_adaxial entity_type: individual value_type: raw @@ -337,7 +337,7 @@ traits: vision fields of each leaf (both upper and lower surfaces) of five different well-watered plants per species. - var_in: Stomatal density Lower surface - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_stomatal_density_abaxial entity_type: individual value_type: raw @@ -350,7 +350,7 @@ traits: vision fields of each leaf (both upper and lower surfaces) of five different well-watered plants per species. - var_in: Mean Stomatal density (upper and lower surfaces) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_stomatal_density_average entity_type: individual value_type: raw diff --git a/data/Funk_2016/metadata.yml b/data/Funk_2016/metadata.yml index 6df2210a7..2bf795438 100644 --- a/data/Funk_2016/metadata.yml +++ b/data/Funk_2016/metadata.yml @@ -231,7 +231,7 @@ traits: analyzer (SmartChem 200; Unity Scientific, Brookfi eld, Connecticut, USA) following Kjeldahl digest. - var_in: Aarea - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -243,7 +243,7 @@ traits: temperature of 25 deg C, and at relative humidity of 40-60%. When necessary, photosynthetic rates were temperature- corrected using standard equations (von Caemmerer 2000). - var_in: WUE - unit_in: mmolCO2/molH2O + unit_in: mmol{CO2}/mol{H2O} trait_name: leaf_water_use_efficiency_photosynthetic entity_type: individual value_type: raw @@ -256,7 +256,7 @@ traits: rates were temperature- corrected using standard equations (von Caemmerer 2000). Water-use efficiency was calculated as the ratio of photosynthesis to transpiration. - var_in: Amass - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: individual value_type: raw @@ -268,7 +268,7 @@ traits: temperature of 25 deg C, and at relative humidity of 40-60%. When necessary, photosynthetic rates were temperature- corrected using standard equations (von Caemmerer 2000). - var_in: PNUE - unit_in: umolCO2/molN/s + unit_in: umol{CO2}/mol{N}/s trait_name: leaf_photosynthetic_nitrogen_use_efficiency_saturated entity_type: individual value_type: raw @@ -277,7 +277,7 @@ traits: methods: Photosynthetic nitrogen-use efficiency (PNUE) was calculated as the ratio of photosynthesis to leaf N. - var_in: PPUE - unit_in: mmolCO2/molP/s + unit_in: mmol{CO2}/mol{P}/s trait_name: leaf_photosynthetic_phosphorus_use_efficiency_saturated entity_type: individual value_type: raw diff --git a/data/Geange_2017/metadata.yml b/data/Geange_2017/metadata.yml index f36529744..2e41770c7 100644 --- a/data/Geange_2017/metadata.yml +++ b/data/Geange_2017/metadata.yml @@ -157,7 +157,7 @@ traits: biomass was calculated as the sum of leaves and stem dry weight (g), with reproductive biomass included for those that flowered. - var_in: ABG_BG - unit_in: mg_shoot/mg_root + unit_in: mg{shoot}/mg{root} trait_name: root_shoot_ratio entity_type: individual value_type: raw @@ -171,7 +171,7 @@ traits: biomass was calculated as the sum of leaves and stem dry weight (g), with reproductive biomass included for those that flowered. - var_in: Photo - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -189,7 +189,7 @@ traits: assessment indicated that this light level was saturating. Photosynthetic measurements were done between 8:00 till 13:00 h, before stomatal closure. - var_in: Cond - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -207,7 +207,7 @@ traits: assessment indicated that this light level was saturating. Photosynthetic measurements were done between 8:00 till 13:00 h, before stomatal closure. - var_in: Ci - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: raw @@ -225,7 +225,7 @@ traits: assessment indicated that this light level was saturating. Photosynthetic measurements were done between 8:00 till 13:00 h, before stomatal closure. - var_in: Trmmol - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: raw @@ -243,7 +243,7 @@ traits: assessment indicated that this light level was saturating. Photosynthetic measurements were done between 8:00 till 13:00 h, before stomatal closure. - var_in: Ci_Ca - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: individual value_type: raw @@ -261,7 +261,7 @@ traits: assessment indicated that this light level was saturating. Photosynthetic measurements were done between 8:00 till 13:00 h, before stomatal closure. - var_in: WUEi - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: leaf_water_use_efficiency_photosynthetic entity_type: individual value_type: raw @@ -279,7 +279,7 @@ traits: assessment indicated that this light level was saturating. Photosynthetic measurements were done between 8:00 till 13:00 h, before stomatal closure. - var_in: Photo_D - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -297,7 +297,7 @@ traits: assessment indicated that this light level was saturating. Photosynthetic measurements were done between 8:00 till 13:00 h, before stomatal closure. - var_in: Cond_D - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -315,7 +315,7 @@ traits: assessment indicated that this light level was saturating. Photosynthetic measurements were done between 8:00 till 13:00 h, before stomatal closure. - var_in: Ci_D - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: raw @@ -333,7 +333,7 @@ traits: assessment indicated that this light level was saturating. Photosynthetic measurements were done between 8:00 till 13:00 h, before stomatal closure. - var_in: Trmmol_D - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: raw @@ -351,7 +351,7 @@ traits: assessment indicated that this light level was saturating. Photosynthetic measurements were done between 8:00 till 13:00 h, before stomatal closure. - var_in: Ci_Ca_D - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: individual value_type: raw @@ -369,7 +369,7 @@ traits: assessment indicated that this light level was saturating. Photosynthetic measurements were done between 8:00 till 13:00 h, before stomatal closure. - var_in: WUEi_D - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: leaf_water_use_efficiency_photosynthetic entity_type: individual value_type: raw @@ -511,7 +511,7 @@ traits: elemental analysis (%N) were performed on an isochrome continuous flow stable isotope ratio mass spectrometer (Micromass, Middlewich, England). - var_in: d13C:2 - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw diff --git a/data/Geange_2020/metadata.yml b/data/Geange_2020/metadata.yml index 40c911fe7..ed2c6aa37 100644 --- a/data/Geange_2020/metadata.yml +++ b/data/Geange_2020/metadata.yml @@ -180,7 +180,7 @@ traits: leaf area (cm2)/mass (g) for the three scanned leaves (Perez-Harguindeguy et al. 2013). - var_in: root_shoot_ratio - unit_in: mg_root/mg_shoot + unit_in: mg{root}/mg{shoot} trait_name: root_shoot_ratio entity_type: individual value_type: raw @@ -218,7 +218,7 @@ traits: leaf area (cm2)/mass (g) for the three scanned leaves (Perez-Harguindeguy et al. 2013). - var_in: Fv.Fm - unit_in: x/x + unit_in: '{dimensionless}' trait_name: leaf_fluorescence_fv_over_fm entity_type: individual value_type: raw @@ -269,7 +269,7 @@ traits: leaf area (cm2)/mass (g) for the three scanned leaves (Perez-Harguindeguy et al. 2013). - var_in: FvFm_Pre_IN - unit_in: x/x + unit_in: '{dimensionless}' trait_name: leaf_fluorescence_fv_over_fm entity_type: individual value_type: raw @@ -282,7 +282,7 @@ traits: analyser (PEA Meter, Hansatech Instruments, King's Lynn, UK). Measurements were taken after 20 min of dark adaptation on a single leaf per seedling. - var_in: FvFm_Post_IN - unit_in: x/x + unit_in: '{dimensionless}' trait_name: leaf_fluorescence_fv_over_fm entity_type: individual value_type: raw diff --git a/data/Ghannoum_2010/metadata.yml b/data/Ghannoum_2010/metadata.yml index 759c1bf1c..89675a0d1 100644 --- a/data/Ghannoum_2010/metadata.yml +++ b/data/Ghannoum_2010/metadata.yml @@ -186,7 +186,7 @@ contexts: description: LMA based on the ratio of leaf mass / leaf area of a single leaf. traits: - var_in: A_sat_umol_per_m2_s1 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -203,7 +203,7 @@ traits: and Ci/Ca were measured. There were five replicate measurements per species and treatment. - var_in: Cond_at_A_sat_mol_per_m2_s1 - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -220,7 +220,7 @@ traits: and Ci/Ca were measured. There were five replicate measurements per species and treatment. - var_in: Ci_at_A_sat_ppm - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: raw @@ -237,7 +237,7 @@ traits: and Ci/Ca were measured. There were five replicate measurements per species and treatment. - var_in: Trans_at_A_sat_mmol_per_m2_s1 - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: raw @@ -254,7 +254,7 @@ traits: and Ci/Ca were measured. There were five replicate measurements per species and treatment. - var_in: A_max_umol_per_m2_s1 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_maximum entity_type: individual value_type: raw @@ -272,7 +272,7 @@ traits: treatment. To then determine Amax, CO2 concentrations were increased to at least 1500 ppm. - var_in: Cond_at_A_max_mol_per_m2_s1 - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Amax entity_type: individual value_type: raw @@ -290,7 +290,7 @@ traits: treatment. To then determine Amax, CO2 concentrations were increased to at least 1500 ppm. - var_in: Ci_at_A_max_ppm - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Amax entity_type: individual value_type: raw @@ -308,7 +308,7 @@ traits: treatment. To then determine Amax, CO2 concentrations were increased to at least 1500 ppm. - var_in: Trans_at_A_max_mmol_per_m2_s1 - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Amax entity_type: individual value_type: raw @@ -333,17 +333,7 @@ traits: basis_of_value: measurement replicates: 1 method_context: entire plant LMA - methods: Two destructive harvests were conducted 80 and 150 DAP; nine trees at 80 - DAP and 18 trees at 150 DAP of each species were harvested within each [CO2] and - temperature treatment combination. During each harvest, we measured the length - of the main stem, diameter at stem base, and separated the seedling into stems - (including branches and petioles) and leaf blades; shoot tips were removed separately - and roots were washed free of soil. Total leaf area was determined using a portable - leaf area meter (LI-3100A, LI-COR, Lincoln, NE, USA). The number of leaves and - branches were counted at 150 DAP harvest only. Harvested samples were oven-dried - at 80 deg C for 48 h, then weighed. For each plant, mean leaf mass per area (LMA) - and leaf area ratio (LAR) were calculated as total leaf dry mass/total leaf area - and total leaf area/total plant dry mass, respectively. + methods: Leaf area was determined using a portable leaf area meter (LI-3100A, LI-COR, Lincoln, NE, USA).Harvested samples were oven-dried at 80 deg C for 48 h, then weighed. - var_in: leaf_area_ratio unit_in: mm2/mg trait_name: leaf_area_ratio @@ -363,7 +353,7 @@ traits: and leaf area ratio (LAR) were calculated as total leaf dry mass/total leaf area and total leaf area/total plant dry mass, respectively. - var_in: RootShoot - unit_in: mg_root/mg_shoot + unit_in: mg{root}/mg{shoot} trait_name: root_shoot_ratio entity_type: individual value_type: raw @@ -406,9 +396,7 @@ traits: basis_of_value: measurement replicates: 1 method_context: single leaf LMA - methods: Measurement on samples collected for biochemical analyses. Leaf area was - determined using a portable leaf area meter (LI-3100A, LI-COR, Lincoln, NE, USA).Harvested - samples were oven-dried at 80 deg C for 48 h, then weighed. + methods: Leaf area was determined using a portable leaf area meter (LI-3100A, LI-COR, Lincoln, NE, USA).Harvested samples were oven-dried at 80 deg C for 48 h, then weighed. - var_in: LSolSugA (g m-2) unit_in: g/m2 trait_name: leaf_soluble_sugars_per_area diff --git a/data/Gosper_2012/metadata.yml b/data/Gosper_2012/metadata.yml index 5f88d3712..2c49ef807 100644 --- a/data/Gosper_2012/metadata.yml +++ b/data/Gosper_2012/metadata.yml @@ -108,7 +108,7 @@ locations: contexts: .na traits: - var_in: Months Until First Fruiting - unit_in: months + unit_in: mo trait_name: fire_time_from_fire_to_fruit entity_type: population value_type: mean @@ -175,7 +175,7 @@ traits: communities sampled. Upper = upper (canopy) stratum of trees or shrubs; Mid = mid-stratum of shrubs; Ground = ground layer] - var_in: Longevity - unit_in: years + unit_in: a trait_name: lifespan entity_type: species value_type: lifespan_value_type diff --git a/data/Gosper_2018/metadata.yml b/data/Gosper_2018/metadata.yml index 1c84b5971..e3d64f2dc 100644 --- a/data/Gosper_2018/metadata.yml +++ b/data/Gosper_2018/metadata.yml @@ -121,7 +121,7 @@ locations: contexts: .na traits: - var_in: Months Until First Fruiting - unit_in: months + unit_in: mo trait_name: fire_time_from_fire_to_fruit entity_type: population value_type: mean diff --git a/data/Gray_2019/metadata.yml b/data/Gray_2019/metadata.yml index 516307351..f4a14409a 100644 --- a/data/Gray_2019/metadata.yml +++ b/data/Gray_2019/metadata.yml @@ -76,7 +76,7 @@ locations: contexts: .na traits: - var_in: Asat_area (micromol/m2/s) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -91,7 +91,7 @@ traits: deg C), and high light (2000 umol m-2 s-1). Cuvette vapour pressure difference ranged between 0.61 and 1.94 kPa. - var_in: gsw (mol/m2/s) - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -106,7 +106,7 @@ traits: deg C), and high light (2000 umol m-2 s-1). Cuvette vapour pressure difference ranged between 0.61 and 1.94 kPa. - var_in: Ci - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: raw @@ -121,7 +121,7 @@ traits: deg C), and high light (2000 umol m-2 s-1). Cuvette vapour pressure difference ranged between 0.61 and 1.94 kPa. - var_in: Ca - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: .na entity_type: individual value_type: raw @@ -136,7 +136,7 @@ traits: deg C), and high light (2000 umol m-2 s-1). Cuvette vapour pressure difference ranged between 0.61 and 1.94 kPa. - var_in: CiCa ratio - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: individual value_type: raw @@ -185,7 +185,7 @@ traits: was calculated by dividing leaf area by dry mass. Leaf nutrient analyses were performed at the Appleton Laboratory (University of Queensland). - var_in: Asat_mass (nmol/g/s) - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_maximum entity_type: individual value_type: raw @@ -200,7 +200,7 @@ traits: deg C), and high light (2000 umol m-2 s-1). Cuvette vapour pressure difference ranged between 0.61 and 1.94 kPa. - var_in: Rd_area (micromol/m2/s) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: individual value_type: raw @@ -215,7 +215,7 @@ traits: deg C), and high light (2000 umol m-2 s-1). Cuvette vapour pressure difference ranged between 0.61 and 1.94 kPa. - var_in: Rd_mass (nmol/g/s) - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_dark_respiration_per_dry_mass entity_type: individual value_type: raw diff --git a/data/Grootemaat_2015/metadata.yml b/data/Grootemaat_2015/metadata.yml index c6815d5e7..f7e88ccce 100644 --- a/data/Grootemaat_2015/metadata.yml +++ b/data/Grootemaat_2015/metadata.yml @@ -326,7 +326,7 @@ traits: (2006). Soluble polyphenols (tannins) were determined using the Folin-Denis method (Allen et al. 1974). - var_in: TTI (s) - unit_in: seconds + unit_in: s trait_name: fire_time_to_ignition entity_type: individual value_type: raw @@ -368,7 +368,7 @@ traits: visible flame. All these measurements were made in seconds, with an accuracy of one-tenth of a second (decimals). - var_in: FD (s) - unit_in: seconds + unit_in: s trait_name: fire_flame_duration entity_type: individual value_type: raw @@ -410,7 +410,7 @@ traits: these measurements were made in seconds, with an accuracy of one-tenth of a second (decimals). - var_in: SD (s) - unit_in: seconds + unit_in: s trait_name: fire_smoulder_duration entity_type: individual value_type: raw @@ -452,7 +452,7 @@ traits: out. All these measurements were made in seconds, with an accuracy of one-tenth of a second (decimals). - var_in: TBT (s) - unit_in: seconds + unit_in: s trait_name: fire_total_burn_duration entity_type: individual value_type: raw diff --git a/data/Grootemaat_2017_1/metadata.yml b/data/Grootemaat_2017_1/metadata.yml index 06e9f2da8..50199f017 100644 --- a/data/Grootemaat_2017_1/metadata.yml +++ b/data/Grootemaat_2017_1/metadata.yml @@ -441,7 +441,7 @@ traits: at 105 deg C. Fuel moisture content was then expressed as a percentage of oven-dry weight. - var_in: TTI (s) - unit_in: seconds + unit_in: s trait_name: fire_time_to_ignition entity_type: individual value_type: raw @@ -469,7 +469,7 @@ traits: as initial sample mass (corresponding approximately with total mass burnt) divided by total burning time (sum of FD and SD). - var_in: FD (s) - unit_in: seconds + unit_in: s trait_name: fire_flame_duration entity_type: individual value_type: raw @@ -497,7 +497,7 @@ traits: as initial sample mass (corresponding approximately with total mass burnt) divided by total burning time (sum of FD and SD). - var_in: SD (s) - unit_in: seconds + unit_in: s trait_name: fire_smoulder_duration entity_type: individual value_type: raw @@ -525,7 +525,7 @@ traits: as initial sample mass (corresponding approximately with total mass burnt) divided by total burning time (sum of FD and SD). - var_in: TBT (s) - unit_in: seconds + unit_in: s trait_name: fire_total_burn_duration entity_type: individual value_type: raw diff --git a/data/Grootemaat_2017_2/metadata.yml b/data/Grootemaat_2017_2/metadata.yml index aac2dd23f..095e112bb 100644 --- a/data/Grootemaat_2017_2/metadata.yml +++ b/data/Grootemaat_2017_2/metadata.yml @@ -138,7 +138,7 @@ locations: contexts: .na traits: - var_in: point_burning_time (s) - unit_in: seconds + unit_in: s trait_name: .na entity_type: individual value_type: raw @@ -255,7 +255,7 @@ traits: s-1 ), point burning time (s) and fuel consumption (% mass loss) (Supplementary material Appendix 1 Table A1). - var_in: packing ratio - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -296,7 +296,7 @@ traits: calculated on species means. - var_in: fuel consumption (%) unit_in: '%' - trait_name: fire_fuel_comsumption + trait_name: fire_fuel_consumption entity_type: individual value_type: raw basis_of_value: measurement diff --git a/data/Guilherme_Pereira_2018/metadata.yml b/data/Guilherme_Pereira_2018/metadata.yml index 76d2653ad..765cbe03f 100644 --- a/data/Guilherme_Pereira_2018/metadata.yml +++ b/data/Guilherme_Pereira_2018/metadata.yml @@ -102,7 +102,7 @@ locations: contexts: .na traits: - var_in: Aarea (umol CO2 m-2 s-1) saturate - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: .na entity_type: individual value_type: raw diff --git a/data/Guilherme_Pereira_2019/metadata.yml b/data/Guilherme_Pereira_2019/metadata.yml index 6691661f2..60b643b66 100644 --- a/data/Guilherme_Pereira_2019/metadata.yml +++ b/data/Guilherme_Pereira_2019/metadata.yml @@ -259,7 +259,7 @@ traits: A second subsample was analysed for leaf [N] using a LaChat QuikChem 8500 Series 2 Flow Injection Analysis System (Lachat) - var_in: Asat (area) umol m-2 s-1 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -284,7 +284,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Amax (area) umol m-2 s-1 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_maximum entity_type: individual value_type: raw @@ -309,7 +309,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Asat (mass) nmol g-1 s-1 - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: individual value_type: raw @@ -334,7 +334,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Amax (mass) nmol g-1 s-1 - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_maximum entity_type: individual value_type: raw @@ -359,7 +359,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rdark (area) umol m-2 s-1 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: individual value_type: raw @@ -384,7 +384,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rdark28 (area) umol m-2 s-1 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: .na entity_type: individual value_type: raw @@ -409,7 +409,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rdark25 (area) umol m-2 s-1 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: .na entity_type: individual value_type: raw @@ -434,7 +434,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rdark (mass) nmol g-1 s-1 - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_dark_respiration_per_dry_mass entity_type: individual value_type: raw @@ -459,7 +459,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rdark28 (mass) nmol g-1 s-1 - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: .na entity_type: individual value_type: raw @@ -484,7 +484,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rdark25 (mass) nmol g-1 s-1 - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: .na entity_type: individual value_type: raw @@ -509,7 +509,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: PNUEsat (umol CO2 g-1 N s-1) - unit_in: umolCO2/gN/s + unit_in: umol{CO2}/g{N}/s trait_name: leaf_photosynthetic_nitrogen_use_efficiency_saturated entity_type: individual value_type: raw @@ -519,7 +519,7 @@ traits: from the 2011 collected plants. For resorption, we used N data from the 2015 sampled leaves. - var_in: PNUEmax (umol CO2 g-1 N s-1) - unit_in: umolCO2/gN/s + unit_in: umol{CO2}/g{N}/s trait_name: leaf_photosynthetic_nitrogen_use_efficiency_maximum entity_type: individual value_type: raw @@ -529,7 +529,7 @@ traits: from the 2011 collected plants. For resorption, we used N data from the 2015 sampled leaves. - var_in: PPUEsat (umol CO2 g-1 P s-1) - unit_in: umolCO2/gP/s + unit_in: umol{CO2}/g{P}/s trait_name: leaf_photosynthetic_phosphorus_use_efficiency_saturated entity_type: individual value_type: raw @@ -539,7 +539,7 @@ traits: exchange rates were divided by site-species mean values of leaf [P] obtained in 2015. - var_in: PPUEmax (umol CO2 g-1 P s-1) - unit_in: umolCO2/gP/s + unit_in: umol{CO2}/g{P}/s trait_name: leaf_photosynthetic_phosphorus_use_efficiency_maximum entity_type: individual value_type: raw @@ -549,7 +549,7 @@ traits: exchange rates were divided by site-species mean values of leaf [P] obtained in 2015. - var_in: Rdark (N based) (umol CO2 g-1 N s-1) - unit_in: umolCO2/gN/s + unit_in: umol{CO2}/g{N}/s trait_name: .na entity_type: individual value_type: raw @@ -574,7 +574,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rdark28 (N based) (umol CO2 g-1 N s-1) - unit_in: umolCO2/gN/s + unit_in: umol{CO2}/g{N}/s trait_name: .na entity_type: individual value_type: raw @@ -599,7 +599,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rdark25 (N based) (umol CO2 g-1 N s-1) - unit_in: umolCO2/gN/s + unit_in: umol{CO2}/g{N}/s trait_name: .na entity_type: individual value_type: raw @@ -624,7 +624,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rdark (P based) umol CO2 g-1 P s-1 - unit_in: umolCO2/gP/s + unit_in: umol{CO2}/g{P}/s trait_name: .na entity_type: individual value_type: raw @@ -649,7 +649,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rdark28 (P based) umol CO2 g-1 P s-1 - unit_in: umolCO2/gP/s + unit_in: umol{CO2}/g{P}/s trait_name: .na entity_type: individual value_type: raw @@ -674,7 +674,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rdark25 (P based) umol CO2 g-1 P s-1 - unit_in: umolCO2/gP/s + unit_in: umol{CO2}/g{P}/s trait_name: .na entity_type: individual value_type: raw @@ -699,7 +699,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rd28/Asat (area) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -724,7 +724,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rd28/Asat (mass) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -749,7 +749,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rd28/Amax (area) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -774,7 +774,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rd28/Amax (mass) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -799,7 +799,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: Rlight (area) (umol m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_light_respiration_per_area entity_type: individual value_type: raw @@ -824,7 +824,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: RL/RD (area) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -849,7 +849,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: RL/RD 28 (area) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -874,7 +874,7 @@ traits: bases. Measurements were made using undamaged, fully expanded, youngest fully mature and sun-exposed leaves, still attached to the plant. - var_in: RL/RD 25 (area) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw diff --git a/data/Harrison_2009/metadata.yml b/data/Harrison_2009/metadata.yml index 241b20606..ac4818e57 100644 --- a/data/Harrison_2009/metadata.yml +++ b/data/Harrison_2009/metadata.yml @@ -161,7 +161,7 @@ traits: CHNO; Carlo-Erba Instruments, Milan, Italy) with a typical machine precision of 0.02% N. Approximately 1.2 mg of each segment was analysed. - var_in: Cell wall fraction - unit_in: dimensionless + unit_in: mg/mg trait_name: leaf_cell_wall_fraction entity_type: population value_type: mean @@ -181,7 +181,7 @@ traits: to represent the leaf structural biomass, and the N content was determined on 2-5 mg of material using the elemental analyser as above. - var_in: Cell wall nitrogen concentration (mmol g-1) - unit_in: mmolN/g + unit_in: mmol{N}/g trait_name: leaf_cell_wall_N_per_cell_wall_dry_mass entity_type: population value_type: mean @@ -217,7 +217,7 @@ traits: protein or Rubisco, presumably because we were unable to successfully rupture the mesophyll cells. - var_in: Cell wall N fraction - unit_in: dimensionless + unit_in: mg/mg trait_name: leaf_cell_wall_N_per_leaf_N entity_type: population value_type: mean @@ -263,7 +263,7 @@ traits: a Mitutoyo (Japan) analogue thickness gauge (precision +/- 20 um). T was calculated as the mean of four measurements. - var_in: Water content (mol m-2) - unit_in: molH2O/m2 + unit_in: mol{H2O}/m2 trait_name: leaf_water_content_per_area entity_type: population value_type: mean @@ -272,7 +272,7 @@ traits: methods: Water content (WC, mol m-2) was computed as the change in leaf mass caused by drying, divided by leaf area. - var_in: Asat (mmol m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: population value_type: mean @@ -302,7 +302,7 @@ traits: between all species, at least four pre-existing, non-necrotic leaves on different plants from the plus nitrogen treatment were measured. - var_in: A300 (Asat adjusted to Ci=300 mmol mol-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: population value_type: mean @@ -332,7 +332,7 @@ traits: between all species, at least four pre-existing, non-necrotic leaves on different plants from the plus nitrogen treatment were measured. - var_in: A300/Na PNUE (mmol (mol N)-1 s-1) - unit_in: umolCO2/molN/s + unit_in: umol{CO2}/mol{N}/s trait_name: leaf_photosynthetic_nitrogen_use_efficiency_saturated entity_type: population value_type: mean @@ -342,7 +342,7 @@ traits: rate per unit area scaled to a common Ci (Aa300), by the nitrogen content per unit leaf area (Na). - var_in: Ci (mmol mol-1) - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: population value_type: mean @@ -371,7 +371,7 @@ traits: between all species, at least four pre-existing, non-necrotic leaves on different plants from the plus nitrogen treatment were measured. - var_in: Ci/Ca - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: population value_type: mean @@ -399,7 +399,7 @@ traits: LMA (PNUE mmol CO2 (mol N)-1 s-1 = 587 x LMA (g m-2)-0.435) See manuscript for the equation used. - var_in: D (%) - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: population value_type: mean diff --git a/data/Hassiotou_2009/metadata.yml b/data/Hassiotou_2009/metadata.yml index 30922f6c5..01441cbb0 100644 --- a/data/Hassiotou_2009/metadata.yml +++ b/data/Hassiotou_2009/metadata.yml @@ -71,7 +71,7 @@ traits: were measured, and leaf dry matter content, LMA and leaf density (leaf density = LMA/LT) were calculated. - var_in: stomatal number per leaf area (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_stomatal_density_average entity_type: population value_type: mean diff --git a/data/Huang_2015/metadata.yml b/data/Huang_2015/metadata.yml index 2a1560c97..1eafa4d42 100644 --- a/data/Huang_2015/metadata.yml +++ b/data/Huang_2015/metadata.yml @@ -169,7 +169,7 @@ traits: then weighed for dry mass. For each seedling, leaf area ratio (LAR, total leaf area/ total plant dry mass, m2 kg-1) was calculated. - var_in: RootShoot - unit_in: mg_root/mg_shoot + unit_in: mg{root}/mg{shoot} trait_name: root_shoot_ratio entity_type: individual value_type: raw @@ -381,7 +381,7 @@ traits: plant organs (leaf, stem, tuber and root). All carbohydrate measurements were conducted on five replicate seedlings per genotype and treatment. - var_in: A_max_umol_per_m2_s1 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_maximum entity_type: individual value_type: raw @@ -399,7 +399,7 @@ traits: without constraining mesophyll conductance. Both Vcmax and Jmax were then corrected to a common temperature of 25C for comparisons between treatments - var_in: Cond_at_A_max_mol_per_m2_s1 - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Amax entity_type: individual value_type: raw @@ -437,7 +437,7 @@ traits: [CO2] in the cuvette to 1800 ul l-1 were taken and five replicate seedlings were measured per genotype and treatment. - var_in: Trans_at_A_max_mmol_per_m2_s1 - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Amax entity_type: individual value_type: raw @@ -456,7 +456,7 @@ traits: [CO2] in the cuvette to 1800 ul l-1 were taken and five replicate seedlings were measured per genotype and treatment. - var_in: A_sat_umol_per_m2_s1 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -474,7 +474,7 @@ traits: without constraining mesophyll conductance. Both Vcmax and Jmax were then corrected to a common temperature of 25C for comparisons between treatments - var_in: Cond_at_A_sat_mol_per_m2_s1 - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -512,7 +512,7 @@ traits: [CO2] in the cuvette to 1800 ul l-1 were taken and five replicate seedlings were measured per genotype and treatment. - var_in: Trans_at_A_sat_mmol_per_m2_s1 - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: raw @@ -532,7 +532,7 @@ traits: measured per genotype and treatment. - var_in: Vcmax unit_in: umol/m2/s - trait_name: leaf_fluorescence_Vcmax_per_area + trait_name: leaf_photosynthesis_Vcmax_per_area entity_type: individual value_type: raw basis_of_value: measurement @@ -550,7 +550,7 @@ traits: treatments - var_in: Jmax unit_in: umol/m2/s - trait_name: leaf_fluorescence_Jmax_per_area + trait_name: leaf_photosynthesis_Jmax_per_area entity_type: individual value_type: raw basis_of_value: measurement @@ -567,8 +567,8 @@ traits: and Jmax were then corrected to a common temperature of 25C for comparisons between treatments - var_in: JV - unit_in: dimensionless - trait_name: leaf_fluorescence_Jmax_over_Vcmax + unit_in: '{dimensionless}' + trait_name: leaf_photosynthesis_Jmax_over_Vcmax entity_type: individual value_type: raw basis_of_value: measurement @@ -585,7 +585,7 @@ traits: and Jmax were then corrected to a common temperature of 25C for comparisons between treatments - var_in: WUEi - unit_in: umolCO2/molH2O + unit_in: umol{CO2}/mol{H2O} trait_name: leaf_water_use_efficiency_intrinsic entity_type: individual value_type: raw diff --git a/data/Hughes_2005/metadata.yml b/data/Hughes_2005/metadata.yml index 348d0a75f..cd4204cd2 100644 --- a/data/Hughes_2005/metadata.yml +++ b/data/Hughes_2005/metadata.yml @@ -120,7 +120,7 @@ traits: low vessel densities, usually a minimum of 200 vessels per cross section were measured. - var_in: SpaceFrac - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: population value_type: mean @@ -152,7 +152,7 @@ traits: had very low vessel densities, usually a minimum of 200 vessels per cross section were measured. - var_in: VessLumFrac - unit_in: dimensionless + unit_in: um2/um2 trait_name: stem_vessel_lumen_fraction entity_type: population value_type: mean @@ -183,7 +183,7 @@ traits: low vessel densities, usually a minimum of 200 vessels per cross section were measured. - var_in: VessDens - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: stem_vessel_density entity_type: population value_type: mean @@ -310,7 +310,7 @@ traits: had very low vessel densities, usually a minimum of 200 vessels per cross section were measured.) - var_in: Ktheo - unit_in: kg/m/s/pa + unit_in: kg/m/Pa/s trait_name: sapwood_specific_conductivity_theoretical entity_type: population value_type: mean @@ -377,7 +377,7 @@ traits: low vessel densities, usually a minimum of 200 vessels per cross section were measured. - var_in: SolidFrac - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: population value_type: mean @@ -408,7 +408,7 @@ traits: low vessel densities, usually a minimum of 200 vessels per cross section were measured. - var_in: nonlumSpaceFrac - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: population value_type: mean @@ -439,7 +439,7 @@ traits: low vessel densities, usually a minimum of 200 vessels per cross section were measured. - var_in: FracNonlumen - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: population value_type: mean diff --git a/data/Jagdish_2020/metadata.yml b/data/Jagdish_2020/metadata.yml index cf2d4ed11..f1b822ee3 100644 --- a/data/Jagdish_2020/metadata.yml +++ b/data/Jagdish_2020/metadata.yml @@ -378,7 +378,7 @@ traits: basis_of_record: field life_stage: adult - var_in: Proportion Germinated - unit_in: n/n + unit_in: '{count}/{count}' trait_name: seed_germination entity_type: population value_type: mean diff --git a/data/Jordan_2015/metadata.yml b/data/Jordan_2015/metadata.yml index 09ddef78c..ce68fa04b 100644 --- a/data/Jordan_2015/metadata.yml +++ b/data/Jordan_2015/metadata.yml @@ -274,7 +274,7 @@ locations: contexts: .na traits: - var_in: ploidy level - unit_in: count + unit_in: '{count}' trait_name: ploidy entity_type: population value_type: mean diff --git a/data/Jordan_2020/metadata.yml b/data/Jordan_2020/metadata.yml index 22490c1b5..2c49a3c54 100644 --- a/data/Jordan_2020/metadata.yml +++ b/data/Jordan_2020/metadata.yml @@ -1575,7 +1575,7 @@ traits: replicates: unknown methods: unknown - var_in: total stomatal density (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_stomatal_density_average entity_type: population value_type: mean @@ -1596,7 +1596,7 @@ traits: assumptions are consistent with dimensions observed in extant Proteaceae (G.J.J. 12 December 2015, unpublished data). - var_in: adaxial stomatal density (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_stomatal_density_adaxial entity_type: population value_type: mean @@ -1617,7 +1617,7 @@ traits: assumptions are consistent with dimensions observed in extant Proteaceae (G.J.J. 12 December 2015, unpublished data). - var_in: abaxial stomatal density (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_stomatal_density_abaxial entity_type: population value_type: mean @@ -1688,7 +1688,7 @@ traits: assumptions are consistent with dimensions observed in extant Proteaceae (G.J.J. 12 December 2015, unpublished data). - var_in: epidermal cell density - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: .na entity_type: population value_type: mean diff --git a/data/Jurado_1991/metadata.yml b/data/Jurado_1991/metadata.yml index 24701dbdd..43e8faa5a 100644 --- a/data/Jurado_1991/metadata.yml +++ b/data/Jurado_1991/metadata.yml @@ -199,7 +199,7 @@ traits: could be an adaptation for more-efficient attachment to the skin of passing mammals. Moreover, some diaspores stuck to the arms of one of the authors during collection. - var_in: plant longevity - unit_in: years + unit_in: a trait_name: lifespan entity_type: species value_type: bin diff --git a/data/Kew_2019_3/metadata.yml b/data/Kew_2019_3/metadata.yml index 10dd715e5..50ec59471 100644 --- a/data/Kew_2019_3/metadata.yml +++ b/data/Kew_2019_3/metadata.yml @@ -77,7 +77,7 @@ traits: with the relevant references listed in measurement_remarks. - var_in: salt_tolerance unit_in: .na - trait_name: salt_tolerance + trait_name: plant_tolerance_salt entity_type: species value_type: mode basis_of_value: expert_score @@ -89,7 +89,7 @@ traits: into a single entry with the relevant references listed in measurement_remarks. - var_in: maxdsm unit_in: dS/m - trait_name: soil_salinity_tolerance + trait_name: plant_tolerance_soil_salinity entity_type: species value_type: mean basis_of_value: measurement @@ -110,13 +110,13 @@ traits: multiple times with different references. These are collapsed into a single entry with the relevant references listed in measurement_remarks. substitutions: -- trait_name: soil_salinity_tolerance +- trait_name: plant_tolerance_soil_salinity find: '?' replace: .na -- trait_name: soil_salinity_tolerance +- trait_name: plant_tolerance_soil_salinity find: ?? replace: .na -- trait_name: soil_salinity_tolerance +- trait_name: plant_tolerance_soil_salinity find: sw? replace: .na - trait_name: photosynthetic_pathway @@ -131,10 +131,10 @@ substitutions: - trait_name: photosynthetic_pathway find: C4? replace: c4 -- trait_name: salt_tolerance +- trait_name: plant_tolerance_salt find: hyhal replace: hydrohalophyte -- trait_name: salt_tolerance +- trait_name: plant_tolerance_salt find: xeroh replace: xerohalophyte - trait_name: plant_type_by_resource_use diff --git a/data/Kew_2019_6/metadata.yml b/data/Kew_2019_6/metadata.yml index 9e9efb1ba..e1b71062f 100644 --- a/data/Kew_2019_6/metadata.yml +++ b/data/Kew_2019_6/metadata.yml @@ -43,7 +43,7 @@ locations: .na contexts: .na traits: - var_in: germination - unit_in: n/n + unit_in: '{count}/{count}' trait_name: seed_germination entity_type: individual value_type: mean diff --git a/data/Knox_2011/metadata.yml b/data/Knox_2011/metadata.yml index 7c38888c5..dcf39bfd4 100644 --- a/data/Knox_2011/metadata.yml +++ b/data/Knox_2011/metadata.yml @@ -170,7 +170,7 @@ traits: volumes of stems, hence the use of fresh stem volume. - var_in: Bark mass area (g cm?2) unit_in: g/cm2 - trait_name: bark_mass_area + trait_name: bark_dry_mass_per_surface_area entity_type: population value_type: mean basis_of_value: measurement diff --git a/data/Kotowska_2020/metadata.yml b/data/Kotowska_2020/metadata.yml index 86c611355..9e41e0007 100644 --- a/data/Kotowska_2020/metadata.yml +++ b/data/Kotowska_2020/metadata.yml @@ -606,11 +606,11 @@ contexts: var_in: method_context values: - value: stem sample - description: Measurements made on the main stem. + description: Measurements made on the main stem. In detail, the wood cores of length 5-6 cm were extracted using an increment borer with an inner diameter of 5.15 mm (Haglof, Langsele, Sweden). The samples were transported in marked straws to ensure the determination of inner and outer segments. In the lab the cores were immediately divided into five segments of 1 cm length for sapwood nutrient analysis, sapwood wood anatomy, wood density, inner wood anatomy, and inner wood nutrient analysis (from the outer to the inner wood, respectively). Fresh samples for wood anatomy were stored in 70% ethanol until further processing while nutrient samples were oven dried at 60 deg C for 48 h. Ethanol storage has proven to be a better storage method based on preliminary work, as cutting previously dried samples led to lower quality sections in some species. All plant samples were oven-dried at 60 deg C for 48 h and then ground and analyzed for C+N contents with a CN auto-analyzer (Vario EL III, Hanau, Germany) and for P and other nutrients after HNO3 digestion by inductively coupled plasma optical emission spectrometry analysis (Perkin Elmer Optima 5300 DV) at the University of Goettingen, Germany. - value: branch sample - description: Measurements made on a branch. + description: Measurements made on a branch. In detail, for the twig samples one sun-exposed branch per tree optimally in mid-canopy position was chosen and cut using loppers mounted on an elongated pole. From this branch a healthy twig with diameter 5-7 mm was selected and a 3-4 cm segment removed for wood anatomy and for nutrient analysis. From this branch, 5-30 healthy and intact mature leaves (the youngest fully expanded leaves without any sign of damage) were taken and dust removed using wet tissue. Senescent leaves (usually visually determinable by an altered color and easy to detach) were collected from the same branch or at least the same tree by shaking the tree or touching the leaf by hand. In the lab, bark from nutrient-sample twigs was carefully removed and bagged separately. Small pieces of stem bark were removed using a knife or small chisel. All plant samples were oven-dried at 60 deg C for 48 h and then ground and analyzed for C+N contents with a CN auto-analyzer (Vario EL III, Hanau, Germany) and for P and other nutrients after HNO3 digestion by inductively coupled plasma optical emission spectrometry analysis (Perkin Elmer Optima 5300 DV) at the University of Goettingen, Germany. - value: heartwood sample - description: Measurements made on heartwood. + description: Measurements made on heartwood. In detail, the wood cores of length 5-6 cm were extracted using an increment borer with an inner diameter of 5.15 mm (Haglof, Langsele, Sweden). The samples were transported in marked straws to ensure the determination of inner and outer segments. In the lab the cores were immediately divided into five segments of 1 cm length for sapwood nutrient analysis, sapwood wood anatomy, wood density, inner wood anatomy, and inner wood nutrient analysis (from the outer to the inner wood, respectively). Fresh samples for wood anatomy were stored in 70% ethanol until further processing while nutrient samples were oven dried at 60 deg C for 48 h. Ethanol storage has proven to be a better storage method based on preliminary work, as cutting previously dried samples led to lower quality sections in some species. All plant samples were oven-dried at 60 deg C for 48 h and then ground and analyzed for C+N contents with a CN auto-analyzer (Vario EL III, Hanau, Germany) and for P and other nutrients after HNO3 digestion by inductively coupled plasma optical emission spectrometry analysis (Perkin Elmer Optima 5300 DV) at the University of Goettingen, Germany. - context_property: leaf lifespan method category: method var_in: method_context2 @@ -694,7 +694,7 @@ traits: specific leaf area (SLA, cm2 g-1) and Huber value (HV; sapwood area over leaf area without bark and pith). - var_in: HV - unit_in: 10^4 x mm2_sapwood/mm2_leaf + unit_in: 10^4.mm2{sapwood}/mm2{leaf} trait_name: huber_value entity_type: individual value_type: raw @@ -827,7 +827,7 @@ traits: using the particle-analysis function from ImageJ for estimating vessel density (VD, n mm-1), the idealized vessels diameter (d)' - var_in: VD.br - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: stem_vessel_density entity_type: individual value_type: raw @@ -947,7 +947,7 @@ traits: using the particle-analysis function from ImageJ for estimating vessel density (VD, n mm-1), the idealized vessels diameter (d)' - var_in: Ks.br - unit_in: kg/m/s/MPa + unit_in: kg/m/MPa/s trait_name: sapwood_specific_conductivity_theoretical entity_type: individual value_type: raw @@ -1082,7 +1082,7 @@ traits: (VD, n mm-1), the idealized vessels diameter (d)' - var_in: Frac_ray.br unit_in: '%' - trait_name: wood_ray_fraction + trait_name: wood_ray_parenchyma_fraction entity_type: individual value_type: raw basis_of_value: measurement @@ -1321,7 +1321,7 @@ traits: using the particle-analysis function from ImageJ for estimating vessel density (VD, n mm-1), the idealized vessels diameter (d)' - var_in: VD.st - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: stem_vessel_density entity_type: individual value_type: raw @@ -1441,7 +1441,7 @@ traits: using the particle-analysis function from ImageJ for estimating vessel density (VD, n mm-1), the idealized vessels diameter (d)' - var_in: Ks.st - unit_in: kg/m/s/MPa + unit_in: kg/m/MPa/s trait_name: sapwood_specific_conductivity_theoretical entity_type: individual value_type: raw @@ -1576,7 +1576,7 @@ traits: (VD, n mm-1), the idealized vessels diameter (d)' - var_in: Frac_ray.st unit_in: '%' - trait_name: wood_ray_fraction + trait_name: wood_ray_parenchyma_fraction entity_type: individual value_type: raw basis_of_value: measurement @@ -1703,21 +1703,7 @@ traits: replicates: 1 method_context: stem sample methods: For measuring tissue fractions in xylem, one wood core of the main trunk - and one twig sample per tree was taken. The wood cores of length 5-6 cm were extracted - using an increment borer with an inner diameter of 5.15 mm (Haglof, Langsele, - Sweden). The samples were transported in marked straws to ensure the determination - of inner and outer segments. In the lab the cores were immediately divided into - five segments of 1 cm length for sapwood nutrient analysis, sapwood wood anatomy, - wood density, inner wood anatomy, and inner wood nutrient analysis (from the outer - to the inner wood, respectively). Fresh samples for wood anatomy were stored in - 70% ethanol until further processing while nutrient samples were oven dried at - 60 deg C for 48 h. Ethanol storage has proven to be a better storage method based - on preliminary work, as cutting previously dried samples led to lower quality - sections in some species. All plant samples were oven-dried at 60 deg C for 48 - h and then ground and analyzed for C+N contents with a CN auto-analyzer (Vario - EL III, Hanau, Germany) and for P and other nutrients after HNO3 digestion by - inductively coupled plasma optical emission spectrometry analysis (Perkin Elmer - Optima 5300 DV) at the University of Goettingen, Germany. + and one twig sample per tree was taken. - var_in: N.leaf unit_in: mg/g trait_name: leaf_N_per_dry_mass @@ -1772,21 +1758,8 @@ traits: basis_of_value: measurement replicates: 1 method_context: branch sample - methods: For the twig samples one sun-exposed branch per tree optimally in mid-canopy - position was chosen and cut using loppers mounted on an elongated pole. From this - branch a healthy twig with diameter 5-7 mm was selected and a 3-4 cm segment removed - for wood anatomy and for nutrient analysis. From this branch, 5-30 healthy and - intact mature leaves (the youngest fully expanded leaves without any sign of damage) - were taken and dust removed using wet tissue. Senescent leaves (usually visually - determinable by an altered color and easy to detach) were collected from the same - branch or at least the same tree by shaking the tree or touching the leaf by hand. - In the lab, bark from nutrient-sample twigs was carefully removed and bagged separately. - Small pieces of stem bark were removed using a knife or small chisel. All plant - samples were oven-dried at 60 deg C for 48 h and then ground and analyzed for - C+N contents with a CN auto-analyzer (Vario EL III, Hanau, Germany) and for P - and other nutrients after HNO3 digestion by inductively coupled plasma optical - emission spectrometry analysis (Perkin Elmer Optima 5300 DV) at the University - of Goettingen, Germany. + methods: For measuring tissue fractions in xylem, one wood core of the main trunk + and one twig sample per tree was taken. - var_in: N.bark unit_in: mg/g trait_name: bark_N_per_dry_mass @@ -1842,21 +1815,7 @@ traits: replicates: 1 method_context: heartwood sample methods: For measuring tissue fractions in xylem, one wood core of the main trunk - and one twig sample per tree was taken. The wood cores of length 5-6 cm were extracted - using an increment borer with an inner diameter of 5.15 mm (Haglof, Langsele, - Sweden). The samples were transported in marked straws to ensure the determination - of inner and outer segments. In the lab the cores were immediately divided into - five segments of 1 cm length for sapwood nutrient analysis, sapwood wood anatomy, - wood density, inner wood anatomy, and inner wood nutrient analysis (from the outer - to the inner wood, respectively). Fresh samples for wood anatomy were stored in - 70% ethanol until further processing while nutrient samples were oven dried at - 60 deg C for 48 h. Ethanol storage has proven to be a better storage method based - on preliminary work, as cutting previously dried samples led to lower quality - sections in some species. All plant samples were oven-dried at 60 deg C for 48 - h and then ground and analyzed for C+N contents with a CN auto-analyzer (Vario - EL III, Hanau, Germany) and for P and other nutrients after HNO3 digestion by - inductively coupled plasma optical emission spectrometry analysis (Perkin Elmer - Optima 5300 DV) at the University of Goettingen, Germany. + and one twig sample per tree was taken. - var_in: N.recy.st unit_in: '%' trait_name: .na @@ -1913,21 +1872,7 @@ traits: replicates: 1 method_context: stem sample methods: For measuring tissue fractions in xylem, one wood core of the main trunk - and one twig sample per tree was taken. The wood cores of length 5-6 cm were extracted - using an increment borer with an inner diameter of 5.15 mm (Haglof, Langsele, - Sweden). The samples were transported in marked straws to ensure the determination - of inner and outer segments. In the lab the cores were immediately divided into - five segments of 1 cm length for sapwood nutrient analysis, sapwood wood anatomy, - wood density, inner wood anatomy, and inner wood nutrient analysis (from the outer - to the inner wood, respectively). Fresh samples for wood anatomy were stored in - 70% ethanol until further processing while nutrient samples were oven dried at - 60 deg C for 48 h. Ethanol storage has proven to be a better storage method based - on preliminary work, as cutting previously dried samples led to lower quality - sections in some species. All plant samples were oven-dried at 60 deg C for 48 - h and then ground and analyzed for C+N contents with a CN auto-analyzer (Vario - EL III, Hanau, Germany) and for P and other nutrients after HNO3 digestion by - inductively coupled plasma optical emission spectrometry analysis (Perkin Elmer - Optima 5300 DV) at the University of Goettingen, Germany. + and one twig sample per tree was taken. - var_in: P.leaf unit_in: mg/g trait_name: leaf_P_per_dry_mass @@ -1982,21 +1927,8 @@ traits: basis_of_value: measurement replicates: 1 method_context: branch sample - methods: For the twig samples one sun-exposed branch per tree optimally in mid-canopy - position was chosen and cut using loppers mounted on an elongated pole. From this - branch a healthy twig with diameter 5-7 mm was selected and a 3-4 cm segment removed - for wood anatomy and for nutrient analysis. From this branch, 5-30 healthy and - intact mature leaves (the youngest fully expanded leaves without any sign of damage) - were taken and dust removed using wet tissue. Senescent leaves (usually visually - determinable by an altered color and easy to detach) were collected from the same - branch or at least the same tree by shaking the tree or touching the leaf by hand. - In the lab, bark from nutrient-sample twigs was carefully removed and bagged separately. - Small pieces of stem bark were removed using a knife or small chisel. All plant - samples were oven-dried at 60 deg C for 48 h and then ground and analyzed for - C+N contents with a CN auto-analyzer (Vario EL III, Hanau, Germany) and for P - and other nutrients after HNO3 digestion by inductively coupled plasma optical - emission spectrometry analysis (Perkin Elmer Optima 5300 DV) at the University - of Goettingen, Germany. + methods: For measuring tissue fractions in xylem, one wood core of the main trunk + and one twig sample per tree was taken. - var_in: P.bark unit_in: mg/g trait_name: bark_P_per_dry_mass @@ -2006,21 +1938,7 @@ traits: replicates: 1 method_context: stem sample methods: For measuring tissue fractions in xylem, one wood core of the main trunk - and one twig sample per tree was taken. The wood cores of length 5-6 cm were extracted - using an increment borer with an inner diameter of 5.15 mm (Haglof, Langsele, - Sweden). The samples were transported in marked straws to ensure the determination - of inner and outer segments. In the lab the cores were immediately divided into - five segments of 1 cm length for sapwood nutrient analysis, sapwood wood anatomy, - wood density, inner wood anatomy, and inner wood nutrient analysis (from the outer - to the inner wood, respectively). Fresh samples for wood anatomy were stored in - 70% ethanol until further processing while nutrient samples were oven dried at - 60 deg C for 48 h. Ethanol storage has proven to be a better storage method based - on preliminary work, as cutting previously dried samples led to lower quality - sections in some species. All plant samples were oven-dried at 60 deg C for 48 - h and then ground and analyzed for C+N contents with a CN auto-analyzer (Vario - EL III, Hanau, Germany) and for P and other nutrients after HNO3 digestion by - inductively coupled plasma optical emission spectrometry analysis (Perkin Elmer - Optima 5300 DV) at the University of Goettingen, Germany. + and one twig sample per tree was taken. - var_in: P.br.bark unit_in: mg/g trait_name: bark_P_per_dry_mass @@ -2029,21 +1947,8 @@ traits: basis_of_value: measurement replicates: 1 method_context: branch sample - methods: For the twig samples one sun-exposed branch per tree optimally in mid-canopy - position was chosen and cut using loppers mounted on an elongated pole. From this - branch a healthy twig with diameter 5-7 mm was selected and a 3-4 cm segment removed - for wood anatomy and for nutrient analysis. From this branch, 5-30 healthy and - intact mature leaves (the youngest fully expanded leaves without any sign of damage) - were taken and dust removed using wet tissue. Senescent leaves (usually visually - determinable by an altered color and easy to detach) were collected from the same - branch or at least the same tree by shaking the tree or touching the leaf by hand. - In the lab, bark from nutrient-sample twigs was carefully removed and bagged separately. - Small pieces of stem bark were removed using a knife or small chisel. All plant - samples were oven-dried at 60 deg C for 48 h and then ground and analyzed for - C+N contents with a CN auto-analyzer (Vario EL III, Hanau, Germany) and for P - and other nutrients after HNO3 digestion by inductively coupled plasma optical - emission spectrometry analysis (Perkin Elmer Optima 5300 DV) at the University - of Goettingen, Germany. + methods: For measuring tissue fractions in xylem, one wood core of the main trunk + and one twig sample per tree was taken. - var_in: P.hr unit_in: mg/g trait_name: wood_P_per_dry_mass @@ -2053,21 +1958,7 @@ traits: replicates: 1 method_context: heartwood sample methods: For measuring tissue fractions in xylem, one wood core of the main trunk - and one twig sample per tree was taken. The wood cores of length 5-6 cm were extracted - using an increment borer with an inner diameter of 5.15 mm (Haglof, Langsele, - Sweden). The samples were transported in marked straws to ensure the determination - of inner and outer segments. In the lab the cores were immediately divided into - five segments of 1 cm length for sapwood nutrient analysis, sapwood wood anatomy, - wood density, inner wood anatomy, and inner wood nutrient analysis (from the outer - to the inner wood, respectively). Fresh samples for wood anatomy were stored in - 70% ethanol until further processing while nutrient samples were oven dried at - 60 deg C for 48 h. Ethanol storage has proven to be a better storage method based - on preliminary work, as cutting previously dried samples led to lower quality - sections in some species. All plant samples were oven-dried at 60 deg C for 48 - h and then ground and analyzed for C+N contents with a CN auto-analyzer (Vario - EL III, Hanau, Germany) and for P and other nutrients after HNO3 digestion by - inductively coupled plasma optical emission spectrometry analysis (Perkin Elmer - Optima 5300 DV) at the University of Goettingen, Germany. + and one twig sample per tree was taken. - var_in: P.recy.st unit_in: '%' trait_name: .na @@ -2116,7 +2007,7 @@ traits: emission spectrometry analysis (Perkin Elmer Optima 5300 DV) at the University of Goettingen, Germany. - var_in: lifespan - unit_in: years + unit_in: a trait_name: leaf_lifespan entity_type: individual value_type: raw @@ -2134,7 +2025,7 @@ traits: (Milla et al., 2004). Diameter growth at the twig base and at three additional marked locations along the twig was recorded also. - var_in: lifespan_birth - unit_in: years + unit_in: a trait_name: leaf_lifespan entity_type: individual value_type: raw diff --git a/data/Laliberte_2012/metadata.yml b/data/Laliberte_2012/metadata.yml index 38e026557..71c91d753 100644 --- a/data/Laliberte_2012/metadata.yml +++ b/data/Laliberte_2012/metadata.yml @@ -1361,7 +1361,7 @@ traits: to minimum reporting limit were re-run on more sensitive axially-configured ICP-AES equipment. The ICP analyses were done at the WA Chemcentre. - var_in: d15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw @@ -1402,7 +1402,7 @@ traits: to minimum reporting limit were re-run on more sensitive axially-configured ICP-AES equipment. The ICP analyses were done at the WA Chemcentre. - var_in: d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw diff --git a/data/Leigh_2003/metadata.yml b/data/Leigh_2003/metadata.yml index 72f95d9c0..408a765ec 100644 --- a/data/Leigh_2003/metadata.yml +++ b/data/Leigh_2003/metadata.yml @@ -119,7 +119,7 @@ traits: readings for the replicates were averaged to obtain an estimate of percentage nitrogen for each plant. - var_in: C-iso diff - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw diff --git a/data/Leigh_2006/metadata.yml b/data/Leigh_2006/metadata.yml index b720917d9..aa2c652d3 100644 --- a/data/Leigh_2006/metadata.yml +++ b/data/Leigh_2006/metadata.yml @@ -113,7 +113,7 @@ contexts: description: Plant at post-fruiting stage. traits: - var_in: A_mass - unit_in: umolCO2/g/s + unit_in: umol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: individual value_type: raw @@ -143,7 +143,7 @@ traits: from the same nodes on different branches, suggesting that within a season, the effects of leaf age on gas exchange were negligible.' - var_in: Mean photo - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -173,7 +173,7 @@ traits: from the same nodes on different branches, suggesting that within a season, the effects of leaf age on gas exchange were negligible.' - var_in: Mean cond - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -203,7 +203,7 @@ traits: from the same nodes on different branches, suggesting that within a season, the effects of leaf age on gas exchange were negligible.' - var_in: Mean trans - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: raw diff --git a/data/Leishman_2007/metadata.yml b/data/Leishman_2007/metadata.yml index e91abc1d3..0f1f8e078 100644 --- a/data/Leishman_2007/metadata.yml +++ b/data/Leishman_2007/metadata.yml @@ -117,35 +117,35 @@ traits: of Adelaide, Adelaide, Australia. Individual measurements were averaged for each species at each site. - var_in: amass (nmol g-1 s-1) - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated value_type: value_type_to_use basis_of_value: measurement replicates: replicates_to_use methods: unknown - var_in: aarea (umolm-2s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated value_type: value_type_to_use basis_of_value: measurement replicates: replicates_to_use methods: unknown - var_in: gs (molm-2s-1) - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat value_type: value_type_to_use basis_of_value: measurement replicates: replicates_to_use methods: unknown - var_in: Rd (umol m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area value_type: value_type_to_use basis_of_value: measurement replicates: replicates_to_use methods: unknown - var_in: Gmass - unit_in: molH2O/g/s + unit_in: mol{H2O}/g/s trait_name: .na entity_type: population value_type: value_type_to_use diff --git a/data/Leishman_2007/raw/metadata.yml b/data/Leishman_2007/raw/metadata.yml index 925839fe6..64a57e668 100644 --- a/data/Leishman_2007/raw/metadata.yml +++ b/data/Leishman_2007/raw/metadata.yml @@ -103,31 +103,31 @@ traits: of Adelaide, Adelaide, Australia. Individual measurements were averaged for each species at each site. - var_in: amass (nmol g-1 s-1) - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: photosynthetic_rate_per_dry_mass_saturated value_type: site_mean replicates: 10 methods: unknown - var_in: aarea (umolm-2s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: photosynthetic_rate_per_area_saturated value_type: site_mean replicates: 10 methods: unknown - var_in: gs (molm-2s-1) - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: stomatal_conductance_per_area_at_Asat value_type: site_mean replicates: 10 methods: unknown - var_in: Rd (umol m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area value_type: site_mean replicates: 10 methods: unknown - var_in: Gmass - unit_in: molH2O/g/s + unit_in: mol{H2O}/g/s trait_name: .na value_type: site_mean replicates: 10 diff --git a/data/Lewis_2015/metadata.yml b/data/Lewis_2015/metadata.yml index 7dfae3f6f..a3346de6e 100644 --- a/data/Lewis_2015/metadata.yml +++ b/data/Lewis_2015/metadata.yml @@ -171,7 +171,7 @@ contexts: - value: 6 traits: - var_in: Amax - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_maximum entity_type: individual value_type: raw @@ -188,7 +188,7 @@ traits: typically 1-2 min after a stable Ca setpoint had been achieved. Amax (and corresponding stomatal conductance) is recorded as the top step in the ACi curve. - var_in: gs_at_Amax - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Amax entity_type: individual value_type: raw @@ -205,7 +205,7 @@ traits: typically 1-2 min after a stable Ca setpoint had been achieved. Amax (and corresponding stomatal conductance) is recorded as the top step in the ACi curve. - var_in: Photo (umol m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -228,7 +228,7 @@ traits: of the response of photosynthesis (A) to intercellular [CO2] (Ci) and irradiance (Q). - var_in: Cond (mol m-2 s-1) - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -251,7 +251,7 @@ traits: of the response of photosynthesis (A) to intercellular [CO2] (Ci) and irradiance (Q). - var_in: Ci (umol mol-1) - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: raw @@ -274,7 +274,7 @@ traits: of the response of photosynthesis (A) to intercellular [CO2] (Ci) and irradiance (Q). - var_in: CiCa - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: individual value_type: raw @@ -297,7 +297,7 @@ traits: of the response of photosynthesis (A) to intercellular [CO2] (Ci) and irradiance (Q). - var_in: Trmmol (mmol m-2 s-1) - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: raw @@ -332,7 +332,7 @@ traits: Serveis Cientifico-Tecnics of the University of Barcelona (Barcelona, Spain) using an elemental analyser (EA1108, Series 1; Carbo Erba Instrumentazione). - var_in: leaf_d15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw @@ -369,7 +369,7 @@ traits: Serveis Cientifico-Tecnics of the University of Barcelona (Barcelona, Spain) using an elemental analyser (EA1108, Series 1; Carbo Erba Instrumentazione). - var_in: leaf_d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -394,7 +394,7 @@ traits: Serveis Cientifico-Tecnics of the University of Barcelona (Barcelona, Spain) using an elemental analyser (EA1108, Series 1; Carbo Erba Instrumentazione). - var_in: stem_d15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: wood_delta15N entity_type: individual value_type: raw @@ -431,7 +431,7 @@ traits: Serveis Cientifico-Tecnics of the University of Barcelona (Barcelona, Spain) using an elemental analyser (EA1108, Series 1; Carbo Erba Instrumentazione). - var_in: stem_d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: wood_delta13C entity_type: individual value_type: raw @@ -456,7 +456,7 @@ traits: Serveis Cientifico-Tecnics of the University of Barcelona (Barcelona, Spain) using an elemental analyser (EA1108, Series 1; Carbo Erba Instrumentazione). - var_in: root_d15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: root_delta15N entity_type: individual value_type: raw @@ -493,7 +493,7 @@ traits: Serveis Cientifico-Tecnics of the University of Barcelona (Barcelona, Spain) using an elemental analyser (EA1108, Series 1; Carbo Erba Instrumentazione). - var_in: root_d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: root_delta13C entity_type: individual value_type: raw @@ -606,7 +606,7 @@ traits: were determined using ImageJ (ImageJ 1.41, Wayne Rasband, National Institute of Health, USA). - var_in: abaxialEpiDen (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_epidermal_cell_density_abaxial entity_type: individual value_type: raw @@ -641,7 +641,7 @@ traits: by the equation S/[E+S] x 100. Where S = stomata per unit area and E = number of epidermal cells per unit area. - var_in: abaxialStomDen (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_stomatal_density_abaxial entity_type: individual value_type: raw @@ -676,7 +676,7 @@ traits: by the equation S/[E+S] x 100. Where S = stomata per unit area and E = number of epidermal cells per unit area. - var_in: adaxialEpiDen (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_epidermal_cell_density_adaxial entity_type: individual value_type: raw @@ -711,7 +711,7 @@ traits: by the equation S/[E+S] x 100. Where S = stomata per unit area and E = number of epidermal cells per unit area. - var_in: adaxialStomDen (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_stomatal_density_adaxial entity_type: individual value_type: raw diff --git a/data/Lim_2017/metadata.yml b/data/Lim_2017/metadata.yml index 98ef1e3f8..a0b252325 100644 --- a/data/Lim_2017/metadata.yml +++ b/data/Lim_2017/metadata.yml @@ -390,7 +390,7 @@ traits: et al. 2013). SLA was calculated as the ratio of the one-sided area of each group of leaves to its dry mass (Perez-Harguindeguy et al. 2013). - var_in: lumen.fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: stem_vessel_lumen_fraction entity_type: individual value_type: raw @@ -407,7 +407,7 @@ traits: unit area, by dividing the number of vessels observed in each section by the total area of the section (Zanne et al. 2010). - var_in: non-lumen.fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: stem_vessel_non_lumen_fraction entity_type: individual value_type: raw diff --git a/data/Lusk_2010/metadata.yml b/data/Lusk_2010/metadata.yml index 322f7e638..ef1d98367 100644 --- a/data/Lusk_2010/metadata.yml +++ b/data/Lusk_2010/metadata.yml @@ -146,7 +146,7 @@ traits: (i.e. the cell contents). life_stage: sapling - var_in: Cell wall fraction - unit_in: dimensionless + unit_in: mg/mg trait_name: leaf_cell_wall_fraction entity_type: population value_type: mean diff --git a/data/Lusk_2012/metadata.yml b/data/Lusk_2012/metadata.yml index b9db00fe1..58640254e 100644 --- a/data/Lusk_2012/metadata.yml +++ b/data/Lusk_2012/metadata.yml @@ -145,7 +145,7 @@ traits: and leaf areas. Relative growth rates (RGR) of stem volume (d-1) during the 90-d period were calculated - var_in: Asat (mol m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: population value_type: mean @@ -162,7 +162,7 @@ traits: 1000 mmol m22 s21, and leaf temperature at 24 and 29 8C in the cool and warm treatments, respectively. - var_in: Gs (moles m-2 d-1) - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: population value_type: mean @@ -190,7 +190,7 @@ traits: entire cross-section was estimated by scaling up the sum of diameters for the pie slice portion that was analysed with the image software. - var_in: Kp (kg m-1 s-1 MPa-1) - unit_in: kg/m/s/MPa + unit_in: kg/m/MPa/s trait_name: sapwood_specific_conductivity_theoretical entity_type: population value_type: mean diff --git a/data/MacinnisNg_2004/metadata.yml b/data/MacinnisNg_2004/metadata.yml index 77e2f9178..8f118f26f 100644 --- a/data/MacinnisNg_2004/metadata.yml +++ b/data/MacinnisNg_2004/metadata.yml @@ -124,7 +124,7 @@ contexts: description: Measurements made in summer. traits: - var_in: Hv sapwood - unit_in: mm2_sapwood/mm2_leaf + unit_in: mm2{sapwood}/mm2{leaf} trait_name: huber_value entity_type: individual value_type: raw @@ -138,7 +138,7 @@ traits: of branch in 0.5% toluidine blue solution. The stained sapwood area was measured with a calibrated eyepiece micrometer. - var_in: stem_hydraulic_conductivity - unit_in: 10^6 x kg*m/s/MPa + unit_in: 10^6.kg.m/MPa/s trait_name: stem_hydraulic_conductivity entity_type: individual value_type: raw @@ -167,7 +167,7 @@ traits: calculated by multiplying the conductance by the branch length and was expressed in terms of leaf area, sapwood area and branch transverse area. - var_in: HC per leaf area - unit_in: 10^3 x kg/m/s/MPa + unit_in: 10^3.kg/m/MPa/s trait_name: leaf_specific_conductivity entity_type: individual value_type: raw @@ -196,8 +196,8 @@ traits: calculated by multiplying the conductance by the branch length and was expressed in terms of leaf area, sapwood area and branch transverse area. - var_in: HC per branch TA - unit_in: 10^1 x kg/m/s/MPa - trait_name: stem_transverse_branch_area_specific_conductivity + unit_in: 10^1.kg/m/MPa/s + trait_name: stem_specific_conductivity entity_type: individual value_type: raw basis_of_value: measurement @@ -225,7 +225,7 @@ traits: (kg s-1 m MPa-1) was calculated by multiplying the conductance by the branch length and was expressed in terms of leaf area, sapwood area and branch transverse area. - var_in: HC per SW area - unit_in: 10^1 x kg/m/s/MPa + unit_in: 10^1.kg/m/MPa/s trait_name: sapwood_specific_conductivity entity_type: individual value_type: raw @@ -284,7 +284,7 @@ traits: water potential (generally the sample collected between 1200 and 1300 hours) was calculated for each species and habitat in summer (January) and winter (July). - var_in: Amass - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: population value_type: mean diff --git a/data/MacinnisNg_2016/metadata.yml b/data/MacinnisNg_2016/metadata.yml index d86f5845a..f579e7210 100644 --- a/data/MacinnisNg_2016/metadata.yml +++ b/data/MacinnisNg_2016/metadata.yml @@ -115,7 +115,7 @@ contexts: description: Measurements made in summer. traits: - var_in: Hv sapwood - unit_in: mm2_sapwood/mm2_leaf + unit_in: mm2{sapwood}/mm2{leaf} trait_name: huber_value entity_type: individual value_type: raw @@ -131,7 +131,7 @@ traits: toluidine blue solution. The stained sapwood area was measured with a calibrated eyepiece micrometer. - var_in: stem_hydraulic_conductivity - unit_in: 10^6 x kg*m/s/MPa + unit_in: 10^6.kg.m/MPa/s trait_name: stem_hydraulic_conductivity entity_type: individual value_type: raw @@ -160,7 +160,7 @@ traits: calculated by multiplying the conductance by the branch length and was expressed in terms of leaf area, sapwood area and branch transverse area. - var_in: HC per leaf area - unit_in: kg/m/s/MPa + unit_in: kg/m/MPa/s trait_name: leaf_specific_conductivity entity_type: individual value_type: raw @@ -189,8 +189,8 @@ traits: calculated by multiplying the conductance by the branch length and was expressed in terms of leaf area, sapwood area and branch transverse area. - var_in: HC per branch TA - unit_in: kg/m/s/MPa - trait_name: stem_transverse_branch_area_specific_conductivity + unit_in: kg/m/MPa/s + trait_name: stem_specific_conductivity entity_type: individual value_type: raw basis_of_value: measurement @@ -218,7 +218,7 @@ traits: calculated by multiplying the conductance by the branch length and was expressed in terms of leaf area, sapwood area and branch transverse area. - var_in: HC per SW area - unit_in: kg/m/s/MPa + unit_in: kg/m/MPa/s trait_name: sapwood_specific_conductivity entity_type: individual value_type: raw @@ -247,7 +247,7 @@ traits: calculated by multiplying the conductance by the branch length and was expressed in terms of leaf area, sapwood area and branch transverse area. - var_in: Aarea - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: mean @@ -272,7 +272,7 @@ traits: rate was measured on three leaves on three plants in each plot, with two plots at each site (a total of 18 samples per site). - var_in: Amass - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: individual value_type: mean @@ -298,7 +298,7 @@ traits: at each site (a total of 18 samples per site). - var_in: ETRmax unit_in: umol/m2/s - trait_name: leaf_fluorescence_Jmax_per_area + trait_name: leaf_photosynthesis_Jmax_per_area entity_type: individual value_type: mean basis_of_value: measurement diff --git a/data/McGlone_2015/metadata.yml b/data/McGlone_2015/metadata.yml index 7da6dd727..761b8a6d7 100644 --- a/data/McGlone_2015/metadata.yml +++ b/data/McGlone_2015/metadata.yml @@ -147,14 +147,6 @@ traits: basis_of_value: expert_score replicates: .na methods: data sourced from reference books listed as secondary references -- var_in: parasitic - unit_in: .na - trait_name: parasitic - value_type: mode - basis_of_value: expert_score - replicates: .na - methods: data sourced from reference books listed as secondary references; a subset - of data under `habit` - var_in: woodiness unit_in: .na trait_name: woodiness diff --git a/data/Metcalfe_2009/metadata.yml b/data/Metcalfe_2009/metadata.yml index 320f9787f..7f017f042 100644 --- a/data/Metcalfe_2009/metadata.yml +++ b/data/Metcalfe_2009/metadata.yml @@ -505,7 +505,7 @@ traits: replicates: .na methods: expert observation or reference book - var_in: seed_longevity_numeric - unit_in: years + unit_in: a trait_name: seed_longevity_numeric entity_type: species value_type: bin diff --git a/data/Metcalfe_2020_2/metadata.yml b/data/Metcalfe_2020_2/metadata.yml index 2f6e14f9d..d31d0e1d4 100644 --- a/data/Metcalfe_2020_2/metadata.yml +++ b/data/Metcalfe_2020_2/metadata.yml @@ -402,10 +402,6 @@ taxonomic_updates: replace: Dimeria sp. Mosquito Point (J.R.Clarkson+ 9994) reason: match_07_fuzzy. Fuzzy alignment with accepted canonical name in APC (2022-11-10) taxonomic_resolution: Species -- find: Echinochloa polystachya cv. Amity - replace: Echinochloa polystachya 'Amity' - reason: Manual alignment with canonical species name in APC (Elizabeth Wenk, 2022-11-12) - taxonomic_resolution: Species - find: Eriachne armitii replace: Eriachne armittii reason: match_07_fuzzy. Fuzzy alignment with accepted canonical name in APC (2022-11-10) @@ -428,10 +424,6 @@ taxonomic_updates: replace: Pseudoraphis sp. (Port Douglas R.L.Jago 6610) reason: Manual alignment with canonical species name in APC (Elizabeth Wenk, 2022-11-22) taxonomic_resolution: Species -- find: Hymenachne amplexicaulis cv. Olive - replace: Hymenachne amplexicaulis 'Olive' - reason: Manual alignment with canonical species name in APC (Elizabeth Wenk, 2022-11-12) - taxonomic_resolution: Species - find: Iseilema calvum x I. vaginiflorum replace: Iseilema x [Iseilema calvum x I. vaginiflorum; Metcalfe_2020_2] reason: match_11. Rewording hybrid species name not in APC or APNI to indicate a @@ -469,5 +461,8 @@ taxonomic_updates: replace: Thaumastochloa sp. Morehead River (J.R.Clarkson+ 8086) reason: match_07_fuzzy. Fuzzy alignment with accepted canonical name in APC (2022-11-10) taxonomic_resolution: Species -exclude_observations: .na +exclude_observations: +- variable: taxon_name + find: Echinochloa polystachya cv. Amity, Hymenachne amplexicaulis cv. Olive + reason: excluding cultivars questions: .na diff --git a/data/Mokany_2008/metadata.yml b/data/Mokany_2008/metadata.yml index 7e57e949d..53122150b 100644 --- a/data/Mokany_2008/metadata.yml +++ b/data/Mokany_2008/metadata.yml @@ -118,7 +118,7 @@ traits: methods: Obtained from various literature sources. - var_in: tap_root2 unit_in: .na - trait_name: root_tap_root_status + trait_name: root_system_type entity_type: species value_type: mode basis_of_value: expert_score @@ -210,7 +210,7 @@ traits: coefficient for pot grown plants ('B' from Gale & Grigal (1987), where high values indicate root biomass allocated deeper in the soil). - var_in: Root:Shoot ratio - unit_in: mg_root/mg_shoot + unit_in: mg{root}/mg{shoot} trait_name: root_shoot_ratio entity_type: individual value_type: raw @@ -272,7 +272,7 @@ traits: methods: Trait measurements were made using standard methods (Cornelissen et al. 2003b). - var_in: leaf angle (degrees from horizontal) - unit_in: degrees + unit_in: deg trait_name: leaf_inclination_angle entity_type: individual value_type: raw @@ -401,7 +401,7 @@ traits: using WinRhizo 3.9f Pro (Regent Instruments, Quebec) to determine the root sample's total volume, length, surface area, and average diameter. - var_in: B (root biomass depth distribution coefficient (Gale and Grigal 1987)) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: root_distribution_coefficient entity_type: population value_type: mean @@ -414,9 +414,9 @@ traits: (1987), where high values indicate root biomass allocated deeper in the soil). - var_in: Diameter of the thickest root (mm) unit_in: mm - trait_name: root_thickest_diameter + trait_name: root_diameter entity_type: individual - value_type: raw + value_type: maximum basis_of_value: measurement replicates: 1 methods: Diameter of the thickest root measured at it's thickest point. For each @@ -460,13 +460,13 @@ substitutions: - trait_name: photosynthetic_pathway find: '3' replace: cam -- trait_name: root_tap_root_status +- trait_name: root_system_type find: '0' replace: tap_root_absent -- trait_name: root_tap_root_status +- trait_name: root_system_type find: '1' replace: tap_root_present -- trait_name: root_tap_root_status +- trait_name: root_system_type find: '2' replace: tap_root_sometimes_present - trait_name: life_form diff --git a/data/Moore_2019_2/metadata.yml b/data/Moore_2019_2/metadata.yml index e01b83bb5..33ffa7840 100644 --- a/data/Moore_2019_2/metadata.yml +++ b/data/Moore_2019_2/metadata.yml @@ -205,7 +205,7 @@ traits: replicates: .na methods: expert observation or reference book - var_in: resprout_prop - unit_in: dimensionless + unit_in: '{count}/{count}' trait_name: fire_response_stem_ratio entity_type: individual value_type: mean @@ -214,7 +214,7 @@ traits: methods: Tillers were counted before the fire treatment. After 10 wk, plant survival and the number of post-fire tillers per plant were recorded. - var_in: resprouting_proportion_individuals - unit_in: dimensionless + unit_in: '{count}/{count}' trait_name: fire_response_numeric entity_type: population value_type: mean diff --git a/data/Muir_2014/metadata.yml b/data/Muir_2014/metadata.yml index a11e7b3c0..e6ae2d656 100644 --- a/data/Muir_2014/metadata.yml +++ b/data/Muir_2014/metadata.yml @@ -161,7 +161,7 @@ traits: gas chromatography performed by The Surface and Chemical Analysis Network at The University of Melbourne. (Analysis led by Freya Thomas) - var_in: flower_count_maximum - unit_in: count + unit_in: '{count}' trait_name: flower_count_maximum entity_type: population value_type: mean diff --git a/data/NHNSW_2014_2/metadata.yml b/data/NHNSW_2014_2/metadata.yml index 195d70c21..7a90c07da 100644 --- a/data/NHNSW_2014_2/metadata.yml +++ b/data/NHNSW_2014_2/metadata.yml @@ -128,14 +128,6 @@ traits: basis_of_value: expert_score replicates: .na methods: unknown -- var_in: growth_habit - unit_in: .na - trait_name: stem_growth_habit - entity_type: species - value_type: mode - basis_of_value: expert_score - replicates: .na - methods: unknown - var_in: woodiness unit_in: .na trait_name: woodiness @@ -296,51 +288,6 @@ traits: basis_of_value: expert_score replicates: .na methods: unknown -- var_in: growth_habit - unit_in: .na - trait_name: growth_habit - value_type: mode - basis_of_value: expert_score - replicates: .na - methods: unknown -- var_in: life_form - unit_in: .na - trait_name: life_form - value_type: mode - basis_of_value: expert_score - replicates: .na - methods: unknown -- var_in: growth_habit - unit_in: .na - trait_name: growth_habit - value_type: mode - basis_of_value: expert_score - replicates: .na - methods: unknown -- var_in: height class - unit_in: .na - trait_name: .na - entity_type: .na - value_type: .na - basis_of_value: .na - replicates: .na - methods: .na -- var_in: propagation - unit_in: .na - trait_name: .na - entity_type: .na - value_type: .na - basis_of_value: .na - replicates: .na - methods: .na -- var_in: introduced - unit_in: .na - trait_name: .na - entity_type: .na - value_type: .na - basis_of_value: .na - replicates: .na - methods: .na substitutions: - trait_name: plant_growth_substrate find: epiphytic diff --git a/data/NHNSW_2022/data.csv b/data/NHNSW_2022/data.csv index a6a6c5e8e..e1cc73503 100644 --- a/data/NHNSW_2022/data.csv +++ b/data/NHNSW_2022/data.csv @@ -14,7 +14,7 @@ "Abrophyllum","Abrophyllum"," shrubs or small trees. ","perennial","inferred_from_growth_form","","","shrub tree","shrubs trees","","","","","","","woody","" "Abrophyllum","Abrophyllum ornans"," shrub or small tree to 8 m high, branchlets herbaceous. ","perennial","inferred_from_growth_form","","","shrub tree","shrub tree","","","","","","","woody","" "Abrotanella","Abrotanella"," small perennial herbs, usually densely tufted, rarely short-decumbent or ascending, ± glabrous. ","perennial","perennial","","","herb","herbs","","","","","decumbent","decumbent ascending","herbaceous","" -"Abrotanella","Abrotanella nivigena"," perennial herb, < 5-7 cm high, dense-tufted or with short stem, underground stock ± woody, glabrous. ","perennial","perennial","","","herb","herb","","","","","dense","dense","herbaceous","" +"Abrotanella","Abrotanella nivigena"," perennial herb, < 5-7 cm high, dense-tufted or with short stem, underground stock ± woody, glabrous. ","perennial","perennial","","","herb","herb","","","","","dense","dense","woody_root herbaceous","" "Abrus","Abrus"," woody subshrubs or lianas pulvinate, paripinnate, minutely stipellate; ","","","","","subshrub climber_woody","subshrubs lianas","","","","","","","","" "Abrus","Abrus precatorius"," woodytwiner with stems to 10 m long. ","perennial","inferred_from_growth_form","","","climber_woody","woodytwiner","","","","","","","woody","inferred_from_growth_form" "Abrus","Abrus precatorius subsp. africanus"," woodytwiner with stems to 10 m long. ","perennial","inferred_from_growth_form","","","climber_woody","woodytwiner","","","","","","","woody","inferred_from_growth_form" @@ -744,8 +744,8 @@ "Arabidella","Arabidella eremigena"," many-stemmed herb to 35 cm high, prostrate or erect, ","","","","","herb","herb","","","","","erect prostrate","erect prostrate","herbaceous","" "Arabidella","Arabidella nasturtium"," many-stemmed herb to 50 cm high, stems terete or finely fluted, glabrous. ","","","","","herb","herb","","","","","","","herbaceous","" "Arabidella","Arabidella procumbens"," many-stemmed herb, usually prostrate with stems to 15 cm long, glabrous. ","","","","","herb","herb","","","","","prostrate","prostrate","herbaceous","" -"Arabidella","Arabidella sp. Tibooburra (R.G.Coveny 13552)"," woody muchbranched subshrub to 50 cm high, erect, stems glabrous. ","","","","","subshrub","subshrub","","","","","erect","erect","","" -"Arabidella","Arabidella trisecta"," woody subshrub to 60 cm high, erect. ","","","","","subshrub","subshrub","","","","","erect","erect","","" +"Arabidella","Arabidella sp. Tibooburra (R.G.Coveny 13552)"," woody muchbranched subshrub to 50 cm high, erect, stems glabrous. ","","","","","subshrub","subshrub","","","","","erect","erect","woody","" +"Arabidella","Arabidella trisecta"," woody subshrub to 60 cm high, erect. ","","","","","subshrub","subshrub","","","","","erect","erect","woody","" "Arabidopsis","Arabidopsis"," annual herbs. ","annual","annual","","","herb","herbs","","","","","","","herbaceous","" "Arabidopsis","Arabidopsis thaliana"," slender annual. mostly 10-40 cm high, simple or branched. ","annual","annual","","","herb","inferred_from_genus","","","","","","","herbaceous","" "Arachniodes","Arachniodes"," terrestrial ferns, rhizome short-creeping, ","","","","","fern","ferns","terrestrial","terrestrial","","","creeping rhizomatous","creeping rhizome","herbaceous","inferred_from_growth_form" @@ -1220,12 +1220,12 @@ "Beyeria","Beyeria viscosa"," shrub 3-4 m high. ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","","","woody","" "Bidens","Bidens"," annual or [perennial] woody herbs. ","annual perennial","annual perennial","","","herb","herbs","","","","","","","herbaceous","" "Bidens","Bidens aurea"," erect annual or perennial herb 50-15- cm high. ","annual perennial","annual perennial","","","herb","herb","","","","","erect","erect","herbaceous","" -"Bidens","Bidens bipinnata"," almost glabrous woody herb to 1.6 m high. ","","","","","herb","herb","","","","","","","herbaceous","" -"Bidens","Bidens pilosa"," almost glabrous to densely hairy woody herb to 1 m or more high. ","","","","","herb","herb","","","","","","","herbaceous","" -"Bidens","Bidens subalternans"," almost glabrous woody herb to 1.6 m high. ","","","","","herb","herb","","","","","","","herbaceous","" -"Bidens","Bidens tripartita"," glabrous to hairy woody herb to 1 m high. ","","","","","herb","herb","","","","","","","herbaceous","" -"Bidens","Bidens pilosa var. minor"," ","","","","","herb","inferred_from_genus","","","","","","","herbaceous","" -"Bidens","Bidens pilosa var. pilosa"," ","","","","","herb","inferred_from_genus","","","","","","","herbaceous","" +"Bidens","Bidens bipinnata"," almost glabrous woody herb to 1.6 m high. ","","","","","herb","herb","","","","","","","woody","" +"Bidens","Bidens pilosa"," almost glabrous to densely hairy woody herb to 1 m or more high. ","","","","","herb","herb","","","","","","","woody","" +"Bidens","Bidens subalternans"," almost glabrous woody herb to 1.6 m high. ","","","","","herb","herb","","","","","","","woody","" +"Bidens","Bidens tripartita"," glabrous to hairy woody herb to 1 m high. ","","","","","herb","herb","","","","","","","woody","" +"Bidens","Bidens pilosa var. minor"," ","","","","","herb","inferred_from_genus","","","","","","","woody","" +"Bidens","Bidens pilosa var. pilosa"," ","","","","","herb","inferred_from_genus","","","","","","","woody","" "Bignoniaceae","Bignoniaceae"," trees or shrubs or often woodyclimbers, rarely herbs. ","","","","","herb shrub tree climber_woody","herbs shrubs trees woodyclimbers","","","","","","","woody herbaceous","" "Billardiera","Billardiera"," undershrubs or perennial climbers or scramblers or with twining branches up to a few metres long. ","perennial","perennial","","","subshrub climber","undershrubs climbers","","","","","","","","" "Billardiera","Billardiera mutabilis"," slender, twining shrubs; ","perennial","inferred_from_genus","","","shrub","shrubs","","","","","","","woody","" @@ -1483,7 +1483,7 @@ "Brassica","Brassica rapa"," annual or biennial to 1 m high, branched. ","annual biennial","annual biennial","","","herb","inferred_from_genus","","","","","","","herbaceous","" "Brassica","Brassica x juncea"," annual to 1 m high, ","annual","annual","","","herb","inferred_from_genus","","","","","","","herbaceous","" "Brassica","Brassica x napus"," annual or biennial. taproot robust, often tuberous. ","annual biennial","annual biennial","","","herb","inferred_from_genus","","","","","","","herbaceous","" -"Brassica","Brassica oleracea"," biennial or perennial with stems usually to 1 m high, becoming woody with conspicuous basal leaf-scars. ","biennial perennial","biennial perennial","","","herb","inferred_from_genus","","","","","","","herbaceous","" +"Brassica","Brassica oleracea"," biennial or perennial with stems usually to 1 m high, becoming woody with conspicuous basal leaf-scars. ","biennial perennial","biennial perennial","","","herb","inferred_from_genus","","","","","","","woody herbaceous","" "Brassica","Brassica fruticulosa"," biennial or perennial, usually glabrous, often glaucescent, erect, to 50 cm high. ","biennial perennial","biennial perennial","","","herb","inferred_from_genus","","","","","erect","erect","herbaceous","" "Brassicaceae","Brassicaceae"," annual to perennial herbs, rarely small shrubs, commonly smelling like mustard or cabbage when crushed. ","annual perennial","annual perennial","","","herb shrub","herbs shrubs","","","","","","","woody herbaceous","" "Breynia","Breynia"," shrubs or small trees, monoecious. ","perennial","inferred_from_growth_form","","","shrub tree","shrubs trees","","","monoecious","monoecious","","","woody","" @@ -1761,7 +1761,7 @@ "Campanulaceae","Campanulaceae"," annual or perennial herbs, usually with a milky latex. ","annual perennial","annual perennial","","","herb","herbs","","","","","","","herbaceous","" "Campsis","Campsis"," deciduous scrambling shrubs or woodyvines, often climbing and clinging by aerial rootlets. ","perennial","inferred_from_growth_form","","","shrub climber_woody","shrubs woodyvines","","","","","climbing","climbing","woody","" "Campsis","Campsis radicans"," woodyvine to scrambling shrub with aerial roots. ","perennial","inferred_from_growth_form","","","shrub climber_woody","shrub woodyvine","","","","","","","woody","" -"Campsis","Campsis x tagliabuana"," woody, clinging vine which attaches itself to structures and climbs by aerial roots; rapidly growing. ","","","","","climber_herbaceous","vine","","","","","","","herbaceous","" +"Campsis","Campsis x tagliabuana"," woody, clinging vine which attaches itself to structures and climbs by aerial roots; rapidly growing. ","","","","","climber_woody","vine","","","","","","","woody","" "Camptacra","Camptacra"," perennials, seasonal stems arising from woodyrootstock. ","perennial","perennials","","","herb","inferred_from_life_history","","","","","","","woody_root herbaceous","woodyrootstock" "Camptacra","Camptacra barbata"," erect or decumbent herb, usually 30-40 cm high. ","perennial","inferred_from_genus","","","herb","herb","","","","","erect decumbent","erect decumbent","herbaceous","" "Canarium","Canarium"," trees or shrubs, evergreen or deciduous, dioecious. ","perennial","inferred_from_growth_form","","","shrub tree","shrubs trees","","","dioecious","dioecious","","","woody","" @@ -2226,7 +2226,7 @@ "Clerodendrum","Clerodendrum inerme"," erect or straggling shrub, to 6 m high, ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","erect","erect","woody","" "Clerodendrum","Clerodendrum tomentosum"," shrub or tree, 1-10 m high, usually velvety. ","perennial","inferred_from_growth_form","","","shrub tree","shrub tree","","","","","","","woody","" "Clytostoma","Clytostoma"," evergreen woodyvines, climbing with tendrils; ","perennial","inferred_from_growth_form","","","climber_woody","woodyvines","","","","","climbing","climbing","woody","inferred_from_growth_form" -"Clytostoma","Clytostoma callistegioides"," robust climber, woodystemmed, climbing with tendrils. ","","","","","climber","climber","","","","","climbing","climbing","","" +"Clytostoma","Clytostoma callistegioides"," robust climber, woodystemmed, climbing with tendrils. ","","","","","climber","climber","","","","","climbing","climbing","woody","" "Coatesia","Coatesia"," small trees. ","perennial","inferred_from_growth_form","","","tree","trees","","","","","","","woody","" "Coatesia","Coatesia paniculata"," small to medium tree, to 12 m high, glabrous. ","perennial","inferred_from_growth_form","","","tree","tree","","","","","","","woody","" "Cobaea","Cobaea"," climbing shrubs or herbs. ","","","","","herb shrub","herbs shrubs","","","","","climbing","climbing","woody herbaceous","" @@ -2338,7 +2338,7 @@ "Coronidium","Coronidium"," perennial herbs. ","perennial","perennial","","","herb","herbs","","","","","","","herbaceous","" "Coronidium","Coronidium oxylepis"," perennial herb with woodyrootstock, to 60 cm high. ","perennial","perennial","","","herb","herb","","","","","","","woody_root herbaceous","woodyrootstock" "Coronidium","Coronidium waddelliae"," erect, multi-stemmed perennial herb. ","perennial","perennial","","","herb","herb","","","","","erect","erect","herbaceous","" -"Coronidium","Coronidium boormanii"," woody herb 60-150 cm high, simple or unbranched below the inflorescence; ","perennial","inferred_from_genus","","","herb","herb","","","","","","","herbaceous","" +"Coronidium","Coronidium boormanii"," woody herb 60-150 cm high, simple or unbranched below the inflorescence; ","perennial","inferred_from_genus","","","herb","herb","","","","","","","woody","" "Coronidium","Coronidium elatum subsp. vellerosum"," erect subshrub to 1 m high. ","perennial","inferred_from_genus","","","subshrub","subshrub","","","","","erect","erect","","" "Coronidium","Coronidium lindsayanum"," low, compact shrub. ","perennial","inferred_from_genus","","","shrub","shrub","","","","","compact","compact","woody","" "Coronidium","Coronidium elatum subsp. minus"," subshrub 30-80 cm high. ","perennial","inferred_from_genus","","","subshrub","subshrub","","","","","","","","" @@ -2675,7 +2675,7 @@ "Cyperus","Cyperus imbecillis"," small tufted perennial. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","","","herbaceous","" "Cyperus","Cyperus rigidellus"," slender annual or tufted perennial, occasionally viscid. ","annual perennial","annual perennial","","","herb graminoid","inferred_from_genus","","","","","","","herbaceous","" "Cyperus","Cyperus unioloides"," tufted perennial, often with short rhizome. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizome","herbaceous","" -"Cyperus","Cyperus rotundus"," rhizomatous perennial with slender rhizomes forming ovoid to ellipsoid tubers 5-10 mm diam., woody. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizomatous rhizomes","herbaceous","" +"Cyperus","Cyperus rotundus"," rhizomatous perennial with slender rhizomes forming ovoid to ellipsoid tubers 5-10 mm diam., woody. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizomatous rhizomes","woody_root herbaceous","" "Cyperus","Cyperus haspan"," slender, tufted perennial with short rhizome but sometimes apparently annual with fibrous roots only. ","annual perennial","annual perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizome","herbaceous","" "Cyperus","Cyperus pygmaeus"," small, tufted, leafy annual with reddish roots. ","annual","annual","","","herb graminoid","inferred_from_genus","","","","","","","herbaceous","" "Cyperus","Cyperus secubans"," slender, tufted perennial, usually somewhat viscid. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","","","herbaceous","" @@ -2684,7 +2684,7 @@ "Cyperus","Cyperus squarrosus"," dwarf tufted annual smelling strongly of fenugreek when dried. ","annual","annual","","","herb graminoid","inferred_from_genus","","","","","","","herbaceous","" "Cyperus","Cyperus aquatilis"," slender tufted annual. ","annual","annual","","","herb graminoid","inferred_from_genus","","","","","","","herbaceous","" "Cyperus","Cyperus concinnus"," tufted perennial with very short rhizome. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizome","herbaceous","" -"Cyperus","Cyperus bifax"," rhizomatous perennial with slender rhizomes producing ovoid tubers circa 5-10 mm diam., woody. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizomatous rhizomes","herbaceous","" +"Cyperus","Cyperus bifax"," rhizomatous perennial with slender rhizomes producing ovoid tubers circa 5-10 mm diam., woody. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizomatous rhizomes","woody_root herbaceous","" "Cyperus","Cyperus esculentus"," rhizomatous perennial with slender rhizomes forming globose to ovoid tubers circa 10 mm diam.. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizomatous rhizomes","herbaceous","" "Cyperus","Cyperus filipes"," tufted perennial. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","","","herbaceous","" "Cyperus","Cyperus castaneus"," small tufted annual. ","annual","annual","","","herb graminoid","inferred_from_genus","","","","","","","herbaceous","" @@ -2700,7 +2700,7 @@ "Cyperus","Cyperus sesquiflorus"," annual or perennial with short rhizome. ","annual perennial","annual perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizome","herbaceous","" "Cyperus","Cyperus papyrus"," very robust perennial sedge with a stout creeping rhizome. ","perennial","perennial","","","graminoid","sedge","","","","","creeping rhizomatous","creeping rhizome","herbaceous","inferred_from_growth_form" "Cyperus","Cyperus isabellinus"," slender annual or shortlivedperennial, tufted. ","annual short_lived_perennial","annual shortlivedperennial","","","herb graminoid","inferred_from_genus","","","","","","","herbaceous","" -"Cyperus","Cyperus victoriensis"," rhizomatous perennial with slender rhizomes forming ovoid to ellipsoid tubers 5-10 mm diam., woody. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizomatous rhizomes","herbaceous","" +"Cyperus","Cyperus victoriensis"," rhizomatous perennial with slender rhizomes forming ovoid to ellipsoid tubers 5-10 mm diam., woody. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizomatous rhizomes","woody_root herbaceous","" "Cyperus","Cyperus polystachyos"," tufted annual or perennial with short rhizome. ","annual perennial","annual perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizome","herbaceous","" "Cyperus","Cyperus sp. Stockton (K.L.Wilson 10541)"," to be inserted. ","","","","","herb graminoid","inferred_from_genus","","","","","","","herbaceous","" "Cyperus","Cyperus subulatus"," perennial with very short rhizome. ","perennial","perennial","","","herb graminoid","inferred_from_genus","","","","","rhizomatous","rhizome","herbaceous","" @@ -3130,7 +3130,7 @@ "Discaria","Discaria nitida"," shrub 2-5 m high, spiny, leaves early. ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","","","woody","" "Discaria","Discaria pubescens"," rigid shrub 0.4-2.5 m high, dominated by spines, leaves often falling early. ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","","","woody","" "Dissocarpus","Dissocarpus"," erect, hairy annuals or shortlivedperennials. ","annual short_lived_perennial","annuals shortlivedperennials","","","herb","inferred_from_life_history","","","","","erect","erect","herbaceous","" -"Dissocarpus","Dissocarpus fontinalis"," hemispherical annual or shortlivedperennial woody herb; ","annual short_lived_perennial","annual shortlivedperennial","","","herb","herb","","","","","","","herbaceous","" +"Dissocarpus","Dissocarpus fontinalis"," hemispherical annual or shortlivedperennial woody herb; ","annual short_lived_perennial","annual shortlivedperennial","","","herb","herb","","","","","","","woody","" "Dissocarpus","Dissocarpus paradoxus"," erect annual or shortlivedperennial to circa 50 cm high, ","annual short_lived_perennial","annual shortlivedperennial","","","herb","inferred_from_genus_life_history","","","","","erect","erect","herbaceous","" "Dissocarpus","Dissocarpus biflorus var. cephalocarpus"," ","","","","","herb","inferred_from_genus_life_history","","","","","","","herbaceous","" "Dissocarpus","Dissocarpus latifolius"," erect annual or shortlivedperennial to circa 50 cm high, ","annual short_lived_perennial","annual shortlivedperennial","","","herb","inferred_from_genus_life_history","","","","","erect","erect","herbaceous","" @@ -3291,7 +3291,7 @@ "Dysoxylum","Dysoxylum pachyphyllum"," tree to 8 m (recorded up to 15 m). ","perennial","inferred_from_growth_form","","","tree","tree","","","","","","","woody","" "Dysoxylum","Dysoxylum rufum"," small to medium-sized tree with finely wrinkled grey bark; new growth rusty-villous. ","perennial","inferred_from_growth_form","","","tree","tree","","","","","","","woody","" "Dysphania","Dysphania"," annual or shortlivedperennial herbs with various glands or glandular hairs, ","annual short_lived_perennial","annual shortlivedperennial","","","herb","herbs","","","","","","","herbaceous","" -"Dysphania","Dysphania ambrosioides"," perennial, aromatic woody herb to 1 m high. ","perennial","perennial","","","herb","herb","","","","","","","herbaceous","" +"Dysphania","Dysphania ambrosioides"," perennial, aromatic woody herb to 1 m high. ","perennial","perennial","","","herb","herb","","","","","","","woody","" "Dysphania","Dysphania multifida"," spreading perennial herb to circa 1 m high. ","perennial","perennial","","","herb","herb","","","","","spreading","spreading","herbaceous","" "Dysphania","Dysphania truncata"," prostrate to decumbent aromatic annual (or shortlivedperennial?) covered with glandular and other hairs. ","annual short_lived_perennial","annual shortlivedperennial","","","herb","inferred_from_genus","","","","","decumbent prostrate","decumbent prostrate","herbaceous","" "Dysphania","Dysphania carinata"," prostrate to erect, aromatic annual or shortlivedperennial covered with glandular and other hairs. ","annual short_lived_perennial","annual shortlivedperennial","","","herb","inferred_from_genus","","","","","erect prostrate","erect prostrate","herbaceous","" @@ -3849,7 +3849,7 @@ "Eriostemon","Eriostemon"," shrubs, ","perennial","inferred_from_growth_form","","","shrub","shrubs","","","","","","","woody","" "Eriostemon","Eriostemon australasius"," erect, bushy shrub 1-2 m high; ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","erect bushy","erect bushy","woody","" "Erodiophyllum","Erodiophyllum"," hairy perennial herbs. ","perennial","perennial","","","herb","herbs","","","","","","","herbaceous","" -"Erodiophyllum","Erodiophyllum elderi"," compact woody herb, 15-50 cm high; ","perennial","inferred_from_genus","","","herb","herb","","","","","compact","compact","herbaceous","" +"Erodiophyllum","Erodiophyllum elderi"," compact woody herb, 15-50 cm high; ","perennial","inferred_from_genus","","","herb","herb","","","","","compact","compact","woody","" "Erodium","Erodium"," ascending annual or shortlivedperennial herbs [or shrubs]. ","annual short_lived_perennial","annual shortlivedperennial","","","herb shrub","herbs shrubs","","","","","decumbent","ascending","woody herbaceous","" "Erodium","Erodium aureum"," dwarf annual or short-lived herb to 20 cm high, ","annual","annual","","","herb","herb","","","","","","","herbaceous","" "Erodium","Erodium botrys"," ascending to erect annual herb to 40 cm high, ","annual","annual","","","herb","herb","","","","","erect decumbent","erect ascending","herbaceous","" @@ -4202,7 +4202,7 @@ "Euphorbia","Euphorbia australis"," prostrate annual or shortlivedperennial 30-60 cm wide, stems much branched, villous. ","annual short_lived_perennial","annual shortlivedperennial","","","herb","inferred_from_life_history","","","monoecious","inferred_from_genus","prostrate","prostrate","herbaceous","" "Euphorbia","Euphorbia lathyris"," stout biennial to 1 m high; ","biennial","biennial","","","herb","inferred_from_life_history","","","monoecious","inferred_from_genus","","","herbaceous","" "Euphorbia","Euphorbia bifida"," perennial often flowering during first year, erect to decumbent, to 30 cm, but often < 20 cm high, ","perennial","perennial","","","herb","inferred_from_life_history","","","monoecious","inferred_from_genus","erect decumbent","erect decumbent","herbaceous","" -"Euphorbia","Euphorbia terracina"," erect or ascending woody herb to 80 cm high; ","","","","","herb","herb","","","monoecious","inferred_from_genus","erect decumbent","erect ascending","herbaceous","" +"Euphorbia","Euphorbia terracina"," erect or ascending woody herb to 80 cm high; ","","","","","herb","herb","","","monoecious","inferred_from_genus","erect decumbent","erect ascending","woody","" "Euphorbia","Euphorbia stevenii"," herbaceous shrub 20-60 cm high, branching with erect, fleshy stems 5-9 mm diam., slightly swollen in lower parts. ","perennial","inferred_from_growth_form","","","shrub","shrub","","","monoecious","inferred_from_genus","erect","erect","woody","" "Euphorbia","Euphorbia prostrata"," prostrate annual herb, stems several, to circa 20 cm long, forming dense mats. ","annual","annual","","","herb","herb","","","monoecious","inferred_from_genus","mat-forming prostrate dense","forming dense mats prostrate dense","herbaceous","" "Euphorbia","Euphorbia inappendiculata var. queenslandica"," erect to spreading herb with numerous pale stems to circa 15 cm long, glabrous. ","","","","","herb","herb","","","monoecious","inferred_from_genus","erect spreading","erect spreading","herbaceous","" @@ -4213,7 +4213,7 @@ "Euphorbia","Euphorbia tannensis subsp. tannensis"," compact shrub to 60 cm high, ","perennial","inferred_from_growth_form","","","shrub","shrub","","","monoecious","inferred_from_genus","compact","compact","woody","" "Euphorbia","Euphorbia helioscopia"," erect or spreading annual to circa 50 cm high with 1-many stems, ","annual","annual","","","herb","inferred_from_life_history","","","monoecious","inferred_from_genus","erect spreading","erect spreading","herbaceous","" "Euphorbia","Euphorbia planiticola"," ","","","","","","","","","monoecious","inferred_from_genus","","","","" -"Euphorbia","Euphorbia oblongata"," woody perennial to circa 80 cm high; ","perennial","perennial","","","herb","inferred_from_life_history","","","monoecious","inferred_from_genus","","","herbaceous","" +"Euphorbia","Euphorbia oblongata"," woody perennial to circa 80 cm high; ","perennial","perennial","","","herb","inferred_from_life_history","","","monoecious","inferred_from_genus","","","woody","" "Euphorbia","Euphorbia drummondii"," perennial herb with prostrate, ascending or decumbent stems mostly to 20 cm long, glabrous; ","perennial","perennial","","","herb","herb","","","monoecious","inferred_from_genus","decumbent prostrate","decumbent ascending prostrate","herbaceous","" "Euphorbia","Euphorbia dallachyana"," perennial herb with prostrate, ascending or decumbent stems mostly to 20 cm long, glabrous. ","perennial","perennial","","","herb","herb","","","monoecious","inferred_from_genus","decumbent prostrate","decumbent ascending prostrate","herbaceous","" "Euphorbia","Euphorbia wheeleri"," annual herb 15-30 cm high with ascending to erect slender stems, glabrous. ","annual","annual","","","herb","herb","","","monoecious","inferred_from_genus","erect decumbent","erect ascending","herbaceous","" @@ -4309,7 +4309,7 @@ "Ficinia","Ficinia"," perennial, tufted or rhizomatous sedges. ","perennial","perennial","","","graminoid","sedges","","","","","rhizomatous","rhizomatous","herbaceous","inferred_from_growth_form" "Ficus","Ficus coronata"," shrub or small tree, ","perennial","inferred_from_growth_form","","","shrub tree","shrub tree","epiphyte","inferred_from_genus","","","","","woody","" "Ficus","Ficus obliqua var. obliqua"," medium-sized to large strangling tree with massive trunks of coalesced roots, ","perennial","inferred_from_growth_form","","","tree","tree","epiphyte","inferred_from_genus","","","","","woody","" -"Ficus","Ficus pumila"," woody creeper climbing by adventitious roots, petioles, ","","","","","","","epiphyte","inferred_from_genus","","","climbing","climbing","","" +"Ficus","Ficus pumila"," woody creeper climbing by adventitious roots, petioles, ","","","","","","","epiphyte","inferred_from_genus","","","climbing","climbing","woody","" "Ficus","Ficus rubiginosa"," small to large spreading tree, ","perennial","inferred_from_growth_form","","","tree","tree","epiphyte","inferred_from_genus","","","spreading","spreading","woody","" "Ficus","Ficus henneana"," strangler, usually a tall buttressed tree and ± deciduous. ","perennial","inferred_from_growth_form","","","tree","tree","epiphyte","inferred_from_genus","","","","","woody","" "Ficus","Ficus superba"," strangler, usually a tall buttressed tree and ± deciduous. ","perennial","inferred_from_growth_form","","","tree","tree","epiphyte","inferred_from_genus","","","","","woody","" @@ -4671,8 +4671,8 @@ "Gonocarpus","Gonocarpus tetragynus"," erect or ascending perennial herb 15-30 cm high; ","perennial","perennial","","","herb","herb","","","","","erect decumbent","erect ascending","herbaceous","" "Gonocarpus","Gonocarpus teucrioides"," erect, multistemmed herb or subshrub, usually 20-40 cm high; ","","","","","herb subshrub","herb subshrub","","","","","erect","erect","herbaceous","" "Gonocarpus","Gonocarpus micranthus subsp. ramosissimus"," ","","","","","herb","inferred_from_species","","","","","","","herbaceous","" -"Goodenia","Goodenia heterophylla subsp. heterophylla"," erect to ascending herb with simple, ","","","","","herb","herb","","","","","erect decumbent","erect ascending","herbaceous","" -"Goodenia","Goodenia heterophylla subsp. montana"," ascending to erect herbs, usually hairy but hairs, ","","","","","herb","herbs","","","","","erect decumbent","erect ascending","herbaceous","" +"Goodenia","Goodenia heterophylla subsp. heterophylla"," erect to ascending herb with simple, ","","","","","herb","herb","","","","","erect decumbent","erect ascending","woody","" +"Goodenia","Goodenia heterophylla subsp. montana"," ascending to erect herbs, usually hairy but hairs, ","","","","","herb","herbs","","","","","erect decumbent","erect ascending","woody","" "Goodenia","Goodenia"," herbs or shrubs, glabrous, ","","","","","herb shrub","herbs shrubs","","","","","","","woody herbaceous","" "Goodenia","Goodenia bellidifolia"," erect herbs to 60 cm high, ","","","","","herb","herbs","","","","","erect","erect","herbaceous","" "Goodenia","Goodenia berardiana"," annual herb to 40 cm high. ","annual","annual","","","herb","herb","","","","","","","herbaceous","" @@ -4692,8 +4692,8 @@ "Goodenia","Goodenia havilandii"," prostrate to ascending, short-lived herb to 18 cm high, ","","","","","herb","herb","","","","","decumbent prostrate","ascending prostrate","herbaceous","" "Goodenia","Goodenia hederacea"," prostrate to ascending herb to 80 cm high. ","","","","","herb","herb","","","","","decumbent prostrate","ascending prostrate","herbaceous","" "Goodenia","Goodenia heteromera"," perennial or annual herb with stolons to 20 cm long. ","annual perennial","annual perennial","","","herb","herb","","","","","","","herbaceous","" -"Goodenia","Goodenia heterophylla"," erect to procumbent ± woody herb to 40 cm high, ","","","","","herb","herb","","","","","erect prostrate","erect procumbent","herbaceous","" -"Goodenia","Goodenia heterophylla subsp. eglandulosa"," ascending to erect herbs, usually hairy but hairs, ","","","","","herb","herbs","","","","","erect decumbent","erect ascending","herbaceous","" +"Goodenia","Goodenia heterophylla"," erect to procumbent ± woody herb to 40 cm high, ","","","","","herb","herb","","","","","erect prostrate","erect procumbent","woody","" +"Goodenia","Goodenia heterophylla subsp. eglandulosa"," ascending to erect herbs, usually hairy but hairs, ","","","","","herb","herbs","","","","","erect decumbent","erect ascending","woody","" "Goodenia","Goodenia humilis"," weak perennial herb to 20 cm high, ","perennial","perennial","","","herb","herb","","","","","","","herbaceous","" "Goodenia","Goodenia lunata"," ascending or decumbent herb to 25 cm high. ","","","","","herb","herb","","","","","decumbent","decumbent ascending","herbaceous","" "Goodenia","Goodenia macbarronii"," annual herb to 30 cm high, glabrous except for flowers. ","annual","annual","","","herb","herb","","","","","","","herbaceous","" @@ -4897,7 +4897,7 @@ "Gynochthodes","Gynochthodes canthoides"," woodyclimber, sometimes a shrub, ± glabrous. ","perennial","inferred_from_growth_form","","","shrub climber_woody","shrub woodyclimber","","","","","","","woody","" "Gynochthodes","Gynochthodes jasminoides"," woodyclimber or scrambling shrub, ± glabrous. ","perennial","inferred_from_growth_form","","","shrub climber_woody","shrub woodyclimber","","","","","","","woody","" "Gynura","Gynura"," perennial herbs. ","perennial","perennial","","","herb","herbs","","","","","","","herbaceous","" -"Gynura","Gynura drymophila"," succulent perennial herb or biennial to 50 cm high, base woody, to 10 cm diameter. ","biennial perennial","biennial perennial","","","herb","herb","","","","","","","herbaceous","" +"Gynura","Gynura drymophila"," succulent perennial herb or biennial to 50 cm high, base woody, to 10 cm diameter. ","biennial perennial","biennial perennial","","","herb","herb","","","","","","","woody_base herbaceous","" "Gynura","Gynura drymophila var. drymophila"," ascending herb to 50 cm high, hirsute. ","perennial","inferred_from_genus","","","herb","herb","","","","","decumbent","ascending","herbaceous","" "Gynura","Gynura drymophila var. glabrifolia"," ","perennial","inferred_from_genus","","","herb","inferred_from_genus","","","","","","","herbaceous","" "Gypsophila","Gypsophila"," annual to perennial herbs. ","annual perennial","annual perennial","","","herb","herbs","","","","","","","herbaceous","" @@ -5361,10 +5361,10 @@ "Indigofera","Indigofera decora"," erect multistemmed shrub, 0.3-1 m high, ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","erect","erect","woody","" "Indigofera","Indigofera efoliata"," perennial herb or b subshrub to 40 cm high. ","perennial","perennial","","","herb subshrub","herb subshrub","","","","","","","herbaceous","" "Indigofera","Indigofera helmsii"," shrub to 60 cm; ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","","","woody","" -"Indigofera","Indigofera hirsuta"," annual or shortlivedperennial woody herb to 60 cm; most parts with long, ","annual short_lived_perennial","annual shortlivedperennial","","","herb","herb","","","","","","","herbaceous","" +"Indigofera","Indigofera hirsuta"," annual or shortlivedperennial woody herb to 60 cm; most parts with long, ","annual short_lived_perennial","annual shortlivedperennial","","","herb","herb","","","","","","","woody","" "Indigofera","Indigofera leucotricha"," small spreading shrub to 1 m high; ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","spreading","spreading","woody","" "Indigofera","Indigofera linifolia"," prostrate or spreading, perennial herb, 0.1-0.3(-0.5) m high. ","perennial","perennial","","","herb","herb","","","","","prostrate spreading","prostrate spreading","herbaceous","" -"Indigofera","Indigofera linnaei"," spreading or prostrate woody herb, 15-50 cm high with a long taproot. ","","","","","herb","herb","","","","","prostrate spreading","prostrate spreading","herbaceous","" +"Indigofera","Indigofera linnaei"," spreading or prostrate woody herb, 15-50 cm high with a long taproot. ","","","","","herb","herb","","","","","prostrate spreading","prostrate spreading","woody","" "Indigofera","Indigofera longibractea"," shrub to 1.5 m; ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","","","woody","" "Indigofera","Indigofera psammophila"," perennial herb or subshrub to 0.5 m high; ","perennial","perennial","","","herb subshrub","herb subshrub","","","","","","","herbaceous","" "Indigofera","Indigofera spicata"," prostrate perennial herb, up to 0.5 m high. ","perennial","perennial","","","herb","herb","","","","","prostrate","prostrate","herbaceous","" @@ -5696,7 +5696,7 @@ "Leiocarpa","Leiocarpa"," perennial herbs with variably woolly branches, ","perennial","perennial","","","herb","herbs","","","","","","","herbaceous","" "Leiocarpa","Leiocarpa brevicompta"," bushy usually annual herb to 60 cm high, branching from base; ","annual","annual","","","herb","herb","","","","","bushy","bushy","herbaceous","" "Leiocarpa","Leiocarpa leptolepis"," bushy perennial herb 10-45 cm high. ","perennial","perennial","","","herb","herb","","","","","bushy","bushy","herbaceous","" -"Leiocarpa","Leiocarpa panaetioides"," erect perennial woody herb or subshrub to 60 cm high, muchbranched, ","perennial","perennial","","","herb subshrub","herb subshrub","","","","","erect","erect","herbaceous","" +"Leiocarpa","Leiocarpa panaetioides"," erect perennial woody herb or subshrub to 60 cm high, muchbranched, ","perennial","perennial","","","herb subshrub","herb subshrub","","","","","erect","erect","woody","" "Leiocarpa","Leiocarpa semicalva"," pungent smelling bushy perennial herb 20-40 cm high; ","perennial","perennial","","","herb","herb","","","","","bushy","bushy","herbaceous","" "Leiocarpa","Leiocarpa tomentosa"," bushy perennial herb 30-70 cm high, woodybase; ","perennial","perennial","","","herb","herb","","","","","bushy","bushy","woody_base herbaceous","woodybase" "Leiocarpa","Leiocarpa serpens"," prostrate to ascending, mat-forming herb to 15 cm high, glandular and scaberulous to glabrescent. ","perennial","inferred_from_genus","","","herb","herb","","","","","mat-forming decumbent prostrate","matforming ascending prostrate","herbaceous","" @@ -6637,8 +6637,8 @@ "Millotia","Millotia greevesii subsp. greevesii"," herb, usually 3-15 cm high, decumbent. ","annual","inferred_from_genus","","","herb","herb","","","","","decumbent","decumbent","herbaceous","" "Millotia","Millotia greevesii subsp. glandulosa"," herb, usually 3-15 cm high; ","annual","inferred_from_genus","","","herb","herb","","","","","","","herbaceous","" "Mimosa","Mimosa"," trees, shrubs or herbs with recurved prickles and sensitive leaves. ","","","","","herb shrub tree","herbs shrubs trees","","","","","","","woody herbaceous","" -"Mimosa","Mimosa pudica"," perennial herb, ± woody, often prostrate; ","perennial","perennial","","","herb","herb","","","","","prostrate","prostrate","herbaceous","" -"Mimosa","Mimosa pudica var. hispida"," perennial herb, ± woody, often prostrate; ","perennial","perennial","","","herb","herb","","","","","prostrate","prostrate","herbaceous","" +"Mimosa","Mimosa pudica"," perennial herb, ± woody, often prostrate; ","perennial","perennial","","","herb","herb","","","","","prostrate","prostrate","woody herbaceous","" +"Mimosa","Mimosa pudica var. hispida"," perennial herb, ± woody, often prostrate; ","perennial","perennial","","","herb","herb","","","","","prostrate","prostrate","woody herbaceous","" "Mimulus","Mimulus"," perennial or annual herbs, conspicuously or obscurely gland-dotted. ","annual perennial","annual perennial","","","herb","herbs","","","","","","","herbaceous","" "Mimulus","Mimulus gracilis"," erect to ascending, stoloniferous perennial or possibly annual herb, 4-35 cm high, rooting from stolon, glabrous. ","annual perennial","annual perennial","","","herb","herb","","","","","erect decumbent stoloniferous","erect ascending stoloniferous","herbaceous","" "Minuria","Minuria"," annual or perennial herbs or dwarf shrubs. ","annual perennial","annual perennial","","","herb shrub","herbs shrubs","","","","","","","woody herbaceous","" @@ -7227,7 +7227,7 @@ "Pachymitus","Pachymitus"," annual herbs. ","annual","annual","","","herb","herbs","","","","","","","herbaceous","" "Pachymitus","Pachymitus cardaminoides"," annual to 30 cm high, erect, many-stemmed, ","annual","annual","","","herb","inferred_from_genus","","","","","erect","erect","herbaceous","" "Paederia","Paederia"," climbing shrubs usually with a foetid smell when bruised. ","perennial","inferred_from_growth_form","","","shrub","shrubs","","","","","climbing","climbing","woody","" -"Paederia","Paederia foetida"," perennial (deciduous or evergreen), semi-woody, herbaceous vine that twines upward on supports and creeps across the ground, climbing by twining on other species or onto its old stems from the previous season; ","perennial","perennial","","","climber_herbaceous","vine","","","","","climbing","climbing","herbaceous","" +"Paederia","Paederia foetida"," perennial (deciduous or evergreen), semi-woody, herbaceous vine that twines upward on supports and creeps across the ground, climbing by twining on other species or onto its old stems from the previous season; ","perennial","perennial","","","climber_herbaceous","vine","","","","","climbing","climbing","soft_wood herbaceous","" "Paenula","Paenula"," shrubs. ","perennial","inferred_from_growth_form","","","shrub","shrubs","","","","","","","woody","" "Paenula","Paenula storyi"," ","perennial","inferred_from_growth_form","","","shrub","inferred_from_genus","","","","","","","woody","" "Palmeria","Palmeria"," woodyclimbers or scandent shrubs, dioecious. ","perennial","inferred_from_growth_form","","","shrub climber_woody","shrubs woodyclimbers","","","dioecious","dioecious","climbing","scandent","woody","" @@ -7237,9 +7237,9 @@ "Pandanus","Pandanus tectorius"," shrub or small tree to 5 m high. ","perennial","inferred_from_growth_form","","","shrub tree","shrub tree","","","dioecious","inferred_from_genus","","","woody","" "Pandanus","Pandanus forsteri"," trees to 13 m tall with numerous sharp outgrowths. ","perennial","inferred_from_growth_form","","","tree","trees","","","dioecious","inferred_from_genus","","","woody","" "Pandorea","Pandorea"," woodyclimbers, rarely scandent shrubs, evergreen. ","perennial","inferred_from_growth_form","","","shrub climber_woody","shrubs woodyclimbers","","","","","climbing","scandent","woody","" -"Pandorea","Pandorea pandorana"," woody scrambler or climber with ± twining branches, ","","","","","climber","climber","","","","","","","","" +"Pandorea","Pandorea pandorana"," woody scrambler or climber with ± twining branches, ","","","","","climber_woody","climber","","","","","","","woody","" "Pandorea","Pandorea pandorana subsp. austrocaledonica"," woodyclimber. ","perennial","inferred_from_growth_form","","","climber_woody","woodyclimber","","","","","","","woody","inferred_from_growth_form" -"Pandorea","Pandorea pandorana subsp. pandorana"," woody scrambler or climber with ± twining branches, ","","","","","climber","climber","","","","","","","","" +"Pandorea","Pandorea pandorana subsp. pandorana"," woody scrambler or climber with ± twining branches, ","","","","","climber","climber","","","","","","","woody","" "Pandorea","Pandorea baileyana"," woodyclimber, ","perennial","inferred_from_growth_form","","","climber_woody","woodyclimber","","","","","","","woody","inferred_from_growth_form" "Pandorea","Pandorea jasminoides"," tall woodyclimber. ","perennial","inferred_from_growth_form","","","climber_woody","woodyclimber","","","","","","","woody","inferred_from_growth_form" "Panicum","Panicum maximum var. maximum"," densely tufted perennial to 3 m high with a short stout rhizome covered with the hairy remainders of cataphylls. ","perennial","perennial","","","herb graminoid","inferred_from_family","","","","","rhizomatous","rhizome","herbaceous","" @@ -7928,7 +7928,7 @@ "Podolepis","Podolepis"," annual & perennial herbs, ","annual perennial","annual perennial","","","herb","herbs","","","","","","","herbaceous","" "Podolepis","Podolepis decipiens"," herb to 70 cm tall, renewed annually from perennial rootstock. ","perennial","perennial","","","herb","herb","","","","","","","herbaceous","" "Podolepis","Podolepis laciniata"," perennial herb to circa 70 cm high with multiple shoots arising from basal rosette. taproot stout. ","perennial","perennial","","","herb","herb","","","","","rosette","rosette","herbaceous","" -"Podolepis","Podolepis monticola"," perennial woody prostrate herb to 50 cm when flowering. ","perennial","perennial","","","herb","herb","","","","","prostrate","prostrate","herbaceous","" +"Podolepis","Podolepis monticola"," perennial woody prostrate herb to 50 cm when flowering. ","perennial","perennial","","","herb","herb","","","","","prostrate","prostrate","woody","" "Podolepis","Podolepis omissa"," perennial herb 30-130 cm high. ","perennial","perennial","","","herb","herb","","","","","","","herbaceous","" "Podolepis","Podolepis robusta"," perennial herb to 80 cm high with multiple shoots arising from basal rosette. taproot stout. ","perennial","perennial","","","herb","herb","","","","","rosette","rosette","herbaceous","" "Podolepis","Podolepis neglecta"," glabrous, hispid or slightly woolly perennial to 65 cm high with one or more stems. ","perennial","perennial","","","herb","inferred_from_genus","","","","","","","herbaceous","" @@ -8839,7 +8839,7 @@ "Salvia","Salvia aethiopis"," biennial or perennial herb, 30-100 cm high, ","biennial perennial","biennial perennial","","","herb","herb","","","","","","","herbaceous","" "Salvia","Salvia coccinea"," slender perennial herb to circa 100 cm high; ","perennial","perennial","","","herb","herb","","","","","","","herbaceous","" "Salvia","Salvia leucantha"," perennial herb to 130 cm high, ","perennial","perennial","","","herb","herb","","","","","","","herbaceous","" -"Salvia","Salvia microphylla"," variable woody perennial herb or subshrub to over 3 m tall. ","perennial","perennial","","","herb subshrub","herb subshrub","","","","","","","herbaceous","" +"Salvia","Salvia microphylla"," variable woody perennial herb or subshrub to over 3 m tall. ","perennial","perennial","","","herb subshrub","herb subshrub","","","","","","","woody herbaceous","" "Salvia","Salvia plebeia"," perennial herb, 40-90 cm high, densely covered with simple, ","perennial","perennial","","","herb","herb","","","","","","","herbaceous","" "Salvia","Salvia reflexa"," annual subshrub to 60 cm high; ","annual","annual","","","subshrub","subshrub","","","","","","","","" "Salvia","Salvia splendens"," perennial herb to 1 m tall, but when cultivated, often grown as an annual. ","annual perennial","annual perennial","","","herb","herb","","","","","","","herbaceous","" @@ -9076,14 +9076,14 @@ "Selago","Selago canescens"," perennial muchbranched shrub 30-60 cm high; ","perennial","perennial","","","shrub","shrub","","","","","","","woody","" "Selago","Selago corymbosa"," perennial shrub 30-60 cm high; ","perennial","perennial","","","shrub","shrub","","","","","","","woody","" "Selliera","Selliera"," perennial herbs with prostrate woodystems rooting at nodes, ","perennial","perennial","","","herb","herbs","","","","","prostrate","prostrate","soft_wood herbaceous","woodystems" -"Selliera","Selliera radicans"," woody perennial herb, stems prostrate, to 50 cm long, glabrous. ","perennial","perennial","","","herb","herb","","","","","prostrate","prostrate","herbaceous","" +"Selliera","Selliera radicans"," woody perennial herb, stems prostrate, to 50 cm long, glabrous. ","perennial","perennial","","","herb","herb","","","","","prostrate","prostrate","woody","" "Senecio","Senecio"," annual or perennial herbs or shrubs or rarely climbers, stems usually striate. ","annual perennial","annual perennial","","","herb shrub climber","herbs shrubs climbers","","","","","","","woody herbaceous","" "Senecio","Senecio amygdalifolius"," perennial herb or shrub. mostly 80-150 cm high, glabrous. ","perennial","perennial","","","herb shrub","herb shrub","","","","","","","woody herbaceous","" "Senecio","Senecio anethifolius"," erect shrub 50-100 cm high, ± glabrous, ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","erect","erect","woody","" "Senecio","Senecio anethifolius subsp. anethifolius"," erect shrub 50-100 cm high, ± glabrous, ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","erect","erect","woody","" "Senecio","Senecio angulatus"," glabrous, scrambling perennial to circa 5 metres high. ","perennial","perennial","","","herb","inferred_from_life_history","","","","","","","herbaceous","" "Senecio","Senecio bathurstianus"," erect herb. mostly 30-100 cm high, simple or muchbranched from ± woodybase, ","","","","","herb","herb","","","","","erect","erect","woody_base herbaceous","woodybase" -"Senecio","Senecio behrianus"," subshrub with a woody rhizome; ","","","","","subshrub","subshrub","","","","","rhizomatous","rhizome","","" +"Senecio","Senecio behrianus"," subshrub with a woody rhizome; ","","","","","subshrub","subshrub","","","","","rhizomatous","rhizome","woody_root","" "Senecio","Senecio bipinnatisectus"," erect annual plant. mostly 60-120 cm high, ","annual","annual","","","herb","inferred_from_life_history","","","","","erect","erect","herbaceous","" "Senecio","Senecio biserratus"," erect annual herb, 50-100 cm high, ± glabrous or basally bristly. ","annual","annual","","","herb","herb","","","","","erect","erect","herbaceous","" "Senecio","Senecio linearifolius var. intermedius"," plant mildy glaucous at least on newer growth. ","perennial","inferred_from_species","","","herb","inferred_from_life_history","","","","","","","herbaceous","" @@ -9133,7 +9133,7 @@ "Senecio","Senecio cunninghamii var. cunninghamii"," erect or spreading subshrub 50-100 cm high, stems white-tomentose, usually glabrescent. ","","","","","subshrub","subshrub","","","","","erect spreading","erect spreading","","" "Senecio","Senecio daltonii"," perennial rhizomatous herb. mostly 10-50 cm high, ","perennial","perennial","","","herb","herb","","","","","rhizomatous","rhizomatous","herbaceous","" "Senecio","Senecio diaschides"," erect perennial herbs. mostly 50-100 cm high, glabrescent. ","perennial","perennial","","","herb","herbs","","","","","erect","erect","herbaceous","" -"Senecio","Senecio elegans"," erect or diffuse annual herb 30-100 cm high, stems ± woody, ribbed. ","annual","annual","","","herb","herb","","","","","erect","erect","herbaceous","" +"Senecio","Senecio elegans"," erect or diffuse annual herb 30-100 cm high, stems ± woody, ribbed. ","annual","annual","","","herb","herb","","","","","erect","erect","woody herbaceous","" "Senecio","Senecio glossanthus"," erect ephemeral herb. mostly 8-30 cm high. ","ephemeral","ephemeral","","","herb","herb","","","","","erect","erect","herbaceous","" "Senecio","Senecio gregorii"," erect annual herb 20-40 cm high, stems simple to muchbranched, glabrous. ","annual","annual","","","herb","herb","","","","","erect","erect","herbaceous","" "Senecio","Senecio pinnatifolius"," erect or ascending, glabrous or sub-glabrous annual or perennial to 1 metre high. ","annual perennial","annual perennial","","","herb","inferred_from_life_history","","","","","erect decumbent","erect ascending","herbaceous","" @@ -9219,7 +9219,7 @@ "Sida","Sida trichopoda"," erect subshrub 40-90 cm tall; ","","","","","subshrub","subshrub","","","","","erect","erect","","" "Sida","Sida rhombifolia"," erect subshrub to circa 1.5 m high, stems finely stellate-puberulent. mostly becoming ± glabrous. ","","","","","subshrub","subshrub","","","","","erect","erect","","" "Sida","Sida rohlenae"," erect subshrub to 1 m high; ","","","","","subshrub","subshrub","","","","","erect","erect","","" -"Sida","Sida everistiana"," spreading woody perennial herb 25-50 cm high with procmbent stems 10-40 cm long; ","perennial","perennial","","","herb","herb","","","","","spreading","spreading","herbaceous","" +"Sida","Sida everistiana"," spreading woody perennial herb 25-50 cm high with procmbent stems 10-40 cm long; ","perennial","perennial","","","herb","herb","","","","","spreading","spreading","woody","" "Sida","Sida pleiantha"," prostrate to spreading subshrub; ","","","","","subshrub","subshrub","","","","","prostrate spreading","prostrate spreading","","" "Sida","Sida fibulifera"," prostrate to procumbent, stellate-tomentose subshrub. ","","","","","subshrub","subshrub","","","","","prostrate","prostrate procumbent","","" "Sida","Sida goniocarpa"," erect to ascending perennial herb or subshrub with branches or leaves sparsely pubescent, ","perennial","perennial","","","herb subshrub","herb subshrub","","","","","erect decumbent","erect ascending","herbaceous","" @@ -9497,7 +9497,7 @@ "Stenopetalum","Stenopetalum"," annual or perennial herbs, erect, ","annual perennial","annual perennial","","","herb","herbs","","","","","erect","erect","herbaceous","" "Stenopetalum","Stenopetalum lineare"," erect herb, usually annual, to 50 cm high, ","annual","annual","","","herb","herb","","","","","erect","erect","herbaceous","" "Stenopetalum","Stenopetalum nutans"," annual or biennial herb to 50 cm high, decumbent to erect. ","annual biennial","annual biennial","","","herb","herb","","","","","erect decumbent","erect decumbent","herbaceous","" -"Stenopetalum","Stenopetalum velutinum"," annual woody herb, greyish green, ","annual","annual","","","herb","herb","","","","","","","herbaceous","" +"Stenopetalum","Stenopetalum velutinum"," annual woody herb, greyish green, ","annual","annual","","","herb","herb","","","","","","","woody","" "Stenopetalum","Stenopetalum sphaerocarpum"," annual to 30 cm high, wiry, straggling, ","annual","annual","","","herb","inferred_from_genus","","","","","","","herbaceous","" "Stenotaphrum","Stenotaphrum"," creeping or prostrate perennials or tufted erect annuals. ","annual perennial","annuals perennials","","","herb graminoid","inferred_from_family","","","","","erect creeping prostrate","erect creeping prostrate","herbaceous","" "Stenotaphrum","Stenotaphrum secundatum"," glabrous, stoloniferous perennials to circa 40 cm tall, culms branched, prostrate, becoming erect when flowering. ","perennial","perennials","","","herb graminoid","inferred_from_family","","","","","erect prostrate stoloniferous","erect prostrate stoloniferous","herbaceous","" @@ -9749,7 +9749,7 @@ "Tecticornia","Tecticornia indica"," decumbent to erect perennial to 1 m high. ","perennial","perennial","","","herb","inferred_from_life_history","","","","","erect decumbent","erect decumbent","herbaceous","" "Tecticornia","Tecticornia"," erect or spreading small annual or perennial herbs or shrubs. ","annual perennial","annual perennial","","","herb shrub","herbs shrubs","","","","","erect spreading","erect spreading","woody herbaceous","" "Tecticornia","Tecticornia disarticulata"," hemispherical perennial to circa 1 m high. ","perennial","perennial","","","herb","inferred_from_life_history","","","","","","","herbaceous","" -"Tecticornia","Tecticornia lylei"," erect woody perennial to 1 m high. ","perennial","perennial","","","herb","inferred_from_life_history","","","","","erect","erect","herbaceous","" +"Tecticornia","Tecticornia lylei"," erect woody perennial to 1 m high. ","perennial","perennial","","","herb","inferred_from_life_history","","","","","erect","erect","woody","" "Tecticornia","Tecticornia arbuscula"," erect spreading perennial to 2 m high. ","perennial","perennial","","","herb","inferred_from_life_history","","","","","erect spreading","erect spreading","herbaceous","" "Tecticornia","Tecticornia halocnemoides subsp. longispicata"," articles barrel-shaped, circa 5 mm long, 2.5 mm diam., entire. . ","perennial","inferred_from_species","","","herb","inferred_from_species","","","","","","","herbaceous","" "Tecticornia","Tecticornia medullosa"," hemispherical perennial to circa 1 m high. ","perennial","perennial","","","herb","inferred_from_life_history","","","","","","","herbaceous","" @@ -10146,8 +10146,8 @@ "Vernicia","Vernicia"," trees with simple hairs; ","perennial","inferred_from_growth_form","","","tree","trees","","","","","","","woody","" "Veronica","Veronica notabilis"," perennial stoloniferous herb with flowering-stems to 40 cm high; ","perennial","perennial","","","herb","herb","","","","","stoloniferous","stoloniferous","herbaceous","" "Veronica","Veronica nivea"," softly woody shrub. ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","","","woody","" -"Veronica","Veronica derwentiana subsp. maideniana"," ","","","","","herb","inferred_from_genus","","","","","","","herbaceous","" -"Veronica","Veronica derwentiana subsp. derwentiana"," ","","","","","herb","inferred_from_genus","","","","","","","herbaceous","" +"Veronica","Veronica derwentiana subsp. maideniana"," ","","","","","herb","inferred_from_genus","","","","","","","woody","" +"Veronica","Veronica derwentiana subsp. derwentiana"," ","","","","","herb","inferred_from_genus","","","","","","","woody","" "Veronica","Veronica hederifolia"," sprawling annual herb with stems to circa 20 cm long. ","annual","annual","","","herb","herb","","","","","sprawling","sprawling","herbaceous","" "Veronica","Veronica grosseserrata"," herbs with procumbent stems and ascending to erect flowering-stems, the procumbent stems commonly becoming ascending to erect, or the flowering-stems becoming procumbent and continuing vegetative growth into the next season. ","","","","","herb","herbs","","","","","erect decumbent prostrate","erect ascending procumbent","herbaceous","" "Veronica","Veronica arcuata"," woody herb or subwoody shrub to 70 cm high, glabrous and glaucous; ","","","","","herb shrub","herb shrub","","","","","","","woody herbaceous","" @@ -10160,7 +10160,7 @@ "Veronica","Veronica blakelyi"," small glabrous and glaucous shrub or woody herb to 50 cm high. ","","","","","herb shrub","herb shrub","","","","","","","woody herbaceous","" "Veronica","Veronica brownii"," perennial herb with arching or prostrate stolons to 50 circa or more long and flowering-stems 10-25 cm high. ","perennial","perennial","","","herb","herb","","","","","prostrate","prostrate","herbaceous","" "Veronica","Veronica densifolia"," prostrate shrub usually less than 10 cm high but spreading to 20 circa or more across. ","perennial","inferred_from_growth_form","","","shrub","shrub","","","","","prostrate spreading","prostrate spreading","woody","" -"Veronica","Veronica derwentiana"," woody herb to circa 140 cm high; ","","","","","herb","herb","","","","","","","herbaceous","" +"Veronica","Veronica derwentiana"," woody herb to circa 140 cm high; ","","","","","herb","herb","","","","","","","woody","" "Veronica","Veronica persica"," herb with sprawling or erect stems to circa 30 cm long, ","","","","","herb","herb","","","","","erect sprawling","erect sprawling","herbaceous","" "Veronica","Veronica serpyllifolia"," perennial herb, ","perennial","perennial","","","herb","herb","","","","","","","herbaceous","" "Veronica","Veronica sobolifera"," herbs with subterranean rhizomes and erect stems. ","","","","","herb","herbs","","","","","erect rhizomatous","erect rhizomes","herbaceous","" @@ -10170,7 +10170,7 @@ "Veronica","Veronica plebeia"," perennial herb. ","perennial","perennial","","","herb","herb","","","","","","","herbaceous","" "Veronica","Veronica subtilis"," herbs with erect flowering-stems and long slender rhizomes, ","","","","","herb","herbs","","","","","erect rhizomatous","erect rhizomes","herbaceous","" "Veronica","Veronica"," erect or prostrate perennial or annual herbs, usually pilose. ","annual perennial","annual perennial","","","herb","herbs","","","","","erect prostrate","erect prostrate","herbaceous","" -"Veronica","Veronica derwentiana subsp. subglauca"," ","","","","","herb","inferred_from_genus","","","","","","","herbaceous","" +"Veronica","Veronica derwentiana subsp. subglauca"," ","","","","","herb","inferred_from_genus","","","","","","","woody","" "Veronica","Veronica velutina"," woody herb or soft-woody shrub, to circa 150 cm high, ","","","","","herb shrub","herb shrub","","","","","","","woody herbaceous","" "Vesselowskya","Vesselowskya"," shrub or small tree. ","perennial","inferred_from_growth_form","","","shrub tree","shrub tree","","","","","","","woody","" "Vesselowskya","Vesselowskya rubifolia"," shrub or small tree to 6-8 m. tall. ","perennial","inferred_from_growth_form","","","shrub tree","shrub tree","","","","","","","woody","" @@ -10220,10 +10220,10 @@ "Vitex","Vitex"," shrubs or trees. ","perennial","inferred_from_growth_form","","","shrub tree","shrubs trees","","","","","","","woody","" "Vitis","Vitis vinifera"," woodyvine with stems up to 35 m long (in cultivation usually reduced by annual prunning from 1-3 m long). ","annual","annual","","","climber_woody","woodyvine","","","","","","","woody","inferred_from_growth_form" "Vittadinia","Vittadinia pustulata"," annual herb or small shrub, 10-30 cm high, hirsute, ","annual","annual","","","herb shrub","herb shrub","","","","","","","woody herbaceous","" -"Vittadinia","Vittadinia cuneata var. hirsuta"," ","","","","","herb","inferred_from_species","","","","","","","herbaceous","" +"Vittadinia","Vittadinia cuneata var. hirsuta"," ","","","","","herb","inferred_from_species","","","","","","","woody","" "Vittadinia","Vittadinia cervicularis var. cervicularis"," mostly annual herbs, ","annual","annual","","","herb","herbs","","","","","","","herbaceous","" "Vittadinia","Vittadinia condyloides"," perennial herb 12-30 cm high, erect, ","perennial","perennial","","","herb","herb","","","","","erect","erect","herbaceous","" -"Vittadinia","Vittadinia cuneata"," woody annual or perennial herb, 10-40 cm high, stems rigidly erect, ","annual perennial","annual perennial","","","herb","herb","","","","","erect","erect","herbaceous","" +"Vittadinia","Vittadinia cuneata"," woody annual or perennial herb, 10-40 cm high, stems rigidly erect, ","annual perennial","annual perennial","","","herb","herb","","","","","erect","erect","woody","" "Vittadinia","Vittadinia dissecta"," annual or shortlivedperennial herb 10-35 cm high, erect. ","annual short_lived_perennial","annual shortlivedperennial","","","herb","herb","","","","","erect","erect","herbaceous","" "Vittadinia","Vittadinia dissecta var. hirta"," annual or shortlivedperennial herb 10-35 cm high, erect. ","annual short_lived_perennial","annual shortlivedperennial","","","herb","herb","","","","","erect","erect","herbaceous","" "Vittadinia","Vittadinia eremaea"," annual herb, 10-25 cm high, erect, ","annual","annual","","","herb","herb","","","","","erect","erect","herbaceous","" diff --git a/data/NHNSW_2022/metadata.yml b/data/NHNSW_2022/metadata.yml index e90f37801..4c3a88407 100644 --- a/data/NHNSW_2022/metadata.yml +++ b/data/NHNSW_2022/metadata.yml @@ -31,7 +31,8 @@ dataset: group_by(taxon_name) %>% mutate( across(c(`life_history_a`, `woodiness_a`, `plant_growth_form_a`, `stem_growth_habit_a`, `parasitic_a`, - `plant_growth_substrate_a`, `sex_type_a`), replace_duplicates_with_NA) + `plant_growth_substrate_a`, `sex_type_a`), replace_duplicates_with_NA), + woodiness_a = stringr::str_replace(woodiness_a, "soft_wood", "semi_woody") ) %>% ungroup() ' @@ -221,10 +222,6 @@ taxonomic_updates: reason: match_20. Rewording name to be recognised as genus rank, with genus accepted by APC (2022-11-22) taxonomic_resolution: genus -- find: Cyrtomium falcatum ;qu;Rochfordii;qu; - replace: Cyrtomium falcatum 'Rochfordii' - reason: Manual alignment with canonical species name in APC (Elizabeth Wenk, 2022-11-21) - taxonomic_resolution: Species - find: Dillwynia sp. Ebor (P.C.Jobson 5318 ;amp; S.A.Mills) replace: Dillwynia sp. Ebor (P.C.Jobson 5318 & S.A.Mills) reason: match_17_fuzzy. Imprecise fuzzy alignment with canonical name in APNI (2022-11-21) @@ -454,14 +451,6 @@ taxonomic_updates: replace: Rubus loganubaccus reason: match_07_fuzzy. Fuzzy alignment with known canonical name in APC (2022-11-21) taxonomic_resolution: Species -- find: Salix humboldtiana cv. ;qu;Pyramidalis;qu; - replace: Salix humboldtiana 'Pyramidalis' - reason: Manual alignment with canonical species name in APC (Elizabeth Wenk, 2022-11-21) - taxonomic_resolution: Species -- find: Salix matsudana cv. ;qu;Tortuosa;qu; - replace: Salix matsudana 'Tortuosa' - reason: Manual alignment with canonical species name in APC (Elizabeth Wenk, 2022-11-21) - taxonomic_resolution: Species - find: Salix matsudana x alba replace: Salix matsudana x Salix alba reason: Manual alignment with canonical hybrid species name in APC (Elizabeth Wenk, @@ -473,11 +462,11 @@ taxonomic_updates: 2022-11-21) taxonomic_resolution: Species - find: Salix x sepulcralis var. chrysocoma - replace: Salix x sepulcralis nothovar. chrysocoma + replace: Salix x sepulcralis reason: Manual alignment with canonical species name in APC (Elizabeth Wenk, 2022-11-22) - taxonomic_resolution: Varietas + taxonomic_resolution: Species - find: Salix x sepulcralis var. sepulcralis - replace: Salix x sepulcralis nothovar. sepulcralis + replace: Salix x sepulcralis reason: Manual alignment with canonical species name in APC (Elizabeth Wenk, 2022-11-22) taxonomic_resolution: Varietas - find: Salvinia molesta @@ -555,5 +544,8 @@ taxonomic_updates: reason: Manual matched to genus for taxon that can't be matched to species (Elizabeth Wenk, 2022-11-22) taxonomic_resolution: genus -exclude_observations: .na +exclude_observations: +- variable: taxon_name + find: Salix humboldtiana cv. ;qu;Pyramidalis;qu;, Salix matsudana cv. ;qu;Tortuosa;qu;, Cyrtomium falcatum ;qu;Rochfordii;qu; + reason: excluding cultivars questions: .na diff --git a/data/NSWFRD_2014/metadata.yml b/data/NSWFRD_2014/metadata.yml index 3f9c89e32..617db6abb 100644 --- a/data/NSWFRD_2014/metadata.yml +++ b/data/NSWFRD_2014/metadata.yml @@ -275,7 +275,7 @@ traits: seedlings were seen then 'no / yes' is given. See original file in raw data folder for extensive reference list. - var_in: Minimum maturity - unit_in: years + unit_in: a trait_name: reproductive_maturity entity_type: species value_type: minimum @@ -286,7 +286,7 @@ traits: and 'maturity'. Secondary juvenile and fire tolerance values are not included for species that are predominately seeders. - var_in: Maximum maturity - unit_in: years + unit_in: a trait_name: reproductive_maturity entity_type: species value_type: maximum @@ -297,7 +297,7 @@ traits: and 'maturity'. Secondary juvenile and fire tolerance values are not included for species that are predominately seeders. - var_in: Lifespan > than - unit_in: years + unit_in: a trait_name: lifespan entity_type: species value_type: minimum @@ -308,7 +308,7 @@ traits: age at which a species is no longer found in a community where it was known or assumed to occur in. - var_in: Lifespan < than - unit_in: years + unit_in: a trait_name: lifespan entity_type: species value_type: maximum @@ -319,7 +319,7 @@ traits: age at which a species is no longer found in a community where it was known or assumed to occur in. - var_in: Secondary juvenile period - unit_in: years + unit_in: a trait_name: reproductive_maturity_secondary_after_fire entity_type: species value_type: bin diff --git a/data/NTH_2022/data.csv b/data/NTH_2022/data.csv index 08c34a230..96c229bb8 100644 --- a/data/NTH_2022/data.csv +++ b/data/NTH_2022/data.csv @@ -2617,7 +2617,7 @@ Stylidium,Stylidium tenerrimum, annual herb to circa 20 cm tall. ,annual,annual, Stylidium,Stylidium ensatum, annual herb. ,annual,annual,,,herb,herb,,,,,,,herbaceous, Stylosanthes,Stylosanthes, herbs or subshrubs. ,,,,,herb subshrub,herbs subshrubs,,,,,,,herbaceous, Stylosanthes,Stylosanthes guianensis," semiprostrate, shortlivedperennial to 50 cm high. ",short_lived_perennial,shortlivedperennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Stylosanthes,Stylosanthes hamata, short lived decumbent perennial to 50 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,decumbent,decumbent,herbaceous, +Stylosanthes,Stylosanthes hamata, short lived decumbent perennial to 50 cm high. ,short_lived_perennial,perennial,,,herb,inferred_from_life_history,,,,,decumbent,decumbent,herbaceous, Stylosanthes,Stylosanthes humilis, suffruticose prostrate or erect annuals. ,annual,annuals,,,herb,inferred_from_life_history,,,,,erect prostrate,erect prostrate,woody_base herbaceous,suffruticose Stylosanthes,Stylosanthes scabra, annual or shortlivedperennial to 1 m high. ,annual short_lived_perennial,annual shortlivedperennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Stylosanthes,Stylosanthes viscosa, viscid perennial to 0.8 m high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, diff --git a/data/Niinemets_2009/metadata.yml b/data/Niinemets_2009/metadata.yml index 18a9e4320..b08400a2e 100644 --- a/data/Niinemets_2009/metadata.yml +++ b/data/Niinemets_2009/metadata.yml @@ -212,7 +212,7 @@ traits: leaves were further oven-dried at 65 deg C for no less than 48 h, and the dry mass of each leaf was determined. - var_in: Gm - unit_in: mmolCO2/g/s + unit_in: mmol{CO2}/g/s trait_name: leaf_mesophyll_conductance_per_area entity_type: individual value_type: raw @@ -220,7 +220,7 @@ traits: replicates: 1 methods: unknown - var_in: gm/mass - unit_in: molCO2/m2/s + unit_in: mol{CO2}/m2/s trait_name: leaf_mesophyll_conductance_per_mass entity_type: individual value_type: raw @@ -228,7 +228,7 @@ traits: replicates: 1 methods: unknown - var_in: dN15 - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw @@ -239,7 +239,7 @@ traits: in fine-ground samples using a LECO CNS2000 Analyzer (LECO Corporation, St Joseph, MI, USA). - var_in: dC13 - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -307,7 +307,7 @@ traits: inductively coupled plasma emission spectroscopy (ICP-OES) using American Public Health Association standard method 3120 (APHA 3120). - var_in: av Ci/CA - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: individual value_type: raw @@ -338,7 +338,7 @@ traits: not fully fill up the window of the gas-exchange cuvette, several leaves arranged side by side were enclosed in the cuvette.' - var_in: av-Cc - unit_in: umolCO2/umol + unit_in: umol{CO2}/umol trait_name: leaf_chloroplast_CO2_concentration entity_type: individual value_type: raw @@ -356,7 +356,7 @@ traits: of 274.8 lmol mol_1 and for O2 (Ko) of 414.1 mmol mol_1 were from Bernacchi et al. (2001). ' - var_in: Av-Ci - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Amax entity_type: individual value_type: raw @@ -387,7 +387,7 @@ traits: not fully fill up the window of the gas-exchange cuvette, several leaves arranged side by side were enclosed in the cuvette.' - var_in: av-CA - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: atmospheric_CO2_concentration entity_type: individual value_type: raw @@ -418,7 +418,7 @@ traits: not fully fill up the window of the gas-exchange cuvette, several leaves arranged side by side were enclosed in the cuvette.' - var_in: Amax for Ci=250 - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_maximum entity_type: individual value_type: raw @@ -449,7 +449,7 @@ traits: not fully fill up the window of the gas-exchange cuvette, several leaves arranged side by side were enclosed in the cuvette.' - var_in: Amax/mass - unit_in: umolCO2/g/s + unit_in: umol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_maximum entity_type: individual value_type: raw @@ -480,7 +480,7 @@ traits: fill up the window of the gas-exchange cuvette, several leaves arranged side by side were enclosed in the cuvette.' - var_in: Rd/mass - unit_in: neg_umolCO2/g/s + unit_in: neg_umol{CO2}/g/s trait_name: leaf_dark_respiration_per_dry_mass entity_type: individual value_type: raw @@ -503,7 +503,7 @@ traits: concentrations had stabilized, commonly 1-2 min after leaf darkening, the dark respiration rate was recorded. ' - var_in: Rd - unit_in: neg_umolCO2/m2/s + unit_in: neg_umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: individual value_type: raw @@ -527,7 +527,7 @@ traits: respiration rate was recorded. ' - var_in: Jmax/mass unit_in: umol/g/s - trait_name: leaf_fluorescence_Jmax_per_mass + trait_name: leaf_photosynthesis_Jmax_per_mass entity_type: individual value_type: raw basis_of_value: measurement @@ -555,8 +555,8 @@ traits: source (Li-Cor Inc., 2004) were used to estimate the amount of light absorbed, Qabs. JETR was then determined (Schreiber et al., 1994; equation in cited manuscript). - var_in: Vcmax/mass - unit_in: umol/g - trait_name: leaf_fluorescence_Vcmax_per_mass + unit_in: umol/g/s + trait_name: leaf_photosynthesis_Vcmax_per_mass entity_type: individual value_type: raw basis_of_value: measurement @@ -584,8 +584,8 @@ traits: source (Li-Cor Inc., 2004) were used to estimate the amount of light absorbed, Qabs. JETR was then determined (Schreiber et al., 1994; equation in cited manuscript). - var_in: Jmax/Vcmax - unit_in: dimensionless - trait_name: leaf_fluorescence_Jmax_over_Vcmax + unit_in: '{dimensionless}' + trait_name: leaf_photosynthesis_Jmax_over_Vcmax entity_type: individual value_type: raw basis_of_value: measurement diff --git a/data/Osborne_2014/metadata.yml b/data/Osborne_2014/metadata.yml index f38adeabf..7946ab060 100644 --- a/data/Osborne_2014/metadata.yml +++ b/data/Osborne_2014/metadata.yml @@ -107,7 +107,7 @@ traits: authors in assuming that all species within each genus shared the same photosynthetic pathway, unless the evidence suggested otherwise. - var_in: d13C value - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: population value_type: mean diff --git a/data/Peeters_2002/metadata.yml b/data/Peeters_2002/metadata.yml index 941530418..8048087f4 100644 --- a/data/Peeters_2002/metadata.yml +++ b/data/Peeters_2002/metadata.yml @@ -96,7 +96,7 @@ traits: 3 leaves). Fresh leaf hair density and height was measured using a dissecting microscope (N = 3 leaves). - var_in: stomate_density (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_stomatal_density_average entity_type: population value_type: mean diff --git a/data/Pickup_2005/metadata.yml b/data/Pickup_2005/metadata.yml index a6a7890d5..186fb93f9 100644 --- a/data/Pickup_2005/metadata.yml +++ b/data/Pickup_2005/metadata.yml @@ -109,16 +109,132 @@ contexts: values: - value: 10mm2 stem cross-sectional area description: Leaf area was determined for a shoot whose sapwood had a cross sectional - area of 10 mm2. + area of 10 mm2. In detail, while initial data were collected in terms of aggregate (or whole) stem + cross-sectional areas, we subsequently decided to use the conductive tissue cross-section + (excluding bark and pith) as a reference diameter. To determine the cross-sectional + area of the aggregate (or whole) stem where the cross-section of the conductive + tissue was 5, 10, 15, 20 and 30 mm 2 for each species, a ratio of the aggregate + stem cross-sectional area to the conductive stem cross-sectional area was measured + as follows for each species in the low-nutrient, high-rainfall site. For four + individuals per species, two sections of stem 20-30 mm in length, one 3-5 mm and + the second 6-8 mm in diameter, were randomly sampled from an actively growing + shoot in the upper canopy. Long and short diameters were used to calculate the + aggregate cross-sectional area. The stem was then dissected along the vascular + cambium and the cross-sectional area of the water-conductive tissue was similarly + calculated. Water-conductive tissue was identified as the portion of the stem + remaining after dissection along the vascular cambium and removal of the bark + (phloem, cortex and epidermis). Examining stained cross-sections of the stem under + a light microscope substantiated identification of water-conductive tissue. (Hereafter, + the term conductive tissue refers to the water-conductive tissue.) This resulted + in two ratios of aggregate to conductive stem cross-sectional area, one at ~10 + mm 2 and the second at ~25 mm 2 . This was done to account for changes in the + proportion of conductive and non-conductive tissue along the stem. The first ratio + was used to calculate variables at 5, 10 and 15 mm 2 of conductive tissue, and + the second ratio was applied at 20 and 30 mm 2 . Average aggregate cross-sectional + area of the stem where the conductive tissue was 10 mm 2 ranged from 11.3 mm 2 + in Epacris pulchella , which had the thinnest bark, to 18.9 mm 2 in Angophora + costata , which had the thickest. - value: 25mm2 stem cross-sectional area description: Leaf area was determined for a shoot whose sapwood had a cross sectional - area of 25 mm2. + area of 25 mm2. In detail, while initial data were collected in terms of aggregate (or whole) stem + cross-sectional areas, we subsequently decided to use the conductive tissue cross-section + (excluding bark and pith) as a reference diameter. To determine the cross-sectional + area of the aggregate (or whole) stem where the cross-section of the conductive + tissue was 5, 10, 15, 20 and 30 mm 2 for each species, a ratio of the aggregate + stem cross-sectional area to the conductive stem cross-sectional area was measured + as follows for each species in the low-nutrient, high-rainfall site. For four + individuals per species, two sections of stem 20-30 mm in length, one 3-5 mm and + the second 6-8 mm in diameter, were randomly sampled from an actively growing + shoot in the upper canopy. Long and short diameters were used to calculate the + aggregate cross-sectional area. The stem was then dissected along the vascular + cambium and the cross-sectional area of the water-conductive tissue was similarly + calculated. Water-conductive tissue was identified as the portion of the stem + remaining after dissection along the vascular cambium and removal of the bark + (phloem, cortex and epidermis). Examining stained cross-sections of the stem under + a light microscope substantiated identification of water-conductive tissue. (Hereafter, + the term conductive tissue refers to the water-conductive tissue.) This resulted + in two ratios of aggregate to conductive stem cross-sectional area, one at ~10 + mm 2 and the second at ~25 mm 2 . This was done to account for changes in the + proportion of conductive and non-conductive tissue along the stem. The first ratio + was used to calculate variables at 5, 10 and 15 mm 2 of conductive tissue, and + the second ratio was applied at 20 and 30 mm 2 . Average aggregate cross-sectional + area of the stem where the conductive tissue was 10 mm 2 ranged from 11.3 mm 2 + in Epacris pulchella , which had the thinnest bark, to 18.9 mm 2 in Angophora + costata , which had the thickest. - value: 250mm long branch segment description: Leaf area was determined for a 250 mm branch segment and sapwood - cross-sectional area was determined where the branch was cut. + cross-sectional area was determined where the branch was cut. In detail, 'from Wright 2006; Leaf area and sapwood cross-sectional area were determined + for a 250 mm branch segment. In detail, No single best point exists to compare + traits such as LM/ SM, LA/SM and LA/SA when considering a set of species that + varies widely in canopy architecture and typical maximum height (here, approximately + 20 cm to 85 m). We have used several approaches (Table 1). In one study, we made + measurements on the terminal twigs of each species, i.e. on a relatively standard + developmental unit (Westoby and Wright 2003). For species at Ash, GLP, Myall and + TRF, traits were measured at each of several different distances back down the + stem from the branch tip (Falster and Westoby 2005a, 2005b and unpublished, Pickup + et al. 2005). At GHP, RHM and RHW, traits were measured at a standard sapwood + cross-sectional area (10 mm2; Pickup et al. 2005). For the present re-analysis, + we took the raw data from the previous studies and, for every species possible, + calculated patterns of leaf and stem deployment at two standard points, at 250 + mm distance from the branch tip (Ash, GLP, Myall and TRF) and at 10 mm2 stem (Ash, + Myall, TRF) or sapwood (GHP, GLP, RHM, RHW) crosssectional area (250 mm or 10 + mm2 formulation denoted as subscript in trait abbreviations). This was done as + follows. For each individual plant, total leaf and stem dry mass at 250 mm distance + was estimated by straightline interpolation from values measured at the nearest + sampling points on either side of this distance. As the dry mass data tended to + display non-linear (power) relationships with distance from the branch tip, the + interpolated values were calculated from log10-log10- transformed data, then back-transformed + to the original scale. The same approach was used for interpolating data to the + standard stem (or sapwood) cross-sectional area. For individuals where measurements + had not been made on either side of the desired point but the nearest measurement + had been made within 25 mm of 250 mm or 1 mm2 of 10 mm2 cross-section (i.e. within + 10% of the desired point), we extrapolated (rather than interpolated) the measured + data to the standard point. This allowed us to include a number of individuals + and species for which interpolation was not possible. Still, several large-leaved, + large-stemmed species from the TRF site could not be included in the 10-mm2 crosssection + dataset. No unusual tendencies in analyses, including the extrapolated data, were + seen in comparison to analyses including interpolated data only (details not shown). + To illustrate how species'' morphology varied at the two standard sampling points, + species-mean stem cross-sectional area varied between 1.2 and 258 mm2 at 250 mm + distance from the branch tip, while the distance from the branch tip at which + stem cross-sectional area reached 10 mm2 varied from 64 to 995 mm.' - value: 1000mm long branch segment description: Leaf area was determined for a 1000 mm branch segment and sapwood - cross-sectional area was determined where the branch was cut. + cross-sectional area was determined where the branch was cut. In detail, 'from Wright 2006; Leaf area and sapwood cross-sectional area were determined + for a 250 mm branch segment. In detail, No single best point exists to compare + traits such as LM/ SM, LA/SM and LA/SA when considering a set of species that + varies widely in canopy architecture and typical maximum height (here, approximately + 20 cm to 85 m). We have used several approaches (Table 1). In one study, we made + measurements on the terminal twigs of each species, i.e. on a relatively standard + developmental unit (Westoby and Wright 2003). For species at Ash, GLP, Myall and + TRF, traits were measured at each of several different distances back down the + stem from the branch tip (Falster and Westoby 2005a, 2005b and unpublished, Pickup + et al. 2005). At GHP, RHM and RHW, traits were measured at a standard sapwood + cross-sectional area (10 mm2; Pickup et al. 2005). For the present re-analysis, + we took the raw data from the previous studies and, for every species possible, + calculated patterns of leaf and stem deployment at two standard points, at 250 + mm distance from the branch tip (Ash, GLP, Myall and TRF) and at 10 mm2 stem (Ash, + Myall, TRF) or sapwood (GHP, GLP, RHM, RHW) crosssectional area (250 mm or 10 + mm2 formulation denoted as subscript in trait abbreviations). This was done as + follows. For each individual plant, total leaf and stem dry mass at 250 mm distance + was estimated by straightline interpolation from values measured at the nearest + sampling points on either side of this distance. As the dry mass data tended to + display non-linear (power) relationships with distance from the branch tip, the + interpolated values were calculated from log10-log10- transformed data, then back-transformed + to the original scale. The same approach was used for interpolating data to the + standard stem (or sapwood) cross-sectional area. For individuals where measurements + had not been made on either side of the desired point but the nearest measurement + had been made within 25 mm of 250 mm or 1 mm2 of 10 mm2 cross-section (i.e. within + 10% of the desired point), we extrapolated (rather than interpolated) the measured + data to the standard point. This allowed us to include a number of individuals + and species for which interpolation was not possible. Still, several large-leaved, + large-stemmed species from the TRF site could not be included in the 10-mm2 crosssection + dataset. No unusual tendencies in analyses, including the extrapolated data, were + seen in comparison to analyses including interpolated data only (details not shown). + To illustrate how species'' morphology varied at the two standard sampling points, + species-mean stem cross-sectional area varied between 1.2 and 258 mm2 at 250 mm + distance from the branch tip, while the distance from the branch tip at which + stem cross-sectional area reached 10 mm2 varied from 64 to 995 mm.' traits: - var_in: Stem wood density unit_in: mg/mm3 @@ -186,157 +302,41 @@ traits: sites, SLA values were taken as a species average from a previous study that had sampled four leaves per plant and five plants per species (M.P., unpublished data). - var_in: LASA10 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean basis_of_value: measurement replicates: 4 method_context: 10mm2 stem cross-sectional area - methods: While initial data were collected in terms of aggregate (or whole) stem - cross-sectional areas, we subsequently decided to use the conductive tissue cross-section - (excluding bark and pith) as a reference diameter. To determine the cross-sectional - area of the aggregate (or whole) stem where the cross-section of the conductive - tissue was 5, 10, 15, 20 and 30 mm 2 for each species, a ratio of the aggregate - stem cross-sectional area to the conductive stem cross-sectional area was measured - as follows for each species in the low-nutrient, high-rainfall site. For four - individuals per species, two sections of stem 20-30 mm in length, one 3-5 mm and - the second 6-8 mm in diameter, were randomly sampled from an actively growing - shoot in the upper canopy. Long and short diameters were used to calculate the - aggregate cross-sectional area. The stem was then dissected along the vascular - cambium and the cross-sectional area of the water-conductive tissue was similarly - calculated. Water-conductive tissue was identified as the portion of the stem - remaining after dissection along the vascular cambium and removal of the bark - (phloem, cortex and epidermis). Examining stained cross-sections of the stem under - a light microscope substantiated identification of water-conductive tissue. (Hereafter, - the term conductive tissue refers to the water-conductive tissue.) This resulted - in two ratios of aggregate to conductive stem cross-sectional area, one at ~10 - mm 2 and the second at ~25 mm 2 . This was done to account for changes in the - proportion of conductive and non-conductive tissue along the stem. The first ratio - was used to calculate variables at 5, 10 and 15 mm 2 of conductive tissue, and - the second ratio was applied at 20 and 30 mm 2 . Average aggregate cross-sectional - area of the stem where the conductive tissue was 10 mm 2 ranged from 11.3 mm 2 - in Epacris pulchella , which had the thinnest bark, to 18.9 mm 2 in Angophora - costata , which had the thickest. + methods: Huber value calculated as the ratio of a stem's leaf area to its water conductive area, as details under method context. - var_in: LASA50 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean basis_of_value: measurement replicates: 4 method_context: 25mm2 stem cross-sectional area - methods: While initial data were collected in terms of aggregate (or whole) stem - cross-sectional areas, we subsequently decided to use the conductive tissue cross-section - (excluding bark and pith) as a reference diameter. To determine the cross-sectional - area of the aggregate (or whole) stem where the cross-section of the conductive - tissue was 5, 10, 15, 20 and 30 mm 2 for each species, a ratio of the aggregate - stem cross-sectional area to the conductive stem cross-sectional area was measured - as follows for each species in the low-nutrient, high-rainfall site. For four - individuals per species, two sections of stem 20-30 mm in length, one 3-5 mm and - the second 6-8 mm in diameter, were randomly sampled from an actively growing - shoot in the upper canopy. Long and short diameters were used to calculate the - aggregate cross-sectional area. The stem was then dissected along the vascular - cambium and the cross-sectional area of the water-conductive tissue was similarly - calculated. Water-conductive tissue was identified as the portion of the stem - remaining after dissection along the vascular cambium and removal of the bark - (phloem, cortex and epidermis). Examining stained cross-sections of the stem under - a light microscope substantiated identification of water-conductive tissue. (Hereafter, - the term conductive tissue refers to the water-conductive tissue.) This resulted - in two ratios of aggregate to conductive stem cross-sectional area, one at ~10 - mm 2 and the second at ~25 mm 2 . This was done to account for changes in the - proportion of conductive and non-conductive tissue along the stem. The first ratio - was used to calculate variables at 5, 10 and 15 mm 2 of conductive tissue, and - the second ratio was applied at 20 and 30 mm 2 . Average aggregate cross-sectional - area of the stem where the conductive tissue was 10 mm 2 ranged from 11.3 mm 2 - in Epacris pulchella , which had the thinnest bark, to 18.9 mm 2 in Angophora - costata , which had the thickest. + methods: Huber value calculated as the ratio of a stem's leaf area to its water conductive area, as details under method context. - var_in: LASA250 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean basis_of_value: measurement replicates: 4 method_context: 250mm long branch segment - methods: 'from Wright 2006; Leaf area and sapwood cross-sectional area were determined - for a 250 mm branch segment. In detail, No single best point exists to compare - traits such as LM/ SM, LA/SM and LA/SA when considering a set of species that - varies widely in canopy architecture and typical maximum height (here, approximately - 20 cm to 85 m). We have used several approaches (Table 1). In one study, we made - measurements on the terminal twigs of each species, i.e. on a relatively standard - developmental unit (Westoby and Wright 2003). For species at Ash, GLP, Myall and - TRF, traits were measured at each of several different distances back down the - stem from the branch tip (Falster and Westoby 2005a, 2005b and unpublished, Pickup - et al. 2005). At GHP, RHM and RHW, traits were measured at a standard sapwood - cross-sectional area (10 mm2; Pickup et al. 2005). For the present re-analysis, - we took the raw data from the previous studies and, for every species possible, - calculated patterns of leaf and stem deployment at two standard points: at 250 - mm distance from the branch tip (Ash, GLP, Myall and TRF) and at 10 mm2 stem (Ash, - Myall, TRF) or sapwood (GHP, GLP, RHM, RHW) crosssectional area (250 mm or 10 - mm2 formulation denoted as subscript in trait abbreviations). This was done as - follows. For each individual plant, total leaf and stem dry mass at 250 mm distance - was estimated by straightline interpolation from values measured at the nearest - sampling points on either side of this distance. As the dry mass data tended to - display non-linear (power) relationships with distance from the branch tip, the - interpolated values were calculated from log10-log10- transformed data, then back-transformed - to the original scale. The same approach was used for interpolating data to the - standard stem (or sapwood) cross-sectional area. For individuals where measurements - had not been made on either side of the desired point but the nearest measurement - had been made within 25 mm of 250 mm or 1 mm2 of 10 mm2 cross-section (i.e. within - 10% of the desired point), we extrapolated (rather than interpolated) the measured - data to the standard point. This allowed us to include a number of individuals - and species for which interpolation was not possible. Still, several large-leaved, - large-stemmed species from the TRF site could not be included in the 10-mm2 crosssection - dataset. No unusual tendencies in analyses, including the extrapolated data, were - seen in comparison to analyses including interpolated data only (details not shown). - To illustrate how species'' morphology varied at the two standard sampling points, - species-mean stem cross-sectional area varied between 1.2 and 258 mm2 at 250 mm - distance from the branch tip, while the distance from the branch tip at which - stem cross-sectional area reached 10 mm2 varied from 64 to 995 mm.' + methods: Huber value calculated as the ratio of a stem's leaf area to its water conductive area, as details under method context. - var_in: LASA1000 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean basis_of_value: measurement replicates: 4 method_context: 1000mm long branch segment - methods: 'from Wright 2006; Leaf area and sapwood cross-sectional area were determined - for a 250 mm branch segment. In detail, No single best point exists to compare - traits such as LM/ SM, LA/SM and LA/SA when considering a set of species that - varies widely in canopy architecture and typical maximum height (here, approximately - 20 cm to 85 m). We have used several approaches (Table 1). In one study, we made - measurements on the terminal twigs of each species, i.e. on a relatively standard - developmental unit (Westoby and Wright 2003). For species at Ash, GLP, Myall and - TRF, traits were measured at each of several different distances back down the - stem from the branch tip (Falster and Westoby 2005a, 2005b and unpublished, Pickup - et al. 2005). At GHP, RHM and RHW, traits were measured at a standard sapwood - cross-sectional area (10 mm2; Pickup et al. 2005). For the present re-analysis, - we took the raw data from the previous studies and, for every species possible, - calculated patterns of leaf and stem deployment at two standard points: at 250 - mm distance from the branch tip (Ash, GLP, Myall and TRF) and at 10 mm2 stem (Ash, - Myall, TRF) or sapwood (GHP, GLP, RHM, RHW) crosssectional area (250 mm or 10 - mm2 formulation denoted as subscript in trait abbreviations). This was done as - follows. For each individual plant, total leaf and stem dry mass at 250 mm distance - was estimated by straightline interpolation from values measured at the nearest - sampling points on either side of this distance. As the dry mass data tended to - display non-linear (power) relationships with distance from the branch tip, the - interpolated values were calculated from log10-log10- transformed data, then back-transformed - to the original scale. The same approach was used for interpolating data to the - standard stem (or sapwood) cross-sectional area. For individuals where measurements - had not been made on either side of the desired point but the nearest measurement - had been made within 25 mm of 250 mm or 1 mm2 of 10 mm2 cross-section (i.e. within - 10% of the desired point), we extrapolated (rather than interpolated) the measured - data to the standard point. This allowed us to include a number of individuals - and species for which interpolation was not possible. Still, several large-leaved, - large-stemmed species from the TRF site could not be included in the 10-mm2 crosssection - dataset. No unusual tendencies in analyses, including the extrapolated data, were - seen in comparison to analyses including interpolated data only (details not shown). - To illustrate how species'' morphology varied at the two standard sampling points, - species-mean stem cross-sectional area varied between 1.2 and 258 mm2 at 250 mm - distance from the branch tip, while the distance from the branch tip at which - stem cross-sectional area reached 10 mm2 varied from 64 to 995 mm.' + methods: Huber value calculated as the ratio of a stem's leaf area to its water conductive area, as details under method context. substitutions: .na taxonomic_updates: - find: Olearia pimelioides diff --git a/data/Prior_2003/metadata.yml b/data/Prior_2003/metadata.yml index e974ab92f..841b45ba4 100644 --- a/data/Prior_2003/metadata.yml +++ b/data/Prior_2003/metadata.yml @@ -267,7 +267,7 @@ traits: replicates: .na methods: expert observation or opinion - var_in: leaf longevity (months) - unit_in: month + unit_in: mo trait_name: leaf_lifespan entity_type: individual value_type: raw @@ -407,7 +407,7 @@ traits: branchlets, leaf area was estimated from total branchlet length and average branchlet diameter. - var_in: Amass - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: individual value_type: raw @@ -428,7 +428,7 @@ traits: weighed to determine saturated mass. Dry mass was determined after leaves were dried for a minimum of 48 h at 70degC." - var_in: Aarea - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw diff --git a/data/RBGV_2022/data.csv b/data/RBGV_2022/data.csv index 817a42daa..043b7b129 100644 --- a/data/RBGV_2022/data.csv +++ b/data/RBGV_2022/data.csv @@ -187,7 +187,7 @@ Acer,Acer negundo," slender, often multi-stemmed deciduous tree to circa 20 m hi Acer,Acer palmatum," wide-crowned, shrub or deciduous tree to circa 7 m high; andromonoecious. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,andromonoecious,andromonoecious,,,woody, Acer,Acer pseudoplatanus," wide-crowned, deciduous tree to circa 25 m high; andromonoecious. ",perennial,inferred_from_growth_form,,,tree,tree,,,andromonoecious,andromonoecious,,,woody, Acetosa,Acetosa," annual or perennial, erect or climbingherbs (rarely shrublets), dioecious or polygamous, rarely monoecious. ",annual perennial,annual perennial,,,shrub climber_herbaceous,shrublets climbingherbs,,,dioecious monoecious polygamous,dioecious monoecious polygamous,erect,erect,woody herbaceous, -Acetosa,Acetosa sagittata," vigorous glabrous perennial climber with stems to 3 m long or more, producing woody, internally yellowish tubers. ",perennial,perennial,,,climber,climber,,,,,,,, +Acetosa,Acetosa sagittata," vigorous glabrous perennial climber with stems to 3 m long or more, producing woody, internally yellowish tubers. ",perennial,perennial,,,climber,climber,,,,,,,woody_root, Acetosella,Acetosella," perennial herbs, dioecious or rarely polygamous. ",perennial,perennial,,,herb,herbs,,,dioecious polygamous,dioecious polygamous,,,herbaceous, Acetosella,Acetosella vulgaris," slender rhizomatous herb, often reddish tinged, to circa 50 cm high. ",perennial,inferred_from_genus,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, Achillea,Achillea, perennial rhizomatous herbs. ,perennial,perennial,,,herb,herbs,,,,,rhizomatous,rhizomatous,herbaceous, @@ -245,7 +245,7 @@ Adriana,Adriana quadripartita," spreading shrub 1-3 m high, glabrous or tomentos Adriana,Adriana tomentosa var. tomentosa," spreading shrub 0.5-2 m high, glabrous or tomentose; ",perennial,inferred_from_genus,,,shrub,shrub,,,,,spreading,spreading,woody, Aegopodium,Aegopodium," mostly glabrous, perennial herbs with creeping rhizomes. ",perennial,perennial,,,herb,herbs,,,,,creeping rhizomatous,creeping rhizomes,herbaceous, Aegopodium,Aegopodium podagraria," erect perennial to 1 m high, spreading by long, slender rhizomes to 9 mm diam. ",perennial,perennial,,,herb,inferred_from_genus,,,,,erect rhizomatous spreading,erect rhizomes spreading,herbaceous, -Aeonium,Aeonium, perennial herbs and soft-wooded shrubs; ,perennial,perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, +Aeonium,Aeonium, perennial herbs and soft-wooded shrubs; ,perennial,perennial,,,herb shrub,herbs shrubs,,,,,,,soft_wood herbaceous, Aeonium,Aeonium arboreum, perennial shrub to circa 1.2 m tall; ,perennial,perennial,,,shrub,shrub,,,,,,,woody, Aeonium,Aeonium haworthii, perennial shrub to circa 1 m tall; ,perennial,perennial,,,shrub,shrub,,,,,,,woody, Agapanthus,Agapanthus, shortly rhizomatous perennial herbs. ,perennial,perennial,,,herb,herbs,,,,,rhizomatous,rhizomatous,herbaceous, @@ -579,7 +579,7 @@ Asclepias,Asclepias curassavica, shrub to 1 m high; ,perennial,inferred_from_fam Asparagaceae,Asparagaceae," perennial herbs, shrubs, climbers, or rarely trees with arborescent stems, or evergreen. ",perennial,perennial,,,herb shrub tree climber,herbs shrubs trees climbers,,,,,arborescent,arborescent,woody herbaceous, Asparagus,Asparagus," erect, often climbing or scrambling, muchbranched, rhizomatous perennial herbs. ",perennial,perennial,,,herb,herbs,,,,,erect climbing rhizomatous,erect climbing rhizomatous,herbaceous, Asparagus,Asparagus asparagoides, climbingherb to 3 m high. smilax (bridal creeper). ,perennial,inferred_from_genus,,,climber_herbaceous,climbingherb,,,,,,,herbaceous, -Asparagus,Asparagus scandens, herbs to 2 m high. asparagus fern. ,perennial,inferred_from_genus,,,herb fern,herbs fern,,,,,,,herbaceous, +Asparagus,Asparagus scandens, herbs to 2 m high. asparagus fern. ,perennial,inferred_from_genus,,,herb fern,herbs,,,,,,,herbaceous, Asparagus,Asparagus aethiopicus, scrambling herb to circa 2 m high (usually less). ,perennial,inferred_from_genus,,,herb,herb,,,,,,,herbaceous, Asparagus,Asparagus declinatus, climbingherb to circa 1 m high. ,perennial,inferred_from_genus,,,climber_herbaceous,climbingherb,,,,,,,herbaceous, Asparagus,Asparagus officinalis, dioecious herbs to 1.5 m high. ,perennial,inferred_from_genus,,,herb,herbs,,,dioecious,dioecious,,,herbaceous, @@ -1194,7 +1194,7 @@ Callitris,Callitris endlicheri," tree with spreading branches, ",perennial,infer Callitris,Callitris verrucosa," stunted or several-stemmed tree or shrub, to 5 m high. ",perennial,inferred_from_family,,,shrub tree,shrub tree,,,,,,,woody, Callitris,Callitris gracilis," broad conical tree to 20 m high, or straggly tree in less favourable habitats. ",perennial,inferred_from_family,,,tree,tree,,,,,,,woody, Callitris,Callitris glaucophylla," broad conical tree to 20 m high, or stunted tree to only 3 m in less favourable habitats. ",perennial,inferred_from_family,,,tree,tree,,,,,,,woody, -Callitris,Callitris oblonga, 3 subspecies; 1 subspecies naturalised in victoria. profile provided under subspecies. ,perennial,inferred_from_family,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Callitris,Callitris oblonga, 3 subspecies; 1 subspecies naturalised in victoria. profile provided under subspecies. ,perennial,inferred_from_family,,,,inferred_from_life_history,,,,,,,, Calocephalus,Calocephalus, annual or perennial herbs. ,annual perennial,annual perennial,,,herb,herbs,,,,,,,herbaceous, Calocephalus,Calocephalus sonderi, ascending to erect annual 6-45 cm high. ,annual,annual,,,herb,inferred_from_genus,,,,,erect decumbent,erect ascending,herbaceous, Calocephalus,Calocephalus citreus," erect perennial, 15-60 cm high; ",perennial,perennial,,,herb,inferred_from_genus,,,,,erect,erect,herbaceous, @@ -1800,7 +1800,7 @@ Crinum,Crinum flaccidum, ,perennial,inferred_from_genus,,,herb,inferred_from_ge Crocosmia,Crocosmia," perennial herb, leaves and flowers annual; ",annual perennial,annual perennial,,,herb,herb,,,,,,,herbaceous, Crocosmia,Crocosmia xcrocosmiiflora, ,,,,,herb,inferred_from_genus,,,,,,,herbaceous, Crotalaria,Crotalaria," herbs or shrubs, annual or perennial. ",annual perennial,annual perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, -Crotalaria,Crotalaria agatiflora subsp. agatiflora," woody subshrub, 1-2 m high; ",,,,,subshrub,subshrub,,,,,,,, +Crotalaria,Crotalaria agatiflora subsp. agatiflora," woody subshrub, 1-2 m high; ",,,,,subshrub,subshrub,,,,,,,woody, Croton,Croton," trees, shrubs, or herbs, monoecious or rarely dioecious, ",,,,,herb shrub tree,herbs shrubs trees,,,dioecious monoecious,dioecious monoecious,,,woody herbaceous, Croton,Croton setiger," mat-forming herb to circa 20 cm high and circa 80 cm wide, ",,,,,herb,herb,,,,,mat-forming,matforming,herbaceous, Crowea,Crowea," shrubs, ",perennial,inferred_from_growth_form,,,shrub,shrubs,,,,,,,woody, @@ -1827,7 +1827,7 @@ Cullen,Cullen," annual or perennial herbs, subshrubs or trees ( victoria), consp Cullen,Cullen australasicum, erect or ascending muchbranched shrub to 2.5 m tall; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect decumbent,erect ascending,woody, Cullen,Cullen cinereum, erect or ascending annual or perennial herb or subshrub to 1 m tall; ,annual perennial,annual perennial,,,herb subshrub,herb subshrub,,,,,erect decumbent,erect ascending,herbaceous, Cullen,Cullen discolor," prostrate perennial herb, usually with a greyish appearance; ",perennial,perennial,,,herb,herb,,,,,prostrate,prostrate,herbaceous, -Cullen,Cullen microcephalum, trailing or ascending perennial herb or sub-shrub; ,perennial,perennial,,,herb subshrub shrub,herb subshrub shrub,,,,,decumbent prostrate,ascending trailing,woody herbaceous, +Cullen,Cullen microcephalum, trailing or ascending perennial herb or sub-shrub; ,perennial,perennial,,,herb subshrub shrub,herb subshrub shrub,,,,,decumbent prostrate,ascending trailing,herbaceous, Cullen,Cullen pallidum," erect or ascending, finally decumbent perennial herb; ",perennial,perennial,,,herb,herb,,,,,erect decumbent,erect decumbent ascending,herbaceous, Cullen,Cullen parvum, trailing or ascending perennial herb; ,perennial,perennial,,,herb,herb,,,,,decumbent prostrate,ascending trailing,herbaceous, Cullen,Cullen patens," prostrate perennial herb, usually with a greenish appearance, atypically greyish; ",perennial,perennial,,,herb,herb,,,,,prostrate,prostrate,herbaceous, @@ -1933,11 +1933,11 @@ Cyperus,Cyperus esculentus, perennial with slender rhizomes forming globose to o Cyperus,Cyperus flaccidus, small tufted annual. ,annual,annual,,,herb graminoid,inferred_from_genus,,,,,,,herbaceous, Cyperus,Cyperus pygmaeus," small, tufted, leafy annual with reddish roots. ",annual,annual,,,herb graminoid,inferred_from_genus,,,,,,,herbaceous, Cyperus,Cyperus lhotskyanus, slender perennial with ± long rhizome. ,perennial,perennial,,,herb graminoid,inferred_from_genus,,,,,rhizomatous,rhizome,herbaceous, -Cyperus,Cyperus bifax," rhizomatous perennial with slender rhizomes producing woody, ovoid tubers circa 0.5-1 cm diam.. ",perennial,perennial,,,herb graminoid,inferred_from_genus,,,,,rhizomatous,rhizomatous rhizomes,herbaceous, +Cyperus,Cyperus bifax," rhizomatous perennial with slender rhizomes producing woody, ovoid tubers circa 0.5-1 cm diam.. ",perennial,perennial,,,herb graminoid,inferred_from_genus,,,,,rhizomatous,rhizomatous rhizomes,woody_root herbaceous, Cyperus,Cyperus nervulosus, dwarf tufted annual. ,annual,annual,,,herb graminoid,inferred_from_genus,,,,,,,herbaceous, Cyperus,Cyperus polystachyos, tufted annual or perennial with short rhizome. ,annual perennial,annual perennial,,,herb graminoid,inferred_from_genus,,,,,rhizomatous,rhizome,herbaceous, Cyperus,Cyperus eragrostis, tufted perennial. ,perennial,perennial,,,herb graminoid,inferred_from_genus,,,,,,,herbaceous, -Cyperus,Cyperus victoriensis," rhizomatous perennial with slender rhizomes forming woody, ovoid to ellipsoid tubers 0.5-1 cm diam.. ",perennial,perennial,,,herb graminoid,inferred_from_genus,,,,,rhizomatous,rhizomatous rhizomes,herbaceous, +Cyperus,Cyperus victoriensis," rhizomatous perennial with slender rhizomes forming woody, ovoid to ellipsoid tubers 0.5-1 cm diam.. ",perennial,perennial,,,herb graminoid,inferred_from_genus,,,,,rhizomatous,rhizomatous rhizomes,woody_root herbaceous, Cyperus,Cyperus leptocarpus, slender annual. ,annual,annual,,,herb graminoid,inferred_from_genus,,,,,,,herbaceous, Cyperus,Cyperus subulatus, tufted perennial with very short rhizome. ,perennial,perennial,,,herb graminoid,inferred_from_genus,,,,,rhizomatous,rhizome,herbaceous, Cyphanthera,Cyphanthera," shrubs, ",perennial,inferred_from_growth_form,,,shrub,shrubs,,,,,,,woody, @@ -2195,7 +2195,7 @@ Dodonaea,Dodonaea viscosa subsp. angustissima, erect shrub to 4 m. ,perennial,in Dodonaea,Dodonaea viscosa subsp. cuneata," compact, spreading shrubs to 3 m. ",perennial,inferred_from_growth_form,,,shrub,shrubs,,,,,spreading compact,spreading compact,woody, Dodonaea,Dodonaea viscosa subsp. spatulata, erect to spreading shrub to 4 m. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading,erect spreading,woody, Dolichandra,Dolichandra, woodyclimbers. ,perennial,inferred_from_growth_form,,,climber_woody,woodyclimbers,,,,,,,woody,inferred_from_growth_form -Dolichandra,Dolichandra unguis-cati," woody, glabrous climber. ",,,,,climber,climber,,,,,,,, +Dolichandra,Dolichandra unguis-cati," woody, glabrous climber. ",,,,,climber_woody,climber,,,,,,,woody, Dorycnium,Dorycnium, perennial herbs or subshrubs. ,perennial,perennial,,,herb subshrub,herbs subshrubs,,,,,,,herbaceous, Dorycnium,Dorycnium rectum, perennial herb or subshrub; ,perennial,perennial,,,herb subshrub,herb subshrub,,,,,,,herbaceous, Drabastrum,Drabastrum," perennial herbs or shrubs, ",perennial,perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, @@ -3067,7 +3067,7 @@ Grevillea,Grevillea patulifolia," erect to trailing shrub 0.2-1.6(-2.5) m high, Grevillea,Grevillea polybractea, spreading muchbranched shrub 0.3-1.8 m high. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, Grevillea,Grevillea polychroma," spreading to erect shrub 1-3 m high, 1-5 wide. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading,erect spreading,woody, Grevillea,Grevillea pterosperma, erect shrub 2-4 m high. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, -Grevillea,Grevillea ramosissima subsp. hypargyrea," straggling to spreading, sometimes root-suckering, ",,,,,,,,,,,spreading,spreading,, +Grevillea,Grevillea ramosissima subsp. hypargyrea," straggling to spreading, sometimes root-suckering, ",,,,,shrub,,,,,,spreading,spreading,, Grevillea,Grevillea repens, prostrate trailing or mat-forming shrub to circa 3 m across. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,mat-forming prostrate,matforming prostrate trailing,woody, Grevillea,Grevillea steiglitziana, spreading shrub 0.7-2.0 m high. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, Grevillea,Grevillea victoriae," spreading to erect shrub (1-)1.5-3(-5) m high, 1.5-4.5(-6) m wide. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading,erect spreading,woody, @@ -3339,15 +3339,15 @@ Hypericaceae,Hypericaceae, woody or perennial herbs. mostly glabrous. ,perennial Hypericum,Hypericum," herbs or shrubs. mostly perennial, ",perennial,perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, Hypericum,Hypericum gramineum," erect perennial (rarely annual) herb to circa 40 cm high, often rhizomatous and shortly creeping at base; ",annual perennial,annual perennial,,,herb,herb,,,,,erect creeping rhizomatous,erect creeping rhizomatous,herbaceous, Hypericum,Hypericum japonicum," prostrate or procumbent, often mat-forming perennial herb, rarely more than circa 8 cm high, ",perennial,perennial,,,herb,herb,,,,,mat-forming prostrate,matforming prostrate procumbent,herbaceous, -Hypericum,Hypericum perforatum subsp. veronense," herb to circa 80 cm high, usually several erect stems arising from woody, short-rhizomatous root-stock; ",perennial,inferred_from_genus,,,herb,herb,,,,,erect rhizomatous,erect rhizomatous,herbaceous, +Hypericum,Hypericum perforatum subsp. veronense," herb to circa 80 cm high, usually several erect stems arising from woody, short-rhizomatous root-stock; ",perennial,inferred_from_genus,,,herb,herb,,,,,erect rhizomatous,erect rhizomatous,woody_root herbaceous, Hypericum,Hypericum canariense, medium to large shrub 1-4 m high; ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Hypericum,Hypericum tetrapterum var. tetrapterum," erect, rhizomatous herb or subshrub to circa 80 cm high; ",perennial,inferred_from_genus,,,herb subshrub,herb subshrub,,,,,erect rhizomatous,erect rhizomatous,herbaceous, Hypericum,Hypericum grandifolium," shrub, 0.5-1 m high; ",perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Hypericum,Hypericum humifusum," procumbent, loosely sprawling herb, to circa 10 cm high, ",perennial,inferred_from_genus,,,herb,herb,,,,,prostrate sprawling,procumbent sprawling,herbaceous, Hypericum,Hypericum calycinum," extensively creeping, rhizomatous subshrub, ",perennial,inferred_from_genus,,,subshrub,subshrub,,,,,creeping rhizomatous,creeping rhizomatous,, Hypericum,Hypericum hircinum," shrub, 0.5-1.5 m high; ",perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, -Hypericum,Hypericum triquetrifolium," erect herb to circa 50 cm high, spreading extensively by woody rhizomes; ",perennial,inferred_from_genus,,,herb,herb,,,,,erect rhizomatous spreading,erect rhizomes spreading,herbaceous, -Hypericum,Hypericum androsaemum," spreading, soft-wooded shrub, to circa 80 cm high, usually curry-scented; ",perennial,inferred_from_genus,,,shrub,shrub,,,,,spreading,spreading,woody, +Hypericum,Hypericum triquetrifolium," erect herb to circa 50 cm high, spreading extensively by woody rhizomes; ",perennial,inferred_from_genus,,,herb,herb,,,,,erect rhizomatous spreading,erect rhizomes spreading,woody_root herbaceous, +Hypericum,Hypericum androsaemum," spreading, soft-wooded shrub, to circa 80 cm high, usually curry-scented; ",perennial,inferred_from_genus,,,shrub,shrub,,,,,spreading,spreading,soft_wood, Hypochaeris,Hypochaeris glabra, annual herb 10-60 cm high. ,annual,annual,,,herb,herb,,,,,,,herbaceous, Hypochaeris,Hypochaeris radicata, perennial herb 10-80 cm high. ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, Hypochaeris,Hypochaeris," rosetted, annual to perennial taprooted herbs. ",annual perennial,annual perennial,,,herb,herbs,,,,,,,herbaceous, @@ -3625,7 +3625,7 @@ Lavandula,Lavandula dentata var. candicans, shrub to circa 1 m high; ,perennial, Lavandula,Lavandula stoechas subsp. stoechas, shrub to circa 80 cm high; ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, Lawrencia,Lawrencia," prostrate to erect subshrubs, glabrous. ",,,,,subshrub,subshrubs,,,,,erect prostrate,erect prostrate,, Lawrencia,Lawrencia berthae," dioecious, short-lived (?) perennial subshrub to circa 80 cm high and wide. ",perennial,perennial,,,subshrub,subshrub,,,dioecious,dioecious,,,, -Lawrencia,Lawrencia glomerata," soft-wooded, shortlivedperennial subshrub to circa 50 cm high and wide, ",short_lived_perennial,shortlivedperennial,,,subshrub,subshrub,,,,,,,, +Lawrencia,Lawrencia glomerata," soft-wooded, shortlivedperennial subshrub to circa 50 cm high and wide, ",short_lived_perennial,shortlivedperennial,,,subshrub,subshrub,,,,,,,soft_wood, Lawrencia,Lawrencia spicata," slender, erect, glabrous, subfleshy herb to circa 120 cm high, 1-few-stemmed from base. ",,,,,herb,herb,,,,,erect,erect,herbaceous, Lawrencia,Lawrencia squamata," divaricate, often spinescent dioecious shrub to circa 60 cm high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,dioecious,dioecious,,,woody, Laxmannia,Laxmannia, tufted or stilt-rooted rhizomatous perennial herbs. ,perennial,perennial,,,herb,herbs,,,,,rhizomatous,rhizomatous,herbaceous, @@ -3760,7 +3760,7 @@ Lepyrodia,Lepyrodia anarthria," perennial, dioecious herbs. ",perennial,perennia Lespedeza,Lespedeza juncea subsp. sericea," erect or decumbent perennial subshrub, 60-120 cm tall; ",perennial,perennial,,,subshrub,subshrub,,,,,erect decumbent,erect decumbent,, Lespedeza,Lespedeza," subshrubs (in victoria), perennial herbs or shrubs; ",perennial,perennial,,,herb subshrub shrub,herbs subshrubs shrubs,,,,,,,woody herbaceous, Lessertia,Lessertia," prostrate or decumbent herbs or shrubs, usually perennial; ",perennial,perennial,,,herb shrub,herbs shrubs,,,,,decumbent prostrate,decumbent prostrate,woody herbaceous, -Lessertia,Lessertia frutescens," hoary, soft-wooded shrub to circa 1 m high; ",perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, +Lessertia,Lessertia frutescens," hoary, soft-wooded shrub to circa 1 m high; ",perennial,inferred_from_genus,,,shrub,shrub,,,,,,,soft_wood, Leucanthemum,Leucanthemum," perennial, rarely annual, rhizomatous herbs. ",annual perennial,annual perennial,,,herb,herbs,,,,,rhizomatous,rhizomatous,herbaceous, Leucanthemum,Leucanthemum xsuperbum," erect, circa glabrous perennial 50-100 cm high, usually unbranched above rhizome. ",perennial,perennial,,,herb,inferred_from_genus,,,,,erect rhizomatous,erect rhizome,herbaceous, Leucanthemum,Leucanthemum vulgare, erect perennial 30-90 cm high; ,perennial,perennial,,,herb,inferred_from_genus,,,,,erect,erect,herbaceous, @@ -3794,7 +3794,7 @@ Levenhookia,Levenhookia dubia," ephemeral herb, 2-8 cm high, ",ephemeral,ephemer Levenhookia,Levenhookia pusilla," ephemeral herb, 2-5 cm high, ",ephemeral,ephemeral,,,herb,herb,,,,,,,herbaceous, Levenhookia,Levenhookia sonderi," ephemeral herb, 3-10 cm high, simple or branched near base, ",ephemeral,ephemeral,,,herb,herb,,,,,,,herbaceous, Leycesteria,Leycesteria, deciduous shrubs. ,perennial,inferred_from_growth_form,,,shrub,shrubs,,,,,,,woody, -Leycesteria,Leycesteria formosa, soft-wooded shrub to circa 2 m high; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, +Leycesteria,Leycesteria formosa, soft-wooded shrub to circa 2 m high; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,soft_wood, Libertia,Libertia," tufted, evergreen, perennial herb. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Libertia,Libertia pulchella, loosely tufted herb. ,perennial,inferred_from_genus,,,herb,herb,,,,,,,herbaceous, Libertia,Libertia paniculata, densely tufted herb. ,perennial,inferred_from_genus,,,herb,herb,,,,,,,herbaceous, @@ -4032,7 +4032,7 @@ Mantisalca,Mantisalca salmantica," erect perennial or biennial, to 1 m high, alm Marianthus,Marianthus, shrubs with twining branches. ,perennial,inferred_from_growth_form,,,shrub,shrubs,,,,,,,woody, Marianthus,Marianthus bignoniaceus," twiner with reddish-brown, finally glabrous stems. ",,,,,climber_herbaceous,twiner,,,,,,,herbaceous, Marrubium,Marrubium, perennial shrubs or subshrubs; ,perennial,perennial,,,subshrub shrub,subshrubs shrubs,,,,,,,woody, -Marrubium,Marrubium vulgare," soft-wooded shrubs to circa 60 cm high, usually many-branched from near base; ",perennial,inferred_from_genus,,,shrub,shrubs,,,,,,,woody, +Marrubium,Marrubium vulgare," soft-wooded shrubs to circa 60 cm high, usually many-branched from near base; ",perennial,inferred_from_genus,,,shrub,shrubs,,,,,,,soft_wood, Marsdenia,Marsdenia," climbers with twining stems (in victoria), or erect shrubs; sap milky, rarely watery ( victoria). ",perennial,inferred_from_family,,,shrub climber,shrubs climbers,,,,,erect,erect,woody, Marsdenia,Marsdenia australis, slender climber with stems to circa 4 m long; ,perennial,inferred_from_family,,,climber,climber,,,,,,,, Marsdenia,Marsdenia flavescens, robust climber with stems to 5 m long or more; ,perennial,inferred_from_family,,,climber,climber,,,,,,,, @@ -4346,7 +4346,7 @@ Neurachne,Neurachne," tufted, shortly rhizomatous perennials. ",perennial,perenn Nicandra,Nicandra," annual herbs, ",annual,annual,,,herb,herbs,,,,,,,herbaceous, Nicandra,Nicandra physalodes, annual herb to circa 2 m high. ,annual,annual,,,herb,herb,,,,,,,herbaceous, Nicotiana,Nicotiana," annual or shortlivedperennial herbs, shrubs or small trees, ",annual short_lived_perennial,annual shortlivedperennial,,,herb shrub tree,herbs shrubs trees,,,,,,,woody herbaceous, -Nicotiana,Nicotiana glauca," erect, often spindly tall shrub or small tree to 6 m high, perennial, soft-wooded; ",perennial,perennial,,,shrub tree,shrub tree,,,,,erect spindly,erect spindly,woody, +Nicotiana,Nicotiana glauca," erect, often spindly tall shrub or small tree to 6 m high, perennial, soft-wooded; ",perennial,perennial,,,shrub tree,shrub tree,,,,,erect spindly,erect spindly,soft_wood, Nicotiana,Nicotiana sylvestris, erect viscid annual herb to 2.5 m high; ,annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Nicotiana,Nicotiana tabacum, erect viscid annual or shortlivedperennial herb to 3 m high; ,annual short_lived_perennial,annual shortlivedperennial,,,herb,herb,,,,,erect,erect,herbaceous, Nicotiana,Nicotiana velutina, erect herb to 1.5 m high; ,,,,,herb,herb,,,,,erect,erect,herbaceous, @@ -4651,7 +4651,7 @@ Parietaria,Parietaria," annual or perennial herbs, ",annual perennial,annual per Parietaria,Parietaria australis," annual herb, 5-30 cm high, at base; ",annual,annual,,,herb,herb,,,,,,,herbaceous, Parietaria,Parietaria cardiostegia," annual herb, 5-60 cm high, at base; ",annual,annual,,,herb,herb,,,,,,,herbaceous, Parietaria,Parietaria debilis," annual herb, 6-30 cm high, at base; ",annual,annual,,,herb,herb,,,,,,,herbaceous, -Parietaria,Parietaria judaica," perennial herb, 20-80 cm tall, woody; ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Parietaria,Parietaria judaica," perennial herb, 20-80 cm tall, woody; ",perennial,perennial,,,herb,herb,,,,,,,woody, Paronychia,Paronychia," annual or perennial, erect or procumbent and mat-forming herbs with a woodybase; ",annual perennial,annual perennial,,,herb,herbs,,,,,erect mat-forming prostrate,erect matforming procumbent,woody_base herbaceous,woodybase Paronychia,Paronychia brasiliana, perennial with woodytaproot; ,perennial,perennial,,,herb,inferred_from_genus,,,,,,,woody_root herbaceous,woodytaproot Paronychia,Paronychia franciscana, perennial with woodytaproot; ,perennial,perennial,,,herb,inferred_from_genus,,,,,,,woody_root herbaceous,woodytaproot @@ -4677,7 +4677,7 @@ Passerina,Passerina, shrubs or small trees. ,perennial,inferred_from_growth_form Passerina,Passerina corymbosa," dense, bushy shrubs to circa 1.5 m high; ",perennial,inferred_from_growth_form,,,shrub,shrubs,,,,,dense bushy,dense bushy,woody, Passiflora,Passiflora edulis," woody, glabrous climber. ",,,,,climber,climber,,,,,,,, Passiflora,Passiflora, ,,,,,,,,,,,,,, -Passiflora,Passiflora caerulea," woody, glabrous vine. ",,,,,climber_herbaceous,vine,,,,,,,herbaceous, +Passiflora,Passiflora caerulea," woody, glabrous vine. ",,,,,climber_woody,vine,,,,,,,woody, Passiflora,Passiflora cinnabarina, glabrous climber or scrambler. ,,,,,climber,climber,,,,,,,, Passiflora,Passiflora tarminiana, pubescent climber. ,,,,,climber,climber,,,,,,,, Passifloraceae,Passifloraceae, herbaceouswoodyvines. ,,,,,,,,,,,,,, @@ -4706,9 +4706,9 @@ Pelargonium,Pelargonium helmsii, ascending perennial to circa 25 cm high; ,peren Pelargonium,Pelargonium inodorum, weakly ascending to erect annual or shortlivedperennial to 35(-60) cm high; ,annual short_lived_perennial,annual shortlivedperennial,,,herb,inferred_from_life_history,,,,,erect decumbent,erect ascending,herbaceous, Pelargonium,Pelargonium littorale, erect to ascending perennial to circa 40 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect decumbent,erect ascending,herbaceous, Pelargonium,Pelargonium peltatum," trailing, scrambling or climbing perennial to 2 m high; ",perennial,perennial,,,herb,inferred_from_life_history,,,,,prostrate climbing,trailing climbing,herbaceous, -Pelargonium,Pelargonium quercifolium," erect, suckering, ",,,,,,,,,,,erect,erect,, +Pelargonium,Pelargonium quercifolium," erect, suckering, ",,,,,subshrub,,,,,,erect,erect,, Pelargonium,Pelargonium rodneyanum," tufted, erect perennial to circa 40 cm high; ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Pelargonium,Pelargonium xasperum," spreading, aromatic, soft-wooded shrub to 1 m high; ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, +Pelargonium,Pelargonium xasperum," spreading, aromatic, soft-wooded shrub to 1 m high; ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,soft_wood, Pelargonium,Pelargonium xdomesticum," diffuse, odorous shrub to circa 1 m high; ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Pelargonium,Pelargonium xhortorum, aromatic subshrub to circa 1 m high; ,,,,,subshrub,subshrub,,,,,,,, Pelargonium,Pelargonium, annual or perennial herbs or low shrubs. ,annual perennial,annual perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, @@ -4843,7 +4843,7 @@ Physalis,Physalis lanceifolia," annual herb to 50 cm high, ",annual,annual,,,her Physalis,Physalis longifolia," perennial herb to 50 cm high, rhizomatous, ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, Physalis,Physalis peruviana," short-lived shrub to 1 m high, ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Phytolacca,Phytolacca," perennial trees, shrubs or herbs. ",perennial,perennial,,,herb shrub tree,herbs shrubs trees,,,dioecious,inferred_from_family,,,woody herbaceous, -Phytolacca,Phytolacca octandra," rank-smelling, glabrous perennial herb or soft-wooded shrub, to circa 2 m high and wide. ",perennial,perennial,,,herb shrub,herb shrub,,,dioecious,inferred_from_family,,,woody herbaceous, +Phytolacca,Phytolacca octandra," rank-smelling, glabrous perennial herb or soft-wooded shrub, to circa 2 m high and wide. ",perennial,perennial,,,herb shrub,herb shrub,,,dioecious,inferred_from_family,,,soft_wood herbaceous, Phytolaccaceae,Phytolaccaceae," herbs, shrubs or trees, sometimes dioecious. ",,,,,herb shrub tree,herbs shrubs trees,,,dioecious,dioecious,,,woody herbaceous, Picea,Picea pungens, tree to 50 m tall. ,perennial,inferred_from_growth_form,,,tree,tree,,,monoecious,inferred_from_family,,,woody, Picea,Picea abies, tree to 30 m tall. ,perennial,inferred_from_growth_form,,,tree,tree,,,monoecious,inferred_from_family,,,woody, @@ -4868,7 +4868,7 @@ Pilosella,Pilosella," perennial, rosetted, rhizomatous, or often stoloniferous Pilularia,Pilularia, ,,,,,,,aquatic,inferred_from_family,,,,,, Pilularia,Pilularia novae-hollandiae, ,,,,,,,aquatic,inferred_from_family,,,,,, Pimelea,Pimelea treyvaudii, shrub 20-30 cm high; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, -Pimelea,Pimelea trichostachya," semi-woody annual, 15-60 cm high; ",annual,annual,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Pimelea,Pimelea trichostachya," semi-woody annual, 15-60 cm high; ",annual,annual,,,herb,inferred_from_life_history,,,,,,,soft_wood, Pimelea,Pimelea williamsonii," annual subshrub, 10-30 cm high; ",annual,annual,,,subshrub,subshrub,,,,,,,, Pimelea,Pimelea spinescens subsp. pubiflora, ,,,,,subshrub,inferred_from_species,,,dioecious,inferred_from_species,,,, Pimelea,Pimelea spinescens subsp. spinescens, ,,,,,subshrub,inferred_from_species,,,dioecious,inferred_from_species,,,, @@ -4904,7 +4904,7 @@ Pimelea,Pimelea pagophila, shrub 0.3-1.2 m high; ,perennial,inferred_from_growth Pimelea,Pimelea pauciflora, shrub 1-3 m high; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Pimelea,Pimelea phylicoides, shrub usually 20-50 cm high; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Pimelea,Pimelea serpyllifolia subsp. serpyllifolia," shrub 0.1-1.5 m high, rarely prostrate; ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,prostrate,prostrate,woody, -Pimelea,Pimelea simplex subsp. simplex," herbaceous or semi-woody annual, 5-50 cm high; ",annual,annual,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Pimelea,Pimelea simplex subsp. simplex," herbaceous or semi-woody annual, 5-50 cm high; ",annual,annual,,,herb,inferred_from_life_history,,,,,,,soft_wood herbaceous, Pimelea,Pimelea spinescens," deeply taprooted, long-lived subshrub 5-30 cm high (rarely more); plants mostly dioecious. ",,,,,subshrub,subshrub,,,dioecious,dioecious,,,, Pimelea,Pimelea stricta, shrub 0.5-1.5 m high; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Pinaceae,Pinaceae," monoecious trees, rarely shrubs. ",perennial,inferred_from_growth_form,,,shrub tree,shrubs trees,,,monoecious,monoecious,,,woody, @@ -4981,7 +4981,7 @@ Platysace,Platysace lanceolata, erect or weak shrub 30-80(-120) cm high; ,perenn Platysace,Platysace ericoides," weakly erect, diffuse subshrub to 50 cm high; ",perennial,inferred_from_genus,,,subshrub,subshrub,,,,,erect,erect,, Platysace,Platysace heterophylla var. heterophylla," semi-erect or scrambling herb or subshrub, glabrous; ",perennial,inferred_from_genus,,,herb subshrub,herb subshrub,,,,,erect,erect,herbaceous, Plecostachys,Plecostachys, soft-wooded decumbent to scrambling or semi-scandent perennial herbs; ,perennial,perennial,,,herb,herbs,,,,,decumbent climbing,decumbent scandent,herbaceous, -Plecostachys,Plecostachys serpyllifolia," spreading, scrambling-ascending, rather dense s herbs to circa 1 m high and wide. ",perennial,inferred_from_genus,,,herb,herbs,,,,,decumbent spreading dense,ascending spreading dense,herbaceous, +Plecostachys,Plecostachys serpyllifolia," spreading, scrambling-ascending, rather dense s herbs to circa 1 m high and wide. ",perennial,inferred_from_genus,,,herb,herbs,,,,,decumbent spreading dense,ascending spreading dense,soft_wood herbaceous, Plectorrhiza,Plectorrhiza, small epiphytes. ,,,,,herb,inferred_from_family,epiphyte,epiphytes,,,,,herbaceous, Plectorrhiza,Plectorrhiza tridentata, ,,,,,herb,inferred_from_family,epiphyte,inferred_from_genus,,,,,herbaceous, Plectranthus,Plectranthus ecklonii," aromatic, soft, erect, perennial shrublet, 70-250 cm high, semi-succulent distally; ",perennial,perennial,,,shrub,shrublet,,,,,erect,erect,woody, @@ -5510,8 +5510,8 @@ Quercus,Quercus robur, deciduous spreading tree to circa 20 m high. ,perennial,i Quercus,Quercus suber, evergreen tree to circa 10 m high. ,perennial,inferred_from_growth_form,,,tree,tree,,,monoecious,inferred_from_genus,,,woody, Quinetia,Quinetia, annual herbs; ,annual,annual,,,herb,herbs,,,,,,,herbaceous, Quinetia,Quinetia urvillei," erect annual, 3-17 cm high. ",annual,annual,,,herb,inferred_from_genus,,,,,erect,erect,herbaceous, -Radyera,Radyera," perennial, soft-wooded shrubs, ",perennial,perennial,,,shrub,shrubs,,,,,,,woody, -Radyera,Radyera farragei, shortlivedperennial to circa 1 m high. ,short_lived_perennial,shortlivedperennial,,,shrub,inferred_from_genus,,,,,,,woody, +Radyera,Radyera," perennial, soft-wooded shrubs, ",perennial,perennial,,,shrub,shrubs,,,,,,,soft_wood, +Radyera,Radyera farragei, shortlivedperennial to circa 1 m high. ,short_lived_perennial,shortlivedperennial,,,shrub,inferred_from_genus,,,,,,,soft_wood, Ranunculaceae,Ranunculaceae," tufted, stoloniferous or rhizomatous, annual or perennial herbs with rosetted or alternate leaves, or woodyclimbers with opposite leaves. ",annual perennial,annual perennial,,,herb climber_woody,herbs woodyclimbers,,,,,rhizomatous stoloniferous,rhizomatous stoloniferous,herbaceous, Ranunculus,Ranunculus millanii," tufted, stoloniferous perennial with fibrous roots, to circa 8 cm high. ",perennial,perennial,,,herb,inferred_from_genus,,,,,stoloniferous,stoloniferous,herbaceous, Ranunculus,Ranunculus inundatus," stoloniferous, aquatic or semiaquatic perennial, to circa 30 cm high. ",perennial,perennial,,,herb,inferred_from_genus,semiaquatic aquatic,semiaquatic aquatic,,,stoloniferous,stoloniferous,herbaceous, @@ -5943,7 +5943,7 @@ Securigera,Securigera," annual or perennial herbs, sometimes woodybase; ",annual Sedum,Sedum caespitosum, erect annual herb; ,annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Sedum,Sedum," annual or perennial soft-wooded herbs or shrubs, more or less succulent, glabrous. ",annual perennial,annual perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, Sedum,Sedum xrubrotinctum, tufted perennial subshrub; ,perennial,perennial,,,subshrub,subshrub,,,,,,,, -Sedum,Sedum acre," perennial procumbent or ascending, mat-forming herb; ",perennial,perennial,,,herb,herb,,,,,mat-forming decumbent prostrate,matforming ascending procumbent,herbaceous, +Sedum,Sedum acre," perennial procumbent or ascending, mat-forming herb; ",perennial,perennial,,,herb,herb,,,,,mat-forming decumbent prostrate,matforming ascending procumbent,, Sedum,Sedum album," loosely tufted, mat-forming subshrub; ",,,,,subshrub,subshrub,,,,,mat-forming,matforming,, Sedum,Sedum praealtum subsp. praealtum, erect or decumbent perennial shrub to circa 1 m tall; ,perennial,perennial,,,shrub,shrub,,,,,erect decumbent,erect decumbent,woody, Sedum,Sedum rupestre, procumbent shrub; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,prostrate,procumbent,woody, @@ -6755,7 +6755,7 @@ Veronica,Veronica anagallis-aquatica," rhizomatous perennial, ",perennial,perenn Veronica,Veronica arvensis, erect annual to 10 cm high; ,annual,annual,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, Veronica,Veronica calycina, stoloniferous perennial; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,stoloniferous,stoloniferous,herbaceous, Veronica,Veronica catenata," rhizomatous perennial, ",perennial,perennial,,,herb,inferred_from_life_history,,,,,rhizomatous,rhizomatous,herbaceous, -Veronica,Veronica derwentiana, woody herb to circa 140 cm high; ,,,,,herb,herb,,,,,,,herbaceous, +Veronica,Veronica derwentiana, woody herb to circa 140 cm high; ,,,,,herb,herb,,,,,,,woody, Veronica,Veronica gracilis, slender rhizomatous perennial; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,rhizomatous,rhizomatous,herbaceous, Veronica,Veronica grosseserrata," stoloniferous, procumbent perennial; ",perennial,perennial,,,herb,inferred_from_life_history,,,,,prostrate stoloniferous,procumbent stoloniferous,herbaceous, Veronica,Veronica hederifolia, sprawling annual; ,annual,annual,,,herb,inferred_from_life_history,,,,,sprawling,sprawling,herbaceous, @@ -6812,7 +6812,7 @@ Viola,Viola cleistogamoides," rhizomatous perennial herb, ",perennial,perennial, Violaceae,Violaceae, herbs or shrubs. ,,,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, Vitaceae,Vitaceae," woody or herbaceousclimbers with leaf-opposed tendrils, less commonly shrubs or small trees, evergreen or deciduous; ",,,,,shrub tree climber_herbaceous,shrubs trees herbaceousclimbers,,,,,,,woody herbaceous, Vitis,Vitis, woody deciduous vines; tendrils simple or 2-branched. ,,,,,climber_herbaceous,vines,,,,,,,herbaceous, -Vitis,Vitis vinifera," soft-wooded climber, ",,,,,climber,climber,,,,,,,, +Vitis,Vitis vinifera," soft-wooded climber, ",,,,,climber,climber,,,,,,,soft_wood, Vittadinia,Vittadinia sulcata, ,,,,,,,,,,,,,, Vittadinia,Vittadinia pterochaeta," annual or biennial, to circa 30 cm high; ",annual biennial,annual biennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Vittadinia,Vittadinia pustulata," annual herb or subshrub, to 30 cm high; ",annual,annual,,,herb subshrub,herb subshrub,,,,,,,herbaceous, diff --git a/data/RBGV_2022/metadata.yml b/data/RBGV_2022/metadata.yml index 7ab7b50e1..e2647724b 100644 --- a/data/RBGV_2022/metadata.yml +++ b/data/RBGV_2022/metadata.yml @@ -573,5 +573,8 @@ taxonomic_updates: reason: match_14. Automatic alignment with species-level canonical name in APC accepted when notes are ignored (2022-11-22) taxonomic_resolution: Species -exclude_observations: .na +exclude_observations: +- variable: taxon_name + find: Cyrtomium falcatum 'Rochfordii', Dicentra formosa subsp. formosa 'Alba', Dodonaea viscosa 'Purpurea', Grevillea 'Poorinda Constance', Salix matsudana 'Tortuosa' + reason: excluding cultivars questions: .na diff --git a/data/Reynolds_2018/metadata.yml b/data/Reynolds_2018/metadata.yml index 26af68dfc..415ffec38 100644 --- a/data/Reynolds_2018/metadata.yml +++ b/data/Reynolds_2018/metadata.yml @@ -122,7 +122,7 @@ traits: placed in a drying oven at 60 deg C for 72 h and then leaves, roots and stems were weighed separately. - var_in: WUE - unit_in: umolCO2/molH2O + unit_in: umol{CO2}/mol{H2O} trait_name: leaf_water_use_efficiency_intrinsic entity_type: individual value_type: raw @@ -139,7 +139,7 @@ traits: a leaf area correction applied to the gas exchange measurements. WUE is calculated as A/Gs. - var_in: A - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -155,7 +155,7 @@ traits: by tracing the leaf and using ImageJ to calculate the area of the outline, and a leaf area correction applied to the gas exchange measurements. - var_in: Gs - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -187,7 +187,7 @@ traits: placed in a drying oven at 60 deg C for 72 h and then leaves, roots and stems were weighed separately. - var_in: SLvR - unit_in: mg_shoot/mg_root + unit_in: mg{shoot}/mg{root} trait_name: root_shoot_ratio entity_type: individual value_type: raw @@ -243,7 +243,7 @@ traits: in a drying oven at 60 deg C for 72 h and then leaves, roots and stems were weighed separately. - var_in: Al_As - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: individual value_type: raw diff --git a/data/Richards_2003/metadata.yml b/data/Richards_2003/metadata.yml index 081e427e8..91553bce3 100644 --- a/data/Richards_2003/metadata.yml +++ b/data/Richards_2003/metadata.yml @@ -114,7 +114,7 @@ traits: liquid nitrogen for pigment analysis (~100 mg leaf fresh weight). Additional discs were dried at 50degC and specific leaf area (cm2 g-1) calculated. - var_in: delta15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw @@ -125,7 +125,7 @@ traits: 5 mg of tissue was weighed into a tin capsule and %N, %C, and d13C were measured in a mass spectrometer (CF-IRMS, Tracer Mass, Europa Scientific, Crewe, UK). - var_in: delta13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -345,7 +345,7 @@ traits: Xanthostemon species were examined for ectomycorrhizqe under a x10 objective light microscope lens. - var_in: Photosynthetic rate (micromol CO2/m2/s)_ambient - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_ambient entity_type: individual value_type: raw @@ -361,7 +361,7 @@ traits: each replicate sample after the rate had reached a steady state. Transpiration rate and stomatal conductance were simultaneously determined. - var_in: Photosynthetic rate (micromol CO2/m2/s)_HalogenLight - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -377,7 +377,7 @@ traits: each replicate sample after the rate had reached a steady state. Transpiration rate and stomatal conductance were simultaneously determined. - var_in: Stomatal conductance_ambient - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_ambient entity_type: individual value_type: raw @@ -393,7 +393,7 @@ traits: each replicate sample after the rate had reached a steady state. Transpiration rate and stomatal conductance were simultaneously determined. - var_in: Stomatal conductance_HalogenLight - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw diff --git a/data/Richards_2008/metadata.yml b/data/Richards_2008/metadata.yml index 77515bf67..089d466b1 100644 --- a/data/Richards_2008/metadata.yml +++ b/data/Richards_2008/metadata.yml @@ -230,7 +230,10 @@ dataset: custom_R_code: ' data %>% group_by(name_original) %>% - mutate(across(c(`GF`, `LfForm`,`LfType`,`DecEv`,`Nfixer`,`photosynthetic pathway`), replace_duplicates_with_NA)) %>% + mutate( + across(c(`GF`, `LfForm`,`LfType`,`DecEv`,`Nfixer`,`photosynthetic pathway`), replace_duplicates_with_NA), + `SLA (cm2/g)` = ifelse(!is.na(`LMA (g/m2)`), 1/(`LMA (g/m2)`*10000), `SLA (cm2/g)`) + ) %>% ungroup() ' collection_date: unknown/2009 @@ -854,20 +857,9 @@ traits: value_type: mean basis_of_value: measurement replicates: unknown - methods: From Leigh_2003, Leigh_2006, Leunig_1991, Richards_2008_2 (unpublished), - and Schortemeyer_0000; See original references, listed alphabetically under 'additional - references' -- var_in: LMA (g/m2) - unit_in: g/m2 - trait_name: leaf_mass_per_area - entity_type: population - value_type: mean - basis_of_value: measurement - replicates: unknown - methods: From Pearcy 1987; See original references, listed alphabetically under - 'additional references' + methods: unknown - var_in: leaf longevity - unit_in: month + unit_in: mo trait_name: leaf_lifespan entity_type: population value_type: mean @@ -929,7 +921,7 @@ traits: and Turner_1983; See original references, listed alphabetically under 'additional references' - var_in: amass (nmol g-1 s-1) - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: population value_type: mean @@ -938,7 +930,7 @@ traits: methods: From Leigh_2006 and Schortemeyer_0000 (unpublished); See original references, listed alphabetically under 'additional references' - var_in: aarea (umolm-2s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: population value_type: mean @@ -947,7 +939,7 @@ traits: methods: From Leigh_2006, Pearcy_1987 and Richards_2008_2 (unpublished); See original references, listed alphabetically under 'additional references' - var_in: gs (molm-2s-1) - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: population value_type: mean @@ -956,7 +948,7 @@ traits: methods: From Pearcy_1987 and Richards_2008_2 (unpublished); See original references, listed alphabetically under 'additional references' - var_in: 13-C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: population value_type: mean diff --git a/data/SAH_2022/data.csv b/data/SAH_2022/data.csv index 87de03498..3b323f824 100644 --- a/data/SAH_2022/data.csv +++ b/data/SAH_2022/data.csv @@ -301,7 +301,7 @@ Ammobium,Ammobium alatum, perennial or facultative annual to 80 cm high; ,annual Ammophila,Ammophila, glabrous erect perennials; ,perennial,perennials,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, Ammophila,Ammophila arenaria," perennial, 60-120 cm high. ",perennial,perennial,,,herb,inferred_from_genus_life_history,,,,,,,herbaceous, Amperea,Amperea, monoecious or dioecious perennials; base often woody; ,perennial,perennials,,,herb,inferred_from_life_history,,,dioecious monoecious,dioecious monoecious,,,herbaceous, -Amperea,Amperea xiphoclada," monoecious or almost dioecious; base hard, woody; ",perennial,inferred_from_genus,,,herb,inferred_from_genus_life_history,,,dioecious monoecious,dioecious monoecious,,,herbaceous, +Amperea,Amperea xiphoclada," monoecious or almost dioecious; base hard, woody; ",perennial,inferred_from_genus,,,herb,inferred_from_genus_life_history,,,dioecious monoecious,dioecious monoecious,,,woody_base herbaceous, Amphibromus,Amphibromus recurvatus, caespitose perennial to 1.5 m tall; ,perennial,perennial,,,herb graminoid,inferred_from_genus_life_history,,,,,caespitose,caespitose,herbaceous, Amphibromus,Amphibromus, slender caespitose or stoloniferous perennials to 1.5 m tall; ,perennial,perennials,,,herb graminoid,inferred_from_life_history,,,,,caespitose stoloniferous,caespitose stoloniferous,herbaceous, Amphibromus,Amphibromus macrorhinus, caespitose perennial to 1 m tall; ,perennial,perennial,,,herb graminoid,inferred_from_genus_life_history,,,,,caespitose,caespitose,herbaceous, @@ -579,7 +579,7 @@ Baumea,Baumea tetragona, ,,,,,,,,,,,,,, Bellardia,Bellardia, annual herbs; ,annual,annual,parasitic,inferred_from_family,herb,herbs,,,,,,,herbaceous, Bellardia,Bellardia trixago," erect viscid herb 10-70 cm high, ",annual,inferred_from_genus,parasitic,inferred_from_family,herb,herb,,,,,erect,erect,herbaceous, Bergia,Bergia," erect to prostrate annual or perennial herbs, sometimes slightly woody. ",annual perennial,annual perennial,,,herb,herbs,aquatic,inferred_from_family,,,erect prostrate,erect prostrate,herbaceous, -Bergia,Bergia perennis," prostrate perennials sometimes with woody older stems, ",perennial,perennials,,,herb,inferred_from_genus,aquatic,inferred_from_family,,,prostrate,prostrate,herbaceous, +Bergia,Bergia perennis," prostrate perennials sometimes with woody older stems, ",perennial,perennials,,,herb,inferred_from_genus,aquatic,inferred_from_family,,,prostrate,prostrate,woody herbaceous, Bergia,Bergia ammannioides, erect or ascending annuals up to 50 cm high; ,annual,annuals,,,herb,inferred_from_genus,aquatic,inferred_from_family,,,erect decumbent,erect ascending,herbaceous, Bergia,Bergia trimera," procumbent or prostrate annuals, sometimes forming mats up to 30 cm or more diam.; young plants sometimes erect; ",annual,annuals,,,herb,inferred_from_genus,aquatic,inferred_from_family,,,erect mat-forming prostrate,erect forming mats prostrate procumbent,herbaceous, Berkheya,Berkheya, thi perennial herbs or shrubs; ,perennial,perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, @@ -694,7 +694,7 @@ Brachycome,Brachycome perpusilla, annual herb to 10 cm high; ,annual,annual,,,he Brachycome,Brachycome readeri, annual herb to 13 cm high; ,annual,annual,,,herb,herb,,,,,,,herbaceous, Brachycome,Brachycome tatei," perennial herb to 8 cm high, compact, semisucculent; ",perennial,perennial,,,herb,herb,,,,,compact,compact,herbaceous, Brachycome,Brachycome tesquorum, undershrub to 45 cm high; ,,,,,subshrub,undershrub,,,,,,,, -Brachycome,Brachycome trachycarpa," perennial herb or undershrub 10-40 cm high: stems erect, much branched, glabrous to scabfid, ribbed, produced annually from a woody stock or woody and perennial; ",perennial,perennial,,,herb subshrub,herb undershrub,,,,,erect,erect,herbaceous, +Brachycome,Brachycome trachycarpa," perennial herb or undershrub 10-40 cm high: stems erect, much branched, glabrous to scabfid, ribbed, produced annually from a woody stock or woody and perennial; ",perennial,perennial,,,herb subshrub,herb undershrub,,,,,erect,erect,woody_root herbaceous, Brachycome,Brachycome xanthocarpa, annual herb to 12 cm high; ,annual,annual,,,herb,herb,,,,,,,herbaceous, Brachyloma,Brachyloma, erect compact or more diffuse shrubs; ,perennial,inferred_from_growth_form,,,shrub,shrubs,,,,,erect compact,erect compact,woody, Brachyloma,Brachyloma ciliatum," shrub, 5-20 cm high; ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, @@ -709,7 +709,7 @@ Brassica,Brassica elongata," herb, biennial or perennial, erect, to 1 m tall; ", Brassica,Brassica juncea," herb, annual, erect, to 1 m tall; ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Brassica,Brassica napus," herb, annual or biennial, erect, to 1.5 m, tap root strong or tuberous; ",annual biennial,annual biennial,,,herb,herb,,,,,erect,erect,herbaceous, Brassica,Brassica nigra," herb, annual, erect, to 1 m tall, hispid below, glaucous and glabrous above; ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, -Brassica,Brassica oleracea," herb, biennial or perennial, becoming woody, to 1 m or more tall, tap root strong; ",biennial perennial,biennial perennial,,,herb,herb,,,,,,,herbaceous, +Brassica,Brassica oleracea," herb, biennial or perennial, becoming woody, to 1 m or more tall, tap root strong; ",biennial perennial,biennial perennial,,,herb,herb,,,,,,,woody herbaceous, Brassica,Brassica rapa," herb, annual or biennial, erect, to 1 m tall, hispid, taproot stout or tuberous; ",annual biennial,annual biennial,,,herb,herb,,,,,erect,erect,herbaceous, Brassica,Brassica tournefortii," herb, annual, erect, to 60 cm tall, hispid below, glabrous above; ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Briza,Briza, annual or perennial erect glabrous herbs; ,annual perennial,annual perennial,,,herb graminoid,herbs,,,,,erect,erect,herbaceous, @@ -1217,7 +1217,7 @@ Crotalaria,Crotalaria eremaea eremaea, ,,,,,,,,,,,,,, Crotalaria,Crotalaria eremaea strehlowii, ,,,,,,,,,,,,,, Crotalaria,Crotalaria medicaginea, ascending or decumbent densely branched shrub; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,decumbent,decumbent ascending,woody, Crotalaria,Crotalaria novae-hollandiae," shrubs to 1.5 m high, softwood, probably perennial. ",perennial,perennial,,,shrub,shrubs,,,,,,,woody, -Crotalaria,Crotalaria smithiana," a soft-wooded subshrub with a strong tap root, at first an erect stem, ",,,,,subshrub,subshrub,,,,,erect,erect,, +Crotalaria,Crotalaria smithiana," a soft-wooded subshrub with a strong tap root, at first an erect stem, ",,,,,subshrub,subshrub,,,,,erect,erect,soft_wood, Crupina,Crupina, slender annual herbs; ,annual,annual,,,herb,herbs,,,,,,,herbaceous, Crupina,Crupina vulgaris, annual to 30 cm high; ,annual,annual,,,herb,inferred_from_genus,,,,,,,herbaceous, Cryptandra,Cryptandra," small shrubs, ",perennial,inferred_from_growth_form,,,shrub,shrubs,,,,,,,woody, @@ -1956,7 +1956,7 @@ Galium,Galium tricornutum," annuals with weak stems up to 60 cm long, scrambling Galium,Galium compactum," perennial with a woodybase producing many weak to wiry branches up to 12 mm long, ",perennial,perennial,,,herb,inferred_from_genus,,,,,,,woody_base herbaceous,woodybase Galium,Galium migrans," perennials with many usually delicate little-branched stems up to 40 cm long from a somewhatwoodybase, scrambling to prostrate; ",perennial,perennials,,,herb,inferred_from_genus,,,,,prostrate,prostrate,herbaceous, Galium,Galium murale," annuals with soft usually thin stems rarely longer than 12 cm, usually prostrate; ",annual,annuals,,,herb,inferred_from_genus,,,,,prostrate,prostrate,herbaceous, -Galium,Galium divaricatum," slender annuals with usually much branched stems rarely up to 30 cm long and becoming wiry to slightly woody, spreading; ",annual,annuals,,,herb,inferred_from_genus,,,,,spreading,spreading,herbaceous, +Galium,Galium divaricatum," slender annuals with usually much branched stems rarely up to 30 cm long and becoming wiry to slightly woody, spreading; ",annual,annuals,,,herb,inferred_from_genus,,,,,spreading,spreading,soft_wood, Galium,Galium propinquum," perennial with frequently branched weak stems up to 20 cm long, prostrate to ascending; ",perennial,perennial,,,herb,inferred_from_genus,,,,,decumbent prostrate,ascending prostrate,herbaceous, Galium,Galium aparine," annual with weak stems often longer than 1 m, scrambling; ",annual,annual,,,herb,inferred_from_genus,,,,,,,herbaceous, Galium,Galium gaudichaudii," perennial with usually many little-branched stems up to 30 cm long from a somewhatwoodybase, stiffly erect to decumbent or prostrate; ",perennial,perennial,,,herb,inferred_from_genus,,,,,erect decumbent prostrate,erect decumbent prostrate,herbaceous, @@ -1968,7 +1968,7 @@ Gastrodia,Gastrodia sesamoides, plant slender to moderately robust; ,,,,,herb,in Gastrolobium,Gastrolobium, shrubs; ,perennial,inferred_from_growth_form,,,shrub,shrubs,,,,,,,woody, Gaura,Gaura lindheimeri," clock weed. perennial herb with several erect main branches, ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Gazania,Gazania, perennial herbs with vestiture of white tomentum; ,perennial,perennial,,,herb,herbs,,,,,,,herbaceous, -Gazania,Gazania linearis, perennial herb with short branched woody rhizome; ,perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizome,herbaceous, +Gazania,Gazania linearis, perennial herb with short branched woody rhizome; ,perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizome,woody_root herbaceous, Gazania,Gazania rigens," herbs, often spiny; ",perennial,inferred_from_genus,,,herb,herbs,,,,,,,herbaceous, Geijera,Geijera, shrubs or trees; ,perennial,inferred_from_family,,,shrub tree,shrubs trees,,,,,,,woody, Geijera,Geijera linearifolia, shrub to 3 m; ,perennial,inferred_from_family,,,shrub,shrub,,,,,,,woody, @@ -2114,7 +2114,7 @@ Gratiola,Gratiola peruviana, decumbent to erect perennial 9-50 rarely 5 cm high. Gratiola,Gratiola pedunculata," erect to decumbent perennial, 13-50 cm high. ",perennial,perennial,,,herb,inferred_from_genus,,,,,erect decumbent,erect decumbent,herbaceous, Grevillea,Grevillea," shrubs or trees, ",perennial,inferred_from_family,,,shrub tree,shrubs trees,,,,,,,woody, Grevillea,Grevillea umbellifera, shrub 0.6-2 m high; ,perennial,inferred_from_family,,,shrub,shrub,,,,,,,woody, -Grevillea,Grevillea lavandulacea sericea, ,perennial,inferred_from_family,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Grevillea,Grevillea lavandulacea sericea, ,perennial,inferred_from_family,,,,inferred_from_life_history,,,,,,,woody, Grevillea,Grevillea huegelii, prickly prostrate to spreading shrub to 2 m high; ,perennial,inferred_from_family,,,shrub,shrub,,,,,prostrate spreading,prostrate spreading,woody, Grevillea,Grevillea pterosperma, rounded shrub to 4 m diam.; ,perennial,inferred_from_family,,,shrub,shrub,,,,,,,woody, Grevillea,Grevillea rosmarinifolia, shrub; ,perennial,inferred_from_family,,,shrub,shrub,,,,,,,woody, @@ -2127,7 +2127,7 @@ Grevillea,Grevillea nematophylla, spreading multi-stemmed shrub or tree to 8 m h Grevillea,Grevillea aspera, shrub 0.3-2 m high; ,perennial,inferred_from_family,,,shrub,shrub,,,,,,,woody, Grevillea,Grevillea biternata," shrub to 1.2 m high, ",perennial,inferred_from_family,,,shrub,shrub,,,,,,,woody, Grevillea,Grevillea parviflora," native trees and shrubs of south-eastern australia, p. 161.) spiny-leaved shrub 0.5-2 m high; ",perennial,inferred_from_family,,,shrub tree,shrubs trees,,,,,,,woody, -Grevillea,Grevillea lavandulacea lavandulacea, ,perennial,inferred_from_family,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Grevillea,Grevillea lavandulacea lavandulacea, ,perennial,inferred_from_family,,,,inferred_from_life_history,,,,,,,, Grevillea,Grevillea aquifolium," procumbent to erect widely spreading shrub to 2 m high, branchlets with a persistent raised tomentum obscuring the 3 ribs decurrent from each leaf base; ",perennial,inferred_from_family,,,shrub,shrub,,,,,erect prostrate spreading,erect procumbent spreading,woody, Grevillea,Grevillea rogersii, sprawling shrub 0.25-0.6 x 0.4-2 m; ,perennial,inferred_from_family,,,shrub,shrub,,,,,sprawling,sprawling,woody, Grevillea,Grevillea juncifolia, bushy shrub or tall tree to 7.5 m high; ,perennial,inferred_from_family,,,shrub tree,shrub tree,,,,,bushy,bushy,woody, @@ -2142,7 +2142,7 @@ Gunniopsis,Gunniopsis calcarea," erect perennial to circa 20 cm high, ",perennia Gunniopsis,Gunniopsis calva, glabrous annual to circa 20 cm high. sparsely papillose; ,annual,annual,,,herb,inferred_from_life_history,,,,,,,herbaceous, Gunniopsis,Gunniopsis kochii, greyish to green branched sparsely to moderately densely papillose annuals usually 5-20 cm high; ,annual,annuals,,,herb,inferred_from_life_history,,,,,,,herbaceous, Gunniopsis,Gunniopsis papillata," annual to circa 20 cm high, papillose; ",annual,annual,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Gunniopsis,Gunniopsis quadrifida, whitish-grey branched densely papillose woody perennials usually 30-40 cm high but occasionally to circa 1 m; ,perennial,perennials,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Gunniopsis,Gunniopsis quadrifida, whitish-grey branched densely papillose woody perennials usually 30-40 cm high but occasionally to circa 1 m; ,perennial,perennials,,,herb,inferred_from_life_history,,,,,,,woody, Gunniopsis,Gunniopsis septifraga," glabrous or sparsely pubescent annual, ",annual,annual,,,herb,inferred_from_life_history,,,,,,,herbaceous, Gunniopsis,Gunniopsis," small annual or perennial shrubs or herbs, glabrous or with a scaly-papillose tomentum, branching dichotomously and with opposite more or less fleshy exstipulate leaves. ",annual perennial,annual perennial,,,herb shrub,herbs shrubs,,,,,,,woody herbaceous, Gunniopsis,Gunniopsis tenuifolia, perennial rounded glabrous shrub to 1 m high; ,perennial,perennial,,,shrub,shrub,,,,,,,woody, @@ -2171,7 +2171,7 @@ Hakea,Hakea francisiana," shrub or tree to over 8 m high, ",perennial,inferred_f Hakea,Hakea tephrosperma, shrub or small tree resembling leucoptera; ,perennial,inferred_from_family,,,shrub tree,shrub tree,,,,,,,woody, Hakea,Hakea, shrubs or small trees. ,perennial,inferred_from_family,,,shrub tree,shrubs trees,,,,,,,woody, Hakea,Hakea sericea, divaricate shrub to 4 m high; ,perennial,inferred_from_family,,,shrub,shrub,,,,,,,woody, -Hakea,Hakea suberea, ,perennial,inferred_from_family,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Hakea,Hakea suberea, ,perennial,inferred_from_family,,,,inferred_from_life_history,,,,,,,, Hakea,Hakea divaricata, crooked-boled tree or shrub to 6 m high with furrowed corky bark; ,perennial,inferred_from_family,,,shrub tree,shrub tree,,,,,,,woody, Hakea,Hakea vittata, prostrate or low straggly or dense bush or shrub 0.1-2 m high; ,perennial,inferred_from_family,,,shrub,bush shrub,,,,,prostrate dense,prostrate dense,woody, Hakea,Hakea leucoptera," small shrub to tree, 1-8 m tall; ",perennial,inferred_from_family,,,shrub tree,shrub tree,,,,,,,woody, @@ -2180,7 +2180,7 @@ Hakea,Hakea minyma," bushy shrub or tree, 1-6 m high, of similar diameter, ",per Hakea,Hakea rugosa, low spreading intricate bush or rounded compact shrub 0.2-2.5 m high; ,perennial,inferred_from_family,,,shrub,bush shrub,,,,,spreading compact,spreading compact,woody, Hakea,Hakea cycloptera, straggly bush or shrub 0.3-1.3 m high; ,perennial,inferred_from_family,,,shrub,bush shrub,,,,,,,woody, Hakea,Hakea carinata," erect often untidy shrub 1.5-3 m high, ",perennial,inferred_from_family,,,shrub,shrub,,,,,erect,erect,woody, -Hakea,Hakea repullulans, ,perennial,inferred_from_family,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Hakea,Hakea repullulans, ,perennial,inferred_from_family,,,,inferred_from_life_history,,,,,,,, Hakea,Hakea rostrata, spreading or rounded shrub 1-5 m high; ,perennial,inferred_from_family,,,shrub,shrub,,,,,spreading,spreading,woody, Hakea,Hakea aenigma, compact shrub to 2.5 m high. ,perennial,inferred_from_family,,,shrub,shrub,,,,,compact,compact,woody, Hakea,Hakea laurina, tall shrub or tall tree to circa 6 m; ,perennial,inferred_from_family,,,shrub tree,shrub tree,,,,,,,woody, @@ -2205,7 +2205,7 @@ Haloragis,Haloragis odontocarpa, annual herb 10-100 cm tall; tap root present; , Haloragis,Haloragis uncatipila, perennial subshrub 40-80 cm tall; ,perennial,perennial,,,subshrub,subshrub,,,,,,,, Haloragis,Haloragis brownii, ,,,,,,,,,,,,,, Halosarcia,Halosarcia cupuliformis, small shrub circa 25 cm high; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, -Halosarcia,Halosarcia flabelliformis, woody perennial to 20 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Halosarcia,Halosarcia flabelliformis, woody perennial to 20 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,woody, Halosarcia,Halosarcia fontinalis, shrub to 70 cm high; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Halosarcia,Halosarcia halocnemoides, spreading or erect shrubs to 0.5 m high. ,perennial,inferred_from_growth_form,,,shrub,shrubs,,,,,erect spreading,erect spreading,woody, Halosarcia,Halosarcia halocnemoides halocnemoides," articles narrowly obovoid to subglobular, 2-5 mm long, usually glossy, entire. ",,,,,,,,,,,,,, @@ -2247,7 +2247,7 @@ Helichrysum,Helichrysum apiculatum, very variable sometimes bushy perennial herb Helichrysum,Helichrysum baxteri, erect perennial herb 15-40 cm tall with successive seasons growth from a branched woodybase; ,perennial,perennial,,,herb,herb,,,,,erect,erect,woody_base herbaceous,woodybase Helichrysum,Helichrysum ambiguum, malodorous bushy tap-rooted perennial herb 20-40 cm tall and up to 50 cm diam.. ,perennial,perennial,,,herb,herb,,,,,bushy,bushy,herbaceous, Helichrysum,Helichrysum eremaeum, muchbranched tap-rooted herb 20-40 cm tall and diam.. with a perennial rootstock; ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Helichrysum,Helichrysum pterochaetum," rigid bushy perennial herb 15-40 cm tall and diam., or subshrub with a woody stock or lower woody branches; ",perennial,perennial,,,herb subshrub,herb subshrub,,,,,bushy,bushy,herbaceous, +Helichrysum,Helichrysum pterochaetum," rigid bushy perennial herb 15-40 cm tall and diam., or subshrub with a woody stock or lower woody branches; ",perennial,perennial,,,herb subshrub,herb subshrub,,,,,bushy,bushy,woody_root woody_base herbaceous, Helichrysum,Helichrysum semipapposum, perennial herbs or undershrubs; ,perennial,perennial,,,herb subshrub,herbs undershrubs,,,,,,,herbaceous, Helichrysum,Helichrysum rutidolepis, stoloniferous perennial herb 15-40 cm tall and up to 1 m diam.; ,perennial,perennial,,,herb,herb,,,,,stoloniferous,stoloniferous,herbaceous, Helichrysum,Helichrysum monochaetum, sparingly to muchbranched annual herbs 2-18 cm tall and up to 10 cm diam.. ,annual,annual,,,herb,herbs,,,,,,,herbaceous, @@ -2305,7 +2305,7 @@ Hemarthria,Hemarthria uncinata," rather rigid ascending perennial, 20-80 cm high Hemarthria,Hemarthria, perennials; ,perennial,perennials,,,herb graminoid,inferred_from_life_history,,,,,,,herbaceous, Hemichroa,Hemichroa, muchbranched woody herb to circa 30 cm tall and circa 50 cm wide; ,,,,,herb,herb,,,,,,,herbaceous, Hemichroa,Hemichroa mesembryanthema, woody shrub to circa 1 m tall; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, -Hemichroa,Hemichroa pentandra," muchbranched woody herb, often less than 20 cm high; ",,,,,herb,herb,,,,,,,herbaceous, +Hemichroa,Hemichroa pentandra," muchbranched woody herb, often less than 20 cm high; ",,,,,herb,herb,,,,,,,woody, Herniaria,Herniaria, small procumbent herbs; ,,,,,herb,herbs,,,,,prostrate,procumbent,herbaceous, Herniaria,Herniaria hirsuta, annual; ,annual,annual,,,herb,inferred_from_genus,,,,,,,herbaceous, Hesperantha,Hesperantha, small deciduous perennial herbs; ,perennial,perennial,,,herb,herbs,,,,,,,herbaceous, @@ -2489,7 +2489,7 @@ Ixiochlamys,Ixiochlamys filicifolia, annual herb to 25 cm high; ,annual,annual,, Ixiochlamys,Ixiochlamys nana, annual herb 3-20 cm high; ,annual,annual,,,herb,herb,,,,,,,herbaceous, Ixiolaena,Ixiolaena chloroleuca, erect muchbranched perennial herb 10-45 cm tall and diam.. ,perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Ixiolaena,Ixiolaena leptolepis, erect bushy perennial herb 10-40 cm tall and diam.. ,perennial,perennial,,,herb,herb,,,,,erect bushy,erect bushy,herbaceous, -Ixiolaena,Ixiolaena pluriseta, erect shrubby perennial herb 30-80 cm tall with woody lower branches; ,perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, +Ixiolaena,Ixiolaena pluriseta, erect shrubby perennial herb 30-80 cm tall with woody lower branches; ,perennial,perennial,,,herb,herb,,,,,erect,erect,woody_base herbaceous, Ixiolaena,Ixiolaena tomentosa, erect to sprawling bushy perennial herb 30-70 cm tall and to 90 cm diam.. ,perennial,perennial,,,herb,herb,,,,,erect sprawling bushy,erect sprawling bushy,herbaceous, Ixiolaena,Ixiolaena supina, sprawling or prostate perennial herb with successive seasons' growth from lower wiry branches; ,perennial,perennial,,,herb,herb,,,,,sprawling,sprawling,herbaceous, Ixiolaena,Ixiolaena brevicompta," erect bushy usually annual or sometimes perennial herb to 60 cm tall and diam., branching from the base; ",annual perennial,annual perennial,,,herb,herb,,,,,erect bushy,erect bushy,herbaceous, @@ -2532,7 +2532,7 @@ Juncus,Juncus procerus, perennial; ,perennial,perennial,,,herb graminoid,inferre Juncus,Juncus bufonius," a slender annual, 2-30 cm tall; ",annual,annual,,,herb graminoid,inferred_from_life_history,,,,,,,herbaceous, Kennedia,Kennedia," perennials with prostrate trailing or twining stems, ",perennial,perennials,,,herb,inferred_from_life_history,,,,,prostrate,prostrate trailing,herbaceous, Kennedia,Kennedia nigricans," large woodytwiners with stems lengthwise ribbed, ",perennial,inferred_from_genus,,,climber_woody,woodytwiners,,,,,,,woody,inferred_from_growth_form -Kennedia,Kennedia prorepens," many-stemmed, prostrate; axes semi-woody, somewhat pithy, to 0.5 m long, tomentose; ",perennial,inferred_from_genus,,,herb,inferred_from_genus_life_history,,,,,prostrate,prostrate,herbaceous, +Kennedia,Kennedia prorepens," many-stemmed, prostrate; axes semi-woody, somewhat pithy, to 0.5 m long, tomentose; ",perennial,inferred_from_genus,,,herb,inferred_from_genus_life_history,,,,,prostrate,prostrate,soft_wood herbaceous, Kennedia,Kennedia prostrata, ,perennial,inferred_from_genus,,,herb,inferred_from_genus_life_history,,,,,,,herbaceous, Kickxia,Kickxia, annual or perennial herbs; ,annual perennial,annual perennial,,,herb,herbs,,,,,,,herbaceous, Kickxia,Kickxia spuria," prostrate to ascending, widely spreading, villous perennial with long eglandular and shorter glandular hairs; ",perennial,perennial,,,herb,inferred_from_genus,,,,,decumbent prostrate spreading,ascending prostrate spreading,herbaceous, @@ -2822,7 +2822,7 @@ Maireana,Maireana coronata," decumbent to erect perennial with a woodybase and s Maireana,Maireana enchylaenoides, perennial herb to 20 cm high; ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, Maireana,Maireana excavata, decumbent perennial with a stout tap root; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,decumbent,decumbent,herbaceous, Maireana,Maireana lobiflora, decumbent perennial herb with a woodyrootstock to small shrub to 0.5 m high; ,perennial,perennial,,,herb shrub,herb shrub,,,,,decumbent,decumbent,woody_root woody herbaceous,woodyrootstock -Maireana,Maireana luehmannii, woody divaricately branched perennial to 40 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Maireana,Maireana luehmannii, woody divaricately branched perennial to 40 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,woody, Maireana,Maireana pentagona," prostrate to decumbent perennial with a small woodybase and a long fleshy tap root, circa 10 mm high; ",perennial,perennial,,,herb,inferred_from_life_history,,,,,decumbent prostrate,decumbent prostrate,woody_base herbaceous,woodybase Maireana,Maireana scleroptera, prostrate to erect perennial to 30 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect prostrate,erect prostrate,herbaceous, Maireana,Maireana trichoptera," erect perennial to 50 cm high, woodybase; ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,woody_base herbaceous,woodybase @@ -3195,7 +3195,7 @@ Olearia,Olearia pimeleoides pimeleoides, ,,,,,,,,,,,,,, Olearia,Olearia rudis," shrub or undershrub, aromatic, ",,,,,subshrub shrub,undershrub shrub,,,,,,,woody, Olearia,Olearia stuartii," compact spreading shrub or undershrub 40-90 cm high, ",,,,,subshrub shrub,undershrub shrub,,,,,spreading compact,spreading compact,woody, Olearia,Olearia subspicata, erect shrub to 3 m high; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, -Olearia,Olearia suffruticosa, glutinous undershrub 40-70 cm high with short-lived shoots from a woody stock; ,,,,,subshrub,undershrub,,,,,,,, +Olearia,Olearia suffruticosa, glutinous undershrub 40-70 cm high with short-lived shoots from a woody stock; ,,,,,subshrub,undershrub,,,,,,,woody_root, Olearia,Olearia teretifolia, erect glutinous shrub to 2 m high; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Olearia,Olearia tubuliflora, shrub to 2 m high; ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Omphalolappula,Omphalolappula," annuals usually with several branches from the base, ",annual,annuals,,,herb,inferred_from_life_history,,,,,,,herbaceous, @@ -3748,7 +3748,7 @@ Ptilotus,Ptilotus chippendalei, ,,,,,,,,,,,,,, Ptilotus,Ptilotus decipiens," decumbent sometimes bushy annual to circa 30 cm high and more than 35 cm across, stems woodybase, ",annual,annual,,,herb,inferred_from_life_history,,,,,decumbent bushy,decumbent bushy,woody_base herbaceous,woodybase Ptilotus,Ptilotus parvifolius laetus, ,,,,,,,,,,,,,, Ptilotus,Ptilotus erubescens, ,,,,,,,,,,,,,, -Ptilotus,Ptilotus exaltatus," annual or perennial herbs arising from a thick woody rhizome, stems and foliage hirsute becoming glabrous except for upper parts and leaf axils; ",annual perennial,annual perennial,,,herb,herbs,,,,,rhizomatous,rhizome,herbaceous, +Ptilotus,Ptilotus exaltatus," annual or perennial herbs arising from a thick woody rhizome, stems and foliage hirsute becoming glabrous except for upper parts and leaf axils; ",annual perennial,annual perennial,,,herb,herbs,,,,,rhizomatous,rhizome,woody_root herbaceous, Ptilotus,Ptilotus exaltatus exaltatus, ,,,,,,,,,,,,,, Ptilotus,Ptilotus nobilis nobilis, ,,,,,,,,,,,,,, Ptilotus,Ptilotus incanus," shrubs and undershrubs with ascending to erect stems, ",,,,,subshrub shrub,undershrubs shrubs,,,,,erect decumbent,erect ascending,woody, @@ -3933,7 +3933,7 @@ Ruschia,Ruschia, erect to prostrate shrubby perennials with opposite often short Ruschia,Ruschia tumidula, small glabrous undershrub to circa 40 cm high; ,perennial,inferred_from_genus,,,subshrub,undershrub,,,,,,,, Rutaceae,Rutaceae," trees, shrubs, or more rarely perennial herbs; ",perennial,perennial,,,herb shrub tree,herbs shrubs trees,,,,,,,woody herbaceous, Rutidosis,Rutidosis, annual or perennial herbs; ,annual perennial,annual perennial,,,herb,herbs,,,,,,,herbaceous, -Rutidosis,Rutidosis helichrysoides," erect branched perennial herb with woody lower branches, ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, +Rutidosis,Rutidosis helichrysoides," erect branched perennial herb with woody lower branches, ",perennial,perennial,,,herb,herb,,,,,erect,erect,woody_base herbaceous, Rutidosis,Rutidosis multiflora, small slender annual herb 1.5-5 cm tall; ,annual,annual,,,herb,herb,,,,,,,herbaceous, Sagina,Sagina," small annual or perennial herb, usually with slender erect ascending or procumbent stems; ",annual perennial,annual perennial,,,herb,herb,,,,,erect decumbent prostrate,erect ascending procumbent,herbaceous, Sagina,Sagina procumbens, small usually glabrous mat-forming perennial herb to circa 6 cm high. ,perennial,perennial,,,herb,herb,,,,,mat-forming,matforming,herbaceous, @@ -4046,9 +4046,9 @@ Scleroblitum,Scleroblitum atriplicinum, somewhat succulent herb with a prominent Sclerochlamys,Sclerochlamys brachyptera," decumbent shrub, ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,decumbent,decumbent,woody, Sclerochloa,Sclerochloa dura," small stiff glabrous annual, 3-12 cm high, stems covered by the broad leaf-sheaths up to the short unilateral s panicle which is 2-4 cm long and surpassed by the flat leaf-blades; spikelets 3-5-flowered, 7-9 mm long; ",annual,annual,,,herb graminoid,inferred_from_genus_life_history,,,,,,,herbaceous, Sclerochloa,Sclerochloa, annuals; ,annual,annuals,,,herb graminoid,inferred_from_life_history,,,,,,,herbaceous, -Sclerolaena,Sclerolaena convexula, erect woody perennial to 30 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, -Sclerolaena,Sclerolaena costata, small woody perennial to 30 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Sclerolaena,Sclerolaena parviflora, erect woody perennial to 30 cm high. sparsely appressed-hirtellous; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, +Sclerolaena,Sclerolaena convexula, erect woody perennial to 30 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,woody, +Sclerolaena,Sclerolaena costata, small woody perennial to 30 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,woody, +Sclerolaena,Sclerolaena parviflora, erect woody perennial to 30 cm high. sparsely appressed-hirtellous; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,woody herbaceous, Sclerolaena,Sclerolaena patenticuspis, rounded perennial circa 20 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Sclerolaena,Sclerolaena tatei," rounded perennial circa 50 cm high, predominantly dioecious; ",perennial,perennial,,,herb,inferred_from_life_history,,,dioecious,dioecious,,,herbaceous, Sclerolaena,Sclerolaena uniflora, perennial herb to 20 cm high branches closely and densely tomentose; ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -4076,7 +4076,7 @@ Sclerolaena,Sclerolaena holtiana, perennial to 20 cm high; ,perennial,perennial, Sclerolaena,Sclerolaena johnsonii," bushy intricately branched annual or perennial, glabrous; ",annual perennial,annual perennial,,,herb,inferred_from_life_history,,,,,bushy,bushy,herbaceous, Sclerolaena,Sclerolaena muricata semiglabra, plant sparsely appressed-hirsute at least when young; ,perennial,inferred_from_genus,,,herb,inferred_from_life_history,,,,,,,herbaceous, Sclerolaena,Sclerolaena muricata villosa, ,perennial,inferred_from_genus,,,herb,inferred_from_life_history,,,,,,,herbaceous, -Sclerolaena,Sclerolaena lanicuspis, woody perennial circa 25 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Sclerolaena,Sclerolaena lanicuspis, woody perennial circa 25 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,woody, Sclerolaena,Sclerolaena longicuspis, rounded glabrous perennial to 60 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Sclerolaena,Sclerolaena parallelicuspis, rounded perennial to 20 cm high; ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Sclerolaena,Sclerolaena birchii, intricately branched shrub to 1 m high; ,perennial,inferred_from_genus,,,shrub,shrub,,,,,,,woody, @@ -4122,7 +4122,7 @@ Senecio,Senecio odoratus," erect glabrous or sparsely hairy perennial undershrub Senecio,Senecio quadridentatus," erect or ascending perennial herb, 40-100 cm high, white-cottony throughout or distally glabrescent, muchbranched from the base, 40-100 cm high; ",perennial,perennial,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, Senecio,Senecio picridioides," erect annual herb, 30-100 cm tall, rarely less or more; ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Senecio,Senecio pterophorus," erect perennial shrub, 0.8-1.5 m or rarely 3 m tall; ",perennial,perennial,,,shrub,shrub,,,,,erect,erect,woody, -Senecio,Senecio mikanioides," slender twining glabrous perennial, muchbranched with the older parts woody; ",perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Senecio,Senecio mikanioides," slender twining glabrous perennial, muchbranched with the older parts woody; ",perennial,perennial,,,herb,inferred_from_life_history,,,,,,,woody herbaceous, Senecio,Senecio angulatus," glabrous perennial, erect or scrambling to 2-3 m, branching; ",perennial,perennial,,,herb,inferred_from_life_history,,,,,erect,erect,herbaceous, Senecio,Senecio behrianus, perennial subshrub. ,perennial,perennial,,,subshrub,subshrub,,,,,,,, Senecio,Senecio biserratus," erect subglabrous annual herb, 60-100 cm high; ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, @@ -4241,7 +4241,7 @@ Sollya,Sollya heterophylla, twiner or flexuose shrub; ,,,,,shrub climber_herbace Sonchus,Sonchus asper, annual or biennial herb 20-150 cm high. ,annual biennial,annual biennial,,,herb,herb,,,,,,,herbaceous, Sonchus,Sonchus tenerrimus," herb 10-80 cm high, usually annual with an unbranched stem from a tap root, sometimes becoming biennial or perennial with several branched stems from a woodybase; ",annual biennial perennial,annual biennial perennial,,,herb,herb,,,,,,,woody_base herbaceous,woodybase Sonchus,Sonchus asper asper, annual; ,annual,annual,,,herb,inferred_from_genus_life_history,,,,,,,herbaceous, -Sonchus,Sonchus megalocarpus, perennial herb 15-60 cm high with woody creeping rhizomes; ,perennial,perennial,,,herb,herb,,,,,creeping rhizomatous,creeping rhizomes,herbaceous, +Sonchus,Sonchus megalocarpus, perennial herb 15-60 cm high with woody creeping rhizomes; ,perennial,perennial,,,herb,herb,,,,,creeping rhizomatous,creeping rhizomes,woody_root herbaceous, Sonchus,Sonchus, perennial 30-150 cm high. ,perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Sonchus,Sonchus oleraceus, annual herb 20-110 cm high; ,annual,annual,,,herb,herb,,,,,,,herbaceous, Sonchus,Sonchus hydrophilus," annual, biennial or possibly perennial herb 50-120 cm high with a woodytaproot; ",annual biennial perennial,annual biennial perennial,,,herb,herb,,,,,,,woody_root herbaceous,woodytaproot @@ -4341,7 +4341,7 @@ Stenopetalum,Stenopetalum lineare," annual herbs, erect, to 50 cm tall, ",annual Stenopetalum,Stenopetalum nutans," annual or biennial herbs, decumbent to erect, to 50 cm tall. ",annual biennial,annual biennial,,,herb,herbs,,,,,erect decumbent,erect decumbent,herbaceous, Stenopetalum,Stenopetalum," annual or perennial, ",annual perennial,annual perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Stenopetalum,Stenopetalum anfractum," annual herbs, slender, rigid, erect, to 40 cm tall, glabrous or slightly papillose; ",annual,annual,,,herb,herbs,,,,,erect,erect,herbaceous, -Stenopetalum,Stenopetalum velutinum," annual herbs, woody, erect, to 65 cm tall, ",annual,annual,,,herb,herbs,,,,,erect,erect,herbaceous, +Stenopetalum,Stenopetalum velutinum," annual herbs, woody, erect, to 65 cm tall, ",annual,annual,,,herb,herbs,,,,,erect,erect,woody, Stenopetalum,Stenopetalum sphaerocarpum," annual herbs, wiry, straggling, to 30 cm tall, glabrous or sparsely papillose; ",annual,annual,,,herb,herbs,,,,,,,herbaceous, Stenotaphrum,Stenotaphrum secundatum, ,perennial,inferred_from_genus,,,herb graminoid,inferred_from_genus_life_history,,,,,,,herbaceous, Stenotaphrum,Stenotaphrum, creeping perennials; ,perennial,perennials,,,herb graminoid,inferred_from_life_history,,,,,creeping,creeping,herbaceous, @@ -4763,7 +4763,7 @@ Vittadinia,Vittadinia pterochaeta," annual herb, sometimes persisting as an unde Vittadinia,Vittadinia condyloides, perennial herb 12-30 cm high; ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, Vittadinia,Vittadinia cuneata cuneata, ,,,,,,,,,,,,,, Vittadinia,Vittadinia nullarborensis, annual herb 15-20 cm high; ,annual,annual,,,herb,herb,,,,,,,herbaceous, -Vittadinia,Vittadinia cuneata, more or less woody annual or perennial herb 10-40 cm high; ,annual perennial,annual perennial,,,herb,herb,,,,,,,herbaceous, +Vittadinia,Vittadinia cuneata, more or less woody annual or perennial herb 10-40 cm high; ,annual perennial,annual perennial,,,herb,herb,,,,,,,soft_wood, Vittadinia,Vittadinia dissecta, annual or somewhatwoody perennial herb 10-35 cm high; ,annual perennial,annual perennial,,,herb,herb,,,,,,,soft_wood herbaceous,somewhatwoody Vittadinia,Vittadinia eremaea, annual herb 10-25 cm high; ,annual,annual,,,herb,herb,,,,,,,herbaceous, Vittadinia,Vittadinia megacephala, perennial herb 5-25 cm high; ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -4859,7 +4859,7 @@ Zygophyllum,Zygophyllum kochii, annual with ascending branches; ,annual,annual,, Zygophyllum,Zygophyllum prismatothecum, small spreading annual; ,annual,annual,,,herb,inferred_from_life_history,,,,,spreading,spreading,herbaceous, Zygophyllum,Zygophyllum ovatum, small erect or ascending annual; ,annual,annual,,,herb,inferred_from_life_history,,,,,erect decumbent,erect ascending,herbaceous, Zygophyllum,Zygophyllum ammophilum, small erect or ascending annual; ,annual,annual,,,herb,inferred_from_life_history,,,,,erect decumbent,erect ascending,herbaceous, -Zygophyllum,Zygophyllum billardierei," shrubby perennial, sometimes almost herbaceous, slender and scrambling over stronger plants; ",perennial,perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Zygophyllum,Zygophyllum billardierei," shrubby perennial, sometimes almost herbaceous, slender and scrambling over stronger plants; ",perennial,perennial,,,herb,inferred_from_life_history,,,,,,,soft_wood herbaceous, Zygophyllum,Zygophyllum crassissimum," erect perennial glaucous subshrub with a thick stem and thick spreading branches, ",perennial,perennial,,,subshrub,subshrub,,,,,erect spreading,erect spreading,, Zygophyllum,Zygophyllum eremaeum," subshrub with slender stems, sometimes scrambling through stronger shrubs, and sometimes apparently annual; ",annual,annual,,,subshrub shrub,subshrub shrubs,,,,,,,woody, Zygophyllum,Zygophyllum glaucum, annual or perennial with an erect or procumbent stem and erect or ascending stout branches; ,annual perennial,annual perennial,,,herb,inferred_from_life_history,,,,,erect decumbent prostrate,erect ascending procumbent,herbaceous, diff --git a/data/Sams_2017/metadata.yml b/data/Sams_2017/metadata.yml index c7dda9c98..2bc72eecb 100644 --- a/data/Sams_2017/metadata.yml +++ b/data/Sams_2017/metadata.yml @@ -182,7 +182,15 @@ locations: longitude (deg): 145.739885 description: dry upland tropical rain forest notes: site values only apply to SLA data; other data sourced from the literature -contexts: .na +contexts: +- context_property: entity type + category: method + var_in: method_context + values: + - value: multi-site means + description: These samples were colelcted at multiple sites, but they are assigned to the lat/lon of a single site; the data.csv file records the names of the multiple sites. + - value: population means + description: These samples were colelcted a single site. traits: - var_in: plant_height_unique unit_in: m @@ -223,10 +231,11 @@ traits: value_type: mean basis_of_value: measurement replicates: individual.n + method_context: population means methods: SLA for most species were measured by Hoa Ran Lai from leaves collected by Michael Sams. Mean surface leaf area based on measurements of LLA and LM by Hao Ran Lai; samples vary per species. For species we could not obtain leaves - from we obtained species mean SLA from Metcalfe or Wells Trait database + from we obtained species mean SLA from Metcalfe or Wells Trait database. - var_in: sla.mean.multisite unit_in: mm2/mg trait_name: leaf_mass_per_area @@ -234,11 +243,11 @@ traits: value_type: mean basis_of_value: measurement replicates: individual.n + method_context: multi-site means methods: SLA for most species were measured by Hoa Ran Lai from leaves collected by Michael Sams. Mean surface leaf area based on measurements of LLA and LM by - Hao Ran Lai; samples vary per species. These samples were colelcted at multiple - sites, but they are assigned to the lat/lon of a single site; the data.csv file - records the names of the multiple sites. + Hao Ran Lai; samples vary per species. For species we could not obtain leaves + from we obtained species mean SLA from Metcalfe or Wells Trait database. - var_in: seed_length_min_unique unit_in: mm trait_name: seed_length diff --git a/data/Schmidt_1997/metadata.yml b/data/Schmidt_1997/metadata.yml index 30576c43f..a5d0f8d28 100644 --- a/data/Schmidt_1997/metadata.yml +++ b/data/Schmidt_1997/metadata.yml @@ -174,7 +174,7 @@ traits: concentration (0-3-0-5% N) were analysed by CF-IRMS using a 20-20 CF-IRMS (Europa Scientific, Crewe, UK). - var_in: delta 13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -190,7 +190,7 @@ traits: concentration (0-3-0-5% N) were analysed by CF-IRMS using a 20-20 CF-IRMS (Europa Scientific, Crewe, UK). - var_in: 15-N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: population value_type: mean diff --git a/data/Schmidt_2003/metadata.yml b/data/Schmidt_2003/metadata.yml index 5ef599e49..147bd9ed8 100644 --- a/data/Schmidt_2003/metadata.yml +++ b/data/Schmidt_2003/metadata.yml @@ -480,7 +480,7 @@ traits: (0.3-0.5% N) were analysed by continuous flow isotope ratio mass spectrometry (20-20 CF-IRMS Europa Scientific, Crewe, UK). - var_in: leaf_delta13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -494,7 +494,7 @@ traits: (0.3-0.5% N) were analysed by continuous flow isotope ratio mass spectrometry (20-20 CF-IRMS Europa Scientific, Crewe, UK). - var_in: leaf_delta15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw diff --git a/data/Schmidt_2010/metadata.yml b/data/Schmidt_2010/metadata.yml index c9af7462b..123c0f089 100644 --- a/data/Schmidt_2010/metadata.yml +++ b/data/Schmidt_2010/metadata.yml @@ -142,7 +142,7 @@ traits: replicates: .na.character methods: expert observation or opinion - var_in: 13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -156,7 +156,7 @@ traits: (0.3-0.5% N) were analysed by continuous flow isotope ratio mass spectrometry (20-20 CF-IRMS Europa Scientific, Crewe, UK). - var_in: 15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw diff --git a/data/Schulze_1998/metadata.yml b/data/Schulze_1998/metadata.yml index 1222a3d99..7c33822d5 100644 --- a/data/Schulze_1998/metadata.yml +++ b/data/Schulze_1998/metadata.yml @@ -400,7 +400,7 @@ traits: contents were expressed as nitrogen concentrations on a leaf dry weight basis (mgN g-1). - var_in: d13C_young - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -414,7 +414,7 @@ traits: value for the isotope composition of the air (-8 per mille ) relative to the PeeDee Belemnite standard (Farquhar and Richards 1984). - var_in: d13C_expanding - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -428,7 +428,7 @@ traits: value for the isotope composition of the air (-8 per mille ) relative to the PeeDee Belemnite standard (Farquhar and Richards 1984). - var_in: d13C_old - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -442,7 +442,7 @@ traits: value for the isotope composition of the air (-8 per mille ) relative to the PeeDee Belemnite standard (Farquhar and Richards 1984). - var_in: 15N_young - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw @@ -456,7 +456,7 @@ traits: value for the isotope composition of the air (-8 per mille ) relative to the PeeDee Belemnite standard (Farquhar and Richards 1984). - var_in: 15N_expanding - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw @@ -470,7 +470,7 @@ traits: value for the isotope composition of the air (-8 per mille ) relative to the PeeDee Belemnite standard (Farquhar and Richards 1984). - var_in: 15N_old - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw diff --git a/data/Schulze_2006/metadata.yml b/data/Schulze_2006/metadata.yml index 1a94161c2..e52e69be7 100644 --- a/data/Schulze_2006/metadata.yml +++ b/data/Schulze_2006/metadata.yml @@ -84,7 +84,7 @@ locations: contexts: .na traits: - var_in: d 13 C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw diff --git a/data/Schulze_2006_2/metadata.yml b/data/Schulze_2006_2/metadata.yml index 814cde7b1..e33d1a097 100644 --- a/data/Schulze_2006_2/metadata.yml +++ b/data/Schulze_2006_2/metadata.yml @@ -372,7 +372,7 @@ locations: contexts: .na traits: - var_in: d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw diff --git a/data/Schulze_2014/metadata.yml b/data/Schulze_2014/metadata.yml index b95d2e3ec..063aaa733 100644 --- a/data/Schulze_2014/metadata.yml +++ b/data/Schulze_2014/metadata.yml @@ -869,7 +869,7 @@ traits: 3100, Li-COR. Lincoln, Nebraska, USA). Leaves were dried to constant mass in a forced draught oven at 70 deg C and specific leaf area (SLA) was calculated. - var_in: Delta vs. PDB-corr. 13/12 C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -889,7 +889,7 @@ traits: and phosphorous was measured using ICP-AES Optima 3300DV, Perkin-Elmer, Waltham, Mass., USA. - var_in: Delta vs. air-corr 29/28 N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw diff --git a/data/Sendall_2016/metadata.yml b/data/Sendall_2016/metadata.yml index 4147cc414..8f4ae06bc 100644 --- a/data/Sendall_2016/metadata.yml +++ b/data/Sendall_2016/metadata.yml @@ -138,7 +138,7 @@ traits: concentrations (ECS 4010 CHNSO Analyser; Costech Analytical Technologies Inc., Valencia, CA, USA). - var_in: Mean area-based light saturated photosynthetic rate (umol m-2s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -158,7 +158,7 @@ traits: humidity and block temperature of 25C. Irradiance was held at 1000 lmol m _2s _1 using the LI-6400 LED light source and at 0 lmol m _2s _1 for respiration measurements.' - var_in: Mean area-based leaf dark respriation rate (umol m-2s-1) - unit_in: neg_umolCO2/m2/s + unit_in: neg_umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: individual value_type: raw diff --git a/data/Smith_1996/metadata.yml b/data/Smith_1996/metadata.yml index b7e0882ac..f70f5a26f 100644 --- a/data/Smith_1996/metadata.yml +++ b/data/Smith_1996/metadata.yml @@ -228,7 +228,7 @@ traits: intersected by the PSU under transparent graph paper. Area was recorded to a precision of 1 mm2. - var_in: INCLIN - unit_in: degrees + unit_in: deg trait_name: leaf_inclination_angle entity_type: individual value_type: raw diff --git a/data/Smith_2012/metadata.yml b/data/Smith_2012/metadata.yml index fdd645011..d41c362ba 100644 --- a/data/Smith_2012/metadata.yml +++ b/data/Smith_2012/metadata.yml @@ -194,7 +194,7 @@ traits: calculated as the fraction of leaf structure between the epidermal layers occupied by palisade cells and intercellular air space respectively. - var_in: PaliLayNum - unit_in: count + unit_in: '{count}' trait_name: leaf_palisade_layer_number entity_type: individual value_type: mean @@ -216,7 +216,7 @@ traits: calculated as the fraction of leaf structure between the epidermal layers occupied by palisade cells and intercellular air space respectively. - var_in: EpiDen (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_epidermal_cell_density_both_sides entity_type: individual value_type: mean @@ -233,7 +233,7 @@ traits: of view. Stomatal index (SI) was calculated as: SI (%) = (SF/(SF + EF)) x 100, where SF is stomatal frequency mm-2 and EF is epidermal cell frequency mm-2.' - var_in: StomDen (mm-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_stomatal_density_abaxial entity_type: individual value_type: mean @@ -441,7 +441,7 @@ traits: calculated as the fraction of leaf structure between the epidermal layers occupied by palisade cells and intercellular air space respectively. - var_in: Photo_Amax_umol_per_m2_s - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_maximum entity_type: individual value_type: mean @@ -458,7 +458,7 @@ traits: was measured at 1200 mL L-1 [CO2] and 26 deg C. Each leaf was allowed to stabilise before measurements were taken. - var_in: gs_at_Amax_mol_per_m2_s - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Amax entity_type: individual value_type: mean @@ -475,7 +475,7 @@ traits: was measured at 1200 mL L-1 [CO2] and 26 deg C. Each leaf was allowed to stabilise before measurements were taken. - var_in: ci_at_Amax_umol_per_mol - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Amax entity_type: individual value_type: mean @@ -492,7 +492,7 @@ traits: was measured at 1200 mL L-1 [CO2] and 26 deg C. Each leaf was allowed to stabilise before measurements were taken. - var_in: transpiration_at_A_max_mmol_per_m2_s - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Amax entity_type: individual value_type: mean @@ -509,7 +509,7 @@ traits: was measured at 1200 mL L-1 [CO2] and 26 deg C. Each leaf was allowed to stabilise before measurements were taken. - var_in: Photo_Asat_umol_per_m2_s - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: mean @@ -526,7 +526,7 @@ traits: was measured at 1200 mL L-1 [CO2] and 26 deg C. Each leaf was allowed to stabilise before measurements were taken. - var_in: gs_at_Asat_mol_per_m2_s - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: mean @@ -543,7 +543,7 @@ traits: was measured at 1200 mL L-1 [CO2] and 26 deg C. Each leaf was allowed to stabilise before measurements were taken. - var_in: ci_at_Asat_umol_per_mol - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: mean @@ -560,7 +560,7 @@ traits: was measured at 1200 mL L-1 [CO2] and 26 deg C. Each leaf was allowed to stabilise before measurements were taken. - var_in: transpiration_at_A_sat_mmol_per_m2_s - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: mean diff --git a/data/Soper_2014/metadata.yml b/data/Soper_2014/metadata.yml index 7c44fb2eb..ad8fedfca 100644 --- a/data/Soper_2014/metadata.yml +++ b/data/Soper_2014/metadata.yml @@ -133,7 +133,7 @@ traits: N via dry combustion and infrared detection in a LECO analyser (CNS-2000; LECO, MI, USA). - var_in: del C_leaf - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -155,7 +155,7 @@ traits: N via dry combustion and infrared detection in a LECO analyser (CNS-2000; LECO, MI, USA). - var_in: Del N_leaf - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw @@ -166,7 +166,7 @@ traits: and d15N via continuous flow isotope ratio mass spectrometry (Tracer Mass, routine precision 0.2 - SD; Europa Scientific, now PDZ Europa,Sandbach, UK). - var_in: xylem delN root - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: root_xylem_delta15N entity_type: individual value_type: raw @@ -187,7 +187,7 @@ traits: d15N analysis via continuous flow isotope ratio mass spectrometry (Tracer Mass, routine precision 0.2 - SD; Europa Scientific, now PDZ Europa,Sandbach, UK). - var_in: xylem delN shoot - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_xylem_delta15N entity_type: individual value_type: raw @@ -222,7 +222,7 @@ traits: N via dry combustion and infrared detection in a LECO analyser (CNS-2000; LECO, MI, USA). MI, USA). - var_in: del C_root - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: root_delta13C entity_type: individual value_type: raw @@ -258,7 +258,7 @@ traits: MI, USA). (unmapped, as duplicate values to various leaf N measurements or to other root N measurements, E. Wenk 2022.11.02) - var_in: Del N_root - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: root_delta15N entity_type: individual value_type: raw diff --git a/data/Stewart_1995/metadata.yml b/data/Stewart_1995/metadata.yml index 45a46dfb2..7214d9ae8 100644 --- a/data/Stewart_1995/metadata.yml +++ b/data/Stewart_1995/metadata.yml @@ -177,7 +177,7 @@ traits: replicates: .na methods: expert knowledge or reference book - var_in: delta_13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw diff --git a/data/Taylor_2008/metadata.yml b/data/Taylor_2008/metadata.yml index ee9827cb5..af71d9813 100644 --- a/data/Taylor_2008/metadata.yml +++ b/data/Taylor_2008/metadata.yml @@ -80,7 +80,7 @@ locations: contexts: .na traits: - var_in: Aarea (umol m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -119,7 +119,7 @@ traits: area basis. We assumed that Callitris needles were cylindrical and Aa was subsequently modified to Aa = (Ameasured x cuvette area)/ 0.5(projected leaf area x Pi).' - var_in: Amass (nmol g-1 s-1) - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: individual value_type: raw @@ -150,7 +150,7 @@ traits: Atmospheric water content and leaf temperature were not controlled during the measurements, but leaves were sampled only under saturating light conditions. - var_in: gs (mmol m-2 s-1) - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -208,7 +208,7 @@ traits: replicates: 1 methods: sampled using standard protocols - var_in: Ci/Ca - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: individual value_type: raw @@ -217,7 +217,7 @@ traits: methods: Both Nm and gs were unique predictors of the ratio of intercellular CO2 concentration to ambient CO2 concentration(Ci/Ca) - var_in: Hydraulic conductivity (k)(ml s-1 cm-1 kPa-1) - unit_in: ml*cm/s/MPa + unit_in: ml.cm/MPa/s trait_name: stem_hydraulic_conductivity entity_type: individual value_type: raw @@ -245,7 +245,7 @@ traits: obtained (Prior and Eamus 2000, Macinnis-Ng et al. 2004). There was no evidence that flow rates declined with time in the vacuum chamber. - var_in: ks (ml/s/m/mpa/cm2) - unit_in: ml*cm/s/MPa/cm2 + unit_in: ml/cm/MPa/s trait_name: sapwood_specific_conductivity entity_type: individual value_type: raw @@ -280,7 +280,7 @@ traits: LI-3000A). Sapwood-specific, branch hydraulic conductivity (ks) was calculated by dividing the conductivity of a branch by its sapwood area. - var_in: kl (ml/s/m/mPa/.m2) - unit_in: 10^4 x ml*cm/s/MPa/cm2 + unit_in: 10^4.ml/cm/MPa/s trait_name: leaf_specific_conductivity entity_type: individual value_type: raw @@ -315,7 +315,7 @@ traits: LI-3000A). Sapwood-specific, branch hydraulic conductivity (ks) was calculated by dividing the conductivity of a branch by its sapwood area. - var_in: LA:SA (dimensionless) - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: individual value_type: raw diff --git a/data/Thomas_2017/metadata.yml b/data/Thomas_2017/metadata.yml index 2686faa76..7ad08b4c5 100644 --- a/data/Thomas_2017/metadata.yml +++ b/data/Thomas_2017/metadata.yml @@ -265,7 +265,7 @@ traits: separately to represent the resprouting species. - var_in: Diam unit_in: mm - trait_name: stem_basal_diameter + trait_name: plant_diameter_breast_height entity_type: population value_type: maximum basis_of_value: measurement diff --git a/data/Tng_2013/metadata.yml b/data/Tng_2013/metadata.yml index def829f28..844592e34 100644 --- a/data/Tng_2013/metadata.yml +++ b/data/Tng_2013/metadata.yml @@ -103,7 +103,7 @@ locations: contexts: .na traits: - var_in: 13C % - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: population value_type: mean @@ -185,7 +185,7 @@ traits: 15 of the records are duplicates with current AusTraits values and across many sources, so nothing filtered.) - var_in: leaf slenderness - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: population value_type: mean @@ -198,7 +198,7 @@ traits: software ImageJ to obtain leaf areas. Leaf slenderness was measured as the ratio of the leaf length to leaf breadth. - var_in: bark thickness index - unit_in: dimensionless + unit_in: mm/mm trait_name: bark_thickness_index entity_type: population value_type: mean diff --git a/data/Tomlinson_2013/metadata.yml b/data/Tomlinson_2013/metadata.yml index 8b7ec9556..da46288e1 100644 --- a/data/Tomlinson_2013/metadata.yml +++ b/data/Tomlinson_2013/metadata.yml @@ -415,7 +415,7 @@ traits: were calculated by dividing mass-based estimates by associated SLA (e.g. Na = Nm x SLA). - var_in: Aa (umolCO2 m-2 s-1) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: population value_type: mean @@ -430,7 +430,7 @@ traits: light levels that we were able to supply to our plants in the greenhouse (up to 450 micromol m-2 s-1). - var_in: Am (nmolCO2 g-1 s-1) - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: population value_type: mean @@ -445,7 +445,7 @@ traits: light levels that we were able to supply to our plants in the greenhouse (up to 450 micromol m-2 s-1). - var_in: gs (umolH2O m-2 s-1) - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: population value_type: mean @@ -460,7 +460,7 @@ traits: light levels that we were able to supply to our plants in the greenhouse (up to 450 micromol m-2 s-1). - var_in: PWUE (umolCO2 umol-1 H2O ) - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: leaf_water_use_efficiency_intrinsic entity_type: population value_type: mean @@ -475,7 +475,7 @@ traits: light levels that we were able to supply to our plants in the greenhouse (up to 450 micromol m-2 s-1). - var_in: PNUE (umolCO2 s-1 g-1 N) - unit_in: umolCO2/gN/s + unit_in: umol{CO2}/g{N}/s trait_name: leaf_photosynthetic_nitrogen_use_efficiency_saturated entity_type: population value_type: mean diff --git a/data/Tomlinson_2019/metadata.yml b/data/Tomlinson_2019/metadata.yml index 650f2d33a..b92e5541c 100644 --- a/data/Tomlinson_2019/metadata.yml +++ b/data/Tomlinson_2019/metadata.yml @@ -343,7 +343,7 @@ traits: the column heading 'Mass_g'. Several of the traits measured will shift with plant size, especially in seedlings, so data users may find this an important covariate. - var_in: A_nmol_CO2_per_g_s - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: individual value_type: raw @@ -368,7 +368,7 @@ traits: the column heading 'Mass_g'. Several of the traits measured will shift with plant size, especially in seedlings, so data users may find this an important covariate. - var_in: photosynthetic_rate_per_area_saturated - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -393,7 +393,7 @@ traits: the column heading 'Mass_g'. Several of the traits measured will shift with plant size, especially in seedlings, so data users may find this an important covariate. - var_in: gs_mmol_H2O_per_m2_s - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -416,7 +416,7 @@ traits: 'Mass_g'. Several of the traits measured will shift with plant size, especially in seedlings, so data users may find this an important covariate. - var_in: PWUE_umol_CO2_per_mmol_H2O - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: leaf_water_use_efficiency_photosynthetic entity_type: individual value_type: raw @@ -436,7 +436,7 @@ traits: of the traits measured will shift with plant size, especially in seedlings, so data users may find this an important covariate. - var_in: WUE_intrinsic - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: leaf_water_use_efficiency_intrinsic entity_type: individual value_type: raw diff --git a/data/Turner_2010/metadata.yml b/data/Turner_2010/metadata.yml index 64ec20529..0777048d5 100644 --- a/data/Turner_2010/metadata.yml +++ b/data/Turner_2010/metadata.yml @@ -106,7 +106,7 @@ traits: replicates: 1 methods: unknown - var_in: av delta C (29.78 per mille VPDB) - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: .na entity_type: individual value_type: raw @@ -121,7 +121,7 @@ traits: and not as carbon isotope discrimination (Farquhar and Richards 1984) because the isotopic composition of carbon dioxide at the sites was not measured. - var_in: av d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -158,7 +158,7 @@ traits: methods: Leaves finely ground to a powder for the analysis of carbon and nitrogen contents with a Vario EL II analyser (Elementar, Hanau, Germany). - var_in: Stemnumber - unit_in: count + unit_in: '{count}' trait_name: stem_count_categorical entity_type: individual value_type: raw diff --git a/data/Veneklaas_2003/metadata.yml b/data/Veneklaas_2003/metadata.yml index 98ce2b8f0..c0c08444f 100644 --- a/data/Veneklaas_2003/metadata.yml +++ b/data/Veneklaas_2003/metadata.yml @@ -130,7 +130,7 @@ traits: replicates: .na methods: expert observation or reference book - var_in: LL - unit_in: month + unit_in: mo trait_name: leaf_lifespan entity_type: population value_type: mean @@ -188,7 +188,7 @@ traits: replicates: unknown methods: unknown - var_in: Amass_max - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: population value_type: maximum @@ -199,7 +199,7 @@ traits: 21-26 degC, CO2 concentration 355-375 umol mol-1, water vapour concentration 9-15 mmol mol-1.' - var_in: Aarea_max - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: population value_type: maximum @@ -210,7 +210,7 @@ traits: 21-26 degC, CO2 concentration 355-375 umol mol-1, water vapour concentration 9-15 mmol mol-1.' - var_in: Gs_max_mmol_m2_s - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: population value_type: maximum @@ -221,7 +221,7 @@ traits: 21-26 degC, CO2 concentration 355-375 umol mol-1, water vapour concentration 9-15 mmol mol-1.' - var_in: Rdmass - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_dark_respiration_per_dry_mass entity_type: population value_type: mean @@ -232,7 +232,7 @@ traits: 21-26 degC, CO2 concentration 355-375 umol mol-1, water vapour concentration 9-15 mmol mol-1.' - var_in: Rdarea - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: population value_type: mean @@ -254,7 +254,7 @@ traits: 21-26 degC, CO2 concentration 355-375 umol mol-1, water vapour concentration 9-15 mmol mol-1.' - var_in: Ci - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: population value_type: maximum @@ -265,7 +265,7 @@ traits: 21-26 degC, CO2 concentration 355-375 umol mol-1, water vapour concentration 9-15 mmol mol-1.' - var_in: Gs_mean_mmol_m2_s - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: population value_type: mean @@ -276,7 +276,7 @@ traits: 21-26 degC, CO2 concentration 355-375 umol mol-1, water vapour concentration 9-15 mmol mol-1.' - var_in: Ci/Ca av - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: population value_type: mean @@ -287,7 +287,7 @@ traits: 21-26 degC, CO2 concentration 355-375 umol mol-1, water vapour concentration 9-15 mmol mol-1.' - var_in: Ci/Ca max - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: population value_type: maximum diff --git a/data/Vesk_2019/metadata.yml b/data/Vesk_2019/metadata.yml index 8538ccd96..9d6987a55 100644 --- a/data/Vesk_2019/metadata.yml +++ b/data/Vesk_2019/metadata.yml @@ -156,7 +156,7 @@ traits: replicates: .na methods: expert observation - var_in: STEMCATS - unit_in: count + unit_in: '{count}' trait_name: stem_count_categorical entity_type: population value_type: mean diff --git a/data/Vlasveld_2018/metadata.yml b/data/Vlasveld_2018/metadata.yml index de1b56e20..1f69952eb 100644 --- a/data/Vlasveld_2018/metadata.yml +++ b/data/Vlasveld_2018/metadata.yml @@ -65,7 +65,7 @@ locations: contexts: .na traits: - var_in: vein frequency (veins per mm) - unit_in: count/mm + unit_in: '{count}/mm' trait_name: leaf_vein_frequency entity_type: individual value_type: mean @@ -84,7 +84,7 @@ traits: cleared in the micrographs used for vein frequency measurements. Veins were always clearly visible up to the third order, at the least. - var_in: Secondary vein angle - unit_in: degrees + unit_in: deg trait_name: leaf_secondary_vein_angle entity_type: individual value_type: mean diff --git a/data/WAH_2022_1/data.csv b/data/WAH_2022_1/data.csv index ac67b3730..d68b772b2 100644 --- a/data/WAH_2022_1/data.csv +++ b/data/WAH_2022_1/data.csv @@ -41,7 +41,7 @@ Anigozanthos,Anigozanthos bicolor subsp. decrescens, ,,,,,,,,,,,,,, Anigozanthos,Anigozanthos humilis subsp. chrysanthus, ,,,,,,,,,,,,,, Anredera,Anredera cordifolia, general biology. growth form. vine. reproduction. ,,,,,climber_herbaceous,vine,,,,,,,herbaceous, Anthoxanthum,Anthoxanthum odoratum," general biology. growth form. grass. life form. perennial, rhizomatous/caespitose. reproduction. seed. dispersal. water, wind, mammals (awns on fur), slashing, mixture with other grass fodder crops. photosynthetic pathway. c3. toxicity. can cause allergies to humans in the form of hay fever. ",perennial,perennial,,,graminoid,grass,,,,,caespitose rhizomatous,caespitose rhizomatous,herbaceous,inferred_from_growth_form -Apodasmia,Apodasmia ceramophila," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Apodasmia,Apodasmia ceramophila," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form Arctotheca,Arctotheca calendula," general biology. growth form. herb. life form. annual. reproduction. seed, stolons. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Arctotheca,Arctotheca populifolia, general biology. growth form. herb. life form. perennial. reproduction. seed. dispersal. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, Arctotis,Arctotis stoechadifolia," general biology. growth form. herb. life form. perennial. reproduction. root fragments, very rarely by seed. dispersal. often planted in gardens or as a coastal stabilising plant. capable of forming large, dense monocultures that smother and displace native species through shading and competition for resources. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,perennial,,,herb,herb,,,,,dense,dense,herbaceous, @@ -170,28 +170,28 @@ Centaurea,Centaurea melitensis, general biology. reproduction. reproduces by see Centranthus,Centranthus macrosiphon, general biology. growth form. herb. life form. annual. dispersal. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ,annual,annual,,,herb,herb,,,,,,,herbaceous, Centranthus,Centranthus ruber," general biology. growth form. herb. life form. perennial. reproduction. primarily seed, also rhizomes. dispersal. seedlings may be handpulled and smaller plants grubbed out. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomes,herbaceous, Chaetanthus,Chaetanthus leptocarpoides," rhizomes tufted, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Chaetanthus,Chaetanthus aristatus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Chaetanthus,Chaetanthus tenellus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Chaetanthus,Chaetanthus aristatus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Chaetanthus,Chaetanthus tenellus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Chamaecytisus,Chamaecytisus palmensis," general biology. growth form. shrub/small tree. reproduction. seed. dispersal. explosive, ants, birds, slashing, garden refuse, plantings, machinery, soil movement. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, Chamelaucium,Chamelaucium uncinatum, general biology. growth form. shrub. reproduction. seed. dispersal. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Chasmanthe,Chasmanthe floribunda," general biology. growth form. geophyte. life form. annually renewed corm. reproduction. primarlily seed, also corm offsets. dispersal. ",perennial,inferred_from_growth_form,,,geophyte,geophyte,,,,,,,woody,inferred_from_growth_form Chenopodium,Chenopodium album," general biology. growth form. herb. life form. annual. reproduction. seed. dispersal. infestations may be very dense and compete vigorously with other plants. manual removal, particularly when plants are young, is effective due to shallow root systems, and can be done up to stem elongation and before seeding in summer. relatively tolerant to many herbicides and any sub-lethal rates of herbicide will result in the same high seed germination rates as unsprayed plants. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",annual,annual,,,herb,herb,,,,,dense,dense,herbaceous, Chenopodium,Chenopodium ambrosioides, general biology. growth form. herb. life form. perennial. reproduction. seed. dispersal. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Chordifex,Chordifex reseminans," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Chordifex,Chordifex gracilior," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Chordifex,Chordifex reseminans," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Chordifex,Chordifex gracilior," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form Chordifex,Chordifex amblycoleus," rhizomes tufted, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Chordifex,Chordifex chaunocoleus," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Chordifex,Chordifex isomorphus," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Chordifex,Chordifex jacksonii," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Chordifex,Chordifex sphacelatus," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Chordifex,Chordifex crispatus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Chordifex,Chordifex chaunocoleus," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Chordifex,Chordifex isomorphus," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Chordifex,Chordifex jacksonii," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Chordifex,Chordifex sphacelatus," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Chordifex,Chordifex crispatus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Chordifex,Chordifex leucoblepharus," rhizomes spreading, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Chordifex,Chordifex stenandrus," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Chordifex,Chordifex stenandrus," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form Chordifex,Chordifex capillaceus," rhizomes spreading, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Chordifex,Chordifex microcodon," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Chordifex,Chordifex laxus," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Chordifex,Chordifex sinuosus," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Chordifex,Chordifex ornatus," rhizomes spreading or tufted, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Chordifex,Chordifex microcodon," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Chordifex,Chordifex laxus," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Chordifex,Chordifex sinuosus," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Chordifex,Chordifex ornatus," rhizomes spreading or tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form Chordifex,Chordifex abortivus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Chorilaena,Chorilaena quercifolia," shrub, ; ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Chrysanthemoides,Chrysanthemoides monilifera," general biology. growth form. shrub. reproduction. seed. dispersal. hot fire kills mature plants. cooler fires results in some resprouting. hand pull or dig out small plants (to 1m), ensuring removal of all root material. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, @@ -286,22 +286,22 @@ Cyperus,Cyperus congestus, general biology. growth form. sedge. life form. peren Cyperus,Cyperus rotundus," general biology. growth form. sedge. life form. perennial. reproduction. can displace native plants and change the availability of food or shelter for native animals. although relatively small in size it is highly competitive for resources. has rapid growth, is able to produce an extensive system of rhizomes and tubers and can quickly form dense colonies. most seed produced is . plants are susceptible to shading, which reduces vegetative growth and tuber production. hand remove small/isolated plants ensuring all tubers and rhizomes are removed. responds differently to glyphosate depending on growth stage. apply glyphosate at label rate before the fifth leaf stage - after this time herbicide is to tubers. repeated applications are usually required for effectiveness. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,perennial,,,graminoid,sedge,,,,,rhizomatous dense,rhizomes dense,herbaceous,inferred_from_growth_form Cyperus,Cyperus polystachyos, general biology. growth form. sedge. life form. perennial. reproduction. seed. dispersal. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ,perennial,perennial,,,graminoid,sedge,,,,,,,herbaceous,inferred_from_growth_form Cyperus,Cyperus eragrostis," general biology. growth form. sedge. life form. perennial. reproduction. primarily seed, also rhizomes. dispersal. hand remove small/isolated infestations ensuring removal of all rhizomes. otherwise try 1% glyphosate + pulse®. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,perennial,,,graminoid,sedge,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Cytogonidium,Cytogonidium leptocarpoides," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Cytogonidium,Cytogonidium leptocarpoides," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Dactylis,Dactylis glomerata," general biology. growth form. grass. life form. perennial, caespitose. reproduction. seed, tillers. dispersal. planting (as fodder), mammals, slashing, occasionally water. photosynthetic pathway. c3. toxicity. severe allergen. seedbank persistence. 1-4 years. fire response. survives and resprouts after moderate fires. hot fire will damage root crowns and can kill adult plants. notes. once established plants are generally very persistent. frost, drought and heat resistant. highly shade tolerant. higher nutrient levels make it more competitive over native perennial grasses. wide range of cultivars available. additional information. origin. europe, west asia, north africa. history of use/introduction. planted as pasture, used in seed mixtures with other grasses and forbs, revegetation. suggested method of management and control. cut out plants. slash/burn clumps and spray regrowth with 1% glyphosate. follow-up with seedling control over following years. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,perennial,,,herb graminoid,forbs grass,,,,,caespitose,caespitose,herbaceous, -Desmocladus,Desmocladus lateriticus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus parthenicus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus semiplanus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus quiricanus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus castaneus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus austrinus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus lateriticus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus parthenicus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus semiplanus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus quiricanus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus castaneus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus austrinus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Desmocladus,Desmocladus biformis," rhizomes tufted, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus elongatus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus asper," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus flexuosus," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus myriocladus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus glomeratus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus virgatus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Desmocladus,Desmocladus fasciculatus," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus elongatus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus asper," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus flexuosus," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus myriocladus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus glomeratus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus virgatus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Desmocladus,Desmocladus fasciculatus," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form Dielsia,Dielsia stenostachya," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form Digitaria,Digitaria sanguinalis," general biology. growth form. grass. life form. annual, caespitose. reproduction. seed. dispersal. mowing, movement of seed in hay. photosynthetic pathway. c4. notes. small infestations and individual plants can be hand removed by releasing the roots with a knife or trowel, ensure sprawling stems are also removed. otherwise spray 1% glyphosate in spring. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",annual,annual,,,graminoid,grass,,,,,caespitose sprawling,caespitose sprawling,herbaceous,inferred_from_growth_form Digitaria,Digitaria ciliaris," general biology. growth form. grass. life form. annual, caespitose. reproduction. seed. dispersal. mowing, movement of seed in hay. photosynthetic pathway. c4. seedbank persistence. short, several months. notes. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",annual,annual,,,graminoid,grass,,,,,caespitose,caespitose,herbaceous,inferred_from_growth_form @@ -427,7 +427,7 @@ Ixia,Ixia paniculata, general biology. growth form. geophyte. life form. annuall Ixia,Ixia polystachya, general biology. growth form. geophyte. life form. annually renewed corm. reproduction. variable seed set. dispersal. ,perennial,inferred_from_growth_form,,,geophyte,geophyte,,,,,,,woody,inferred_from_growth_form Juncus,Juncus microcephalus," general biology. growth form. sedge. life form. perennial. reproduction. seed. dispersal. water, machinery. ",perennial,perennial,,,graminoid,sedge,,,,,,,herbaceous,inferred_from_growth_form Juncus,Juncus acutus," general biology. growth form. sedge. life form. perennial. reproduction. primarily by seed, also crown fragments. dispersal. rhizomes are able to resprout after fire.. notes. the earliest herbarium specimens were collected in the sydney area.. similar native species. juncus kraussii, pallidus. suggested method of management and control. controlling infestations early and preventing further spread is the most effective form of management. spiny rush may be dug out effectively, as the plant is shallow-rooted. the plant likes damp situations so improving drainage may help to reduce populations, but this would a suitable control measure where it is a weed in natural habitats such as wetlands. chemical control is often impractical because of the difficulty of application to dense patches; therefore, mechanical removal of the existing growth, although costly, is often the most practical starting point in a control program, read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,perennial,,,graminoid,sedge rush,,,,,rhizomatous dense,rhizomes dense,herbaceous,inferred_from_growth_form -Kulinia,Kulinia eludens," rhizomes tufted, ",,,,,,,,,,,rhizomatous,rhizomes,, +Kulinia,Kulinia eludens," rhizomes tufted, ",,,,,,,,,dioecious,,rhizomatous,rhizomes,, Lachenalia,Lachenalia reflexa, general biology. growth form. geophyte. reproduction. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ,perennial,inferred_from_growth_form,,,geophyte,geophyte,,,,,,,woody,inferred_from_growth_form Lachenalia,Lachenalia aloides," general biology. growth form. geophyte. life form. annually renewed bulb. reproduction. primarily seed, also offsets. dispersal. ",perennial,inferred_from_growth_form,,,geophyte,geophyte,,,,,,,woody,inferred_from_growth_form Lachenalia,Lachenalia bulbifera, general biology. growth form. geophyte. life form. annually renewed bulb. reproduction. ,perennial,inferred_from_growth_form,,,geophyte,geophyte,,,,,,,woody,inferred_from_growth_form @@ -438,12 +438,12 @@ Lagurus,Lagurus ovatus," general biology. growth form. grass. life form. annual, Lantana,Lantana camara," general biology. growth form. shrub. reproduction. plants may resprout after a cool burn, hot fire can kill plants. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Lavandula,Lavandula stoechas, general biology. growth form. shrub. reproduction. seed. dispersal. hot fire may kill adult plants and destroy some soil stored seed. plants will resprout following cooler fires. prolific seed germination can follow fire. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Leonotis,Leonotis leonurus," general biology. growth form. shrub. reproduction. seed. vegetative regeneration strategy. can produces root suckers. notes. can produce large amounts of seed. additional information. origin. south africa. history of use/introduction. handpull seedlings or small plants, ensuring you remove the tap root. try cut and paint with 50% glyphosate for larger plants. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, -Lepidobolus,Lepidobolus preissianus subsp. volubilis," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Lepidobolus,Lepidobolus preissianus subsp. volubilis," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form Lepidobolus,Lepidobolus deserti," rhizomes tufted, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Lepidobolus,Lepidobolus quadratus," rhizomes tufted, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Lepidobolus,Lepidobolus spiralis," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Lepidobolus,Lepidobolus chaetocephalus," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Lepidobolus,Lepidobolus densus," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Lepidobolus,Lepidobolus spiralis," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Lepidobolus,Lepidobolus chaetocephalus," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Lepidobolus,Lepidobolus densus," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Leptocarpus,Leptocarpus laxus," rhizomes tufted, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Leptocarpus,Leptocarpus tenax," rhizomes spreading, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form Leptospermum,Leptospermum laevigatum," general biology. growth form. shrub. reproduction. seed. dispersal. adult plants are killed by fire, seed is released from woody fruits and germinates prolifically in post fire conditions. notes. fell mature plants. slash, fell, mulch spray regrowth until just wet - 100ml grazon® plus pulse® in 10l water standing plants (thickets) 10l/ha glyphosate plus 0.25% pulse® for overall spraying or 100ml glyphosate (450g/l) plus 25ml pulse® in 10l water - spot spraying individual plants 200ml access® in 10l diesel applied to the lower 50cm of each trunk in spring. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, @@ -465,11 +465,11 @@ Lolium,Lolium temulentum," general biology. growth form. grass. life form. annua Lolium,Lolium rigidum," general biology. growth form. grass. life form. annual, caespitose. reproduction. seed. dispersal. water, wind, mammals, combine harvesters. photosynthetic pathway. c3. toxicity. ",annual,annual,,,graminoid,grass,,,,,caespitose,caespitose,herbaceous,inferred_from_growth_form Lonicera,Lonicera japonica, general biology. growth form. vine. reproduction. ,,,,,climber_herbaceous,vine,,,,,,,herbaceous, Lotus,Lotus uliginosus," general biology. growth form. herb. life form. perennial. reproduction. seed, rhizomes. dispersal. develops extensive rhizomes. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomes,herbaceous, -Loxocarya,Loxocarya cinerea," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Loxocarya,Loxocarya magna," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Loxocarya,Loxocarya gigas," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Loxocarya,Loxocarya albipes," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form -Loxocarya,Loxocarya striata," rhizomes spreading, ",,,,,graminoid,,,,,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Loxocarya,Loxocarya cinerea," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Loxocarya,Loxocarya magna," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Loxocarya,Loxocarya gigas," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Loxocarya,Loxocarya albipes," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form +Loxocarya,Loxocarya striata," rhizomes spreading, ",,,,,graminoid,,,,dioecious,,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form Lupinus,Lupinus angustifolius, general biology. growth form. herb. life form. annual. reproduction. seed. dispersal. hand remove scattered plants. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ,annual,annual,,,herb,herb,,,,,,,herbaceous, Lupinus,Lupinus cosentinii," general biology. growth form. herb. life form. annual. reproduction. seed. dispersal. planting for agriculture, water, soil movement. toxicity. stubble and large quantities of seed can cause poisoning in stock. seedbank persistence. some dormancy. notes. has a well-established root system including a strong taproot. capable of fixing nitrogen. seed germinates in autumn, plants grow through winter and spring, and die with the onset of summer drought. hand remove scattered plants prior to flowering. spray dense infestations with metsulfuron methyl 0.1g/15 l (2-3 g/ha) + wetting agent. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",annual,annual,,,herb,herb,,,,,dense,dense,herbaceous, Luvunga,Luvunga monophylla," tree, spines present; ",perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, @@ -603,8 +603,8 @@ Piptatherum,Piptatherum miliaceum," general biology. growth form. grass. life fo Pittosporum,Pittosporum undulatum," general biology. growth form. small tree. reproduction. seed. dispersal. birds, possums, other mammals, garden refuse. fire will kill most adult plants and destroy the soil seed bank. the higher light conditions following fire are to seedling establishment. ",perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, Plantago,Plantago major, general biology. growth form. herb. life form. perennial. reproduction. seed. dispersal. plantago lanceolata. suggested method of management and control. hand remove isolated/small infestations. spray in early stages of growth with 1% glyphosate. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ,perennial,perennial,,,herb,herb,,,,,,,herbaceous, Plantago,Plantago lanceolata," general biology. growth form. herb. life form. perennial. reproduction. has evolved resistance to group g/9 herbicides in south africa. additional information. origin. europe, temperate and tropical asia, north africa. history of use/introduction. animal forage. similar native species. plantago debilis, drummondii, exilis. suggested method of management and control. hand remove small/isolated infestations. spray in early stages of growth with 1% glyphosate. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Platychorda,Platychorda applanata," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Platychorda,Platychorda rivalis," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Platychorda,Platychorda applanata," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Platychorda,Platychorda rivalis," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Poa,Poa annua," general biology. growth form. grass. life form. annual, caespitose. reproduction. seed. dispersal. wind, water, birds, contaminated seed, on footware and clothing, mowers and other equipment. photosynthetic pathway. c3. seedbank persistence. 4-6 years. notes. susceptible to many herbicides, however some grass-selective herbicides such as fluazifop (fusilade® forte) can give poor control. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",annual,annual,,,graminoid,grass,,,,,caespitose,caespitose,herbaceous,inferred_from_growth_form Polygala,Polygala myrtifolia, general biology. growth form. shrub. reproduction. seed. dispersal. hot fire will kill mature plants. fell mature plants. follow up work removing germinating seedlings will be required for at least 5 years. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Polypogon,Polypogon monspeliensis," general biology. growth form. grass. life form. annual, caespitose. reproduction. seed. dispersal. mammals (particularly rabbits), wind, water. photosynthetic pathway. c3. notes. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",annual,annual,,,graminoid,grass,,,,,caespitose,caespitose,herbaceous,inferred_from_growth_form @@ -743,14 +743,14 @@ Spinifex,Spinifex sericeus," general biology. growth form. grass. life form. per Sporadanthus,Sporadanthus rivularis," rhizomes spreading, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous spreading,rhizomes spreading,herbaceous,inferred_from_growth_form Sporadanthus,Sporadanthus strictus," rhizomes tufted, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Sporobolus,Sporobolus africanus," general biology. growth form. grass. life form. perennial, caespitose. reproduction. seed. dispersal. wind, water, mammals including livestock, clothing. photosynthetic pathway. c4. fire response. resprouts. notes. fusilade® forte has been shown to be effective for controlling seedling and juveniles plants of other sporobolus species. mechanical and chemical control methods for mature plants are largely ineffective and expensive, thus biocontrol agents for invasive sporoblous in australia including africanus are being investigated. additional information. origin. south africa. similar exotic species. sporobolus elongatus, creber. similar native species. virginicus. suggested method of management and control. cut and bag seed head then dig to remove. try fusilade® forte 13ml/l + wetting agent or for generic fluazifop-p (212g/l active ingredient) 8ml/l on seedling and juvenile plants. slash large clumps in winter/spring and spray regrowth with glyphosate at label rates. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,perennial,,,graminoid,grass,,,,,caespitose,caespitose,herbaceous,inferred_from_growth_form -Stenotalis,Stenotalis ramosissima," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Stenotalis,Stenotalis ramosissima," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Stenotaphrum,Stenotaphrum secundatum," general biology. growth form. grass. life form. perennial, stoloniferous. reproduction. stolons, ",perennial,perennial,,,graminoid,grass,,,,,stoloniferous,stoloniferous,herbaceous,inferred_from_growth_form Symphyotrichum,Symphyotrichum squamatum," general biology. growth form. herb. life form. annual. reproduction. seed. dispersal. wind. notes. may also be biennial or shortlivedperennial. also naturalised in europe, mediterranean region, united states, central america. hand remove isolated plants before seed set. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",annual biennial short_lived_perennial,annual biennial shortlivedperennial,,,herb,herb,,,,,,,herbaceous, Tamarix,Tamarix aphylla," general biology. growth form. tree. life form. annual. reproduction. seed and vegetative. dispersal. seed dispersal by wind, water and animals.. ",annual,annual,,,tree,tree,,,,,,,woody, Taraxis,Taraxis grossa," rhizomes tufted, glabrous. dioecious (with separate male and female plants). ",,,,,graminoid,,,,dioecious,dioecious,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Trachyandra,Trachyandra divaricata," general biology. growth form. herb. life form. perennial. reproduction. seed. dispersal. wind, water. toxicity. poisonous to mammals. notes. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Tremulina,Tremulina cracens," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form -Tremulina,Tremulina tremula," rhizomes tufted, ",,,,,graminoid,,,,,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Tremulina,Tremulina cracens," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form +Tremulina,Tremulina tremula," rhizomes tufted, ",,,,,graminoid,,,,dioecious,,rhizomatous,rhizomes,herbaceous,inferred_from_growth_form Tribolium,Tribolium uniolae," general biology. growth form. grass. life form. perennial, caespitose/shortly rhizomatous. reproduction. seed, also short rhizomes. dispersal. highly invasive and has the potential to seriously impact native plant communities across its invasive range. forms dense clumps. capable of displacing herbaceous flora. although plants may reproduce clonally from small perenniating buds breaking off from the base, it mainly reproduces and spreads by mildly dehiscent seeds. spot spray resprouting clumps and blanket spray seedling flushes with fusilade® forte 16 ml/l + wetting agent or for generic fluazifop-p (212g/l active ingredient) 10ml/smaller plants and isolated infestations may be physically removed or cut at the base with a sharp knife when the soil is moist. however, as small perennating buds can result in new plants care needs to be taken during any hand removal program. larger plants are difficult to remove in their entirety excess soil disturbance. following any fire event is an optimal time to undertake control. read the manufacturers' labels and material safety data sheets before using herbicides. for further information consult the australian pesticides and veterinary medicines authority to determine the status of permits for your situation or state. ",perennial,perennial,,,graminoid,grass,,,,,caespitose rhizomatous dense,caespitose rhizomatous rhizomes dense,herbaceous,inferred_from_growth_form Tribonanthes,Tribonanthes purpurea, ,,,,,,,,,,,,,, Tribonanthes,Tribonanthes brachypetala, ,,,,,,,,,,,,,, diff --git a/data/WAH_2022_2/data.csv b/data/WAH_2022_2/data.csv index 164d9896a..dc2b5aa1b 100644 --- a/data/WAH_2022_2/data.csv +++ b/data/WAH_2022_2/data.csv @@ -1513,10 +1513,10 @@ Asteridea,Asteridea morawana," ascending to erect annual, herb. ",annual,annual, Asterolasia,Asterolasia drummondii," slender erect shrub, 0.2-0.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Asterolasia,Asterolasia grandiflora," slender open shrub, 0.2-0.6(-0.8) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,open,open,woody, Asterolasia,Asterolasia nivea," open, weak, densely branched shrub, 0.3-0.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,open,open,woody, -Asterolasia,Asterolasia pallida," sometimes rhizomatous, woody perennial, herb, 0.3-1 m high, leaves 1-2.5 cm long; ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, +Asterolasia,Asterolasia pallida," sometimes rhizomatous, woody perennial, herb, 0.3-1 m high, leaves 1-2.5 cm long; ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,woody, Asterolasia,Asterolasia squamuligera," erect, spreading shrub, 0.15-1 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading,erect spreading,woody, -Asterolasia,Asterolasia pallida subsp. pallida," woody perennial, herb, 0.3-1 m high, ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Asterolasia,Asterolasia pallida subsp. hyalina," woody perennial, herb, to 1 m high, ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Asterolasia,Asterolasia pallida subsp. pallida," woody perennial, herb, 0.3-1 m high, ",perennial,perennial,,,herb,herb,,,,,,,woody, +Asterolasia,Asterolasia pallida subsp. hyalina," woody perennial, herb, to 1 m high, ",perennial,perennial,,,herb,herb,,,,,,,woody, Asterolasia,Asterolasia sp. Kalgan River (S. Barrett 1522)," low shrub, to 0.3 m high (to 0.3m wide). ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Asterolinon,Asterolinon linum-stellatum," delicate annual, herb, 0.04-0.11 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Asteromyrtus,Asteromyrtus arnhemica," tree or shrub, to 5 m high. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, @@ -2219,7 +2219,7 @@ Boronia,Boronia kalumburuensis," sprawling shrub, 0.4-0.5 m high, leaves pinnate Boronia,Boronia wilsonii," erect shrub, 0.3-1.5 m high, leaves pinnate, pinnae 13-23, recurved to revolute; ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Boronia,Boronia humifusa," low-growing, wiry perennial, herb, 0.1-0.2 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Boronia,Boronia corynophylla," spreading, densely branched shrub, ca 0.3 m high, leaves terete to clavate, cuticle exfoliating to form a grey scurfy covering. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, -Boronia,Boronia ramosa subsp. lesueurana," compact, woody perennial, herb, (0.05-)0.15-0.3 m high, leaflets linear to oblong, concave above, pedicels 2-3 mm long. ",perennial,perennial,,,herb,herb,,,,,compact,compact,herbaceous, +Boronia,Boronia ramosa subsp. lesueurana," compact, woody perennial, herb, (0.05-)0.15-0.3 m high, leaflets linear to oblong, concave above, pedicels 2-3 mm long. ",perennial,perennial,,,herb,herb,,,,,compact,compact,woody, Boronia,Boronia baeckeacea subsp. patula," slender or straggling shrub, 0.2-1 m high, leaves simple or triofoliolate, more or less spreading, broadly elliptic to obovate, 4-7 mm long. mallee. ",perennial,inferred_from_growth_form,,,shrub mallee,shrub mallee,,,,,spreading,spreading,woody, Boronia,Boronia baeckeacea subsp. baeckeacea," slender or straggling shrub, 0.2-1 m high, leaves simple, erect, sub-orbicular, 2-3 mm long. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Boronia,Boronia fabianoides subsp. rosea," erect shrub, 0.3-0.6 m high, petals 5-7 mm long. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, @@ -2327,7 +2327,7 @@ Brachyscias,Brachyscias verecundus," annual (or ephemeral), herb, 0.012-0.022 m Brachyscome,Brachyscome ciliaris var. lanuginosa," bushy perennial, herb. ",perennial,perennial,,,herb,herb,,,,,bushy,bushy,herbaceous, Brachyscome,Brachyscome perpusilla var. tenella," weakly erect, branching annual, herb, 0.03-0.12 m high, leaves pinnatisect. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Brachyscome,Brachyscome bellidioides," erect, glabrous annual, herb, to 0.15 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, -Brachyscome,Brachyscome blackii," woody perennial, herb, to 0.4 m high, leaves light green, divided, very aromatic. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Brachyscome,Brachyscome blackii," woody perennial, herb, to 0.4 m high, leaves light green, divided, very aromatic. ",perennial,perennial,,,herb,herb,,,,,,,woody, Brachyscome,Brachyscome ciliaris," bushy annual or perennial, herb, to 0.4 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,bushy,bushy,herbaceous, Brachyscome,Brachyscome ciliocarpa," tufted annual, herb, to 0.3 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Brachyscome,Brachyscome exilis," decumbent to erect, slender annual, herb, to 0.2 m high. ",annual,annual,,,herb,herb,,,,,erect decumbent,erect decumbent,herbaceous, @@ -2378,13 +2378,13 @@ Brunonia,Brunonia sp. Goldfields (K.R. Newbey 6044)," upright, spreading annual, Brunonia,Brunonia sp. Long hairs (D.E. Symon 2440)," erect herb, to 0.07 m high. ",,,,,herb,herb,,,,,erect,erect,herbaceous, Brunoniella,Brunoniella acaulis var. acaulis," tuberous, perennial, herb (more or less prostrate). ",perennial,perennial,,,herb,herb,,,,,prostrate,prostrate,herbaceous, Brunoniella,Brunoniella australis," decumbent or erect tuberous, perennial, herb, 0.02-0.15 m high. ",perennial,perennial,,,herb,herb,,,,,erect decumbent,erect decumbent,herbaceous, -Brunoniella,Brunoniella acaulis," tuberous, perennial, herb (more or less prostrate), short, woody, unbranched stem; ",perennial,perennial,,,herb,herb,,,,,prostrate,prostrate,herbaceous, +Brunoniella,Brunoniella acaulis," tuberous, perennial, herb (more or less prostrate), short, woody, unbranched stem; ",perennial,perennial,,,herb,herb,,,,,prostrate,prostrate,woody, Bryophyllum,Bryophyllum delagoense," erect, smooth, succulent perennial, herb. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Buchanania,Buchanania obovata," tree or shrub, 1-15 m high. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, Buchanania,Buchanania arborescens," tree, to 20 m high. ",perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, Buchanania,Buchanania oblongifolia," spreading tree or shrub, to 8 m high, bark grey, rough, crazed; ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,spreading,spreading,woody, Buchnera,Buchnera linearis," erect annual or perennial (short-lived), herb, 0.15-0.4(-0.65) m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Buchnera,Buchnera ramosissima," woody perennial, herb or shrub, 0.2-0.6 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,,,woody herbaceous, +Buchnera,Buchnera ramosissima," woody perennial, herb or shrub, 0.2-0.6 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,,,woody, Buchnera,Buchnera urticifolia," erect annual, herb, (0.15-)0.3-0.6 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Buchnera,Buchnera asperata," slender, erect, woodybased annual or perennial (short-lived, rarely), herb, (0.2-)0.45-1 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,woody_base herbaceous,woodybased Buddleja,Buddleja madagascariensis," straggling shrub, to 4 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, @@ -2406,7 +2406,7 @@ Burchardia,Burchardia rosea," cormous and tuberous, perennial, herb, 0.2-0.5 m h Burchardia,Burchardia congesta," open, erect tuberous, perennial, herb, to 0.8 m high. ",perennial,perennial,,,herb,herb,,,,,erect open,erect open,herbaceous, Burmannia,Burmannia juncea," tuberous and rhizomatous, perennial or annual, herb, to 0.5 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, Bursaria,Bursaria occidentalis," spiny shrub or tree, 1.2-8 m high. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, -Byblis,Byblis gigantea," small, branched perennial, herb (or sub-shrub), to 0.45 m high. ",perennial,perennial,,,herb subshrub shrub,herb subshrub shrub,,,,,,,woody herbaceous, +Byblis,Byblis gigantea," small, branched perennial, herb (or sub-shrub), to 0.45 m high. ",perennial,perennial,,,herb subshrub shrub,herb subshrub shrub,,,,,,,herbaceous, Byblis,Byblis liniflora," erect, bushy annual, herb, 0.05-0.15 m high, anthers shorter than the filaments. ",annual,annual,,,herb,herb,,,,,erect bushy,erect bushy,herbaceous, Byblis,Byblis rorida," erect or leaning annual, herb, 0.06-0.3 m high, anthers longer than the filaments, sepals bearing glandular setae 0.7-1.5 mm long. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Byblis,Byblis filifolia," erect or leaning annual, herb, 0.2-0.6 m high, anthers as long as, or longer than the filaments, ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, @@ -2443,7 +2443,7 @@ Caladenia,Caladenia longicauda subsp. eminens," tuberous, perennial, herb, 0.3-0 Caladenia,Caladenia nana subsp. unita," loose, clumping tuberous, perennial, herb, to 0.4 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Caladenia,Caladenia barbarossa," tuberous, perennial, herb, 0.1-0.3 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Caladenia,Caladenia bryceana," tuberous, perennial, herb, 0.03-0.1 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Caladenia,Caladenia cairnsiana," tuberous, perennial, herb, 0.15-0.3 m high. mallee woodland, coastal heath, jarrah forest. ",perennial,perennial,,,herb mallee,herb mallee,,,,,,,herbaceous, +Caladenia,Caladenia cairnsiana," tuberous, perennial, herb, 0.15-0.3 m high. mallee woodland, coastal heath, jarrah forest. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Caladenia,Caladenia corynephora," tuberous, perennial, herb, 0.25-0.45 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Caladenia,Caladenia crebra," tuberous, perennial, herb, 0.25-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Caladenia,Caladenia cristata," tuberous, perennial, herb, 0.18-0.4 m high. sandy rise above salt flats, freshwater. ",perennial,perennial,,,herb,herb,aquatic,freshwater,,,,,herbaceous, @@ -2613,7 +2613,7 @@ Caladenia,Caladenia xaestantha," tuberous, herb, 0.25-0.45 m high. ",,,,,herb,he Caladenia,Caladenia graniticola," tuberous, perennial, herb, to 0.21 m high, plant usually single flowered. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Caladenia,Caladenia petrensis," erect tuberous, herb (with a strong burning metal odour). ",,,,,herb,herb,,,,,erect,erect,herbaceous, Caladenia,Caladenia saxicola," erect herb, to 0.3 m high. ",,,,,herb,herb,,,,,erect,erect,herbaceous, -Caladenia,Caladenia sp. Muddarning Hill (S.D. Hopper 4013)," tuberous, perennial, herb. eucalyptus open shrub mallee over sheoak and hibbertia scrub. ",perennial,perennial,,,herb shrub mallee,herb shrub mallee,,,,,open,open,woody herbaceous, +Caladenia,Caladenia sp. Muddarning Hill (S.D. Hopper 4013)," tuberous, perennial, herb. eucalyptus open shrub mallee over sheoak and hibbertia scrub. ",perennial,perennial,,,herb shrub mallee,herb shrub mallee,,,,,open,open,herbaceous, Caladenia,Caladenia sp. Wyalkatchem (G.B. Brockman GBB 661)," herb, to 0.3 m high. ",,,,,herb,herb,,,,,,,herbaceous, Calamphoreus,Calamphoreus inflatus," erect, spreading shrub, 0.4-1.6 m high, to 2 m wide. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading,erect spreading,woody, Calandrinia,Calandrinia balonensis," succulent, prostrate annual, herb, to 0.3 m wide. ",annual,annual,,,herb,herb,,,,,prostrate,prostrate,herbaceous, @@ -2657,9 +2657,9 @@ Caldesia,Caldesia oligococca," rhizomatous, emergent attached aquatic perennial, Caldesia,Caldesia oligococca var. oligococca," aquatic perennial, herb, to 0.85 m high. ",perennial,perennial,,,herb,herb,aquatic,aquatic,,,,,herbaceous, Calectasia,Calectasia grandiflora subsp. southern," rhizomatous, erect, caespitose perennial, herb, 0.15-0.4 m high, to 0.4 m wide; ",perennial,perennial,,,herb,herb,,,,,erect caespitose rhizomatous,erect caespitose rhizomatous,herbaceous, Calectasia,Calectasia grandiflora subsp. Wheatbelt," erect, spreading perennial, herb, 0.1-0.6 m high, to 0.6 m wide. ",perennial,perennial,,,herb,herb,,,,,erect spreading,erect spreading,herbaceous, -Calectasia,Calectasia cyanea," rhizomatous, clump forming, woody perennial, herb, 0.1-0.6 m high, to 0.3 m wide. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, +Calectasia,Calectasia cyanea," rhizomatous, clump forming, woody perennial, herb, 0.1-0.6 m high, to 0.3 m wide. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,woody, Calectasia,Calectasia grandiflora," rhizomatous, perennial, herb (or undershrub), to 0.65 m high. ",perennial,perennial,,,herb subshrub,herb undershrub,,,,,rhizomatous,rhizomatous,herbaceous, -Calectasia,Calectasia gracilis," rhizomatous, tufted, spreading, woody perennial, herb, 0.2-0.5 m high, to 0.5 m wide. ",perennial,perennial,,,herb,herb,,,,,rhizomatous spreading,rhizomatous spreading,herbaceous, +Calectasia,Calectasia gracilis," rhizomatous, tufted, spreading, woody perennial, herb, 0.2-0.5 m high, to 0.5 m wide. ",perennial,perennial,,,herb,herb,,,,,rhizomatous spreading,rhizomatous spreading,woody, Calectasia,Calectasia palustris," stilt-rooted herb (undershrub), stems to 0.7 m high. ",,,,,herb subshrub,herb undershrub,,,,,,,herbaceous, Calectasia,Calectasia browneana," spreading, caespitose perennial, herb, 0.2-0.5 m high, to 0.4 m wide. ",perennial,perennial,,,herb,herb,,,,,caespitose spreading,caespitose spreading,herbaceous, Calectasia,Calectasia grandiflora subsp. grandiflora ms," rhizomatous, erect, clump-forming perennial, herb, to 0.6 m high, to 0.4 m wide. ",perennial,perennial,,,herb,herb,,,,,erect rhizomatous,erect rhizomatous,herbaceous, @@ -3014,7 +3014,7 @@ Cestrum,Cestrum parqui," shrub, 1-3 m high. ",perennial,inferred_from_growth_for Chaetanthus,Chaetanthus leptocarpoides," densely tufted perennial, herb (sedge), 0.2-0.4 m high. ",perennial,perennial,,,herb graminoid,herb sedge,,,,,,,herbaceous, Chaetanthus,Chaetanthus tenellus," rhizomatous, perennial, herb (), 0.1-0.7 m high. ",perennial,perennial,,,herb graminoid,herb,,,,,rhizomatous,rhizomatous,herbaceous, Chaetanthus,Chaetanthus aristatus," tufted perennial, herb (), 0.2-1 m high. ",perennial,perennial,,,herb graminoid,herb,,,,,,,herbaceous, -Chamaecrista,Chamaecrista absus," viscidly pubescent annual or perennial (short-lived), ",annual perennial,annual perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, +Chamaecrista,Chamaecrista absus," viscidly pubescent annual or perennial (short-lived), ",annual short_lived_perennial,annual perennial,,,herb,inferred_from_life_history,,,,,,,herbaceous, Chamaecrista,Chamaecrista mimosoides," erect or straggling herb or shrub, to 1 m high. ",,,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, Chamaecrista,Chamaecrista symonii," erect or spreading shrub, 0.25-0.7(-1) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading,erect spreading,woody, Chamaecrista,Chamaecrista moorei," sparse, tufted perennial, herb, to 0.3 m high, ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -3035,7 +3035,7 @@ Chamaescilla,Chamaescilla gibsonii," clumped tuberous, herb. ",,,,,herb,herb,,,, Chamaexeros,Chamaexeros fimbriata," rhizomatous, tufted, clump forming perennial, herb, 0.15-0.7 m high, usually 2-leaved. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, Chamaexeros,Chamaexeros macranthera," rhizomatous, tufted, clump forming perennial, herb, 0.12-0.35 m high. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, Chamaexeros,Chamaexeros serra," rhizomatous, tufted perennial, herb, to 0.1 m high, to 0.2 m wide. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, -Chamaexeros,Chamaexeros longicaulis," rhizomatous, colony-forming, semi-woody perennial, herb, 0.05-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, +Chamaexeros,Chamaexeros longicaulis," rhizomatous, colony-forming, semi-woody perennial, herb, 0.05-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,soft_wood, Chamelaucium,Chamelaucium drummondii subsp. hallii," erect shrub, 0.15-1(-2) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Chamelaucium,Chamelaucium pauciflorum subsp. thryptomenioides," spreading shrub, 0.15-0.8(-2) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, Chamelaucium,Chamelaucium axillare," erect shrub, 0.2-2 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, @@ -3969,22 +3969,22 @@ Damasonium,Damasonium minus," emergent, attached aquatic annual or perennial, he Dampiera,Dampiera haematotricha subsp. dura," ascending to decumbent perennial, herb or shrub, 0.1-0.6 m high, leaves oblong-elliptic, elliptic or cuneate. ",perennial,perennial,,,herb shrub,herb shrub,,,,,decumbent,decumbent ascending,woody herbaceous, Dampiera,Dampiera tenuicaulis var. curvula," wiry shrub, 0.1-0.4 m high, ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Dampiera,Dampiera angulata subsp. Peak Charles," upright-spreading, leafless perennial, shrub or herb, to 0.5 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,spreading,spreading,woody herbaceous, -Dampiera,Dampiera alata," erect, woody perennial, herb, 0.1-0.6 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Dampiera,Dampiera altissima," decumbent to ascending, woody perennial, herb, 0.1-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,decumbent,decumbent ascending,herbaceous, +Dampiera,Dampiera alata," erect, woody perennial, herb, 0.1-0.6 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,woody, +Dampiera,Dampiera altissima," decumbent to ascending, woody perennial, herb, 0.1-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,decumbent,decumbent ascending,woody, Dampiera,Dampiera angulata," erect, spreading perennial, herb or shrub, 0.07-0.6 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect spreading,erect spreading,woody herbaceous, Dampiera,Dampiera atriplicina," spreading, robust shrub, to 0.5(-1.2) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, Dampiera,Dampiera candicans," upright-spreading shrub, 0.3-0.7(-1) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, Dampiera,Dampiera carinata," erect perennial, herb, 0.1-0.25 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Dampiera,Dampiera cinerea," spreading shrub, 0.2-0.7(-1) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, Dampiera,Dampiera conospermoides," spreading shrub, 0.7-1.2 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, -Dampiera,Dampiera coronata," erect to spreading, woody perennial, herb, 0.2-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,erect spreading,erect spreading,herbaceous, +Dampiera,Dampiera coronata," erect to spreading, woody perennial, herb, 0.2-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,erect spreading,erect spreading,woody, Dampiera,Dampiera decurrens," stiff, robust perennial, herb, 0.1-1 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Dampiera,Dampiera deltoidea," erect perennial, herb, 0.12-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Dampiera,Dampiera dentata," erect perennial, herb, 0.2-0.5(-0.8) m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Dampiera,Dampiera diversifolia de," prostrate perennial, herb or shrub, 0.03-0.75 m high, to 0.6 m wide; ",perennial,perennial,,,herb shrub,herb shrub,,,,,prostrate,prostrate,woody herbaceous, Dampiera,Dampiera eriantha," erect perennial, herb, to 0.6 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Dampiera,Dampiera eriocephala de," erect perennial, herb, 0.1-0.4 m high, leaves white-tomentose below. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Dampiera,Dampiera fasciculata," erect or ascending, woody perennial, herb or shrub, 0.2-0.6 m high, stem with rounded angles & 3 distinct grooves. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect decumbent,erect ascending,woody herbaceous, +Dampiera,Dampiera eriocephala de," erect perennial, herb, 0.1-0.4 m high, leaves white-tomentose below. ",perennial,perennial,,,herb,herb,,,,,erect,erect,, +Dampiera,Dampiera fasciculata," erect or ascending, woody perennial, herb or shrub, 0.2-0.6 m high, stem with rounded angles & 3 distinct grooves. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect decumbent,erect ascending,woody, Dampiera,Dampiera fitzgeraldensis," erect perennial, herb or shrub, to 0.7 m high, leaves sessile, fasciculate, spathulate or oblong elliptic. sandplains. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, Dampiera,Dampiera glabrescens," erect perennial, herb, 0.2-0.5(-0.9) m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Dampiera,Dampiera haematotricha de," ascending to decumbent perennial, herb or shrub, 0.1-0.6 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,decumbent,decumbent ascending,woody herbaceous, @@ -3995,20 +3995,20 @@ Dampiera,Dampiera juncea," erect to prostrate perennial, herb or shrub, 0.1-0.6 Dampiera,Dampiera krauseana," erect, branched shrub, 0.3-0.6 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Dampiera,Dampiera lavandulacea," erect shrub, to 0.9 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Dampiera,Dampiera leptoclada," erect to semi-prostrate perennial, herb, 0.2-0.6(-1) m high. ",perennial,perennial,,,herb,herb,,,,,erect prostrate,erect prostrate,herbaceous, -Dampiera,Dampiera lindleyi de," erect to semi-prostrate, woody perennial, herb, 0.2-0.7 m high. ",perennial,perennial,,,herb,herb,,,,,erect prostrate,erect prostrate,herbaceous, +Dampiera,Dampiera lindleyi de," erect to semi-prostrate, woody perennial, herb, 0.2-0.7 m high. ",perennial,perennial,,,herb,herb,,,,,erect prostrate,erect prostrate,woody, Dampiera,Dampiera linearis," erect perennial, herb, 0.15-0.6 m high, leaves obovate to elliptic, entire or lobed. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Dampiera,Dampiera loranthifolia," erect perennial, herb, 0.2-0.7 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Dampiera,Dampiera luteiflora," erect to decumbent perennial, herb or shrub, 0.2-0.5 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect decumbent,erect decumbent,woody herbaceous, Dampiera,Dampiera obliqua," erect perennial, herb or shrub, 0.3-0.7 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, -Dampiera,Dampiera oligophylla," erect, woody perennial, herb or shrub, 0.25-0.6 m high, stems prominently ribbed. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, +Dampiera,Dampiera oligophylla," erect, woody perennial, herb or shrub, 0.25-0.6 m high, stems prominently ribbed. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody, Dampiera,Dampiera orchardii," erect perennial, herb, 0.2-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Dampiera,Dampiera parvifolia," erect, woody perennial, herb, (0.1-)0.2-0.6 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Dampiera,Dampiera pedunculata," erect, woody perennial, herb, 0.15-0.7 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, +Dampiera,Dampiera parvifolia," erect, woody perennial, herb, (0.1-)0.2-0.6 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,woody, +Dampiera,Dampiera pedunculata," erect, woody perennial, herb, 0.15-0.7 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,woody, Dampiera,Dampiera plumosa," erect perennial, herb, 0.15-0.2 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Dampiera,Dampiera ramosa," erect, tufted perennial, herb, 0.15-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Dampiera,Dampiera roycei," decumbent to ascending perennial, herb or shrub, 0.15-0.4 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,decumbent,decumbent ascending,woody herbaceous, Dampiera,Dampiera sacculata," erect to spreading perennial, herb or shrub, 0.1-0.4 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect spreading,erect spreading,woody herbaceous, -Dampiera,Dampiera salahae," ascending, woody perennial, herb or shrub, 0.15-0.5 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,decumbent,ascending,woody herbaceous, +Dampiera,Dampiera salahae," ascending, woody perennial, herb or shrub, 0.15-0.5 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,decumbent,ascending,woody, Dampiera,Dampiera scaevolina," erect to ascending perennial, herb or shrub, 0.2-0.5 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect decumbent,erect ascending,woody herbaceous, Dampiera,Dampiera sericantha," erect, slender perennial, herb, 0.05-0.3(-0.6) m high, stems with blunt angles. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Dampiera,Dampiera spicigera," erect shrub, 0.1-0.8 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, @@ -4023,7 +4023,7 @@ Dampiera,Dampiera triloba," erect perennial, herb or shrub, to 0.5 m high. ",per Dampiera,Dampiera wellsiana," tufted perennial, herb, 0.05-0.25(-0.4) m high, leaves glabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Dampiera,Dampiera incana var. fuscescens," erect perennial, herb or shrub, 0.15-0.6 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, Dampiera,Dampiera incana var. incana," erect perennial, herb or shrub, 0.15-0.6 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, -Dampiera,Dampiera latealata," erect woody perennial, herb or shrub, 0.3-1 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, +Dampiera,Dampiera latealata," erect woody perennial, herb or shrub, 0.3-1 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody, Dampiera,Dampiera haematotricha de subsp. haematotricha," ascending to decumbent perennial, herb or shrub, 0.1-0.6 m high, leaves ovate-orbicular or obovate. ",perennial,perennial,,,herb shrub,herb shrub,,,,,decumbent,decumbent ascending,woody herbaceous, Dampiera,Dampiera tenuicaulis var. tenuicaulis," wiry shrub, 0.1-0.4 m high, ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Dampiera,Dampiera angulata subsp. angulata," erect, spreading perennial, herb or shrub (with angled stems), 0.25-0.6 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect spreading,erect spreading,woody herbaceous, @@ -4090,7 +4090,7 @@ Darwinia,Darwinia sp. Westdale (F. Hort 864)," decumbent to prostrate shrub, 0.5 Darwinia,"Darwinia sp. Wyalgima Hill (L.W. Sage, J.P. Pigott & E.B. Pigott LWS1549)"," compact, erect, aromatic shrub, 0.5-0.7 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect compact,erect compact,woody, Darwinia,Darwinia sp. Gibson (R.D. Royce 3569)," compact shrub, to 0.4 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,compact,compact,woody, Dasypogon,Dasypogon bromeliifolius," rhizomatous, tufted perennial, herb, 0.3-1(-1.5) m high. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, -Dasypogon,Dasypogon hookeri," rhizomatous, perennial, herb or treelike monocot, 0.5-3 m high. ",perennial,perennial,,,herb palmoid,herb treelike,,,,,rhizomatous,rhizomatous,herbaceous, +Dasypogon,Dasypogon hookeri," rhizomatous, perennial, herb or treelike monocot, 0.5-3 m high. ",perennial,perennial,,,herb palmoid,herb treelike,,,,,rhizomatous,rhizomatous,woody, Dasypogon,Dasypogon obliquifolius," rhizomatous, tufted perennial, herb, 0.3-1 m high, to 1 m wide. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, Datura,Datura ferox," stout, bushy annual, herb, 0.5-1 m high. ",annual,annual,,,herb,herb,,,,,bushy,bushy,herbaceous, Datura,Datura leichhardtii," stout annual, herb, 0.2-1 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, @@ -4352,7 +4352,7 @@ Dicrastylis,Dicrastylis mitchellii," shrub, to about 0.3 m high. ",perennial,inf Dicrastylis,Dicrastylis sp. Peron Peninsula (M.E. Trudgen 7373), small shrub. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Dicrastylis,Dicrastylis sp. Cue (A.A. Mitchell 764)," shrub, 1-3 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Dicrastylis,Dicrastylis sp. Denham (M. Lewis 42/92), dwarf shrub. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, -Didymanthus,Didymanthus roei," spreading, woody perennial, herb, 0.2-0.6 m high. ",perennial,perennial,,,herb,herb,,,,,spreading,spreading,herbaceous, +Didymanthus,Didymanthus roei," spreading, woody perennial, herb, 0.2-0.6 m high. ",perennial,perennial,,,herb,herb,,,,,spreading,spreading,woody, Didymoplexis,Didymoplexis pallens," tuberous, perennial, herb, 0.05-0.12 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Dielitzia,Dielitzia tysonii," tufted annual, herb. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Dielsia,Dielsia stenostachya," rhizomatous, perennial, herb, 0.2-0.9 m high. ",perennial,perennial,,,herb graminoid,herb,,,,,rhizomatous,rhizomatous,herbaceous, @@ -4653,7 +4653,7 @@ Drosera,Drosera broomensis," perennial, herb, to 0.3 m high, inflorescence (incl Drosera,Drosera caduca," fibrous-rooted, rosetted perennial, herb, to 0.45 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Drosera,Drosera derbyensis," fibrous-rooted, rosetted perennial, herb. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Drosera,Drosera brevicornis, herb. ,,,,,herb,herb,,,,,,,herbaceous, -Drosera,Drosera paradoxa," fibrous-rooted perennial, herb, to 0.3 m high, stem erect, woody. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, +Drosera,Drosera paradoxa," fibrous-rooted perennial, herb, to 0.3 m high, stem erect, woody. ",perennial,perennial,,,herb,herb,,,,,erect,erect,woody, Drosera,Drosera zigzagia," glabrous, erect tuberous, perennial, herb, 0.05-0.07 m high, inflorescence 4-9-flowered. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Drosera,Drosera moorei," glabrous, scrambling or climbing tuberous, perennial, herb (with lax habit), 0.12-0.35 m high, inflorescence 2-10-flowered. ",perennial,perennial,,,herb,herb,,,,,climbing,climbing,herbaceous, Drosera,Drosera intricata," glabrous, scrambling or climbing tuberous, perennial, herb (with lax habit), 0.25-0.4 m high, inflorescence 3-12-flowered. ",perennial,perennial,,,herb,herb,,,,,climbing,climbing,herbaceous, @@ -5815,7 +5815,7 @@ Eulalia,Eulalia mackinlayi," tufted perennial, g or herb, 1.4-2.5 m high. ",pere Eulophia,Eulophia bicallosa," tuberous, perennial, herb, 0.25 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Eupatorium,Eupatorium adenophorum," muchbranched perennial, herb, to 2 m high, leaves opposite, ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Euphorbia,Euphorbia tannensis subsp. eremophila," erect annual or perennial, herb or shrub, 0.1-1 m high. ",annual perennial,annual perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, -Euphorbia,Euphorbia alsiniflora," erect or ascending, spreading, sometimes woody annual or perennial, herb, 0.2-0.45 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect decumbent spreading,erect ascending spreading,herbaceous, +Euphorbia,Euphorbia alsiniflora," erect or ascending, spreading, sometimes woody annual or perennial, herb, 0.2-0.45 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect decumbent spreading,erect ascending spreading,woody herbaceous, Euphorbia,Euphorbia atoto," erect or sprawling herb or shrub, 0.15-0.6 m high. ",,,,,herb shrub,herb shrub,,,,,erect sprawling,erect sprawling,woody herbaceous, Euphorbia,Euphorbia australis," prostrate annual or perennial, herb, 0.02-0.1 m high, naturalised in the perth region. ",annual perennial,annual perennial,,,herb,herb,,,,,prostrate,prostrate,herbaceous, Euphorbia,Euphorbia biconvexa," annual, herb, to 0.4 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, @@ -6394,7 +6394,7 @@ Gonocarpus,Gonocarpus ericifolius," semi-woody shrub, 0.1-0.15 m high. ",perenni Gonocarpus,Gonocarpus hexandrus," perennial, herb or shrub, 0.08-2 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,,,woody herbaceous, Gonocarpus,Gonocarpus hispidus," erect perennial, herb or shrub, ca 0.16 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, Gonocarpus,Gonocarpus implexus," scrambling, matted annual, herb, 0.05-0.4 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, -Gonocarpus,Gonocarpus intricatus," erect to decumbent, woody perennial, herb, 0.2-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect decumbent,erect decumbent,herbaceous, +Gonocarpus,Gonocarpus intricatus," erect to decumbent, woody perennial, herb, 0.2-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect decumbent,erect decumbent,woody, Gonocarpus,Gonocarpus leptothecus," erect to spreading annual or perennial, herb or shrub, 0.2-0.6(-0.9) m high. ",annual perennial,annual perennial,,,herb shrub,herb shrub,,,,,erect spreading,erect spreading,woody herbaceous, Gonocarpus,Gonocarpus nodulosus," slender annual, herb, 0.02-0.2 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Gonocarpus,Gonocarpus rudis," erect or sprawling perennial, herb or shrub, 0.1-0.3 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect sprawling,erect sprawling,woody herbaceous, @@ -6481,9 +6481,9 @@ Goodenia,Goodenia pinnatifida," decumbent to ascending herb, 0.05-0.4(-0.6) m hi Goodenia,Goodenia pulchella," decumbent to erect annual or perennial, herb, 0.05-0.35 m high, leaves linear to ovate; ",annual perennial,annual perennial,,,herb,herb,,,,,erect decumbent,erect decumbent,herbaceous, Goodenia,Goodenia purpurascens," erect perennial or annual, herb, 0.1-0.3 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, Goodenia,Goodenia pusilliflora," decumbent to ascending annual, herb, 0.01-0.2 m high. ",annual,annual,,,herb,herb,,,,,decumbent,decumbent ascending,herbaceous, -Goodenia,Goodenia quadrilocularis," erect, slender, woody perennial, herb, 0.3-1 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Goodenia,Goodenia quasilibera," ascending to erect, semi-woody herb, 0.1-0.3 m high. ",,,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, -Goodenia,Goodenia ramelii," erect, woody with basal rosette perennial, herb, 0.3-1 m high. ",perennial,perennial,,,herb,herb,,,,,erect rosette,erect rosette,herbaceous, +Goodenia,Goodenia quadrilocularis," erect, slender, woody perennial, herb, 0.3-1 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,woody, +Goodenia,Goodenia quasilibera," ascending to erect, semi-woody herb, 0.1-0.3 m high. ",,,,,herb,herb,,,,,erect decumbent,erect ascending,woody, +Goodenia,Goodenia ramelii," erect, woody with basal rosette perennial, herb, 0.3-1 m high. ",perennial,perennial,,,herb,herb,,,,,erect rosette,erect rosette,woody, Goodenia,Goodenia strangfordii," erect, diffuse herb, to 0.3 m high. ",,,,,herb,herb,,,,,erect,erect,herbaceous, Goodenia,Goodenia suffrutescens," perennial, herb or shrub, to 1 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,,,woody herbaceous, Goodenia,Goodenia tenuiloba," erect to ascending, viscid herb, 0.15-0.6 m high. ",,,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, @@ -6493,7 +6493,7 @@ Goodenia,Goodenia varia, prostrate shrub. ,perennial,inferred_from_growth_form,, Goodenia,Goodenia vilmoriniae," ascending to erect annual, herb, 0.15-0.6 m high. ",annual,annual,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, Goodenia,Goodenia virgata," ascending to erect, virgate perennial, herb, to 0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, Goodenia,Goodenia viscida," erect perennial, herb or shrub, 0.3-0.7 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, -Goodenia,Goodenia watsonii," erect, semi-woody perennial, herb, 0.15-0.7 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, +Goodenia,Goodenia watsonii," erect, semi-woody perennial, herb, 0.15-0.7 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,soft_wood, Goodenia,Goodenia wilunensis," ascending to prostrate, diffuse annual, herb. ",annual,annual,,,herb,herb,,,,,decumbent prostrate,ascending prostrate,herbaceous, Goodenia,Goodenia xanthosperma," prostrate perennial, herb, 0.01-0.15 m high. ",perennial,perennial,,,herb,herb,,,,,prostrate,prostrate,herbaceous, Goodenia,Goodenia xanthotricha de," viscid shrub, to 0.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, @@ -6533,8 +6533,8 @@ Goodenia,Goodenia sepalosa var. glandulosa," prostrate to sprawling herb, 0.03-0 Goodenia,Goodenia sepalosa var. sepalosa," prostrate to sprawling herb, 0.03-0.3 m high. ",,,,,herb,herb,,,,,prostrate sprawling,prostrate sprawling,herbaceous, Goodenia,Goodenia janamba," erect herb, to 0.6 m high. ",,,,,herb,herb,,,,,erect,erect,herbaceous, Goodenia,Goodenia pusilla," ascending annual, herb, 0.01-0.1(-0.25) m high. ",annual,annual,,,herb,herb,,,,,decumbent,ascending,herbaceous, -Goodenia,Goodenia watsonii subsp. glandulosa," erect, semi-woody perennial, herb, 0.15-0.7 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Goodenia,Goodenia watsonii subsp. watsonii," erect, semi-woody perennial, herb, 0.15-0.7 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, +Goodenia,Goodenia watsonii subsp. glandulosa," erect, semi-woody perennial, herb, 0.15-0.7 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,soft_wood, +Goodenia,Goodenia watsonii subsp. watsonii," erect, semi-woody perennial, herb, 0.15-0.7 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,soft_wood, Goodenia,Goodenia katabudjar," shrub (subshrub), 0.1-0.2 m high, stems hirsute; ",,,,,subshrub shrub,subshrub shrub,,,,,,,woody, Goodenia,Goodenia laevis subsp. laevis," erect, woody shrub (subshrub), 0.1-0.25 m high, largest leaves 15-25 x 1-3 mm, entire. ",,,,,subshrub shrub,subshrub shrub,,,,,erect,erect,woody, Goodenia,Goodenia laevis subsp. humifusa," prostrate, woody shrub (subshrub), 0.02-0.1 m high, largest leaves 23-43 x 5-13 mm, entire or sometimes with 2 lobes near the apex. ",,,,,subshrub shrub,subshrub shrub,,,,,prostrate,prostrate,woody, @@ -6678,7 +6678,7 @@ Grevillea,Grevillea erectiloba," shrub, 1-3 m high. ",perennial,inferred_from_gr Grevillea,Grevillea erinacea," spindly, prickly, sparingly branched shrub, (0.3-)0.6-1.8 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spindly,spindly,woody, Grevillea,Grevillea eriobotrya," erect shrub, 1.5-4 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Grevillea,Grevillea eriostachya," small, lignotuberous shrub, (0.5-)1-5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, -Grevillea,Grevillea eryngioides," suckering, ",,,,,,,,,,,,,, +Grevillea,Grevillea eryngioides," suckering, ",,,,,shrub,,,,,,,,woody, Grevillea,Grevillea erythroclada," small tree or shrub, 2.5-8 m high. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, Grevillea,Grevillea extorris," spreading, bushy shrub, 1-2.5(-3) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading bushy,spreading bushy,woody, Grevillea,Grevillea fasciculata," loose to moderately dense spreading shrub, 0.3-1.2(-1.8) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading dense,spreading dense,woody, @@ -7148,7 +7148,7 @@ Halophila,Halophila ovalis," rhizomatous, dioecious, submerged, marine or estuar Halophila,Halophila spinulosa," rhizomatous, dioecious, submerged, marine perennial, herb. ",perennial,perennial,,,herb,herb,aquatic,submerged marine,dioecious,dioecious,rhizomatous submerged,rhizomatous submerged,herbaceous, Haloragis,Haloragis brownii," aquatic or semiaquatic annual or perennial, herb, 0.1-0.5 m high. ",annual perennial,annual perennial,,,herb,herb,semiaquatic aquatic,semiaquatic aquatic,,,,,herbaceous, Haloragis,Haloragis digyna," decumbent perennial, herb, 0.15-0.6 m high. ",perennial,perennial,,,herb,herb,,,,,decumbent,decumbent,herbaceous, -Haloragis,Haloragis dura," spreading perennial, herb (semi-woody), 0.1-0.35 m high. ",perennial,perennial,,,herb,herb,,,,,spreading,spreading,herbaceous, +Haloragis,Haloragis dura," spreading perennial, herb (semi-woody), 0.1-0.35 m high. ",perennial,perennial,,,herb,herb,,,,,spreading,spreading,soft_wood, Haloragis,Haloragis gossei," erect annual or perennial, herb, to 0.4 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, Haloragis,Haloragis hamata," spreading, semi-woody shrub, 0.1-0.6 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, Haloragis,Haloragis odontocarpa," erect annual, herb, 0.1-0.5(-0.9) m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, @@ -7216,7 +7216,7 @@ Hedypnois,Hedypnois rhagadioloides subsp. cretica," annual, herb, to 0.3 m high. Hedypnois,Hedypnois rhagadioloides," procumbent or erect, rosetted annual, herb, to 0.3 m high. ",annual,annual,,,herb,herb,,,,,erect prostrate,erect procumbent,herbaceous, Hedypnois,Hedypnois rhagadioloides subsp. rhagadioloides," open, spreading, rosetted annual, herb. ",annual,annual,,,herb,herb,,,,,spreading open,spreading open,herbaceous, Helianthus,Helianthus debilis subsp. cucumerifolius," erect annual or perennial, herb, 0.3-2 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Helianthus,Helianthus annuus," erect, woody annual, herb, (0.3-)0.6-3 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, +Helianthus,Helianthus annuus," erect, woody annual, herb, (0.3-)0.6-3 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,woody, Helianthus,Helianthus debilis," erect annual or perennial, herb, 0.3-2 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, Helianthus,Helianthus tuberosus," erect rhizomatous, perennial, herb, to 4 m high, widely cultivated for its edible tubers. ",perennial,perennial,,,herb,herb,,,,,erect rhizomatous,erect rhizomatous,herbaceous, Helichrysum,Helichrysum gilesii," erect or ascending annual, herb, 0.2-0.5 m high. ",annual,annual,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, @@ -7257,7 +7257,7 @@ Heliotropium,Heliotropium dichotomum," ascending annual or perennial (short-live Heliotropium,Heliotropium aenigmatum," herb, ",,,,,herb,herb,,,,,,,herbaceous, Heliotropium,Heliotropium ammophilum," ascending to spreading annual or perennial (short-lived), herb, 0.07-0.3(-0.5) m high. ",annual perennial,annual perennial,,,herb,herb,,,,,decumbent spreading,ascending spreading,herbaceous, Heliotropium,Heliotropium calvariavis," ascending to spreading-ascending annual, herb, to 0.15 m high. ",annual,annual,,,herb,herb,,,,,decumbent spreading,ascending spreading,herbaceous, -Heliotropium,Heliotropium chrysocarpum," ascending to spreading, woody perennial, herb, 0.2-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,decumbent spreading,ascending spreading,herbaceous, +Heliotropium,Heliotropium chrysocarpum," ascending to spreading, woody perennial, herb, 0.2-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,decumbent spreading,ascending spreading,woody, Heliotropium,Heliotropium cupressinum," perennial, herb, to 0.6 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Heliotropium,Heliotropium euodes," ascending to spreading annual or perennial (short-lived), herb, 0.15-0.4 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,decumbent spreading,ascending spreading,herbaceous, Heliotropium,Heliotropium foveolatum," ascending to spreading annual, herb, to 0.3 m high. ",annual,annual,,,herb,herb,,,,,decumbent spreading,ascending spreading,herbaceous, @@ -7713,7 +7713,7 @@ Illecebrum,Illecebrum verticillatum," slender, spreading decumbent annual, herb, Impatiens,Impatiens sodenii," erect shrub, to 1.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Imperata,Imperata cylindrica," rhizomatous, densely tufted perennial, g or herb, 0.3-1.5 m high. ",perennial,perennial,,,herb graminoid,herb,,,,,rhizomatous,rhizomatous,herbaceous, Indigastrum,Indigastrum parviflorum," erect annual, herb, 0.3-0.5 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, -Indigofera,Indigofera linifolia," erect or spreading, woody annual or perennial, herb, (0.03-)0.1-0.6 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect spreading,erect spreading,herbaceous, +Indigofera,Indigofera linifolia," erect or spreading, woody annual or perennial, herb, (0.03-)0.1-0.6 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect spreading,erect spreading,woody, Indigofera,Indigofera occidentalis," erect shrub, ca 0.6 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Indigofera,Indigofera oblongifolia," erect, spreading shrub, to 2 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading,erect spreading,woody, Indigofera,Indigofera sessiliflora," semi-prostrate annual or biennial, herb, to 0.05 m high. ",annual biennial,annual biennial,,,herb,herb,,,,,prostrate,prostrate,herbaceous, @@ -7738,13 +7738,13 @@ Indigofera,Indigofera georgei," decumbent or erect shrub, 0.05-1.4 m high. ",per Indigofera,Indigofera glandulosa," erect annual or perennial (short-lived), herb, to 0.75 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, Indigofera,Indigofera haplophylla," erect annual, herb, 0.3-1 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Indigofera,Indigofera helmsii," erect, spreading shrub, 0.7-2.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading,erect spreading,woody, -Indigofera,Indigofera hirsuta," prostrate, spreading or erect, woody annual or perennial (short-lived), herb, 0.2-0.6(-1.4) m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect prostrate spreading,erect prostrate spreading,herbaceous, +Indigofera,Indigofera hirsuta," prostrate, spreading or erect, woody annual or perennial (short-lived), herb, 0.2-0.6(-1.4) m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect prostrate spreading,erect prostrate spreading,woody, Indigofera,Indigofera leucotricha," erect or spreading shrub, to 1 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading,erect spreading,woody, -Indigofera,Indigofera linnaei," prostrate to ascending, woody perennial, herb, 0.05-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,decumbent prostrate,ascending prostrate,herbaceous, +Indigofera,Indigofera linnaei," prostrate to ascending, woody perennial, herb, 0.05-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,decumbent prostrate,ascending prostrate,woody, Indigofera,Indigofera monophylla," spreading shrub, 0.3-1.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, Indigofera,Indigofera pratensis," low, multi-stemmed, spreading shrub, 0.3-0.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, Indigofera,Indigofera rugosa," shrub, 0.2-0.75 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, -Indigofera,Indigofera trifoliata," woody perennial, herb, to 1 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Indigofera,Indigofera trifoliata," woody perennial, herb, to 1 m high. ",perennial,perennial,,,herb,herb,,,,,,,woody, Indigofera,Indigofera trita," spreading to erect annual or perennial (short-lived), herb or shrub, 0.3-0.6(-0.8) m high. ",annual perennial,annual perennial,,,herb shrub,herb shrub,,,,,erect spreading,erect spreading,woody herbaceous, Indigofera,Indigofera psammophila," perennial, herb or shrub, to 0.5 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,,,woody herbaceous, Indigofera,Indigofera ixocarpa," shrub, to 1 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, @@ -8115,7 +8115,7 @@ Lachnostachys,Lachnostachys verbascifolia var. verbascifolia," erect shrub, 0.3- Lachnostachys,Lachnostachys verbascifolia var. paniculata," shrub, ca 1 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Lactuca,Lactuca saligna," rigid, erect annual or biennial, herb, to 1 m high. ",annual biennial,annual biennial,,,herb,herb,,,,,erect,erect,herbaceous, Lactuca,Lactuca serriola," erect annual or biennial, herb, 0.4-2 m high. ",annual biennial,annual biennial,,,herb,herb,,,,,erect,erect,herbaceous, -Lactuca,Lactuca serriola," erect, climbingherb (with spiny leaves), to 2 m high. ",,,,,climber_herbaceous,climbingherb,,,,,erect,erect,herbaceous, +Lactuca,Lactuca serriola," erect, herb (with spiny leaves), to 2 m high. ",,,,,herb,herb,,,,,erect,erect,herbaceous, Lagenophora,Lagenophora huegelii," rosetted perennial, herb, 0.04-0.35 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Lagerstroemia,Lagerstroemia archeriana," shrub or tree, 2.5-15 m high. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, Lagerstroemia,Lagerstroemia archeriana subsp. divaricatiflora," shrub or tree, 2.5-15 m high. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, @@ -8289,7 +8289,7 @@ Lepidium,Lepidium africanum," erect annual or perennial, herb, 0.1-0.8 m high. " Lepidium,Lepidium aschersonii," erect perennial, herb, 0.04-0.3 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Lepidium,Lepidium biplicatum, erect shrub. ,perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Lepidium,Lepidium bonariense," erect annual or biennial, herb, to 0.6 m high. ",annual biennial,annual biennial,,,herb,herb,,,,,erect,erect,herbaceous, -Lepidium,Lepidium catapycnon," open, woody perennial, herb or shrub, 0.2-0.3 m high, stems zigzag. ",perennial,perennial,,,herb shrub,herb shrub,,,,,open,open,woody herbaceous, +Lepidium,Lepidium catapycnon," open, woody perennial, herb or shrub, 0.2-0.3 m high, stems zigzag. ",perennial,perennial,,,herb shrub,herb shrub,,,,,open,open,woody, Lepidium,Lepidium desvauxii," erect to spreading perennial, herb, to 0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect spreading,erect spreading,herbaceous, Lepidium,Lepidium drummondii," annual, herb, to 0.15 m high, very rare species. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Lepidium,Lepidium echinatum," prostrate & spreading perennial, herb, to 3 m wide. ",perennial,perennial,,,herb,herb,,,,,prostrate spreading,prostrate spreading,herbaceous, @@ -8823,7 +8823,7 @@ Lysiosepalum,Lysiosepalum hexandrum," dense erect shrub, (0.2-)0.3-0.9 m high. " Lysiosepalum,Lysiosepalum abollatum," dense, erect shrub, to 1.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect dense,erect dense,woody, Lysiosepalum,Lysiosepalum aromaticum," thick, bushy shrub, to 0.75 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,bushy,bushy,woody, Lythrum,Lythrum hyssopifolia," decumbent or ascending annual, herb, 0.05-0.2(-0.5) m high, flowers solitary, hypanthium spots at base, petals 2-4 mm long. ",annual,annual,,,herb,herb,,,,,decumbent,decumbent ascending,herbaceous, -Lythrum,Lythrum paradoxum," woody erect herb, 0.6-1 m high, plants glabrous, inflorescence of (1-)2-7 flowers, stamens 8-12, exserted. ",,,,,herb,herb,,,,,erect,erect,herbaceous, +Lythrum,Lythrum paradoxum," woody erect herb, 0.6-1 m high, plants glabrous, inflorescence of (1-)2-7 flowers, stamens 8-12, exserted. ",,,,,herb,herb,,,,,erect,erect,woody, Lythrum,Lythrum wilsonii," erect herb, ca 0.03 m high, plants often minutely scabrous, inflorescence of (1-)2-7 flowers, stamens 4-6, included to exserted. ",,,,,herb,herb,,,,,erect,erect,herbaceous, Macarthuria,Macarthuria apetala," tufted perennial, herb or shrub, 0.1-0.3 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,,,woody herbaceous, Macarthuria,Macarthuria australis," erect or ascending, spreading, wiry shrub, 0.15-0.75 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect decumbent spreading,erect ascending spreading,woody, @@ -8845,8 +8845,8 @@ Maireana,Maireana glomerifolia," rigid, open, divaricately branched shrub, 0.15- Maireana,Maireana integra," shrub, 0.15-0.6(-1) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Maireana,Maireana lanosa," divaricately branched shrub, 0.25-0.6 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Maireana,Maireana lobiflora," decumbent to erect perennial, herb or shrub, 0.05-0.5 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect decumbent,erect decumbent,woody herbaceous, -Maireana,Maireana luehmannii," woody, divaricately branched perennial, herb, 0.2-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Maireana,Maireana marginata," prostrate to decumbent perennial, herb (with woody stock). ",perennial,perennial,,,herb,herb,,,,,decumbent prostrate,decumbent prostrate,herbaceous, +Maireana,Maireana luehmannii," woody, divaricately branched perennial, herb, 0.2-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,,,woody, +Maireana,Maireana marginata," prostrate to decumbent perennial, herb (with woody stock). ",perennial,perennial,,,herb,herb,,,,,decumbent prostrate,decumbent prostrate,woody_base herbaceous, Maireana,Maireana amoena," brittle shrub, 0.1-0.4 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Maireana,Maireana aphylla," rounded, divaricately branched shrub, 0.5-2 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Maireana,Maireana appressa," intricately branched shrub, 0.1-0.6 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, @@ -9949,7 +9949,7 @@ Patersonia,Patersonia rudis subsp. velutina," rhizomatous, tufted perennial, her Patersonia,Patersonia drummondii subsp. drummondii ms," rhizomatous, tufted perennial, herb, 0.15-0.3 m high. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, Patersonia,Patersonia lanata," erect, multi-stemmed to caespitose perennial, herb, 0.2-0.6 m high. ",perennial,perennial,,,herb,herb,,,,,erect caespitose,erect caespitose,herbaceous, Patersonia,Patersonia lanata forma calvata," stiff, wiry-leaved perennial, herb. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Patersonia,Patersonia spirifolia," spreading, woody, tussock-forming rhizomatous, herb, to 0.3 m high, to 0.4 m across. ",,,,,herb tussock,herb tussock,,,,,caespitose rhizomatous spreading,tussock rhizomatous spreading,herbaceous, +Patersonia,Patersonia spirifolia," spreading, woody, tussock-forming rhizomatous, herb, to 0.3 m high, to 0.4 m across. ",,,,,herb tussock,herb tussock,,,,,caespitose rhizomatous spreading,tussock rhizomatous spreading,woody, Patersonia,Patersonia occidentalis var. angustifolia," rhizomatous, perennial, herb, to 1.5 m high. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, Patersonia,Patersonia occidentalis var. occidentalis," erect, tufted perennial, herb or g, to 1 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Patersonia,Patersonia occidentalis var. latifolia," caespitose rhizomatous, perennial, herb, to 0.7 m high. ",perennial,perennial,,,herb,herb,,,,,caespitose rhizomatous,caespitose rhizomatous,herbaceous, @@ -9980,7 +9980,7 @@ Pennisetum,Pennisetum pedicellatum subsp. unispiculum," annual or perennial (rar Pennisetum,Pennisetum pedicellatum subsp. pedicellatum," annual, g or herb, 0.4-1.5 m high, 2-5 spikelets within each involucre. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Pentalepis,Pentalepis ecliptoides," erect or straggling annual, herb, 0.15-1(-1.4) m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Pentalepis,Pentalepis trichodesmoides," erect perennial, herb or shrub, 0.4-1(-2) m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, -Pentalepis,Pentalepis sp. Mt House (E.M. Bennett 1877)," erect woody perennial, herb, 0.45-1 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, +Pentalepis,Pentalepis sp. Mt House (E.M. Bennett 1877)," erect woody perennial, herb, 0.45-1 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,woody, Pentapeltis,Pentapeltis peltigera," prostrate to ascending perennial, herb, 0.05-0.2(-0.45) m high. ",perennial,perennial,,,herb,herb,,,,,decumbent prostrate,ascending prostrate,herbaceous, Pentapeltis,Pentapeltis silvatica," prostrate perennial, herb. ",perennial,perennial,,,herb,herb,,,,,prostrate,prostrate,herbaceous, Pentapogon,Pentapogon quadrifidus var. quadrifidus," annual or perennial, g or herb, 0.3-0.6 m high, panicles to 20 cm, glumes usually 6.5-10 mm long. ",annual perennial,annual perennial,,,herb graminoid,herb,,,,,,,herbaceous, @@ -10242,7 +10242,7 @@ Phyllanthus,Phyllanthus sp. D Kimberley Flora (C.R. Dunlop 5302)," shrub, to 0.3 Phyllodium,Phyllodium pulchellum," shrub, to 1 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Phylloglossum,Phylloglossum drummondii," tuberous, perennial, herb or g or (fern ally), 0.01-0.06 m high, sporophylls clustered in solitary strobilus on fleshy peduncle, leaves fleshy. ",perennial,perennial,,,herb fern,herb fern,,,,,,,herbaceous, Phyllopodium,Phyllopodium cordatum," erect, slender annual, herb, 0.06-0.2 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, -Phyllostachys,Phyllostachys aurea," rhizomatous, woody g or herb, to 6 m high, 6 m wide; ",,,,,herb graminoid,herb,,,,,rhizomatous,rhizomatous,herbaceous, +Phyllostachys,Phyllostachys aurea," rhizomatous, woody g or herb, to 6 m high, 6 m wide; ",,,,,herb graminoid,herb,,,,,rhizomatous,rhizomatous,woody, Phyllota,Phyllota barbata," erect shrub, 0.2-1.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Phyllota,Phyllota gracilis," spherical or procumbent, multi-stemmed shrub, 0.15-0.7 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,prostrate,procumbent,woody, Phyllota,Phyllota luehmannii," erect, spreading, dense shrub, 0.15-0.6(-1) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading dense,erect spreading dense,woody, @@ -10342,7 +10342,7 @@ Pimelea,Pimelea subvillifera," shrub, 0.1-0.6 m high. ",perennial,inferred_from_ Pimelea,Pimelea sulphurea," erect, spindly or open shrub, 0.15-0.7 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spindly open,erect spindly open,woody, Pimelea,Pimelea sylvestris," erect shrub, 0.3-2 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Pimelea,Pimelea tinctoria," erect, spindly shrub, 0.5-1(-2) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spindly,erect spindly,woody, -Pimelea,Pimelea trichostachya," semi-woody annual, herb, 0.15-0.6 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, +Pimelea,Pimelea trichostachya," semi-woody annual, herb, 0.15-0.6 m high. ",annual,annual,,,herb,herb,,,,,,,soft_wood, Pimelea,Pimelea villifera," erect, dense shrub, 0.2-1(-2) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect dense,erect dense,woody, Pimelea,Pimelea micrantha," decumbent shrub, 0.08-0.2 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,decumbent,decumbent,woody, Pimelea,Pimelea microcephala subsp. microcephala," erect shrub, 0.8-2.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, @@ -10365,7 +10365,7 @@ Pistia,Pistia stratiotes," rhizomatous, freefloating, aquatic perennial, herb. " Pithocarpa,Pithocarpa pulchella var. melanostigma," slender, diffuse perennial, herb, 0.1-0.8 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Pithocarpa,Pithocarpa corymbulosa," erect to scrambling perennial, herb, 0.5-1 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, Pithocarpa,Pithocarpa pulchella," erect, slender, rigid perennial, herb, 0.1-0.8 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Pithocarpa,Pithocarpa pulchella var. pulchella," erect, woody perennial, herb, to 0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, +Pithocarpa,Pithocarpa pulchella var. pulchella," erect, woody perennial, herb, to 0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,woody, Pittosporum,Pittosporum angustifolium," weeping tree or shrub, 1-8 m high, ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, Pittosporum,Pittosporum ligustrifolium," erect, spreading shrub or tree (small), 0.2-4.5 m high. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,erect spreading,erect spreading,woody, Pittosporum,Pittosporum undulatum," tree, to 5 m high. ",perennial,inferred_from_growth_form,,,tree,tree,,,,,,,woody, @@ -10891,7 +10891,7 @@ Ptilotus,Ptilotus sericostachyus subsp. sericostachyus," prostrate to ascending Ptilotus,Ptilotus polystachyus var. polystachyus," erect or ascending annual or perennial, herb, 0.15-1.5 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, Ptilotus,Ptilotus polystachyus var. arthrotrichus," erect or ascending annual or perennial, herb, 0.3-0.5 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, Ptilotus,Ptilotus spicatus subsp. spicatus," erect annual or perennial, herb, 0.25-1.5 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Ptilotus,Ptilotus halophilus," prostrate to decumbent tuberous, perennial, herb, to 0.08 m high. open mallee woodlands. ",perennial,perennial,,,herb mallee,herb mallee,,,,,decumbent prostrate open,decumbent prostrate open,herbaceous, +Ptilotus,Ptilotus halophilus," prostrate to decumbent tuberous, perennial, herb, to 0.08 m high. open mallee woodlands. ",perennial,perennial,,,herb,herb,,,,,decumbent prostrate open,decumbent prostrate open,herbaceous, Ptilotus,Ptilotus chrysocomus," compact, perenial, woody shrub, to 1 m high, leaves bunched at shoots, oblanceolate, 3-10 mm long, 0.5-1 mm long; ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,compact,compact,woody, Ptilotus,Ptilotus subspinescens," compact shrub, to 0.8 m high. gentle rocky slopes, screes and the bases of screes. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,compact,compact,woody, Ptilotus,Ptilotus nobilis subsp. nobilis," robust perennial, herb or shrub, 0.3-0.6(-2) m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,,,woody herbaceous, @@ -11003,7 +11003,7 @@ Rhagodia,Rhagodia sp. Watheroo (R.J. Cranfield & P.J. Spencer 8183)," dense, pun Rhamnus,Rhamnus alaternus," erect shrub or tree, 1-6 m high. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,erect,erect,woody, Rhaponticum,Rhaponticum repens," perennial, herb. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Rhetinocarpha,Rhetinocarpha suffruticosa," woody perennial, herb (with slender erect branches), ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Rhizanthella,Rhizanthella gardneri," tuberous, perennial, herb, flowers develop under the surface and break through as they mature; ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Rhizanthella,Rhizanthella gardneri," tuberous, perennial, herb, flowers develop under the surface and break through as they mature; ",perennial,perennial,,,herb,herb,,,,,,,woody, Rhizophora,Rhizophora stylosa," mangrove shrub or tree (with stilt and aerial roots), 1.5-20 m high. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, Rhodanthe,Rhodanthe fuscescens," erect annual, herb, 0.05-0.1 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Rhodanthe,Rhodanthe humboldtiana," erect annual, herb, 0.1-0.5 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, @@ -11482,9 +11482,9 @@ Sclerolaena,Sclerolaena bicuspis," shrub, ca 0.15 m high. ",perennial,inferred_f Sclerolaena,Sclerolaena brevifolia," erect to decumbent shrub, 0.05-0.3 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect decumbent,erect decumbent,woody, Sclerolaena,Sclerolaena burbidgeae," rounded perennial, herb, 0.07-0.2 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Sclerolaena,Sclerolaena clelandii," prostrate perennial, herb. ",perennial,perennial,,,herb,herb,,,,,prostrate,prostrate,herbaceous, -Sclerolaena,Sclerolaena convexula," woody perennial, herb, 0.2-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Sclerolaena,Sclerolaena convexula," woody perennial, herb, 0.2-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,,,woody, Sclerolaena,Sclerolaena cornishiana," intricately branched annual or perennial, herb, 0.2-0.5 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,,,herbaceous, -Sclerolaena,Sclerolaena costata," woody perennial, herb, 0.1-0.3 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Sclerolaena,Sclerolaena costata," woody perennial, herb, 0.1-0.3 m high. ",perennial,perennial,,,herb,herb,,,,,,,woody, Sclerolaena,Sclerolaena crenata," annual or perennial (short-lived), herb, 0.1-0.4 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,,,herbaceous, Sclerolaena,Sclerolaena cuneata," intricately branched, spreading perennial, herb, 0.1-0.3 m high. ",perennial,perennial,,,herb,herb,,,,,spreading,spreading,herbaceous, Sclerolaena,Sclerolaena densiflora," erect to sprawling perennial, herb, 0.05-0.3 m high. ",perennial,perennial,,,herb,herb,,,,,erect sprawling,erect sprawling,herbaceous, @@ -11501,7 +11501,7 @@ Sclerolaena,Sclerolaena hostilis," intricately branched perennial, herb, 0.2-0.6 Sclerolaena,Sclerolaena johnsonii," bushy, intricately branched annual or perennial, herb, to 0.4 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,bushy,bushy,herbaceous, Sclerolaena,Sclerolaena microcarpa," decumbent villous perennial, herb. ",perennial,perennial,,,herb,herb,,,,,decumbent,decumbent,herbaceous, Sclerolaena,Sclerolaena minuta," annual or perennial (short-lived), herb, 0.08-0.2 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,,,herbaceous, -Sclerolaena,Sclerolaena parviflora," erect, woody perennial, herb, 0.1-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, +Sclerolaena,Sclerolaena parviflora," erect, woody perennial, herb, 0.1-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,woody, Sclerolaena,Sclerolaena patenticuspis," erect to spreading perennial, herb, 0.05-0.3 m high. ",perennial,perennial,,,herb,herb,,,,,erect spreading,erect spreading,herbaceous, Sclerolaena,Sclerolaena recurvicuspis," rounded perennial, herb, 0.1-0.3(-0.5) m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Sclerolaena,Sclerolaena stylosa," rounded shrub, 0.2-0.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, @@ -11509,12 +11509,12 @@ Sclerolaena,Sclerolaena symoniana," shrub, ca 0.3 m high. ",perennial,inferred_f Sclerolaena,Sclerolaena beaugleholei," shrub, ca 0.3 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Sclerolaena,Sclerolaena gardneri," prostrate perennial, herb, 0.1-0.3 m high. ",perennial,perennial,,,herb,herb,,,,,prostrate,prostrate,herbaceous, Sclerolaena,Sclerolaena limbata," shrub, to 1 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, -Sclerolaena,Sclerolaena lanicuspis," woody perennial, herb, 0.1-0.35 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Sclerolaena,Sclerolaena lanicuspis," woody perennial, herb, 0.1-0.35 m high. ",perennial,perennial,,,herb,herb,,,,,,,woody, Sclerolaena,Sclerolaena medicaginoides," straggly shrub, 0.3-0.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Sclerolaena,Sclerolaena decurrens," shrub, to 0.2 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Sclerolaena,Sclerolaena muelleri," sprawling perennial, herb, to 0.6 m high. ",perennial,perennial,,,herb,herb,,,,,sprawling,sprawling,herbaceous, Sclerolaena,Sclerolaena obliquicuspis," erect, spreading perennial, herb, 0.1-0.35 m high. ",perennial,perennial,,,herb,herb,,,,,erect spreading,erect spreading,herbaceous, -Sclerolaena,Sclerolaena tetragona," woody perennial, herb, 0.1-0.3 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Sclerolaena,Sclerolaena tetragona," woody perennial, herb, 0.1-0.3 m high. ",perennial,perennial,,,herb,herb,,,,,,,woody, Sclerolaena,Sclerolaena tridens," open perennial, herb, ca 0.3 m high. ",perennial,perennial,,,herb,herb,,,,,open,open,herbaceous, Sclerolaena,Sclerolaena uniflora," sprawling perennial, herb, 0.05-0.3(-0.6) m high. ",perennial,perennial,,,herb,herb,,,,,sprawling,sprawling,herbaceous, Sclerolaena,Sclerolaena urceolata," rounded, fleshy herb. ",,,,,herb,herb,,,,,,,herbaceous, @@ -11532,7 +11532,7 @@ Sehima,Sehima nervosum," tufted perennial, g or herb, 0.5-1.5 m high. ",perennia Selaginella,Selaginella ciliaris," tufted, as opposed to rhizomatous herb or (fern ally), 0.01-0.05 m high. ",,,,,herb fern,herb fern,,,,,rhizomatous,rhizomatous,herbaceous, Selaginella,Selaginella gracillima," annual, herb or (fern ally), 0.01-0.09 m high, leaves all alike. ",annual,annual,,,herb fern,herb fern,,,,,,,herbaceous, Selaginella,Selaginella pygmaea," tufted herb or (fern ally), 0.04 m high. ",,,,,herb fern,herb fern,,,,,,,herbaceous, -Selliera,Selliera radicans," prostrate, woody perennial, herb. ",perennial,perennial,,,herb,herb,,,,,prostrate,prostrate,herbaceous, +Selliera,Selliera radicans," prostrate, woody perennial, herb. ",perennial,perennial,,,herb,herb,,,,,prostrate,prostrate,woody, Senecio,Senecio gregorii," erect, fleshy annual, herb, to 1 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Senecio,Senecio squarrosus," erect or ascending perennial, herb, ca 0.3 m high, stems & leaf veins purple. ",perennial,perennial,,,herb,herb,,,,,erect decumbent,erect ascending,herbaceous, Senecio,Senecio vulgaris," erect, rather succulent annual, herb, 0.05-0.4(-0.75) m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, @@ -11909,7 +11909,7 @@ Stachystemon,Stachystemon vinosus," compact shrub, to 0.1 m high. ",perennial,in Stachystemon,Stachystemon axillaris," diffuse shrub, to 1.2 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Stachystemon,Stachystemon brachyphyllus," diffuse to compact shrub, to 0.7 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,compact,compact,woody, Stachystemon,Stachystemon polyandrus," diffuse to straggling shrub, to 0.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, -Stachytarpheta,Stachytarpheta cayennensis," erect, woody perennial, herb or shrub, 0.7-2 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, +Stachytarpheta,Stachytarpheta cayennensis," erect, woody perennial, herb or shrub, 0.7-2 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody, Stachytarpheta,Stachytarpheta jamaicensis," perennial, herb or shrub, to 0.6 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,,,woody herbaceous, Stackhousia,Stackhousia dielsii," s perennial, herb, 0.2-0.6 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stackhousia,Stackhousia intermedia," annual, herb, 0.1-0.8 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, @@ -11997,7 +11997,7 @@ Stirlingia,Stirlingia abrotanoides," perennial, suckering herb or shrub, ",peren Stirlingia,Stirlingia seselifolia," erect perennial, herb or shrub, 0.3-1 m high. ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, Stirlingia,Stirlingia anethifolia," shrub, 0.15-0.7 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Stirlingia,Stirlingia divaricatissima," shrub, to 1.7 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, -Stirlingia,Stirlingia simplex," erect, woody perennial, suckering herb or shrub, ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody herbaceous, +Stirlingia,Stirlingia simplex," erect, woody perennial, suckering herb or shrub, ",perennial,perennial,,,herb shrub,herb shrub,,,,,erect,erect,woody, Stirlingia,Stirlingia latifolia," erect, lignotuberous shrub, 0.2-1.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect,erect,woody, Strangea,Strangea cynanchicarpa," low, many-stemmed, spreading, lignotuberous shrub, 0.3-1(-1.5) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,spreading,spreading,woody, Strangea,Strangea stenocarpoides," slender erect or decumbent, lignotuberous shrub, 0.2-1.2 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect decumbent,erect decumbent,woody, @@ -12027,7 +12027,7 @@ Stylidium,Stylidium utricularioides," slender annual (ephemeral), herb, 0.05-0.1 Stylidium,Stylidium verticillatum," sprawling perennial, herb, 0.1-0.32 m high, leaves in whorls, linear to narrowly oblanceolate, 0.25-3 cm long, 0.3-0.9 mm wide, apex subacute to acute, margin entire, glabrous. ",perennial,perennial,,,herb,herb,,,,,sprawling,sprawling,herbaceous, Stylidium,Stylidium violaceum," rosetted perennial, herb, 0.2-0.5 m high, leaves tufted, linear to narrowly oblanceolate, 2-8 cm long, 0.5-3.2 mm wide, apex subacute, margin entire, glabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium xanthopis," rosetted herb, 0.04-0.1 m high. ",,,,,herb,herb,,,,,,,herbaceous, -Stylidium,Stylidium yilgarnense," caespitose perennial, herb, 0.07-0.4 m high, leaves tufted, broadly linear to narrowly oblanceolate, 3-15 cm long, 1.5-5 mm wide, apex acute to mucronate, margin hyaline, glabrous. acacia, mallee or allocasuarina shrubland. ",perennial,perennial,,,herb mallee,herb mallee,,,,,caespitose,caespitose,herbaceous, +Stylidium,Stylidium yilgarnense," caespitose perennial, herb, 0.07-0.4 m high, leaves tufted, broadly linear to narrowly oblanceolate, 3-15 cm long, 1.5-5 mm wide, apex acute to mucronate, margin hyaline, glabrous. acacia, mallee or allocasuarina shrubland. ",perennial,perennial,,,herb,herb,,,,,caespitose,caespitose,herbaceous, Stylidium,Stylidium drummondianum," rosetted perennial, herb, 0.05-0.22 m high, leaves narrowly oblanceolate, 0.5-3 cm long, 0.8-2 mm wide, apex mucronate, margin hyaline and serrulate, glabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium diceratum," fibrous rooted annual, herb, 0.15-0.35 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium chiddarcoopingense," caespitose perennial, herb, 0.2-0.45 m high, leaves tufted, linear, 12-26 cm long, 0.5-0.9 mm wide, apex acute to mucronate, margin involute, glabrous. ",perennial,perennial,,,herb,herb,,,,,caespitose,caespitose,herbaceous, @@ -12056,7 +12056,7 @@ Stylidium,Stylidium sp. Dewars Pool (K.F. Kenneally 11400)," perennial, herb. ", Stylidium,Stylidium sp. Mt Barker (E.J. Croxford 1906)," herb, to 0.25 m high. ",,,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium obtusatum var. rubricalyx," bulbforming perennial, herb, 0.03-0.1 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium aeonioides," rosetted perennial, herb, 0.05-0.4 m high, leaves adpressed to soil, oblanceolate, 0.7-3 cm long, 1.5-5 mm wide, apex subacute, margin hyaline, glabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Stylidium,Stylidium albomontis," rosetted perennial, herb, 0.18-0.9 m high, leaves tufted, linear, 6-30 cm long, 1-4 mm wide, apex mucronate, margin involute, scabrous. mallee shrubland and heath. ",perennial,perennial,,,herb mallee,herb mallee,,,,,,,herbaceous, +Stylidium,Stylidium albomontis," rosetted perennial, herb, 0.18-0.9 m high, leaves tufted, linear, 6-30 cm long, 1-4 mm wide, apex mucronate, margin involute, scabrous. mallee shrubland and heath. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium amoenum," rosetted perennial, herb, 0.1-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium arenicola," caespitose perennial, herb, 0.03-0.25 m high. ",perennial,perennial,,,herb,herb,,,,,caespitose,caespitose,herbaceous, Stylidium,Stylidium falcatum," perennial, herb, 0.15-0.35(-0.6) m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -12071,7 +12071,7 @@ Stylidium,Stylidium luteum," rosetted perennial, herb, 0.2-0.6 m high, leaves tu Stylidium,Stylidium pilosum," rosetted perennial, herb, 0.25-0.75 m high, leaves tufted, narrowly oblanceolate, 15-42 cm long, 2-8 mm wide, apex acute, margin involute, glabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium plantagineum," rosetted perennial, herb, 0.4-1 m high, leaves tufted, narrowly oblanceolate, 15-60 cm long, 6.5-17 mm wide, apex acute, margin involute, glabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium preissii," sprawling perennial, herb, 0.05-0.18 m high, leaves adpressed to stem, lanceolate, 0.15-0.25 cm long, 0.4-1.5 mm wide, apex acute, margin hyaline and fimbriate, glabrous. ",perennial,perennial,,,herb,herb,,,,,sprawling,sprawling,herbaceous, -Stylidium,Stylidium pseudohirsutum," rosetted perennial, herb, 0.09-0.42 m high, leaves tufted, linear, 2-16 cm long, 0.6-1.3 mm wide, apex subacute, margin involute, scabrous. mallee, acacia or myrtaceous shrubland. ",perennial,perennial,,,herb mallee,herb mallee,,,,,,,herbaceous, +Stylidium,Stylidium pseudohirsutum," rosetted perennial, herb, 0.09-0.42 m high, leaves tufted, linear, 2-16 cm long, 0.6-1.3 mm wide, apex subacute, margin involute, scabrous. mallee, acacia or myrtaceous shrubland. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium warriedarense," creeping perennial, herb, to 0.07 m high, elevated on stilt roots to 2.5 cm long, forming a network to 15 cm wide. ",perennial,perennial,,,herb,herb,,,,,creeping,creeping,herbaceous, Stylidium,Stylidium pseudosacculatum," creeping perennial, herb, 0.04-0.15 m high, leaves adpressed to stem, linear-lanceolate to lanceolate, 0.2-0.55 cm long, 0.6-1.2 mm wide, apex mucronate, margin hyaline, glabrous. ",perennial,perennial,,,herb,herb,,,,,creeping,creeping,herbaceous, Stylidium,Stylidium pingrupense," creeping perennial, herb, elevated above the soil on stilt roots 1-1.5 cm long; forming a tangled mat up to 1 m wide. ",perennial,perennial,,,herb,herb,,,,,creeping,creeping,herbaceous, @@ -12098,8 +12098,8 @@ Stylidium,Stylidium floodii," erect, delicate herb, 0.05-0.3 m high. ",,,,,herb, Stylidium,Stylidium floribundum," rosetted annual, herb, to 0.5 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium galioides," creeping to semi-scandent perennial, herb, 0.1-0.3 m high, leaves in whorls, oblanceolate, 0.25-4 cm long, 0.7-6 mm wide, apex subacute to acute, margin entire, glabrous. ",perennial,perennial,,,herb,herb,,,,,creeping climbing,creeping scandent,herbaceous, Stylidium,Stylidium glandulosum," compact, leafy perennial, herb, 0.15-0.4 m high, leaves subulate to narrowly oblanceolate, 0.6-2.5 cm long, 0.7-2 mm wide, apex mucronate, margin entire, glabrous or minutely papillose. ",perennial,perennial,,,herb,herb,,,,,compact,compact,herbaceous, -Stylidium,Stylidium longibracteatum," caespitose, woody perennial, herb, 0.1-0.2 m high. ",perennial,perennial,,,herb,herb,,,,,caespitose,caespitose,herbaceous, -Stylidium,Stylidium macranthum," rosetted perennial, herb, 0.1-0.5 m high, leaves tufted, linear, 4-26 cm long, 0.6-2.1 mm wide, apex acute to mucronate, margin involute, glabrous. mallee shrubland, low heath. ",perennial,perennial,,,herb mallee,herb mallee,,,,,,,herbaceous, +Stylidium,Stylidium longibracteatum," caespitose, woody perennial, herb, 0.1-0.2 m high. ",perennial,perennial,,,herb,herb,,,,,caespitose,caespitose,woody, +Stylidium,Stylidium macranthum," rosetted perennial, herb, 0.1-0.5 m high, leaves tufted, linear, 4-26 cm long, 0.6-2.1 mm wide, apex acute to mucronate, margin involute, glabrous. mallee shrubland, low heath. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium maitlandianum," rosetted perennial, herb, 0.29-0.7 m high, leaves adpressed to soil, spathulate, 1-5 cm long, 2-10 mm wide, apex subacute, margin hyaline, glabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium obtusatum," cormous, perennial, herb, 0.03-0.1 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium pseudocaespitosum," rosetted perennial, herb, 0.1-0.3 m high, leaves tufted, linear, 2-7 cm long, 0.5-2 mm wide, apex subacute, margin entire, scabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -12142,8 +12142,8 @@ Stylidium,Stylidium stenosepalum," rosetted perennial, herb, 0.12-0.38 m high, l Stylidium,Stylidium thylax," creeping perennial, herb, 0.04-0.08 m high, leaves adpressed to stem, ovate to lanceolate, 0.1-0.4 cm long, 0.6-1.5 mm wide, apex mucronate, margin hyaline, glabrous. ",perennial,perennial,,,herb,herb,,,,,creeping,creeping,herbaceous, Stylidium,Stylidium leptorrhizum," erect, rosetted annual, herb, 0.08-0.45 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Stylidium,Stylidium merrallii," rosetted perennial, herb. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Stylidium,Stylidium daphne," rosetted perennial, herb, 0.15-0.45 m high, leaves tufted, linear to narrowly oblanceolate, 1-4.5 cm long, 0.5-2 (-3) mm wide, apex subacute, margin entire, hoary. mallee or melaleuca shrubland. ",perennial,perennial,,,herb mallee,herb mallee,,,,,,,herbaceous, -Stylidium,Stylidium sejunctum," caespitose perennial, herb, 0.25-0.45 m high, leaves tufted, linear to narrowly oblanceolate, 10-30 cm long, 0.8-4 mm wide, apex acute to mucronate, margin involute, glabrous to scabrous. mallee and allocasuarina shrubland. ",perennial,perennial,,,herb mallee,herb mallee,,,,,caespitose,caespitose,herbaceous, +Stylidium,Stylidium daphne," rosetted perennial, herb, 0.15-0.45 m high, leaves tufted, linear to narrowly oblanceolate, 1-4.5 cm long, 0.5-2 (-3) mm wide, apex subacute, margin entire, hoary. mallee or melaleuca shrubland. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Stylidium,Stylidium sejunctum," caespitose perennial, herb, 0.25-0.45 m high, leaves tufted, linear to narrowly oblanceolate, 10-30 cm long, 0.8-4 mm wide, apex acute to mucronate, margin involute, glabrous to scabrous. mallee and allocasuarina shrubland. ",perennial,perennial,,,herb,herb,,,,,caespitose,caespitose,herbaceous, Stylidium,Stylidium weeliwolli," annual, herb, 0.1-0.25 m high, throat appendages 4, rod-shaped. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium piliferum," rosetted perennial, herb, 0.1-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium petiolare," bulbforming perennial, herb, 0.055-0.15 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -12164,13 +12164,13 @@ Stylidium,Stylidium multiscapum," rosetted annual, herb, 0.08-0.3 m high. ",annu Stylidium,Stylidium muscicola," delicate, often trailing annual, herb, 0.05-0.4 m high. ",annual,annual,,,herb,herb,,,,,prostrate,trailing,herbaceous, Stylidium,Stylidium neglectum," creeping perennial, herb. ",perennial,perennial,,,herb,herb,,,,,creeping,creeping,herbaceous, Stylidium,Stylidium nonscandens," erect perennial, herb, 0.18-0.46 m high, leaves in whorls, linear, 0.2-4.2 cm long, 0.4-1.2 mm wide, apex subacute to acute, margin entire, glabrous. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Stylidium,Stylidium nungarinense," caespitose perennial, herb, 0.12-0.47 m high, leaves tufted, narrowly oblanceolate to oblanceolate, 10-35 cm long, (1-) 2-8 mm wide, apex acute to mucronate, margin involute, glabrous. mallee woodland, allocasuarina shrubland. ",perennial,perennial,,,herb mallee,herb mallee,,,,,caespitose,caespitose,herbaceous, +Stylidium,Stylidium nungarinense," caespitose perennial, herb, 0.12-0.47 m high, leaves tufted, narrowly oblanceolate to oblanceolate, 10-35 cm long, (1-) 2-8 mm wide, apex acute to mucronate, margin involute, glabrous. mallee woodland, allocasuarina shrubland. ",perennial,perennial,,,herb,herb,,,,,caespitose,caespitose,herbaceous, Stylidium,Stylidium pachyrrhizum," perennial, herb, 0.2-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium pendulum," caespitose perennial, herb, 0.09-0.35 m high, leaves tufted, broadly linear to narrowly oblanceolate, 3-14 cm long, 0.5-2 mm wide, apex mucronate, margin minutely toothed, glabrous. ",perennial,perennial,,,herb,herb,,,,,caespitose,caespitose,herbaceous, Stylidium,Stylidium periscelianthum," bulbforming perennial, herb, 0.07-0.15 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium perpusillum," slender annual (ephemeral), herb, 0.015-0.025(-0.04) m high. ",ephemeral annual,ephemeral annual,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium coroniforme subsp. coroniforme," rosetted perennial, herb, 0.07-0.18 m high, leaves narrowly oblanceolate to oblanceolate, 1-4 cm long, 1-2.5 mm wide, apex mucronate, marginate, glabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Stylidium,Stylidium applanatum," rosetted perennial, herb, 0.12-0.35 m high, leaves adpressed to soil, oblanceolate, 1.5-4 cm long, 2.5-6 mm wide, apex subacute, margin entire, glabrous. hillslopes, mallee shrubland. ",perennial,perennial,,,herb mallee,herb mallee,,,,,,,herbaceous, +Stylidium,Stylidium applanatum," rosetted perennial, herb, 0.12-0.35 m high, leaves adpressed to soil, oblanceolate, 1.5-4 cm long, 2.5-6 mm wide, apex subacute, margin entire, glabrous. hillslopes, mallee shrubland. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium scariosum," perennial, herb, 0.1-0.8 m high, leaves tufted, narrowly oblanceolate, 0.75-4 cm long, 0.7-2 mm wide, apex subacute to acute, margin entire, glabrous or minutely papillose. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium nymphaeum," scandent perennial, herb, 1.4-2.5 m high, leaves in whorls, linear, 1.5-7.5 cm long, 0.8-2 mm wide, apex curled, margin entire, glabrous. ",perennial,perennial,,,herb,herb,,,,,climbing,scandent,herbaceous, Stylidium,Stylidium bicolor," rosetted perennial, herb, 0.01-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -12187,7 +12187,7 @@ Stylidium,Stylidium diuroides subsp. nanum," erect perennial, herb, 0.06-0.11 m Stylidium,Stylidium cymiferum," rosetted perennial, herb, 0.12-0.35 m high, leaves oblanceolate to spathulate, 0.5-1.5 cm long, 1-2.7 mm wide, apex obtuse to subacute, margin entire, glandular. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium coatesianum," rosetted perennial, herb, 0.15-0.38 m high, leaves tufted, narrowly oblanceolate, 1-4.5 cm long, 1-4 mm wide, apex subacute, margin entire, hoary. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium carlquistii," leafy-stemmed perennial, herb, (0.1-)0.25-0.6 m high, leaves narrowly oblanceolate, 1.2-4.2 cm long, 1-5 mm wide, apex subacute to acuminate, margin entire, glabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Stylidium,Stylidium albolilacinum," rosetted perennial, herb, 0.1-0.36 m high, leaves tufted, linear, 0.8-4.5 cm long, 0.4-1 mm wide, apex subacute, margin entire, glandular. proteaceous or mallee shrubland, heath, jarrah forest. ",perennial,perennial,,,herb mallee,herb mallee,,,,,,,herbaceous, +Stylidium,Stylidium albolilacinum," rosetted perennial, herb, 0.1-0.36 m high, leaves tufted, linear, 0.8-4.5 cm long, 0.4-1 mm wide, apex subacute, margin entire, glandular. proteaceous or mallee shrubland, heath, jarrah forest. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium emarginatum subsp. exappendiculatum," bulbforming perennial, herb, 0.03-0.065 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium ireneae," lax perennial, herb, (0.06-)0.1-0.28 m high, leaves oblanceolate, 0.4-2 cm long, 1-3 (-5) mm wide, apex subacute to acuminate, margin entire, glandular. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium laciniatum," twining perennial, herb, 0.75-3 m high, leaves in mature plants. where present linear or subulate, 0.4-2 cm long, 0.6-1.2 mm wide, apex acute, margin entire, glabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -12205,7 +12205,7 @@ Stylidium,Stylidium rupestre," clump-forming perennial, herb, 0.07-0.2 m high, l Stylidium,Stylidium androsaceum," delicate, erect, open annual or perennial, herb, to 0.15 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect open,erect open,herbaceous, Stylidium,Stylidium scandens," scandent perennial, herb, 0.4-0.85 m high, leaves in whorls, linear, 1.5-6 cm long, 0.6-1.7 mm wide, apex curled, margin entire, glabrous. ",perennial,perennial,,,herb,herb,,,,,climbing,scandent,herbaceous, Stylidium,Stylidium calcaratum," slender, rosetted annual (ephemeral), herb, 0.02-0.2 m high, throat appendages 2, reniform. ",ephemeral annual,ephemeral annual,,,herb,herb,,,,,,,herbaceous, -Stylidium,Stylidium caricifolium," caespitose perennial, herb, 0.15-0.5 m high, leaves tufted, linear to narrowly oblanceolate, 7-32 cm long, 1-5 (-6.5) mm wide, apex acute, margin involute, scabrous, rarely glabrous. wandoo or mallee woodland, allocasuarina shrubland. ",perennial,perennial,,,herb mallee,herb mallee,,,,,caespitose,caespitose,herbaceous, +Stylidium,Stylidium caricifolium," caespitose perennial, herb, 0.15-0.5 m high, leaves tufted, linear to narrowly oblanceolate, 7-32 cm long, 1-5 (-6.5) mm wide, apex acute, margin involute, scabrous, rarely glabrous. wandoo or mallee woodland, allocasuarina shrubland. ",perennial,perennial,,,herb,herb,,,,,caespitose,caespitose,herbaceous, Stylidium,Stylidium ciliatum," rosetted perennial, herb, 0.1-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium lepidum," spreading, rosetted perennial, herb, ca 0.05 m high, forming densely packed colonies. ",perennial,perennial,,,herb,herb,,,,,spreading,spreading,herbaceous, Stylidium,Stylidium hesperium," perennial, herb, 0.15-0.7 m high, leaves subulate to narrowly oblanceolate, 1-3.5 cm long, 0.7-2.5 mm wide, apex acute, margin entire, glabrous or minutely papillose. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -12234,8 +12234,8 @@ Stylidium,Stylidium hirsutum," rosetted perennial, herb, 0.12-0.57 m high, leave Stylidium,Stylidium inaequipetalum, herb. ,,,,,herb,herb,,,,,,,herbaceous, Stylidium,Stylidium induratum," creeping perennial, herb, 0.05-0.2 m high. ",perennial,perennial,,,herb,herb,,,,,creeping,creeping,herbaceous, Stylidium,Stylidium leptocalyx," rosetted perennial, herb, 0.08-0.4 m high, leaves tufted, linear, 3.5-16 cm long, 1.1-2.2 mm wide, apex acute, margin involute, scabrous. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, -Stylidium,Stylidium turleyae," rosetted perennial, herb, 0.08-0.32 m high, leaves tufted, linear, 1-7 cm long, 1-3 mm wide, apex subacute, margin entire, glabrous. mallee or melaleuca shrubland, heath. ",perennial,perennial,,,herb mallee,herb mallee,,,,,,,herbaceous, -Stylidium,Stylidium gloeophyllum," rosetted perennial, herb, 0.13-0.47 m high, leaves tufted, oblanceolate, 1.5-7 cm long, 2-12 mm wide, apex subacute, margin entire, glandular. agonis, mallee, or hakea shrubland with sedges. ",perennial,perennial,,,herb mallee graminoid,herb mallee sedges,,,,,,,herbaceous, +Stylidium,Stylidium turleyae," rosetted perennial, herb, 0.08-0.32 m high, leaves tufted, linear, 1-7 cm long, 1-3 mm wide, apex subacute, margin entire, glabrous. mallee or melaleuca shrubland, heath. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Stylidium,Stylidium gloeophyllum," rosetted perennial, herb, 0.13-0.47 m high, leaves tufted, oblanceolate, 1.5-7 cm long, 2-12 mm wide, apex subacute, margin entire, glandular. agonis, mallee, or hakea shrubland with sedges. ",perennial,perennial,,,herb graminoid,herb sedges,,,,,,,herbaceous, Stylidium,Stylidium validum," caespitose perennial, herb, 0.06-0.3 m high, leaves tufted, oblanceolate, 1.5-10 cm long, 2.2-6 mm wide, apex acute to acuminate, margin entire, glabrous, glaucous. ",perennial,perennial,,,herb,herb,,,,,caespitose,caespitose,herbaceous, Stylidium,Stylidium lateriticola," stoloniferous, erect, bushy perennial, herb, 0.1-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect stoloniferous bushy,erect stoloniferous bushy,herbaceous, Stylidium,Stylidium striatum," rosetted perennial, herb, 0.15-0.55 m high, leaves erect, oblanceolate to spathulate, 1.5-4 cm long, 1.5-6 mm wide, apex acute to acuminate, margin entire, glabrous, striate. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, @@ -12647,7 +12647,7 @@ Thelymitra,Thelymitra xanthotricha, herb. swampy creeklines. ,,,,,herb,herb,,,,, Thelymitra,Thelymitra magnifica," perennial, herb. stony ridges. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Thelymitra,Thelymitra paludosa," tuberous, perennial, herb, to 0.75 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Thelymitra,Thelymitra sp. Slender Sun Orchid (A.R. Annels 2884)," herb, 0.25 m high. ",,,,,herb,herb,,,,,,,herbaceous, -Thelymitra,Thelymitra sp. Esperance (N.S. Lander 1080)," tuberous, perennial, herb. amongst mallee. ",perennial,perennial,,,herb mallee,herb mallee,,,,,,,herbaceous, +Thelymitra,Thelymitra sp. Esperance (N.S. Lander 1080)," tuberous, perennial, herb. amongst mallee. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Thelymitra,Thelymitra campanulata," tuberous, perennial, herb, 0.2-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Thelymitra,Thelymitra canaliculata," tuberous, perennial, herb, 0.2-0.75 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, Thelymitra,Thelymitra cornicina," tuberous, perennial, herb, 0.2-0.5 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, @@ -12816,7 +12816,7 @@ Thysanotus,Thysanotus thyrsoideus," perennial, herb (with tuberous roots), 0.15- Tietkensia,Tietkensia corrickiae," small, rosetted annual, herb. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Timonius,Timonius timon," tree or shrub, 1.5-15 m high. ",perennial,inferred_from_growth_form,,,shrub tree,shrub tree,,,,,,,woody, Tinospora,Tinospora esiangkara," climber, to 2 m high, large stems with brown, flaky bark. ",,,,,climber,climber,,,,,,,, -Tinospora,Tinospora smilacina," slender, woody, deciduous climber. ",,,,,climber,climber,,,,,,,, +Tinospora,Tinospora smilacina," slender, woody, deciduous climber. ",,,,,climber_woody,climber,,,,,,,woody, Tolpis,Tolpis barbata," erect annual, herb, 0.2-0.5 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Tolpis,Tolpis virgata," erect tuberous, annual or perennial, herb, to 1.5 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, Tournefortia,Tournefortia muelleri," shrub, up to 1(-4) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, @@ -12916,7 +12916,7 @@ Tricoryne,Tricoryne sp. Mullewa (G.J. Keighery 12080)," tangled, clumped rhizoma Tricoryne,Tricoryne sp. South Coast (T.E.H. Aplin 2653)," rhizomatous, perennial, herb, 0.25 m high. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, Tricoryne,Tricoryne sp. Morawa (G.J. Keighery & N. Gibson 6759)," sprawling annual, herb, to 0.2 m high. ",annual,annual,,,herb,herb,,,,,sprawling,sprawling,herbaceous, Tricoryne,Tricoryne sp. Kimberley (K.F. Kenneally 4857)," rhizomatous, perennial, herb, 0.15-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, -Tricoryne,Tricoryne sp. Eneabba (E.A. Griffin 1200)," erect, open, woody rhizomatous, perennial, herb, to 0.5 m high. ",perennial,perennial,,,herb,herb,,,,,erect rhizomatous open,erect rhizomatous open,herbaceous, +Tricoryne,Tricoryne sp. Eneabba (E.A. Griffin 1200)," erect, open, woody rhizomatous, perennial, herb, to 0.5 m high. ",perennial,perennial,,,herb,herb,,,,,erect rhizomatous open,erect rhizomatous open,woody, Tricoryne,Tricoryne sp. Geraldton (G.J. Keighery 10461)," erect rhizomatous, perennial, herb, to 0.6 m high. ",perennial,perennial,,,herb,herb,,,,,erect rhizomatous,erect rhizomatous,herbaceous, Tricoryne,Tricoryne sp. Hamersley Range (S. van Leeuwen 915)," rhizomatous, perennial, herb, ca 1 m high. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, Tricoryne,Tricoryne sp. Great Victoria Desert western dunes (C. Slee 645-211)," rhizomatous, perennial, herb, to 0.3 m high. ",perennial,perennial,,,herb,herb,,,,,rhizomatous,rhizomatous,herbaceous, @@ -13070,7 +13070,7 @@ Triumfetta,Triumfetta reflexa," procumbent or spreading shrub, to 0.8 m high. ", Triumfetta,Triumfetta echinata," prostrate shrub, to 0.3 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,prostrate,prostrate,woody, Triumfetta,Triumfetta rupestris," spreading to ascending shrub, 0.3-0.6(-1.5) m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,decumbent spreading,ascending spreading,woody, Triumfetta,Triumfetta appendiculata," erect slender or spreading shrub, 0.3-1.8 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,erect spreading,erect spreading,woody, -Triumfetta,Triumfetta pentandra," woody annual, herb or shrub, to 1.5 m high. ",annual,annual,,,herb shrub,herb shrub,,,,,,,woody herbaceous, +Triumfetta,Triumfetta pentandra," woody annual, herb or shrub, to 1.5 m high. ",annual,annual,,,herb shrub,herb shrub,,,,,,,woody, Triumfetta,Triumfetta fissurata," shrub, to 0.5 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, Triumfetta,Triumfetta bradshawii," open, muchbranched shrub, 0.7-2 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,open,open,woody, Triumfetta,Triumfetta longipedunculata," shrub, 0.8-3 m high. ",perennial,inferred_from_growth_form,,,shrub,shrub,,,,,,,woody, @@ -13465,26 +13465,26 @@ Vittadinia,Vittadinia blackii," perennial, herb or shrub, 0.1-0.3 m high. ",pere Vittadinia,Vittadinia cervicularis," annual, herb, 0.1-0.3 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Vittadinia,Vittadinia arida," upright annual, herb, 0.1-0.4 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Vittadinia,Vittadinia australasica," short-lived, erect, muchbranched annual or perennial, herb, 0.1-0.25 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, -Vittadinia,Vittadinia cuneata," semi-woody annual or perennial, herb, 0.1-0.4 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,,,herbaceous, +Vittadinia,Vittadinia cuneata," semi-woody annual or perennial, herb, 0.1-0.4 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,,,soft_wood, Vittadinia,Vittadinia dissecta," erect, muchbranched, viscid annual or perennial, short-lived herb, 0.1-0.4 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, Vittadinia,Vittadinia eremaea," erect annual, herb, 0.05-0.4 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, -Vittadinia,Vittadinia gracilis," erect, woody perennial, herb, 0.1-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,herbaceous, +Vittadinia,Vittadinia gracilis," erect, woody perennial, herb, 0.1-0.4 m high. ",perennial,perennial,,,herb,herb,,,,,erect,erect,woody, Vittadinia,Vittadinia hispidula," annual, herb. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Vittadinia,Vittadinia humerata," annual, herb, 0.08-0.2 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Vittadinia,Vittadinia nullarborensis," annual, herb, 0.1-0.3 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Vittadinia,Vittadinia sulcata," erect, branched annual, herb, 0.1-0.3 m high. ",annual,annual,,,herb,herb,,,,,erect,erect,herbaceous, Vittadinia,Vittadinia spechtii," herb, to 0.5 m high. ",,,,,herb,herb,,,,,,,herbaceous, -Vittadinia,Vittadinia virgata," woody perennial, herb, to 0.3 m high. ",perennial,perennial,,,herb,herb,,,,,,,herbaceous, +Vittadinia,Vittadinia virgata," woody perennial, herb, to 0.3 m high. ",perennial,perennial,,,herb,herb,,,,,,,woody, Vittadinia,Vittadinia cervicularis var. occidentalis," annual, herb, more than 0.3 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Vittadinia,Vittadinia cervicularis var. cervicularis," annual, herb, 0.1-0.3 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, Vittadinia,Vittadinia hispidula var. setosa," annual, herb. ",annual,annual,,,herb,herb,,,,,,,herbaceous, -Vittadinia,Vittadinia cuneata var. cuneata," semi-woody annual or perennial, herb, 0.1-0.4 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,,,herbaceous, +Vittadinia,Vittadinia cuneata var. cuneata," semi-woody annual or perennial, herb, 0.1-0.4 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,,,soft_wood, Vittadinia,Vittadinia sp. A Kimberley Flora (R.J. Cranfield 6527)," erect herb, to 0.5 m high. ",,,,,herb,herb,,,,,erect,erect,herbaceous, Vittadinia,Vittadinia australasica var. oricola," short-lived, erect, muchbranched annual or perennial, herb, 0.1-0.25 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, Vittadinia,Vittadinia australasica var. subglabra," short-lived, erect, muchbranched annual or perennial, herb, 0.1-0.25 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, Vittadinia,Vittadinia australasica var. australasica," short-lived, erect, muchbranched annual or perennial, herb, 0.1-0.25 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, Vittadinia,Vittadinia cervicularis var. oldfieldii," annual, herb, 0.1-0.3 m high. ",annual,annual,,,herb,herb,,,,,,,herbaceous, -Vittadinia,Vittadinia obovata," woody annual or biennial, herb, to 0.6 m high. ",annual biennial,annual biennial,,,herb,herb,,,,,,,herbaceous, +Vittadinia,Vittadinia obovata," woody annual or biennial, herb, to 0.6 m high. ",annual biennial,annual biennial,,,herb,herb,,,,,,,woody, Vittadinia,Vittadinia pustulata," low annual, herb (sometimes persisting as an under-shrub), 0.1-0.3 m high. ",annual,annual,,,herb shrub,herb shrub,,,,,,,woody herbaceous, Vittadinia,Vittadinia dissecta var. hirta," erect, muchbranched, viscid annual or perennial, short-lived herb, 0.1-0.4 m high. ",annual perennial,annual perennial,,,herb,herb,,,,,erect,erect,herbaceous, Vittadinia,Vittadinia spechtii var. kimberleyensis," herb, to 0.5 m high. ",,,,,herb,herb,,,,,,,herbaceous, diff --git a/data/WAH_2022_2/metadata.yml b/data/WAH_2022_2/metadata.yml index 383f50ff8..63afcc9ab 100644 --- a/data/WAH_2022_2/metadata.yml +++ b/data/WAH_2022_2/metadata.yml @@ -4877,8 +4877,8 @@ taxonomic_updates: replace: Xanthosia sp. Dardanup (B.J.Keighery & N.Gibson 174) reason: match_07_fuzzy. Fuzzy alignment with accepted canonical name in APC (2022-11-21) taxonomic_resolution: Species -- find: XCyanthera glossodioides - replace: x Cyanthera glossodioides +- find: xCyanthera glossodioides + replace: X Cyanthera glossodioides reason: Manual alignment with canonical species name in APC (Elizabeth Wenk, 2022-11-22) taxonomic_resolution: Species - find: Xyris atrovirida @@ -4904,9 +4904,5 @@ taxonomic_updates: reason: match_14. Automatic alignment with species-level name known by APC when notes are ignored (2022-11-23) taxonomic_resolution: Species -- find: XCyanthera glossodioides - replace: x Cyanthera glossodioides - reason: manual match to canonical name in APC (Elizabeth Wenk, 2022-11-23) - taxonomic_resolution: Species exclude_observations: .na questions: .na diff --git a/data/Warren_2005/metadata.yml b/data/Warren_2005/metadata.yml index 95d807d36..2a9c33ba5 100644 --- a/data/Warren_2005/metadata.yml +++ b/data/Warren_2005/metadata.yml @@ -121,7 +121,7 @@ contexts: MAP = 550 mm ; Evaporation = 1500 mm/yr). traits: - var_in: photo (umol/m2/s) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: population value_type: mean @@ -147,7 +147,7 @@ traits: leaves per tree were collected for subsequent morphological measurements and chemical analyses. - var_in: Photo (nmol/g/s) - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: population value_type: mean @@ -173,7 +173,7 @@ traits: leaves per tree were collected for subsequent morphological measurements and chemical analyses. - var_in: Photo (nmol/g H2O/s) - unit_in: nmolCO2/gH20/s + unit_in: nmol{CO2}/gH20/s trait_name: .na entity_type: population value_type: mean @@ -199,7 +199,7 @@ traits: leaves per tree were collected for subsequent morphological measurements and chemical analyses. - var_in: Photo (umol/g N/s) - unit_in: umolCO2/gN/s + unit_in: umol{CO2}/g{N}/s trait_name: leaf_photosynthetic_nitrogen_use_efficiency_saturated entity_type: population value_type: mean @@ -225,7 +225,7 @@ traits: leaves per tree were collected for subsequent morphological measurements and chemical analyses. - var_in: gs - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: population value_type: mean @@ -251,7 +251,7 @@ traits: leaves per tree were collected for subsequent morphological measurements and chemical analyses. - var_in: Ci (umol/mol) - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: population value_type: mean @@ -277,7 +277,7 @@ traits: leaves per tree were collected for subsequent morphological measurements and chemical analyses. - var_in: WUE (mmol/mol) - unit_in: mmolCO2/molH2O + unit_in: mmol{CO2}/mol{H2O} trait_name: leaf_water_use_efficiency_photosynthetic entity_type: population value_type: mean @@ -303,7 +303,7 @@ traits: leaves per tree were collected for subsequent morphological measurements and chemical analyses. - var_in: d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: population value_type: mean @@ -316,7 +316,7 @@ traits: Centre. Subsamples were analyzed for total N by Dumas combustion (CHN-2000, LECO, St Joseph, MI). - var_in: d18O - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta18O entity_type: population value_type: mean @@ -329,8 +329,8 @@ traits: Centre. Subsamples were analyzed for total N by Dumas combustion (CHN-2000, LECO, St Joseph, MI). - var_in: quantum yield - unit_in: dimensionless - trait_name: leaf_fluorescence_Jmax_over_Vcmax + unit_in: '{dimensionless}' + trait_name: leaf_photosynthesis_Jmax_over_Vcmax entity_type: population value_type: mean basis_of_value: measurement diff --git a/data/Warren_2006/metadata.yml b/data/Warren_2006/metadata.yml index c1c486a61..7a00bf9f1 100644 --- a/data/Warren_2006/metadata.yml +++ b/data/Warren_2006/metadata.yml @@ -274,7 +274,7 @@ traits: California, Davis Stable Isotope Facility. The (one-sided) area of leaves was measured with a leaf-area meter (LI-3000A + LI-3050A, Li-Cor Inc., Lincoln, Nebraska). - var_in: d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: population value_type: mean diff --git a/data/Weerasinghe_2014/metadata.yml b/data/Weerasinghe_2014/metadata.yml index a780275c1..4b29c0d18 100644 --- a/data/Weerasinghe_2014/metadata.yml +++ b/data/Weerasinghe_2014/metadata.yml @@ -451,7 +451,7 @@ contexts: description: Light level in the understory; 11 PAR. traits: - var_in: Photo - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -479,7 +479,7 @@ traits: including PAR, leaf temperature, CO2 concentration in the cuvette and relative humidity.' - var_in: Cond - unit_in: molH2O/m2/s + unit_in: mol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -507,7 +507,7 @@ traits: including PAR, leaf temperature, CO2 concentration in the cuvette and relative humidity.' - var_in: Ci - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: raw @@ -535,7 +535,7 @@ traits: including PAR, leaf temperature, CO2 concentration in the cuvette and relative humidity.' - var_in: Trmmol - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: individual value_type: raw @@ -563,7 +563,7 @@ traits: including PAR, leaf temperature, CO2 concentration in the cuvette and relative humidity.' - var_in: Rdark - unit_in: neg_umolCO2/m2/s + unit_in: neg_umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: individual value_type: raw diff --git a/data/Wells_2012/metadata.yml b/data/Wells_2012/metadata.yml index 9afad0fe6..239224ce9 100644 --- a/data/Wells_2012/metadata.yml +++ b/data/Wells_2012/metadata.yml @@ -430,7 +430,7 @@ traits: weight was measured after drying at 60degC for >=48 hours (Garnier et al., 2001). basis_of_record: field - var_in: LSleaf - unit_in: 10^1*kN/m + unit_in: 10^1.kN/m trait_name: leaf_work_to_punch entity_type: individual value_type: mean @@ -477,7 +477,7 @@ traits: LDM. basis_of_record: field - var_in: LSS - unit_in: 10^1*MN/m2 + unit_in: 10^1.MN/m2 trait_name: leaf_work_to_punch_adjusted entity_type: individual value_type: mean @@ -608,7 +608,7 @@ traits: (2) basis_of_record: field - var_in: nLsample - unit_in: count + unit_in: '{count}' trait_name: .na entity_type: individual value_type: raw @@ -711,7 +711,7 @@ traits: life_stage: adult basis_of_record: field - var_in: ReproAge - unit_in: years + unit_in: a trait_name: reproductive_maturity entity_type: species value_type: bin @@ -721,7 +721,7 @@ traits: basis_of_record: literature life_stage: adult - var_in: ReproCLE - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: reproductive_light_environment_index entity_type: species value_type: mean @@ -899,7 +899,7 @@ traits: life_stage: seedling basis_of_record: literature - var_in: LEE - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: establishment_light_environment_index entity_type: species value_type: mean diff --git a/data/Wenk_2022/metadata.yml b/data/Wenk_2022/metadata.yml index 5aa3ed4da..d952de63a 100644 --- a/data/Wenk_2022/metadata.yml +++ b/data/Wenk_2022/metadata.yml @@ -1744,5 +1744,11 @@ taxonomic_updates: reason: match_10_fuzzy. Imprecise fuzzy alignment with accepted canonical name in APC (2022-11-23) taxonomic_resolution: Species -exclude_observations: .na +exclude_observations: +- variable: taxon_name + find: Cyrtomium falcatum 'Rochfordii', Dicentra formosa subsp. formosa 'Alba', Dodonaea viscosa 'Purpurea', Echinochloa polystachya 'Amity', Salix matsudana 'Tortuosa', Megathyrsus maximus var. maximus 'Hamil', Hymenachne amplexicaulis 'Olive', Grevillea 'Poorinda Constance', Platanus x hispanica 'Acerifolia' + reason: excluding cultivars +- variable: taxon_name + find: Salix x sepulcralis nothovar. chrysocoma, Salix x sepulcralis nothovar. sepulcralis, Salix x fragilis nothovar. furcata, Salix x fragilis nothovar. fragilis + reason: excluding nothovarietas questions: .na diff --git a/data/Westoby_2003/metadata.yml b/data/Westoby_2003/metadata.yml index 8005a655f..e4f8b4459 100644 --- a/data/Westoby_2003/metadata.yml +++ b/data/Westoby_2003/metadata.yml @@ -146,7 +146,7 @@ traits: 5 leaves from each of 5 individuals (mallee, June 1998). - var_in: twig A unit_in: mm2 - trait_name: twig_area + trait_name: branch_terminal_twig_cross_sectional_area entity_type: population value_type: mean basis_of_value: measurement @@ -166,7 +166,7 @@ traits: 5 leaves from each of 5 individuals (mallee, June 1998). - var_in: twig L unit_in: mm - trait_name: twig_length + trait_name: branch_terminal_twig_length entity_type: population value_type: mean basis_of_value: measurement diff --git a/data/Westoby_2014/metadata.yml b/data/Westoby_2014/metadata.yml index 6f73575ec..8a1cb6d40 100644 --- a/data/Westoby_2014/metadata.yml +++ b/data/Westoby_2014/metadata.yml @@ -448,7 +448,7 @@ traits: methods: Metal concentrations in leaves and stems were determined using inductively coupled plasma spectroscopy after acid digestion. - var_in: d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: population value_type: mean @@ -533,7 +533,7 @@ traits: methods: Mean, one-sided, projected area of c. 5-20 expanded leaves from five shoots per species. - var_in: Ksap (kg m-1 s-1 MPa -1) - unit_in: kg/m/s/MPa + unit_in: kg/m/MPa/s trait_name: sapwood_specific_conductivity entity_type: population value_type: mean @@ -576,7 +576,7 @@ traits: branch conductivity by the distal cross-sectional area (xylem) of each segment, subtracting pith. - var_in: KLA (leaf-specific conductivity (mg m-1 MPa-1 s-1)) - unit_in: mg/m/s/MPa + unit_in: mg/m/MPa/s trait_name: leaf_specific_conductivity entity_type: population value_type: mean @@ -619,7 +619,7 @@ traits: calculated by dividing branch conductivity by the distal cross-sectional area (xylem) of each segment, subtracting pith. - var_in: LA/SA at 1.0 cm (m2/m2) whole leaf - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean @@ -665,7 +665,7 @@ traits: to the pressure chamber for measurement. An effort was made to collect midday potentials during hot, sunny days. - var_in: Amass (umol/kg/s)_filtered - unit_in: umolCO2/kg/s + unit_in: umol{CO2}/kg/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: population value_type: mean @@ -690,7 +690,7 @@ traits: surface area. Much of the Round Hill mallee data is sourced from Wright_2002 and has been filtered out. - var_in: Aarea (umol m-2 s-1)_filtered - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: population value_type: mean @@ -715,7 +715,7 @@ traits: surface area. Much of the Round Hill mallee data is sourced from Wright_2002 and has been filtered out. - var_in: Rmass (umol/kg/s)_filtered - unit_in: umolCO2/kg/s + unit_in: umol{CO2}/kg/s trait_name: leaf_dark_respiration_per_dry_mass entity_type: population value_type: mean @@ -740,7 +740,7 @@ traits: surface area. Much of the Round Hill mallee data is sourced from Wright_2002 and has been filtered out. - var_in: Rarea - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_dark_respiration_per_area entity_type: population value_type: mean @@ -764,7 +764,7 @@ traits: mass per unit area (LMA) was calculated by dividing dry leaf mass by fresh leaf surface area. - var_in: WUE (mmol CO2/mol H2O/m2/s - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: leaf_water_use_efficiency_photosynthetic entity_type: population value_type: mean @@ -916,8 +916,8 @@ traits: methods: Metal concentrations in leaves and stems were determined using inductively coupled plasma spectroscopy after acid digestion. - var_in: K_leaf_max (mmol/m2/s/Mpa) - unit_in: mmol/m2/s/MPa - trait_name: leaf_hydraulic_conductivity + unit_in: mmol/m2/MPa/s + trait_name: leaf_specific_conductance entity_type: population value_type: maximum basis_of_value: measurement @@ -1227,7 +1227,7 @@ traits: which weights the vessels (n) within each vein order by their hydraulic contribution to total vein conductance (Tyree and Zimmermann, 2002). - var_in: ves_den_min - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_vessel_density entity_type: population value_type: mean @@ -1274,7 +1274,7 @@ traits: which weights the vessels (n) within each vein order by their hydraulic contribution to total vein conductance (Tyree and Zimmermann, 2002). - var_in: ves_den_2nd - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_vessel_density entity_type: population value_type: mean @@ -1321,7 +1321,7 @@ traits: which weights the vessels (n) within each vein order by their hydraulic contribution to total vein conductance (Tyree and Zimmermann, 2002). - var_in: ves_den_mid - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_vessel_density entity_type: population value_type: mean @@ -1369,7 +1369,7 @@ traits: which weights the vessels (n) within each vein order by their hydraulic contribution to total vein conductance (Tyree and Zimmermann, 2002). - var_in: ves_den_pet - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: leaf_vessel_density entity_type: population value_type: mean diff --git a/data/White_2020/metadata.yml b/data/White_2020/metadata.yml index ebed0fa4c..5a9732bf9 100644 --- a/data/White_2020/metadata.yml +++ b/data/White_2020/metadata.yml @@ -194,7 +194,7 @@ traits: methods: compilation from diverse sources and expert opinion - var_in: salt_tolerance unit_in: .na - trait_name: salt_tolerance + trait_name: plant_tolerance_salt entity_type: species value_type: mode basis_of_value: expert_score @@ -225,7 +225,7 @@ traits: replicates: .na methods: compilation from diverse sources and expert opinion - var_in: lifespan - unit_in: years + unit_in: a trait_name: lifespan entity_type: species value_type: bin @@ -258,14 +258,14 @@ traits: methods: compilation from diverse sources and expert opinion - var_in: calcicole_status unit_in: .na - trait_name: calcicole_status + trait_name: plant_tolerance_calcicole entity_type: species value_type: mode basis_of_value: expert_score replicates: .na methods: compilation from diverse sources and expert opinion - var_in: reproductive_maturity - unit_in: years + unit_in: a trait_name: reproductive_maturity entity_type: species value_type: bin @@ -282,7 +282,7 @@ traits: methods: compilation from diverse sources and expert opinion - var_in: snow_tolerance unit_in: .na - trait_name: snow_tolerance + trait_name: plant_tolerance_snow entity_type: species value_type: mode basis_of_value: expert_score @@ -290,7 +290,7 @@ traits: methods: compilation from diverse sources and expert opinion - var_in: water_logging_tolerance unit_in: .na - trait_name: water_logging_tolerance + trait_name: plant_tolerance_water_logged_soils entity_type: species value_type: mode basis_of_value: expert_score @@ -298,7 +298,7 @@ traits: methods: compilation from diverse sources and expert opinion - var_in: inundation_tolerance unit_in: .na - trait_name: inundation_tolerance + trait_name: plant_tolerance_inundation entity_type: species value_type: mode basis_of_value: expert_score @@ -376,6 +376,10 @@ substitutions: - trait_name: plant_physical_defence_structures find: 1 replace: sharp_pointed_defence +- trait_name: plant_physical_defence_structures + find: 1 + replace: sharp_pointed_defence + - trait_name: seed_longevity_categorical find: 10 replace: short_persistent @@ -385,13 +389,13 @@ substitutions: - trait_name: seed_longevity_categorical find: '00' replace: .na -- trait_name: calcicole_status +- trait_name: plant_tolerance_calcicole find: 10 replace: calcicole -- trait_name: calcicole_status +- trait_name: plant_tolerance_calcicole find: '01' replace: calcifuge -- trait_name: calcicole_status +- trait_name: plant_tolerance_calcicole find: '00' replace: .na - trait_name: life_form @@ -412,6 +416,18 @@ substitutions: - trait_name: reproductive_maturity find: '>20' replace: 20-- +- trait_name: plant_tolerance_water_logged_soils + find: '>6_months' + replace: greater_than_6_months +- trait_name: plant_tolerance_water_logged_soils + find: '<1_month' + replace: less_than_1_month +- trait_name: plant_tolerance_inundation + find: '>6_months' + replace: greater_than_6_months +- trait_name: plant_tolerance_inundation + find: '<1_month' + replace: less_than_1_month - trait_name: vegetative_reproduction_ability find: 1 replace: vegetative @@ -5016,6 +5032,14 @@ taxonomic_updates: reason: match_06. Automatic alignment with synonymous term among known canonical names APC (2022-11-23) taxonomic_resolution: Species +- find: Persoonia spp. + replace: Persoonia sp. [White_2020] + reason: Manual alignment to correct genus syntax (Elizabeth Wenk, 2022-11-30) + taxonomic_resolution: Genus +- find: Callitris spp. + replace: Callitris sp. [White_2020] + reason: Manual alignment to correct genus syntax (Elizabeth Wenk, 2022-11-30) + taxonomic_resolution: Genus exclude_observations: - variable: taxon_name find: Dead tree, 'dead Acacia' stenophylla, 'dead Eucalyptus' camaldulensis var. diff --git a/data/Williams_2012/metadata.yml b/data/Williams_2012/metadata.yml index be529f29a..884d7166c 100644 --- a/data/Williams_2012/metadata.yml +++ b/data/Williams_2012/metadata.yml @@ -163,7 +163,7 @@ traits: rainforest species (Alphitonia petrei) were recorded. life_stage: seedling - var_in: Reproductive maturity - unit_in: years + unit_in: a trait_name: reproductive_maturity entity_type: population value_type: mean diff --git a/data/Wright_2000/metadata.yml b/data/Wright_2000/metadata.yml index 4fb315592..28d985543 100644 --- a/data/Wright_2000/metadata.yml +++ b/data/Wright_2000/metadata.yml @@ -166,7 +166,7 @@ traits: life_stage: seedling - var_in: cata unit_in: .na - trait_name: seedling_first_leaf + trait_name: seedling_first_node_leaf_type entity_type: species value_type: mode basis_of_value: expert_score @@ -189,7 +189,7 @@ traits: life_stage: seedling - var_in: node unit_in: .na - trait_name: seedling_first_node + trait_name: seedling_first_node_leaf_count entity_type: species value_type: mode basis_of_value: expert_score @@ -212,7 +212,7 @@ traits: life_stage: seedling - var_in: hypo unit_in: .na - trait_name: hypocotyl_type + trait_name: seedling_hypocotyl_hairs entity_type: species value_type: mode basis_of_value: expert_score @@ -286,22 +286,22 @@ substitutions: - trait_name: cotyledon_position find: 2 replace: cryptocotylar -- trait_name: seedling_first_leaf +- trait_name: seedling_first_node_leaf_type find: 1 replace: leaf-like -- trait_name: seedling_first_leaf +- trait_name: seedling_first_node_leaf_type find: 2 replace: scale-like -- trait_name: seedling_first_node +- trait_name: seedling_first_node_leaf_count find: 1 replace: single -- trait_name: seedling_first_node +- trait_name: seedling_first_node_leaf_count find: 2 replace: paired -- trait_name: hypocotyl_type +- trait_name: seedling_hypocotyl_hairs find: 1 replace: glabrous -- trait_name: hypocotyl_type +- trait_name: seedling_hypocotyl_hairs find: 2 replace: hairy - trait_name: cotyledon_type diff --git a/data/Wright_2002/metadata.yml b/data/Wright_2002/metadata.yml index 2676ccb67..2940c4b2b 100644 --- a/data/Wright_2002/metadata.yml +++ b/data/Wright_2002/metadata.yml @@ -265,7 +265,7 @@ traits: methods: Leaves were oven-dried for a minimum of 48 h at 65 deg C, weighed, finely ground, and analysed for Kjeldahl N and P. - var_in: LL - unit_in: years + unit_in: a trait_name: leaf_lifespan entity_type: population value_type: mean @@ -341,7 +341,7 @@ traits: or non-linear change in 64 of the 66 species from the first to the fifth replicate. Thus cMD is likely to be a reasonable representative of minimum c. - var_in: d13C - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: population value_type: mean @@ -351,7 +351,7 @@ traits: leaf samples used for measuring Rd by Wright et al 2001. The 13C isotope data were later used by Prentice et al 2014 Ecol Letts and Cornwell et al 2018 GEB. - var_in: d15N - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: population value_type: mean @@ -361,7 +361,7 @@ traits: leaf samples used for measuring Rd by Wright et al 2001. The 13C isotope data were later used by Prentice et al 2014 Ecol Letts and Cornwell et al 2018 GEB. - var_in: Ks - unit_in: kg/m/s/MPa + unit_in: kg/m/MPa/s trait_name: .na entity_type: population value_type: mean @@ -385,7 +385,7 @@ traits: cross sectional area of the stem (minus bark; m2) or total leaf area subtending the distal branch end, (m2) respectively. - var_in: Kh - unit_in: kg*m/s/MPa + unit_in: kg.m/MPa/s trait_name: .na entity_type: population value_type: mean @@ -409,7 +409,7 @@ traits: cross sectional area of the stem (minus bark; m2) or total leaf area subtending the distal branch end, (m2) respectively. - var_in: Kl - unit_in: 10^4 x kg/m/s/MPa + unit_in: 10^4.kg/m/MPa/s trait_name: .na entity_type: population value_type: mean @@ -433,7 +433,7 @@ traits: cross sectional area of the stem (minus bark; m2) or total leaf area subtending the distal branch end, (m2) respectively. - var_in: ci - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: .na entity_type: population value_type: mean @@ -458,7 +458,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: ci_raw - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: raw @@ -483,7 +483,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: ca - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: .na entity_type: population value_type: mean @@ -508,7 +508,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: CO2a_raw - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: atmospheric_CO2_concentration entity_type: individual value_type: raw @@ -533,7 +533,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: ci_ca - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: population value_type: mean @@ -558,7 +558,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: Aarea_gs - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: leaf_water_use_efficiency_intrinsic entity_type: population value_type: mean @@ -583,7 +583,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: trans - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_transpiration_at_Asat entity_type: population value_type: mean @@ -608,7 +608,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: Aarea - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: .na entity_type: population value_type: mean @@ -633,7 +633,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: PsAreaUse_raw - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -658,7 +658,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: Amass - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: .na entity_type: population value_type: mean @@ -683,7 +683,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: PsmassUSE_raw - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: individual value_type: raw @@ -708,7 +708,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: Gs - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: .na entity_type: population value_type: mean @@ -734,7 +734,7 @@ traits: C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: GsUSE_raw - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -759,7 +759,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: wue - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: .na entity_type: population value_type: mean @@ -784,7 +784,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: wue_raw - unit_in: umolCO2/mmolH2O + unit_in: umol{CO2}/mmol{H2O} trait_name: leaf_water_use_efficiency_photosynthetic entity_type: individual value_type: raw @@ -809,7 +809,7 @@ traits: 25.5 deg C, SE 0.9 deg C), with an average of 6.2 samples taken per species, all from different individuals (except Exocarpos aphyllus ). - var_in: RD_MASS - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_dark_respiration_per_dry_mass entity_type: population value_type: mean diff --git a/data/Wright_2006/metadata.yml b/data/Wright_2006/metadata.yml index 8239b4108..57e14a105 100644 --- a/data/Wright_2006/metadata.yml +++ b/data/Wright_2006/metadata.yml @@ -84,8 +84,7 @@ contexts: description: Leaf area was determined for a shoot whose sapwood had a cross sectional area of 10 mm2. - value: 250mm long branch segment - description: Leaf area was determined for a 250 mm branch segment and sapwood - cross-sectional area was determined where the branch was cut. + description: Leaf area was determined for a 250 mm branch segment and sapwood cross-sectional area was determined where the branch was cut. In detail, WD was measured at 250-mm distance by Falster and Westoby. Pickup et al. measured WD at 10 mm2 sapwood crosssectional area for all species, but WD could also be interpolated to 250 mm distance for species at the GLP site. WD was measured on stem segments 40-70 mm in length, following standard methods (Pickup et al. 2005).] - value: 1000mm long branch segment description: Leaf area was determined for a 1000 mm branch segment and sapwood cross-sectional area was determined where the branch was cut. @@ -98,11 +97,7 @@ traits: basis_of_value: measurement replicates: unknown method_context: 250mm long branch segment - methods: WD was measured at 250-mm distance by Falster and Westoby. Pickup et al. - measured WD at 10 mm2 sapwood crosssectional area for all species, but WD could - also be interpolated to 250 mm distance for species at the GLP site. WD was measured - on stem segments 40-70 mm in length, following standard methods (Pickup et al. - 2005). + methods: Wood density was measured following standard methods. - var_in: wd_1000 unit_in: mg/mm3 trait_name: wood_density @@ -111,8 +106,7 @@ traits: basis_of_value: measurement replicates: unknown method_context: 1000mm long branch segment - methods: These wood density values would have been measured on segments 1000 mm - in length, following standard methods. + methods: Wood density was measured following standard methods. - var_in: leaf size unit_in: mm2 trait_name: leaf_area @@ -136,7 +130,7 @@ traits: scanner); these were then averaged to calculate species-mean values (in total 15-20 leaves were sampled per species). - var_in: LA/SA10 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean @@ -178,7 +172,7 @@ traits: distance from the branch tip, while the distance from the branch tip at which stem cross-sectional area reached 10 mm2 varied from 64 to 995 mm. - var_in: LA/SA250 - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: population value_type: mean diff --git a/data/Wright_2019/metadata.yml b/data/Wright_2019/metadata.yml index 8646fee83..6d6a47812 100644 --- a/data/Wright_2019/metadata.yml +++ b/data/Wright_2019/metadata.yml @@ -113,12 +113,18 @@ contexts: category: method var_in: method_context values: - - find: leaf morphology sample - value: leaf morphology sample - description: Leaf samples collected for leaf morphology measurements. - - find: gas exchange sample - value: gas exchange sample - description: Leaf samples collected for gas exchange measurements. + - value: leaf morphology sample + description: Measurements made on leaf samples collected for leaf morphology measurements. Five recently-matured, fully-expanded and undamaged leaves (including petioles) were collected from each individual + - value: gas exchange sample + description: Measurements made on leaf samples collected for gas exchange measurements. +- context_property: nitrogen sample type + category: method + var_in: method_context2 + values: + - value: Leaf N associated with isotope samples + description: Leaf lamina material used in photosynthetic measurements was oven-dried and pooled per species/age class, then analysed for 13C/12C and 15N/14N stable isotope composition at the Stable Isotopes Laboratory, Australian National University, Canberra. + - value: Leaf N analysed with a LECO TruSpec CHN analyser + description: Total N concentration of leaf and soil samples was measured with a LECO TruSpec CHN analyser; total P by ICP-OES, on nitric acid digests (analyses run at Appleton Lab, University of Queensland). Area-based leaf N and P concentrations were calculated from mass-based concentrations and the mean SLA value for each species/age class. traits: - var_in: WD kg/m3 unit_in: kg/m3 @@ -144,10 +150,9 @@ traits: basis_of_value: measurement replicates: 1 method_context: leaf morphology sample - methods: Five recently-matured, fully-expanded and undamaged leaves (including petioles) - were collected from each individual for determination of one-sided projected leaf - area (flatbed scanner), oven-dried mass (70 deg C for at least 48 h) and thus - SLA (area per dry mass; cm2 g-1). + methods: One-sided projected leaf area was determined (flatbed scanner), + oven-dried mass (70 deg C for at least 48 h) and thus SLA (area per dry mass; + cm2 g-1). - var_in: C% unit_in: '%' trait_name: leaf_C_per_dry_mass @@ -167,11 +172,8 @@ traits: value_type: raw basis_of_value: measurement replicates: 1 - methods: Total N concentration of leaf and soil samples was measured with a LECO - TruSpec CHN analyser; total P by ICP-OES, on nitric acid digests (analyses run - at Appleton Lab, University of Queensland). Area-based leaf N and P concentrations - were calculated from mass-based concentrations and the mean SLA value for each - species/age class. + method_context2: Leaf N analysed with a LECO TruSpec CHN analyser + methods: Area-based leaf N calculated from mass-based concentrations. - var_in: P% unit_in: '%' trait_name: leaf_P_per_dry_mass @@ -281,7 +283,7 @@ traits: per species/age class. Sample volumes were measured using standard procedure (via displacement), and dry masses after oven-drying at 70 deg C for 7 days. - var_in: Asat_area (micromol/m2/s) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: leaf_photosynthetic_rate_per_area_saturated entity_type: individual value_type: raw @@ -298,7 +300,7 @@ traits: only loosely controlled, averaging 1.22 kPa across all measurements (standard deviation 0.28). - var_in: gsw (mol/m2/s) - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: leaf_stomatal_conductance_per_area_at_Asat entity_type: individual value_type: raw @@ -315,7 +317,7 @@ traits: only loosely controlled, averaging 1.22 kPa across all measurements (standard deviation 0.28). - var_in: Ci - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat entity_type: individual value_type: raw @@ -332,7 +334,7 @@ traits: only loosely controlled, averaging 1.22 kPa across all measurements (standard deviation 0.28). - var_in: Ca - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: atmospheric_CO2_concentration entity_type: individual value_type: raw @@ -349,7 +351,7 @@ traits: only loosely controlled, averaging 1.22 kPa across all measurements (standard deviation 0.28). - var_in: CiCa ratio - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio entity_type: individual value_type: raw @@ -390,7 +392,7 @@ traits: replicates: 1 methods: circumference at breast height - var_in: Amass - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: leaf_photosynthetic_rate_per_dry_mass_saturated entity_type: individual value_type: raw @@ -414,8 +416,7 @@ traits: basis_of_value: measurement replicates: 1 method_context: gas exchange sample - methods: Specific leaf area (SLA) measurements made on the leaves on which photosynthesis - was measured. One-sided projected leaf area was determined (flatbed scanner), + methods: One-sided projected leaf area was determined (flatbed scanner), oven-dried mass (70 deg C for at least 48 h) and thus SLA (area per dry mass; cm2 g-1). - var_in: Al @@ -507,7 +508,7 @@ traits: replicates: 1 methods: P and other elemental results obtained by ICPOES on nitric acid digests - var_in: gas_d15N_leaf - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N entity_type: individual value_type: raw @@ -520,7 +521,7 @@ traits: during photosynthesis (Farquhar et al. 1982). We also measured d13C on representative whole-leaf (including petiole) samples collected during September 2010 (dry season). - var_in: gas_ d13C_leaf - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C entity_type: individual value_type: raw @@ -551,15 +552,10 @@ traits: value_type: raw basis_of_value: measurement replicates: 1 - methods: Leaf N associated with isotope samples. Leaf lamina material used in photosynthetic - measurements was oven-dried and pooled per species/age class, then analysed for - 13C/12C and 15N/14N stable isotope composition at the Stable Isotopes Laboratory, - Australian National University, Canberra. The d13C provides an integrated measure - of the extent of CO2 drawdown during photosynthesis (Farquhar et al. 1982). We - also measured d13C on representative whole-leaf (including petiole) samples collected - during September 2010 (dry season). + method_context2: Leaf N associated with isotope samples + methods: Area-based leaf N calculated from mass-based concentrations. - var_in: d15N_bark - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: bark_delta15N entity_type: individual value_type: raw @@ -568,7 +564,7 @@ traits: methods: Bark was analysed for 15N/14N stable isotope composition at the Stable Isotopes Laboratory, Australian National University, Canberra. - var_in: d13C_bark - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: bark_delta13C entity_type: individual value_type: raw @@ -577,7 +573,7 @@ traits: methods: Bark was analysed for 13C/12C stable isotope composition at the Stable Isotopes Laboratory, Australian National University, Canberra. - var_in: d15N_wood - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: wood_delta15N entity_type: individual value_type: raw @@ -586,7 +582,7 @@ traits: methods: Wood was analysed for 15N/14N stable isotope composition at the Stable Isotopes Laboratory, Australian National University, Canberra. - var_in: d13C_wood - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: wood_delta13C entity_type: individual value_type: raw diff --git a/data/Wright_2019/raw/metadata.yml b/data/Wright_2019/raw/metadata.yml index 5cacc82f4..5830f630b 100644 --- a/data/Wright_2019/raw/metadata.yml +++ b/data/Wright_2019/raw/metadata.yml @@ -229,7 +229,7 @@ traits: per species/age class. Sample volumes were measured using standard procedure (via displacement), and dry masses after oven-drying at 70 deg C for 7 days. - var_in: Asat_area (micromol/m2/s) - unit_in: umolCO2/m2/s + unit_in: umol{CO2}/m2/s trait_name: photosynthetic_rate_per_area_saturated value_type: raw replicates: 1 @@ -244,7 +244,7 @@ traits: only loosely controlled, averaging 1.22 kPa across all measurements (standard deviation 0.28). - var_in: gsw (mol/m2/s) - unit_in: mmolH2O/m2/s + unit_in: mmol{H2O}/m2/s trait_name: stomatal_conductance_per_area_at_Asat value_type: raw replicates: 1 @@ -259,7 +259,7 @@ traits: only loosely controlled, averaging 1.22 kPa across all measurements (standard deviation 0.28). - var_in: Ci - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: leaf_intercellular_CO2_concentration_at_Asat value_type: raw replicates: 1 @@ -274,7 +274,7 @@ traits: only loosely controlled, averaging 1.22 kPa across all measurements (standard deviation 0.28). - var_in: Ca - unit_in: umolCO2/mol + unit_in: umol{CO2}/mol trait_name: ca value_type: raw replicates: 1 @@ -289,7 +289,7 @@ traits: only loosely controlled, averaging 1.22 kPa across all measurements (standard deviation 0.28). - var_in: CiCa ratio - unit_in: umolCO2 internal/umolCO2 ambient + unit_in: umol{CO2_internal}/umol{CO2_ambient} trait_name: leaf_intercellular_CO2_concentration_to_atmospheric_CO2_concentration_ratio value_type: raw replicates: 1 @@ -322,7 +322,7 @@ traits: replicates: 1 methods: circumference at breast height - var_in: Amass - unit_in: nmolCO2/g/s + unit_in: nmol{CO2}/g/s trait_name: photosynthetic_rate_per_dry_mass_saturated value_type: raw replicates: 1 @@ -412,7 +412,7 @@ traits: replicates: 1 methods: P and other elemental results obtained by ICPOES on nitric acid digests - var_in: gas_d15N_leaf - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta15N value_type: raw replicates: 1 @@ -423,7 +423,7 @@ traits: during photosynthesis (Farquhar et al. 1982). We also measured d13C on representative whole-leaf (including petiole) samples collected during September 2010 (dry season). - var_in: gas_ d13C_leaf - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: leaf_delta13C value_type: raw replicates: 1 @@ -455,28 +455,28 @@ traits: also measured d13C on representative whole-leaf (including petiole) samples collected during September 2010 (dry season). - var_in: d15N_bark - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: bark_delta15N value_type: raw replicates: 1 methods: Bark was analysed for 15N/14N stable isotope composition at the Stable Isotopes Laboratory, Australian National University, Canberra. - var_in: d13C_bark - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: bark_delta13C value_type: raw replicates: 1 methods: Bark was analysed for 13C/12C stable isotope composition at the Stable Isotopes Laboratory, Australian National University, Canberra. - var_in: d15N_wood - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: wood_delta15N value_type: raw replicates: 1 methods: Wood was analysed for 15N/14N stable isotope composition at the Stable Isotopes Laboratory, Australian National University, Canberra. - var_in: d13C_wood - unit_in: per mille + unit_in: '{delta}[ppth]' trait_name: wood_delta13C value_type: raw replicates: 1 diff --git a/data/Zanne_2007/metadata.yml b/data/Zanne_2007/metadata.yml index 3d77da162..15df03cb6 100644 --- a/data/Zanne_2007/metadata.yml +++ b/data/Zanne_2007/metadata.yml @@ -86,7 +86,7 @@ traits: replicates: 1 methods: unknown - var_in: LA/SA (cm2/cm2) - unit_in: mm2_leaf/mm2_sapwood + unit_in: mm2{leaf}/mm2{sapwood} trait_name: huber_value entity_type: individual value_type: raw @@ -102,7 +102,7 @@ traits: replicates: 1 methods: unknown - var_in: Kh (kg*m/Mpa*s) - unit_in: kg*m/s/MPa + unit_in: kg.m/MPa/s trait_name: stem_hydraulic_conductivity entity_type: individual value_type: raw @@ -126,7 +126,7 @@ traits: of the stem (minus bark; m2) or total leaf area subtending the distal branch end, (m2) respectively. - var_in: Ks - unit_in: kg/m/s/MPa + unit_in: kg/m/MPa/s trait_name: sapwood_specific_conductivity entity_type: individual value_type: raw @@ -150,7 +150,7 @@ traits: of the stem (minus bark; m2) or total leaf area subtending the distal branch end, (m2) respectively. - var_in: Kl - unit_in: 10^4 x kg/m/s/MPa + unit_in: 10^4.kg/m/MPa/s trait_name: leaf_specific_conductivity entity_type: individual value_type: raw diff --git a/data/Zieminska_2013/metadata.yml b/data/Zieminska_2013/metadata.yml index 7dedaa467..4780d4b4c 100644 --- a/data/Zieminska_2013/metadata.yml +++ b/data/Zieminska_2013/metadata.yml @@ -284,7 +284,7 @@ traits: but it should be thought of as the theoretical maximum since it does not capture effects of end-wall resistances, blockage by tyloses, effects of emboli, etc. - var_in: vessel number per area (mm^-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: stem_vessel_density entity_type: individual value_type: raw @@ -355,7 +355,7 @@ traits: but it should be thought of as the theoretical maximum since it does not capture effects of end-wall resistances, blockage by tyloses, effects of emboli, etc. - var_in: vessel lumen fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: stem_vessel_lumen_fraction entity_type: individual value_type: raw @@ -426,7 +426,7 @@ traits: but it should be thought of as the theoretical maximum since it does not capture effects of end-wall resistances, blockage by tyloses, effects of emboli, etc. - var_in: vessel wall fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: stem_vessel_wall_fraction entity_type: individual value_type: raw @@ -497,7 +497,7 @@ traits: but it should be thought of as the theoretical maximum since it does not capture effects of end-wall resistances, blockage by tyloses, effects of emboli, etc. - var_in: axial parenchyma fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: wood_axial_parenchyma_fraction entity_type: individual value_type: raw @@ -568,8 +568,8 @@ traits: but it should be thought of as the theoretical maximum since it does not capture effects of end-wall resistances, blockage by tyloses, effects of emboli, etc. - var_in: ray fraction - unit_in: dimensionless - trait_name: wood_ray_fraction + unit_in: '{dimensionless}' + trait_name: wood_ray_parenchyma_fraction entity_type: individual value_type: raw basis_of_value: measurement @@ -639,7 +639,7 @@ traits: but it should be thought of as the theoretical maximum since it does not capture effects of end-wall resistances, blockage by tyloses, effects of emboli, etc. - var_in: axial+ray parenchyma fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: .na entity_type: individual value_type: raw @@ -647,7 +647,7 @@ traits: replicates: 1 methods: see manuscript or other methods for mapped in traits - var_in: fibre fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: wood_fibre_fraction entity_type: individual value_type: raw @@ -718,7 +718,7 @@ traits: but it should be thought of as the theoretical maximum since it does not capture effects of end-wall resistances, blockage by tyloses, effects of emboli, etc. - var_in: fibre wall fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: .na entity_type: individual value_type: raw @@ -726,7 +726,7 @@ traits: replicates: 1 methods: see manuscript or methods for mapped in traits - var_in: fibre lumen fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: .na entity_type: individual value_type: raw @@ -734,7 +734,7 @@ traits: replicates: 1 methods: see manuscript or methods for mapped in traits - var_in: fibre wall area (micron^2) - unit_in: dimensionless + unit_in: um2 trait_name: .na entity_type: individual value_type: raw @@ -758,7 +758,7 @@ traits: replicates: 1 methods: see manuscript or methods for mapped in traits - var_in: fibre wall area to fibre lumen ratio (averaged across multiple fibres measured) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -766,7 +766,7 @@ traits: replicates: 1 methods: see manuscript or methods for mapped in traits - var_in: fibre wall to fibre area ratio (averaged across multiple fibres measured) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -774,7 +774,7 @@ traits: replicates: 1 methods: see manuscript or methods for mapped in traits - var_in: fibre lumen to fibre area ratio (averaged across multiple fibres measured) - unit_in: dimensionless + unit_in: '{dimensionless}' trait_name: .na entity_type: individual value_type: raw @@ -782,7 +782,7 @@ traits: replicates: 1 methods: see manuscript or methods for mapped in traits - var_in: tracheid fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: wood_tracheid_fraction entity_type: individual value_type: raw diff --git a/data/Zieminska_2015/metadata.yml b/data/Zieminska_2015/metadata.yml index 3e06ef317..ef854c5f2 100644 --- a/data/Zieminska_2015/metadata.yml +++ b/data/Zieminska_2015/metadata.yml @@ -159,7 +159,7 @@ traits: at least 72 hours. Leaf dry mass was then measured on a precision balance. SLA was calculated as mass of dried leaves divided by their leaf area. - var_in: Leaf area to sapwood area ratio (cm^2 cm^-2) - unit_in: cm2_leaf/cm2_sapwood + unit_in: cm2{leaf}/cm2{sapwood} trait_name: huber_value entity_type: individual value_type: raw @@ -388,7 +388,7 @@ traits: divided by arithmetic average of vessel lumen area (A, mm2). S was calculated as A divided by N (mm4; [14]. - var_in: vessel number per area (mm^-2) - unit_in: count/mm2 + unit_in: '{count}/mm2' trait_name: stem_vessel_density entity_type: individual value_type: raw @@ -470,7 +470,7 @@ traits: divided by arithmetic average of vessel lumen area (A, mm2). S was calculated as A divided by N (mm4; [14]. - var_in: vessel lumen fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: stem_vessel_lumen_fraction entity_type: individual value_type: raw @@ -552,7 +552,7 @@ traits: divided by arithmetic average of vessel lumen area (A, mm2). S was calculated as A divided by N (mm4; [14]. - var_in: vessel wall fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: stem_vessel_wall_fraction entity_type: individual value_type: raw @@ -634,7 +634,7 @@ traits: divided by arithmetic average of vessel lumen area (A, mm2). S was calculated as A divided by N (mm4; [14]. - var_in: axial parenchyma fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: wood_axial_parenchyma_fraction entity_type: individual value_type: raw @@ -716,8 +716,8 @@ traits: divided by arithmetic average of vessel lumen area (A, mm2). S was calculated as A divided by N (mm4; [14]. - var_in: ray fraction - unit_in: dimensionless - trait_name: wood_ray_fraction + unit_in: um2/um2 + trait_name: wood_ray_parenchyma_fraction entity_type: individual value_type: raw basis_of_value: measurement @@ -798,7 +798,7 @@ traits: divided by arithmetic average of vessel lumen area (A, mm2). S was calculated as A divided by N (mm4; [14]. - var_in: axial+ray parenchyma fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: .na entity_type: individual value_type: raw @@ -806,7 +806,7 @@ traits: replicates: 1 methods: see manuscript or methods for mapped-in traits - var_in: fibre fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: wood_fibre_fraction entity_type: individual value_type: raw @@ -888,7 +888,7 @@ traits: divided by arithmetic average of vessel lumen area (A, mm2). S was calculated as A divided by N (mm4; [14]. - var_in: fibre wall fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: .na entity_type: individual value_type: raw @@ -896,7 +896,7 @@ traits: replicates: 1 methods: see manuscript or methods for mapped-in traits - var_in: fibre lumen fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: .na entity_type: individual value_type: raw @@ -904,7 +904,7 @@ traits: replicates: 1 methods: see manuscript or methods for mapped-in traits - var_in: conduits15 fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: .na entity_type: individual value_type: raw @@ -912,7 +912,7 @@ traits: replicates: 1 methods: see manuscript or methods for mapped-in traits - var_in: mucilage canals fraction - unit_in: dimensionless + unit_in: um2/um2 trait_name: .na entity_type: individual value_type: raw diff --git a/data/eFLOWER_2021/metadata.yml b/data/eFLOWER_2021/metadata.yml index 1ddd3cf11..20d4a67e6 100644 --- a/data/eFLOWER_2021/metadata.yml +++ b/data/eFLOWER_2021/metadata.yml @@ -279,7 +279,7 @@ traits: making it impossible to distinguish among different sexual systems such as monoecy and dioecy. - var_in: 201. Number of perianth parts (C1) - unit_in: count + unit_in: '{count}' trait_name: flower_perianth_parts_count entity_type: species value_type: mode @@ -302,7 +302,7 @@ traits: parts also has the advantage of being applicable to all angiosperms, including those with spiral phyllotaxis. - var_in: 201. Number of perianth parts (C1)_min - unit_in: count + unit_in: '{count}' trait_name: flower_perianth_parts_count entity_type: species value_type: minimum @@ -325,7 +325,7 @@ traits: parts also has the advantage of being applicable to all angiosperms, including those with spiral phyllotaxis. - var_in: 201. Number of perianth parts (C1)_max - unit_in: count + unit_in: '{count}' trait_name: flower_perianth_parts_count entity_type: species value_type: maximum @@ -348,7 +348,7 @@ traits: parts also has the advantage of being applicable to all angiosperms, including those with spiral phyllotaxis. - var_in: 204. Fusion of perianth (C1) - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_perianth_fusion entity_type: species value_type: mode @@ -375,7 +375,7 @@ traits: in our data set, we treat such flowers as having free perianth parts in order to treat all species in a comparable way (i.e., at anthesis). - var_in: 204. Fusion of perianth (C1)_min - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_perianth_fusion entity_type: species value_type: minimum @@ -402,7 +402,7 @@ traits: in our data set, we treat such flowers as having free perianth parts in order to treat all species in a comparable way (i.e., at anthesis). - var_in: 204. Fusion of perianth (C1)_max - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_perianth_fusion entity_type: species value_type: maximum @@ -429,7 +429,7 @@ traits: in our data set, we treat such flowers as having free perianth parts in order to treat all species in a comparable way (i.e., at anthesis). - var_in: 301. Number of fertile stamens (C1) - unit_in: count + unit_in: '{count}' trait_name: flower_fertile_stamens_count entity_type: species value_type: mode @@ -450,7 +450,7 @@ traits: stamens only when unequivocally clarified in the literature (e.g., Malvaceae, von Balthazar et al., 2004). Equivocal cases were left as missing data. - var_in: 301. Number of fertile stamens (C1)_min - unit_in: count + unit_in: '{count}' trait_name: flower_fertile_stamens_count entity_type: species value_type: minimum @@ -471,7 +471,7 @@ traits: stamens only when unequivocally clarified in the literature (e.g., Malvaceae, von Balthazar et al., 2004). Equivocal cases were left as missing data. - var_in: 301. Number of fertile stamens (C1)_max - unit_in: count + unit_in: '{count}' trait_name: flower_fertile_stamens_count entity_type: species value_type: maximum @@ -506,7 +506,7 @@ traits: (e.g., Rosaceae). This character was considered inapplicable when filaments were entirely fused with each other or to the perianth. - var_in: 306. Fusion of filaments (C1) - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_filament_fusion entity_type: species value_type: mode @@ -535,7 +535,7 @@ traits: there is a single structural stamen (i.e., one stamen, no staminodes; e.g., Chloranthus, Chloranthaceae). - var_in: 306. Fusion of filaments (C1)_min - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_filament_fusion entity_type: species value_type: minimum @@ -564,7 +564,7 @@ traits: there is a single structural stamen (i.e., one stamen, no staminodes; e.g., Chloranthus, Chloranthaceae). - var_in: 306. Fusion of filaments (C1)_max - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_filament_fusion entity_type: species value_type: maximum @@ -628,7 +628,7 @@ traits: single whorls and multiple whorls in this character. This character is not applicable to unicarpellate flowers. - var_in: 401. Number of structural carpels (C1) - unit_in: count + unit_in: '{count}' trait_name: flower_structural_carpels_count entity_type: species value_type: mode @@ -652,7 +652,7 @@ traits: two or more whorls are rare in angiosperms and gynoecium merism therefore usually equals the number of carpels per flower. - var_in: 401. Number of structural carpels (C1)_min - unit_in: count + unit_in: '{count}' trait_name: flower_structural_carpels_count entity_type: species value_type: minimum @@ -676,7 +676,7 @@ traits: two or more whorls are rare in angiosperms and gynoecium merism therefore usually equals the number of carpels per flower. - var_in: 401. Number of structural carpels (C1)_max - unit_in: count + unit_in: '{count}' trait_name: flower_structural_carpels_count entity_type: species value_type: maximum @@ -700,7 +700,7 @@ traits: two or more whorls are rare in angiosperms and gynoecium merism therefore usually equals the number of carpels per flower. - var_in: 403. Fusion of ovaries (C1) - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_ovary_fusion entity_type: species value_type: mode @@ -710,7 +710,7 @@ traits: ovary (from the floral base to the apex of the ovary). Fusion of styles and stigmas is not taken into account here. Not applicable when there is a single carpel. - var_in: 403. Fusion of ovaries (C1)_min - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_ovary_fusion entity_type: species value_type: minimum @@ -720,7 +720,7 @@ traits: ovary (from the floral base to the apex of the ovary). Fusion of styles and stigmas is not taken into account here. Not applicable when there is a single carpel. - var_in: 403. Fusion of ovaries (C1)_max - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_ovary_fusion entity_type: species value_type: maximum @@ -777,7 +777,7 @@ traits: inferior, or one of the following intermediate states, 1/4 inferior or less, half-inferior, 3/4 inferior or more. - var_in: 308. Fusion of filaments to inner perianth series (C1) - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_filament_fusion_to_inner_perianth entity_type: species value_type: mode @@ -797,7 +797,7 @@ traits: for this is to provide a general character that allows comparison of fusion among all angiosperms. - var_in: 308. Fusion of filaments to inner perianth series (C1)_min - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_filament_fusion_to_inner_perianth entity_type: species value_type: minimum @@ -817,7 +817,7 @@ traits: for this is to provide a general character that allows comparison of fusion among all angiosperms. - var_in: 308. Fusion of filaments to inner perianth series (C1)_max - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_filament_fusion_to_inner_perianth entity_type: species value_type: maximum @@ -854,7 +854,7 @@ traits: example the basifixed stamens of Tulipa or the dorsifixed stamens of Lilium may be versatile. - var_in: 411. Number of ovules per functional carpel (C1) - unit_in: count + unit_in: '{count}' trait_name: flower_ovules_per_functional_carpel_count entity_type: species value_type: mode @@ -863,7 +863,7 @@ traits: methods: Number of ovules per carpel recorded as a continuous character (with integer values of 1 and above). Reduced (sterile) carpels are not taken into account here. - var_in: 411. Number of ovules per functional carpel (C1)_min - unit_in: count + unit_in: '{count}' trait_name: flower_ovules_per_functional_carpel_count entity_type: species value_type: minimum @@ -872,7 +872,7 @@ traits: methods: Number of ovules per carpel recorded as a continuous character (with integer values of 1 and above). Reduced (sterile) carpels are not taken into account here. - var_in: 411. Number of ovules per functional carpel (C1)_max - unit_in: count + unit_in: '{count}' trait_name: flower_ovules_per_functional_carpel_count entity_type: species value_type: maximum @@ -950,7 +950,7 @@ traits: the state 'very long extension' for those that are longer than the thecae (e.g., Asarum, Endress and Hufford, 1989; Chloranthus, Endress, 1987b). - var_in: 5000. Number of apertures (C1) - unit_in: count + unit_in: '{count}' trait_name: flower_pollen_apertures_count entity_type: species value_type: mode @@ -963,7 +963,7 @@ traits: when pollen is inaperturate (i.e. when there is no distinct aperture). Aperturate pollen is scored with integer values of 1 and above. - var_in: 5000. Number of apertures (C1)_min - unit_in: count + unit_in: '{count}' trait_name: flower_pollen_apertures_count entity_type: species value_type: minimum @@ -976,7 +976,7 @@ traits: when pollen is inaperturate (i.e. when there is no distinct aperture). Aperturate pollen is scored with integer values of 1 and above. - var_in: 5000. Number of apertures (C1)_max - unit_in: count + unit_in: '{count}' trait_name: flower_pollen_apertures_count entity_type: species value_type: maximum @@ -1122,7 +1122,7 @@ traits: is not applicable when there is a single structural stamen (i.e., one stamen, no staminodes; e.g., Chloranthus, Chloranthaceae). - var_in: 231. Number of perianth whorls (C1) - unit_in: count + unit_in: '{count}' trait_name: flower_perianth_whorls_count entity_type: species value_type: mode @@ -1132,7 +1132,7 @@ traits: integer values of 1 and above). Not applicable when perianth phyllotaxis is spiral or irregular or when the perianth is absent. - var_in: 231. Number of perianth whorls (C1)_min - unit_in: count + unit_in: '{count}' trait_name: flower_perianth_whorls_count entity_type: species value_type: minimum @@ -1142,7 +1142,7 @@ traits: integer values of 1 and above). Not applicable when perianth phyllotaxis is spiral or irregular or when the perianth is absent. - var_in: 231. Number of perianth whorls (C1)_max - unit_in: count + unit_in: '{count}' trait_name: flower_perianth_whorls_count entity_type: species value_type: maximum @@ -1152,7 +1152,7 @@ traits: integer values of 1 and above). Not applicable when perianth phyllotaxis is spiral or irregular or when the perianth is absent. - var_in: 232. Perianth merism (C1) - unit_in: count + unit_in: '{count}' trait_name: flower_perianth_merism entity_type: species value_type: mode @@ -1163,7 +1163,7 @@ traits: Not applicable when perianth phyllotaxis is spiral or irregular or when the perianth is absent. - var_in: 232. Perianth merism (C1)_min - unit_in: count + unit_in: '{count}' trait_name: flower_perianth_merism entity_type: species value_type: minimum @@ -1174,7 +1174,7 @@ traits: Not applicable when perianth phyllotaxis is spiral or irregular or when the perianth is absent. - var_in: 232. Perianth merism (C1)_max - unit_in: count + unit_in: '{count}' trait_name: flower_perianth_merism entity_type: species value_type: maximum @@ -1185,7 +1185,7 @@ traits: Not applicable when perianth phyllotaxis is spiral or irregular or when the perianth is absent. - var_in: 331. Number of androecium structural whorls (C1) - unit_in: count + unit_in: '{count}' trait_name: flower_androecium_structural_whorls_count entity_type: species value_type: mode @@ -1201,7 +1201,7 @@ traits: to evaluate and in such cases additional information from developmental or anatomical studies was considered if available. Equivocal cases were left as missing data. - var_in: 331. Number of androecium structural whorls (C1)_min - unit_in: count + unit_in: '{count}' trait_name: flower_androecium_structural_whorls_count entity_type: species value_type: minimum @@ -1217,7 +1217,7 @@ traits: to evaluate and in such cases additional information from developmental or anatomical studies was considered if available. Equivocal cases were left as missing data. - var_in: 331. Number of androecium structural whorls (C1)_max - unit_in: count + unit_in: '{count}' trait_name: flower_androecium_structural_whorls_count entity_type: species value_type: maximum @@ -1233,7 +1233,7 @@ traits: to evaluate and in such cases additional information from developmental or anatomical studies was considered if available. Equivocal cases were left as missing data. - var_in: 332. Androecium structural merism (C1) - unit_in: count + unit_in: '{count}' trait_name: flower_androecium_structural_merism entity_type: species value_type: mode @@ -1246,7 +1246,7 @@ traits: or irregular stamen arrangements, nor when there is a single structural stamen (i.e., one stamen, no staminodes; e.g., Chloranthus, Chloranthaceae). - var_in: 332. Androecium structural merism (C1)_min - unit_in: count + unit_in: '{count}' trait_name: flower_androecium_structural_merism entity_type: species value_type: minimum @@ -1259,7 +1259,7 @@ traits: or irregular stamen arrangements, nor when there is a single structural stamen (i.e., one stamen, no staminodes; e.g., Chloranthus, Chloranthaceae). - var_in: 332. Androecium structural merism (C1)_max - unit_in: count + unit_in: '{count}' trait_name: flower_androecium_structural_merism entity_type: species value_type: maximum @@ -1272,7 +1272,7 @@ traits: or irregular stamen arrangements, nor when there is a single structural stamen (i.e., one stamen, no staminodes; e.g., Chloranthus, Chloranthaceae). - var_in: 406. Fusion of styles (C1) - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_style_fusion entity_type: species value_type: mode @@ -1285,7 +1285,7 @@ traits: fusion, 0.5 to fusion along half of the total length of the styles). This character is not applicable in unicarpellate flowers. - var_in: 406. Fusion of styles (C1)_min - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_style_fusion entity_type: species value_type: minimum @@ -1298,7 +1298,7 @@ traits: fusion, 0.5 to fusion along half of the total length of the styles). This character is not applicable in unicarpellate flowers. - var_in: 406. Fusion of styles (C1)_max - unit_in: n/n + unit_in: '{dimensionless}' trait_name: flower_style_fusion entity_type: species value_type: maximum diff --git a/docs/news/index.html b/docs/news/index.html index 2e01ec80e..27981683c 100644 --- a/docs/news/index.html +++ b/docs/news/index.html @@ -101,7 +101,7 @@