diff --git a/DESCRIPTION b/DESCRIPTION index 1d54216..135d695 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -47,6 +47,7 @@ Suggests: ggpointdensity, ggbeeswarm (>= 0.7.1), gridExtra, + readr, scales, forcats, viridis, diff --git a/NAMESPACE b/NAMESPACE index a0ced9e..b33148a 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -4,18 +4,21 @@ S3method(print,austraits) export("%>%") export(as_wide_table) export(bind_trait_values) +export(database_create_combined_table) export(extract_dataset) export(extract_taxa) export(extract_trait) export(get_version_latest) export(get_versions) -export(join_all) -export(join_contexts) -export(join_locations) +export(join_contributors) +export(join_location_coordinates) +export(join_location_properties) export(join_methods) -export(join_sites) -export(join_taxonomy) +export(join_taxa) +export(join_taxonomic_updates) export(load_austraits) +export(lookup_context_property) +export(lookup_location_property) export(lookup_trait) export(plot_locations) export(plot_site_locations) diff --git a/R/as_wide_table.R b/R/as_wide_table.R index 8958ad9..fcb8971 100644 --- a/R/as_wide_table.R +++ b/R/as_wide_table.R @@ -37,7 +37,7 @@ as_wide_table <- function(austraits){ # The contexts table needs the contexts collapsed to one context name per site austraits %>% - join_contexts(collapse_context = TRUE) -> austraits + join_contexts_old(collapse = TRUE) -> austraits # Getting rid of the columns that will soon be deleted in the next austraits release and renaming the description column austraits$methods <- @@ -104,4 +104,64 @@ collapse_cols <- function(data) { data %>% purrr::imap_dfr(~ sprintf("%s='%s'",.y,.x)) %>% tidyr::unite("text", sep="; ") %>% dplyr::pull(text) +} + +#' Old join contexts function that collapses contexts into a single column and doesn't specify categories of context properties. +#' @keywords internal +#' @noRd +join_contexts_old <- function(austraits, collapse_context = FALSE){ + # Check compatability + status <- check_compatibility(austraits) + + # If compatible + if(!status){ + function_not_supported(austraits) + } + + traits2 <- split(austraits$traits, austraits$traits$dataset_id) + contexts2 <- split(austraits$contexts, austraits$contexts$dataset_id) + + traits_vars <- names(austraits$traits) + + problem_studies <- c("Hall_1981") + + for(id in names(traits2)) { + + if(!is.null(contexts2[[id]][1]) & ! (id %in% problem_studies)) { + + context_ids <- + unique(contexts2[[id]]$link_id) + + for(v in context_ids[!is.na(context_ids)]) { + + context_sub <- + contexts2[[id]] %>% + dplyr::select(-dplyr::any_of(c("category", "description"))) %>% + dplyr::filter(link_id == v) %>% + tidyr::separate_rows(link_vals) %>% + tidyr::pivot_wider(values_from = value, names_from = context_property) %>% + tidyr::pivot_wider(names_from = link_id, values_from = link_vals) + + traits2[[id]] <- + dplyr::left_join(by = c("dataset_id", v), + traits2[[id]], + context_sub + ) + } + + if(collapse_context == TRUE){ + context_text <- + traits2[[id]] %>% + dplyr::select(-dplyr::any_of(traits_vars)) %>% collapse_cols() + + traits2[[id]] <- traits2[[id]] %>% + dplyr::mutate(context = context_text) %>% + dplyr::select(dplyr::any_of(traits_vars), context) + } + } + } + + austraits$traits <- traits2 %>% dplyr::bind_rows() + + austraits } \ No newline at end of file diff --git a/R/database_create_combined_table.R b/R/database_create_combined_table.R new file mode 100644 index 0000000..50d6157 --- /dev/null +++ b/R/database_create_combined_table.R @@ -0,0 +1,40 @@ +#' Create combined traits.build table +#' +#' Create a single database output that merges together the information +#' in all relational tables within a traits.build database. +#' Trait measurements are still output in long format (1 row per trait value), +#' but all measurement-related metadata (methods, location properties, context properties, contributors) +#' are now included as additional columns in a single table. +#' +#' @param database A traits.build database +#' +#' @return A table combining information in 7 traits.build relational tables: traits, locations, contexts, methods, taxa, taxonomic_updates, and contributors +#' @export +#' +#' @usage database_create_combined_table(database) +#' +database_create_combined_table <- function(austraits, + format = "single_column_pretty", + vars = list( + location = "all", + context = "all", + contributors = "all", + taxonomy = "all", + taxonomic_updates = "all", + methods = setdiff(names(austraits$methods), c("data_collectors")) + ), + include_description = TRUE + ) { + # Since `data_collectors` is also merged into the combined_table via the contributors tibble, we don't want the information twice. + + combined_table_relational <- austraits %>% + join_location_coordinates() %>% + join_location_properties(format = format, vars = vars$location) %>% + join_context_properties(format = format, vars = vars$context, include_description = TRUE) %>% + join_methods(vars = vars$methods) %>% + join_contributors(format = format, vars = vars$contributors) %>% + join_taxa(vars = vars$taxonomy) %>% + join_taxonomic_updates(vars = vars$taxonomic_updates) + + combined_table <- combined_table_relational$traits +} diff --git a/R/join_all.R b/R/join_all.R index f1f9146..e453467 100644 --- a/R/join_all.R +++ b/R/join_all.R @@ -1,11 +1,12 @@ -#' @title Join metadata fields into the core traits table +#' @title Joining location coordinates to traits table #' @description Function to merge metadata stored in relational tables into the core traits table. #' #' A traits.build database includes relational tables that contain measurement (and observation) metadata pertaining to locations, contexts, methods, and taxonomy. This function merges all (or some) of the metadata from one (or all) of these tables into the traits table. #' #' @param austraits traits.build generated database -#' @param vars vector specifying which columns from a specific relational table to join to the traits table (works only for `join_` functions joining a single dataframe) -#' @param collapse_context for `join_contexts` only. Logical, whether contexts for a given observation will be concatenated into one cell +#' @param vars Vector specifying which columns or values from a specific relational table to join to the traits table (currently works only for `join_` functions joining a single dataframe). For the functions `join_methods`, `join_taxa`, `join_taxonomic_updates`, and `join_contributors` the parameter vars specifies which columns to join to the traits table. For the functions `join_location_properties` and `join_context_properties` the parameter `vars` specifies which properties to add to the traits table; the functions `lookup_location_property` and `lookup_context_property` allow easy searches for relevant properties. The function `join_location_coordinates` does not include the parameter `vars`. +#' @param format A parameter for `join_context_properties`, `join_location_properties`, and `join_contributors`. Specifies whether location properties or context properties for a given observation will be concatenated, and if concatenated whether the compacted column(s) will have a human readable ("single_column_pretty") format or be format using json ("single_column_json") syntax. For location and context properties there is also the option to add each location_property or `context_property` to the traits table as its own column ("many_columns"). +#' @param include_description For `join_context_properties` only, a logical indicating whether to include (TRUE) or omit (FALSE) the context_property descriptions. #' @return traits.build list object, but with additional fields (columns) appended to `traits` dataframe #' @details #' the `join_` functions have been developed to join relational tables for databases built using the traits.build workflow. @@ -17,184 +18,410 @@ #' - This function works with AusTraits version >= 5.0.0 (from Nov 2023 release) #' - For AusTraits versions <= 4.2.0 (up to Sept 2023 release) see [https://github.com/traitecoevo/austraits] for how to install old versions of the package or download a newer version of the database." #' -#' @rdname join_all - +#' @rdname join_ #' @examples #' \dontrun{ #' austraits$traits -#' -#' #Append locations data -#' (austraits %>% join_locations)$traits +#' +#' #Append locations coordinates and output a single table +#' (austraits %>% join_location_coordinates)$traits +#' +#' #Append location coordinates, but maintain the relational database +#' austraits %>% join_location_coordinates() #' #' #Append contexts -#' (austraits %>% join_contexts)$traits -#' -#' # Append methods -#' (austraits %>% join_methods(vars = c("method_id")))$traits -#' +#' (austraits %>% join_context_properties)$traits +#' +#' #Append methods +#' (austraits %>% join_methods)$traits +#' #' #Append taxonomic details -#' (austraits %>% join_taxonomy)$traits -#' -#' #Append all information -#' (austraits %>% join_all)$traits +#' (austraits %>% join_taxa)$traits +#' +#' #Append taxonomic update details +#' (austraits %>% join_taxonomic_updates)$traits #' } #' @author Daniel Falster - daniel.falster@unsw.edu.au #' @export +join_location_coordinates <- function(austraits) { - -join_all <- function(austraits) { - # Check compatability - status <- check_compatibility(austraits) - - # If compatible - if(!status){ + # Check compatibility + if(!check_compatibility(austraits)){ function_not_supported(austraits) } - austraits %>% - join_locations() %>% - join_taxonomy() %>% - join_methods() + + location_coordinates <- + austraits$locations %>% + dplyr::filter(location_property %in% c("latitude (deg)", "longitude (deg)")) %>% + tidyr::pivot_wider(names_from = location_property, values_from = value) + + # variables to join_ by depends on if location_name already in traits table + # from joining coordinates for instances + join_vars <- intersect(names(austraits$traits), c("dataset_id", "location_id", "location_name")) + + if (any(stringr::str_detect(names(location_coordinates), "latitude "))) { + austraits$traits <- + austraits$traits %>% + dplyr::left_join(by = join_vars, location_coordinates) + + } else { + austraits$traits <- + austraits$traits %>% + dplyr::mutate( + location_name = NA_character_, + `latitude (deg)` = NA_character_, + `longitude (deg)` = NA_character_, + ) + } + + austraits } -#' @title Joining taxonomic information to traits table -#' @export -#' @rdname join_all +#' @title Joining taxonomy to traits table +#' @export +#' @rdname join_location_coordinates +join_taxa <- function(austraits, vars = c("family", "genus", "taxon_rank", "establishment_means")) { -join_taxonomy <- function(austraits, vars = c("family", "genus", "taxon_rank", "establishment_means")) { - # Check compatability - status <- check_compatibility(austraits) - - # If compatible - if(!status){ + # Check compatibility + if(!check_compatibility(austraits)){ function_not_supported(austraits) - } - - austraits$traits <- austraits$traits %>% + } + + # If all columns to be added, create `vars` vector + if (vars[1] == "all" & length(vars == 1)){ + vars <- names(austraits$taxa) + } + + # Join selected columns to traits table + austraits$traits <- + austraits$traits %>% dplyr::left_join(by="taxon_name", austraits$taxa %>% dplyr::select("taxon_name", tidyselect::any_of(vars))) - + austraits } -#' @title Joining methodological information to traits table +#' @title Joining taxonomic updates information to traits table #' @export -#' @rdname join_all +#' @rdname join_location_coordinates +join_taxonomic_updates <- function(austraits, vars = c("aligned_name")) { -join_methods <- function(austraits, vars = c("methods", "year_collected_start", "year_collected_end", "collection_type")) { - # Check compatability - status <- check_compatibility(austraits) - - # If compatible - if(!status){ + # Check compatibility + if(!check_compatibility(austraits)){ function_not_supported(austraits) - } + } + + # If all columns to be added, create `vars` vector + if (vars[1] == "all" & length(vars == 1)){ + vars <- names(austraits$taxonomic_updates) + } + + # Join selected columns to traits table + austraits$traits <- + austraits$traits %>% + dplyr::left_join(by = c("taxon_name", "dataset_id", "original_name"), + austraits$taxonomic_updates %>% + dplyr::select("taxon_name", "dataset_id", "original_name", + tidyselect::any_of(vars))) - austraits$methods %>% - dplyr::select(c("dataset_id", "trait_name", "method_id"), tidyselect::any_of(vars)) %>% - dplyr::distinct() -> methods - - austraits$traits <- austraits$traits %>% - dplyr::left_join(by=c("dataset_id", "trait_name", "method_id"), - methods, relationship = "many-to-many") - austraits } -#' @title Joining location information to traits table +#' @title Joining methodological information to traits table #' @export +#' @rdname join_location_coordinates +join_methods <- function(austraits, vars = c("methods")) { -#' @rdname join_all - -join_locations <- function(austraits, vars = c("longitude (deg)","latitude (deg)")) { - # Check compatability - status <- check_compatibility(austraits) - - # If compatible - if(!status){ + # Check compatibility + if(!check_compatibility(austraits)){ function_not_supported(austraits) - } - - sites <- - austraits$locations %>% - dplyr::filter(location_property %in% vars) %>% - tidyr::pivot_wider(names_from = location_property) - - austraits$traits <- austraits$traits %>% - dplyr::left_join(by=c("dataset_id", "location_id"), sites) - + } + + # If all columns to be added, create `vars` vector + if (vars[1] == "all" & length(vars == 1)){ + vars <- names(austraits$methods) + } + + # Join selected columns to traits table + austraits$traits <- + austraits$traits %>% + dplyr::left_join(by=c("dataset_id", "trait_name", "method_id"), + austraits$methods %>% + dplyr::select(c("dataset_id", "trait_name", "method_id"), tidyselect::any_of(vars)) %>% + dplyr::distinct() + ) + austraits } -#' @title Joining location info for AusTraits versions <= 3.0.2 -#' @description `r lifecycle::badge('deprecated')` -#' Joining location info for AusTraits versions <= 3.0.2 -#' @param austraits austraits object -#' @param vars variables from site table to join + +#' @title Joining data contributor metadata to traits table #' @export +#' @rdname join_location_coordinates +join_contributors <- function(austraits, format = "single_column_pretty", vars = "all") { -join_sites <- function(austraits, vars = c("longitude (deg)","latitude (deg)")) { - function_not_supported(austraits) + # Check compatibility + if(!check_compatibility(austraits)){ + function_not_supported(austraits) + } + + # Work out which vars to retain and create a dataframe for compacting + if (vars[1] == "all") { + contributors_tmp <- austraits$contributors + } else { + # Create vector that is combination of selected columns and required columns + vars_tmp <- c("dataset_id", "last_name", "given_name", vars) + # Determine which columns aren't wanted + vars_remove <- setdiff(names(austraits$contributors), vars_tmp) + # Remove unwanted columns from contributors dataframe + contributors_tmp <- austraits$contributors %>% dplyr::select(-dplyr::any_of(vars_remove)) + } + + # Different options for how data are compacted and joined depending on `format` argument + if (format == "single_column_pretty") { + # collapse all metadata for a single contributor into a single cell + contributor_metadata <- + contributors_tmp %>% + tidyr::pivot_longer(cols = 4:ncol(contributors_tmp)) %>% + dplyr::filter(!is.na(value)) %>% + dplyr::group_by(dataset_id, last_name, given_name) %>% + dplyr::mutate(contributor = paste0(paste0(name, "==", value), collapse = " \\ "))%>% + dplyr::select(-name, -value) %>% + dplyr::distinct() %>% + dplyr::ungroup() + + # Merge in contributor metadata and paste together with name + compacted_contributors_column <- + contributors_tmp %>% + dplyr::left_join(contributor_metadata, + by = c("dataset_id", "last_name", "given_name")) %>% + dplyr::mutate( + data_contributors = ifelse(is.na(contributor), + paste0(last_name, ", ", given_name), + paste0(last_name, ", ", given_name, " <<", contributor, ">>"))) %>% + dplyr::select(dataset_id, data_contributors) %>% + # Collapse metadata for all data contributors associated with a dataset into a single cell + dplyr::group_by(dataset_id) %>% + dplyr::mutate(data_contributors = paste0(data_contributors, collapse = ";; ")) %>% + dplyr::ungroup() %>% + dplyr::distinct() + + } else if (format == "single_column_json") { + + compacted_contributors_column <- + contributors_tmp |> + tidyr::nest(-dplyr::all_of("dataset_id")) |> + dplyr::mutate(data_contributors = purrr::map_chr(data, jsonlite::toJSON)) |> + dplyr::select(-dplyr::any_of("data")) |> + dplyr::ungroup() + } + + austraits$traits <- austraits$traits %>% + dplyr::left_join(by = c("dataset_id"), compacted_contributors_column) + + austraits } + +#' @title Joining location properties to traits table #' @export -#' @rdname join_all +#' @rdname join_location_coordinates +join_location_properties <- function(austraits, format = "single_column_pretty", vars = "all") { -join_contexts <- function(austraits, collapse_context = FALSE){ - # Check compatability - status <- check_compatibility(austraits) - - # If compatible - if(!status){ + # Check compatibility + if(!check_compatibility(austraits)){ function_not_supported(austraits) - } + } - traits2 <- split(austraits$traits, austraits$traits$dataset_id) - contexts2 <- split(austraits$contexts, austraits$contexts$dataset_id) - - traits_vars <- names(austraits$traits) + # If all location properties to be added, create `vars` vector that is unique list + # of location properties in the database + if (vars[1] == "all") { - problem_studies <- c("Hall_1981") + vars_tmp <- austraits$locations %>% + dplyr::distinct(location_property) %>% + dplyr::filter(!location_property %in% c("latitude (deg)", "longitude (deg)")) - for(id in names(traits2)) { + vars <- vars_tmp$location_property + } - if(!is.null(contexts2[[id]][1]) & ! (id %in% problem_studies)) { + # If latitude, longitude present in vars list, remove them + vars <- setdiff(vars, c("latitude (deg)", "longitude (deg)")) + + locations <- + austraits$locations %>% + dplyr::filter(location_property %in% vars) + + # Variables to join_ by depends on if location_name already in traits table + # from joining coordinates for instances + join_vars <- intersect(names(austraits$traits), c("dataset_id", "location_id", "location_name")) + + # Different options for how data are compacted and joined depending on `format` argument + if (format == "many_columns") { + + # Pivot wider, so each `location_property` in its own column + locations <- + locations %>% + dplyr::mutate(location_property = paste0("location_property: ", location_property)) %>% + tidyr::pivot_wider(names_from = location_property) + + # Join locations, based on appropriate columns + austraits$traits <- + austraits$traits %>% + dplyr::left_join(by = join_vars, locations) + + } else if (format == "single_column_pretty") { + + # Merge each location property and its corresponding value + compacted_locations_column <- + locations %>% + dplyr::mutate(location_properties = paste0(location_property, "==", value)) %>% + dplyr::select(dplyr::all_of(c("dataset_id", "location_id", "location_name", "location_properties"))) %>% + dplyr::group_by(dataset_id, location_id, location_name) %>% + # collapse all location properties associated with a measurement into a single cell + dplyr::mutate(location_properties = paste0(location_properties, collapse = ";; ")) %>% + dplyr::ungroup() %>% + dplyr::distinct() + + austraits$traits <- + austraits$traits %>% + dplyr::left_join(by = join_vars, compacted_locations_column) + + } else if (format == "single_column_json") { + + compacted_locations_column <- + locations |> + tidyr::nest(data = -dplyr::all_of(c("dataset_id", "location_id"))) |> + dplyr::mutate(location_properties = purrr::map_chr(data, jsonlite::toJSON)) |> + dplyr::select(-dplyr::any_of("data")) |> + dplyr::ungroup() - context_ids <- - unique(contexts2[[id]]$link_id) + austraits$traits <- austraits$traits %>% + dplyr::left_join(by = join_vars, compacted_locations_column) + + } + + austraits +} + + +join_context_properties <- function(austraits, format = "single_column_pretty", vars = "all", include_description = TRUE) { - for(v in context_ids[!is.na(context_ids)]) { - - context_sub <- - contexts2[[id]] %>% - dplyr::select(-dplyr::any_of(c("category", "description"))) %>% - dplyr::filter(link_id == v) %>% - tidyr::separate_rows(link_vals) %>% - tidyr::pivot_wider(values_from = value, names_from = context_property) %>% - tidyr::pivot_wider(names_from = link_id, values_from = link_vals) - - traits2[[id]] <- - dplyr::left_join(by = c("dataset_id", v), - traits2[[id]], - context_sub - ) - } - - if(collapse_context == TRUE){ - context_text <- - traits2[[id]] %>% - dplyr::select(-dplyr::any_of(traits_vars)) %>% collapse_cols() - - traits2[[id]] <- traits2[[id]] %>% - dplyr::mutate(context = context_text) %>% - dplyr::select(dplyr::any_of(traits_vars), context) - } + # Check compatibility + if(!check_compatibility(austraits)){ + function_not_supported(austraits) + } + + # If all context properties to be added, create `vars` vector that is unique list + # of context properties in the database + if (vars[1] == "all") { + vars <- austraits$contexts$context_property %>% unique() + } + + # Create dataframe of contexts to use & add `context_property:` to context properties + contexts_tmp <- + austraits$contexts %>% + dplyr::filter(context_property %in% vars) %>% + dplyr::mutate(context_property = paste0(category, ": ", context_property)) + + # From here format depends on desired output + if (format == "many_columns") { + contexts_tmp <- + contexts_tmp %>% + dplyr::mutate( + value = ifelse( + is.na(description) | include_description == FALSE, + value, + paste0(value, " <<", description, ">>")) + ) %>% + dplyr::select(-dplyr::all_of(c("description", "category"))) %>% + tidyr::separate_longer_delim(link_vals, ", ") + + pivot <- TRUE + } else if (format == "single_column_pretty") { + contexts_tmp <- + contexts_tmp %>% + dplyr::mutate( + value = ifelse( + !is.na(description) & include_description, + paste0(context_property, "==", value, " <<", description, ">>"), + paste0(context_property, "==", value)) + ) %>% + dplyr::select(-dplyr::all_of(c("description", "context_property", "category"))) %>% + tidyr::separate_longer_delim(link_vals, ", ") %>% + dplyr::distinct() %>% + dplyr::group_by(dataset_id, link_id, link_vals) %>% + dplyr::mutate(value = paste0(value, collapse = ";; ")) %>% + dplyr::distinct() %>% + dplyr::ungroup() + + pivot <- FALSE + } else if (format == "single_column_json") { + + contexts_tmp <- + contexts_tmp |> + tidyr::separate_longer_delim(link_vals, ", ") |> + dplyr::distinct() |> + dplyr::mutate(description = ifelse(!is.na(description) & include_description, description, NA)) |> + tidyr::nest(data = -dplyr::all_of(c("dataset_id", "link_id", "link_vals"))) |> + dplyr::mutate(value = purrr::map_chr(data, jsonlite::toJSON)) |> + dplyr::select(-dplyr::any_of("data")) |> + dplyr::ungroup() + + pivot <- FALSE + + } else { + stop("format not supported: ", format) + } + + # Merge contexts to austraits$traits + + # Defines a function to further reformat specific columns of the context table + reformat_contexts <- function(data, context_id, pivot) { + + data <- + data %>% + dplyr::filter(link_id == context_id) + + if(pivot) { + data <- tidyr::pivot_wider(data, names_from = context_property, values_from = value) } + + data <- + data %>% + dplyr::select(-link_id) %>% + dplyr::distinct(dataset_id, link_vals, .keep_all = TRUE) + + names(data)[which(names(data) == "value")] <- gsub("_id", "_properties", context_id, fixed = TRUE) + names(data)[which(names(data) == "link_vals")] <- context_id + + data } - austraits$traits <- traits2 %>% dplyr::bind_rows() - austraits -} + austraits$traits <- + austraits$traits %>% + dplyr::left_join( + by = c("dataset_id", "treatment_context_id"), + reformat_contexts(contexts_tmp, "treatment_context_id", pivot) + ) %>% + dplyr::left_join( + by = c("dataset_id", "plot_context_id"), + reformat_contexts(contexts_tmp, "plot_context_id", pivot) + ) %>% + dplyr::left_join( + by = c("dataset_id", "entity_context_id"), + reformat_contexts(contexts_tmp, "entity_context_id", pivot) + ) %>% + dplyr::left_join( + by = c("dataset_id", "temporal_context_id"), + reformat_contexts(contexts_tmp, "temporal_context_id", pivot) + ) %>% + dplyr::left_join( + by = c("dataset_id", "method_context_id"), + reformat_contexts(contexts_tmp, "method_context_id", pivot) + ) + austraits +} \ No newline at end of file diff --git a/R/lookup.R b/R/lookup.R index b1c864e..382cc29 100644 --- a/R/lookup.R +++ b/R/lookup.R @@ -22,3 +22,63 @@ lookup_trait <- function(austraits, term){ ret } + + +#' Look up location properties +#' +#' @description +#' Look up location properties that contain a specific search term. +#' +#' +#' @param austraits austraits list +#' @param term character string for location property search term +#' +#' @return vector containing location properties that contains search term +#' @export +#' +#' @examples +#' \dontrun{ +#' austraits %>% lookup_location_property("soil") +#' } +lookup_location_property <- function(austraits, term){ + + all_location_properties <- austraits$locations$location_property %>% unique() + + ret <- stringr::str_subset(all_location_properties, term) + + if(length(ret) == 0){ + stop(paste0("No location properties found containing ", term, " !")) + } + + ret +} + + +#' Look up context properties +#' +#' @description +#' Look up context properties that contain a specific search term. +#' +#' +#' @param austraits austraits list +#' @param term character string for context property search term +#' +#' @return vector containing context properties that contains search term +#' @export +#' +#' @examples +#' \dontrun{ +#' austraits %>% lookup_context_property("temperature") +#' } +lookup_context_property <- function(austraits, term){ + + all_context_properties <- austraits$contexts$context_property %>% unique() + + ret <- stringr::str_subset(all_context_properties, term) + + if(length(ret) == 0){ + stop(paste0("No context properties found containing ", term, " !")) + } + + ret +} diff --git a/R/plot_locations.R b/R/plot_locations.R index 11f68cf..17fdbde 100644 --- a/R/plot_locations.R +++ b/R/plot_locations.R @@ -1,6 +1,6 @@ #' @title Produce location maps of trait values #' @description Plot location where trait data was collected from -#' @param aus_traits austraits object OR traits table. Note location details must be joined. See join_all and examples +#' @param aus_traits austraits object OR traits table. Note location details must be joined. See join_location_coordinates and examples #' @param feature grouping/classification categories e.g trait_name, collection_type for <= v3.0.2, basis of record for >3.0.2 #' @param ... arguments passed to ggplot() #' @author Dony Indiarto - d.indiarto@student.unsw.edu.au @@ -8,11 +8,11 @@ #' @examples #' \dontrun{ #' #All traits from a given study -#' data <- austraits %>% extract_dataset(dataset_id = "Falster_2003") %>% join_all() +#' data <- austraits %>% extract_dataset(dataset_id = "Falster_2003") %>% join_location_coordinates() #' data %>% plot_locations("trait_name") #' #' #Single trait -#' data <- austraits %>% extract_trait(trait_names = c("plant_height")) %>% join_all() +#' data <- austraits %>% extract_trait(trait_names = c("plant_height")) %>% join_location_coordinates() #' data$traits %>% plot_locations("trait_name") #' } #' @export @@ -29,7 +29,7 @@ plot_locations <- function(aus_traits, feature="trait_name", ...){ if( length(stringr::str_which(names(traits), "(deg)")) < 2 ){ cli::cli_alert_info("Coordinate columns were not detected, joining location tables now.") - aus_traits <- aus_traits |> join_locations() + aus_traits <- aus_traits |> join_location_coordinates() traits <- get_traits_table(aus_traits) } } else { @@ -37,7 +37,7 @@ plot_locations <- function(aus_traits, feature="trait_name", ...){ # Check if traits contains coordinate cols in traits table if( length(stringr::str_which(names(traits), "(deg)")) < 2 ) - cli::cli_abort("No location data found in traits table - try `join_locations()` first before `plot_locations()`") + cli::cli_abort("No location data found in traits table - try `join_location_coordinates()` first before `plot_locations()`") } plot_locations2(traits, feature) @@ -101,7 +101,7 @@ plot_locations2 <- function(aus_traits, feature, ...){ #' @description `r lifecycle::badge('deprecated')` #' #'Plot location where trait data was collected from -#' @param traits traits table with site details appended. See join_all and examples +#' @param traits traits table with site details appended. See join_location_coordinates and examples #' @param feature grouping/classification categories e.g trait_name, collection_type for <= v3.0.2 #' @param ... arguments passed to ggplot() #' @author Dony Indiarto - d.indiarto@student.unsw.edu.au diff --git a/R/summarise_austraits.R b/R/summarise_austraits.R index 8461d4f..0ea1bbf 100644 --- a/R/summarise_austraits.R +++ b/R/summarise_austraits.R @@ -63,7 +63,7 @@ summarise_austraits_traits <-function(austraits, var) { summarise_austraits_taxa <-function(austraits, var) { #Join taxonomic info - austraits <- austraits %>% join_taxonomy() + austraits <- austraits %>% join_taxa() # Create table ret <- austraits[["traits"]] %>% diff --git a/man/database_create_combined_table.Rd b/man/database_create_combined_table.Rd new file mode 100644 index 0000000..0a30c2a --- /dev/null +++ b/man/database_create_combined_table.Rd @@ -0,0 +1,21 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/database_create_combined_table.R +\name{database_create_combined_table} +\alias{database_create_combined_table} +\title{Create combined traits.build table} +\usage{ +database_create_combined_table(database) +} +\arguments{ +\item{database}{A traits.build database} +} +\value{ +A table combining information in 7 traits.build relational tables: traits, locations, contexts, methods, taxa, taxonomic_updates, and contributors +} +\description{ +Create a single database output that merges together the information +in all relational tables within a traits.build database. +Trait measurements are still output in long format (1 row per trait value), +but all measurement-related metadata (methods, location properties, context properties, contributors) +are now included as additional columns in a single table. +} diff --git a/man/join_.Rd b/man/join_.Rd new file mode 100644 index 0000000..6236b39 --- /dev/null +++ b/man/join_.Rd @@ -0,0 +1,63 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/join_all.R +\name{join_location_coordinates} +\alias{join_location_coordinates} +\title{Joining location coordinates to traits table} +\usage{ +join_location_coordinates(austraits) +} +\arguments{ +\item{austraits}{traits.build generated database} + +\item{vars}{Vector specifying which columns or values from a specific relational table to join to the traits table (currently works only for \code{join_} functions joining a single dataframe). For the functions \code{join_methods}, \code{join_taxa}, \code{join_taxonomic_updates}, and \code{join_contributors} the parameter vars specifies which columns to join to the traits table. For the functions \code{join_location_properties} and \code{join_context_properties} the parameter \code{vars} specifies which properties to add to the traits table; the functions \code{lookup_location_property} and \code{lookup_context_property} allow easy searches for relevant properties. The function \code{join_location_coordinates} does not include the parameter \code{vars}.} + +\item{format}{A parameter for \code{join_context_properties}, \code{join_location_properties}, and \code{join_contributors}. Specifies whether location properties or context properties for a given observation will be concatenated, and if concatenated whether the compacted column(s) will have a human readable ("single_column_pretty") format or be format using json ("single_column_json") syntax. For location and context properties there is also the option to add each location_property or \code{context_property} to the traits table as its own column ("many_columns").} + +\item{include_description}{For \code{join_context_properties} only, a logical indicating whether to include (TRUE) or omit (FALSE) the context_property descriptions.} +} +\value{ +traits.build list object, but with additional fields (columns) appended to \code{traits} dataframe +} +\description{ +Function to merge metadata stored in relational tables into the core traits table. + +A traits.build database includes relational tables that contain measurement (and observation) metadata pertaining to locations, contexts, methods, and taxonomy. This function merges all (or some) of the metadata from one (or all) of these tables into the traits table. +} +\details{ +the \code{join_} functions have been developed to join relational tables for databases built using the traits.build workflow. +Learn more at: +\link{https://github.com/traitecoevo/traits.build} & +\link{https://github.com/traitecoevo/traits.build-book} + +Note to AusTraits users: +\itemize{ +\item This function works with AusTraits version >= 5.0.0 (from Nov 2023 release) +\item For AusTraits versions <= 4.2.0 (up to Sept 2023 release) see \link{https://github.com/traitecoevo/austraits} for how to install old versions of the package or download a newer version of the database." +} +} +\examples{ +\dontrun{ +austraits$traits + +#Append locations coordinates and output a single table +(austraits \%>\% join_location_coordinates)$traits + +#Append location coordinates, but maintain the relational database +austraits \%>\% join_location_coordinates() + +#Append contexts +(austraits \%>\% join_context_properties)$traits + +#Append methods +(austraits \%>\% join_methods)$traits + +#Append taxonomic details +(austraits \%>\% join_taxa)$traits + +#Append taxonomic update details +(austraits \%>\% join_taxonomic_updates)$traits +} +} +\author{ +Daniel Falster - daniel.falster@unsw.edu.au +} diff --git a/man/join_all.Rd b/man/join_all.Rd deleted file mode 100644 index b7507ae..0000000 --- a/man/join_all.Rd +++ /dev/null @@ -1,76 +0,0 @@ -% Generated by roxygen2: do not edit by hand -% Please edit documentation in R/join_all.R -\name{join_all} -\alias{join_all} -\alias{join_taxonomy} -\alias{join_methods} -\alias{join_locations} -\alias{join_contexts} -\title{Join metadata fields into the core traits table} -\usage{ -join_all(austraits) - -join_taxonomy( - austraits, - vars = c("family", "genus", "taxon_rank", "establishment_means") -) - -join_methods( - austraits, - vars = c("methods", "year_collected_start", "year_collected_end", "collection_type") -) - -join_locations(austraits, vars = c("longitude (deg)", "latitude (deg)")) - -join_contexts(austraits, collapse_context = FALSE) -} -\arguments{ -\item{austraits}{traits.build generated database} - -\item{vars}{vector specifying which columns from a specific relational table to join to the traits table (works only for \code{join_} functions joining a single dataframe)} - -\item{collapse_context}{for \code{join_contexts} only. Logical, whether contexts for a given observation will be concatenated into one cell} -} -\value{ -traits.build list object, but with additional fields (columns) appended to \code{traits} dataframe -} -\description{ -Function to merge metadata stored in relational tables into the core traits table. - -A traits.build database includes relational tables that contain measurement (and observation) metadata pertaining to locations, contexts, methods, and taxonomy. This function merges all (or some) of the metadata from one (or all) of these tables into the traits table. -} -\details{ -the \code{join_} functions have been developed to join relational tables for databases built using the traits.build workflow. -Learn more at: -\link{https://github.com/traitecoevo/traits.build} & -\link{https://github.com/traitecoevo/traits.build-book} - -Note to AusTraits users: -\itemize{ -\item This function works with AusTraits version >= 5.0.0 (from Nov 2023 release) -\item For AusTraits versions <= 4.2.0 (up to Sept 2023 release) see \link{https://github.com/traitecoevo/austraits} for how to install old versions of the package or download a newer version of the database." -} -} -\examples{ -\dontrun{ -austraits$traits - -#Append locations data -(austraits \%>\% join_locations)$traits - -#Append contexts -(austraits \%>\% join_contexts)$traits - -# Append methods -(austraits \%>\% join_methods(vars = c("method_id")))$traits - -#Append taxonomic details -(austraits \%>\% join_taxonomy)$traits - -#Append all information -(austraits \%>\% join_all)$traits -} -} -\author{ -Daniel Falster - daniel.falster@unsw.edu.au -} diff --git a/man/join_location_coordinates.Rd b/man/join_location_coordinates.Rd new file mode 100644 index 0000000..47ac101 --- /dev/null +++ b/man/join_location_coordinates.Rd @@ -0,0 +1,38 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/join_all.R +\name{join_taxa} +\alias{join_taxa} +\alias{join_taxonomic_updates} +\alias{join_methods} +\alias{join_contributors} +\alias{join_location_properties} +\title{Joining taxonomy to traits table} +\usage{ +join_taxa( + austraits, + vars = c("family", "genus", "taxon_rank", "establishment_means") +) + +join_taxonomic_updates(austraits, vars = c("aligned_name")) + +join_methods(austraits, vars = c("methods")) + +join_contributors(austraits, format = "single_column_pretty", vars = "all") + +join_location_properties( + austraits, + format = "single_column_pretty", + vars = "all" +) +} +\description{ +Joining taxonomy to traits table + +Joining taxonomic updates information to traits table + +Joining methodological information to traits table + +Joining data contributor metadata to traits table + +Joining location properties to traits table +} diff --git a/man/join_sites.Rd b/man/join_sites.Rd deleted file mode 100644 index 89f51ff..0000000 --- a/man/join_sites.Rd +++ /dev/null @@ -1,17 +0,0 @@ -% Generated by roxygen2: do not edit by hand -% Please edit documentation in R/join_all.R -\name{join_sites} -\alias{join_sites} -\title{Joining location info for AusTraits versions <= 3.0.2} -\usage{ -join_sites(austraits, vars = c("longitude (deg)", "latitude (deg)")) -} -\arguments{ -\item{austraits}{austraits object} - -\item{vars}{variables from site table to join} -} -\description{ -\ifelse{html}{\href{https://lifecycle.r-lib.org/articles/stages.html#deprecated}{\figure{lifecycle-deprecated.svg}{options: alt='[Deprecated]'}}}{\strong{[Deprecated]}} -Joining location info for AusTraits versions <= 3.0.2 -} diff --git a/man/lookup_context_property.Rd b/man/lookup_context_property.Rd new file mode 100644 index 0000000..7874858 --- /dev/null +++ b/man/lookup_context_property.Rd @@ -0,0 +1,24 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/lookup.R +\name{lookup_context_property} +\alias{lookup_context_property} +\title{Look up context properties} +\usage{ +lookup_context_property(austraits, term) +} +\arguments{ +\item{austraits}{austraits list} + +\item{term}{character string for context property search term} +} +\value{ +vector containing context properties that contains search term +} +\description{ +Look up context properties that contain a specific search term. +} +\examples{ +\dontrun{ +austraits \%>\% lookup_context_property("temperature") +} +} diff --git a/man/lookup_location_property.Rd b/man/lookup_location_property.Rd new file mode 100644 index 0000000..833f64b --- /dev/null +++ b/man/lookup_location_property.Rd @@ -0,0 +1,24 @@ +% Generated by roxygen2: do not edit by hand +% Please edit documentation in R/lookup.R +\name{lookup_location_property} +\alias{lookup_location_property} +\title{Look up location properties} +\usage{ +lookup_location_property(austraits, term) +} +\arguments{ +\item{austraits}{austraits list} + +\item{term}{character string for location property search term} +} +\value{ +vector containing location properties that contains search term +} +\description{ +Look up location properties that contain a specific search term. +} +\examples{ +\dontrun{ +austraits \%>\% lookup_location_property("soil") +} +} diff --git a/man/plot_locations.Rd b/man/plot_locations.Rd index 760070b..c608992 100644 --- a/man/plot_locations.Rd +++ b/man/plot_locations.Rd @@ -7,7 +7,7 @@ plot_locations(aus_traits, feature = "trait_name", ...) } \arguments{ -\item{aus_traits}{austraits object OR traits table. Note location details must be joined. See join_all and examples} +\item{aus_traits}{austraits object OR traits table. Note location details must be joined. See join_location_coordinates and examples} \item{feature}{grouping/classification categories e.g trait_name, collection_type for <= v3.0.2, basis of record for >3.0.2} @@ -22,11 +22,11 @@ Plot location where trait data was collected from \examples{ \dontrun{ #All traits from a given study -data <- austraits \%>\% extract_dataset(dataset_id = "Falster_2003") \%>\% join_all() +data <- austraits \%>\% extract_dataset(dataset_id = "Falster_2003") \%>\% join_location_coordinates() data \%>\% plot_locations("trait_name") #Single trait -data <- austraits \%>\% extract_trait(trait_names = c("plant_height")) \%>\% join_all() +data <- austraits \%>\% extract_trait(trait_names = c("plant_height")) \%>\% join_location_coordinates() data$traits \%>\% plot_locations("trait_name") } } diff --git a/man/plot_site_locations.Rd b/man/plot_site_locations.Rd index 749721c..e7d93e3 100644 --- a/man/plot_site_locations.Rd +++ b/man/plot_site_locations.Rd @@ -7,7 +7,7 @@ plot_site_locations(traits, feature = "trait_name", ...) } \arguments{ -\item{traits}{traits table with site details appended. See join_all and examples} +\item{traits}{traits table with site details appended. See join_location_coordinates and examples} \item{feature}{grouping/classification categories e.g trait_name, collection_type for <= v3.0.2} diff --git a/tests/testthat/Falster_2003_combined_format.csv b/tests/testthat/Falster_2003_combined_format.csv new file mode 100644 index 0000000..44301fb --- /dev/null +++ b/tests/testthat/Falster_2003_combined_format.csv @@ -0,0 +1,115 @@ +dataset_id,taxon_name,observation_id,trait_name,value,unit,entity_type,value_type,basis_of_value,replicates,basis_of_record,life_stage,population_id,individual_id,repeat_measurements_id,temporal_context_id,source_id,location_id,entity_context_id,plot_context_id,treatment_context_id,collection_date,measurement_remarks,method_id,method_context_id,original_name,location_name,latitude (deg),longitude (deg),location_properties,treatment_context_properties,plot_context_properties,entity_context_properties,temporal_context_properties,method_context_properties,methods,description,sampling_strategy,source_primary_key,source_primary_citation,source_secondary_key,source_secondary_citation,source_original_dataset_key,source_original_dataset_citation,assistants,dataset_curators,data_contributors,taxon_rank,taxonomic_status,taxonomic_dataset,taxon_name_alternatives,genus,family,binomial,trinomial,taxon_distribution,establishment_means,scientific_name,taxon_id,taxon_id_genus,taxon_id_family,scientific_name_id,aligned_name,taxonomic_resolution,aligned_name_taxon_id,aligned_name_taxonomic_status +Falster_2003,Acacia floribunda,01,leaf_area,142,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Acacia floribunda,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Acacia,Fabaceae,Acacia floribunda,NA,"WA (naturalised), SA (naturalised), Qld, NSW, ACT (doubtfully naturalised), Vic (native and naturalised), Tas (naturalised)",native and naturalised,Acacia floribunda (Vent.) Willd.,https://id.biodiversity.org.au/node/apni/2916159,https://id.biodiversity.org.au/taxon/apni/51471290,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/63165,Acacia floribunda,NA,https://id.biodiversity.org.au/node/apni/2916159,accepted +Falster_2003,Acacia floribunda,01,leaf_inclination_angle,57,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Acacia floribunda,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Acacia,Fabaceae,Acacia floribunda,NA,"WA (naturalised), SA (naturalised), Qld, NSW, ACT (doubtfully naturalised), Vic (native and naturalised), Tas (naturalised)",native and naturalised,Acacia floribunda (Vent.) Willd.,https://id.biodiversity.org.au/node/apni/2916159,https://id.biodiversity.org.au/taxon/apni/51471290,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/63165,Acacia floribunda,NA,https://id.biodiversity.org.au/node/apni/2916159,accepted +Falster_2003,Acacia floribunda,02,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Acacia floribunda,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Acacia,Fabaceae,Acacia floribunda,NA,"WA (naturalised), SA (naturalised), Qld, NSW, ACT (doubtfully naturalised), Vic (native and naturalised), Tas (naturalised)",native and naturalised,Acacia floribunda (Vent.) Willd.,https://id.biodiversity.org.au/node/apni/2916159,https://id.biodiversity.org.au/taxon/apni/51471290,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/63165,Acacia floribunda,NA,https://id.biodiversity.org.au/node/apni/2916159,accepted +Falster_2003,Acacia myrtifolia,03,leaf_area,319,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Acacia myrtifolia,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Acacia,Fabaceae,Acacia myrtifolia,NA,"WA, SA, Qld, NSW, Vic, Tas",native,Acacia myrtifolia (Sm.) Willd.,https://id.biodiversity.org.au/node/apni/2901160,https://id.biodiversity.org.au/taxon/apni/51471290,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/162110,Acacia myrtifolia,NA,https://id.biodiversity.org.au/node/apni/2901160,accepted +Falster_2003,Acacia myrtifolia,03,leaf_inclination_angle,66.1,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Acacia myrtifolia,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Acacia,Fabaceae,Acacia myrtifolia,NA,"WA, SA, Qld, NSW, Vic, Tas",native,Acacia myrtifolia (Sm.) Willd.,https://id.biodiversity.org.au/node/apni/2901160,https://id.biodiversity.org.au/taxon/apni/51471290,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/162110,Acacia myrtifolia,NA,https://id.biodiversity.org.au/node/apni/2901160,accepted +Falster_2003,Acacia myrtifolia,04,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Acacia myrtifolia,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Acacia,Fabaceae,Acacia myrtifolia,NA,"WA, SA, Qld, NSW, Vic, Tas",native,Acacia myrtifolia (Sm.) Willd.,https://id.biodiversity.org.au/node/apni/2901160,https://id.biodiversity.org.au/taxon/apni/51471290,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/162110,Acacia myrtifolia,NA,https://id.biodiversity.org.au/node/apni/2901160,accepted +Falster_2003,Acacia suaveolens,05,leaf_area,562,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Acacia suaveolens,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Acacia,Fabaceae,Acacia suaveolens,NA,"SA, Qld, NSW, Vic, Tas",native,Acacia suaveolens (Sm.) Willd.,https://id.biodiversity.org.au/node/apni/2904374,https://id.biodiversity.org.au/taxon/apni/51471290,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/70862,Acacia suaveolens,NA,https://id.biodiversity.org.au/node/apni/2904374,accepted +Falster_2003,Acacia suaveolens,05,leaf_inclination_angle,71.7,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Acacia suaveolens,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Acacia,Fabaceae,Acacia suaveolens,NA,"SA, Qld, NSW, Vic, Tas",native,Acacia suaveolens (Sm.) Willd.,https://id.biodiversity.org.au/node/apni/2904374,https://id.biodiversity.org.au/taxon/apni/51471290,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/70862,Acacia suaveolens,NA,https://id.biodiversity.org.au/node/apni/2904374,accepted +Falster_2003,Acacia suaveolens,06,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Acacia suaveolens,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Acacia,Fabaceae,Acacia suaveolens,NA,"SA, Qld, NSW, Vic, Tas",native,Acacia suaveolens (Sm.) Willd.,https://id.biodiversity.org.au/node/apni/2904374,https://id.biodiversity.org.au/taxon/apni/51471290,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/70862,Acacia suaveolens,NA,https://id.biodiversity.org.au/node/apni/2904374,accepted +Falster_2003,Angophora hispida,07,leaf_area,1590,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Angophora hispida,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Angophora,Myrtaceae,Angophora hispida,NA,NSW,native,Angophora hispida (Sm.) Blaxell,https://id.biodiversity.org.au/node/apni/2889602,https://id.biodiversity.org.au/taxon/apni/51439560,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/91809,Angophora hispida,NA,https://id.biodiversity.org.au/node/apni/2889602,accepted +Falster_2003,Angophora hispida,07,leaf_inclination_angle,50.8,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Angophora hispida,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Angophora,Myrtaceae,Angophora hispida,NA,NSW,native,Angophora hispida (Sm.) Blaxell,https://id.biodiversity.org.au/node/apni/2889602,https://id.biodiversity.org.au/taxon/apni/51439560,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/91809,Angophora hispida,NA,https://id.biodiversity.org.au/node/apni/2889602,accepted +Falster_2003,Angophora hispida,08,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Angophora hispida,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Angophora,Myrtaceae,Angophora hispida,NA,NSW,native,Angophora hispida (Sm.) Blaxell,https://id.biodiversity.org.au/node/apni/2889602,https://id.biodiversity.org.au/taxon/apni/51439560,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/91809,Angophora hispida,NA,https://id.biodiversity.org.au/node/apni/2889602,accepted +Falster_2003,Astrotricha floccosa,09,leaf_area,3495,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Astrotricha floccosa,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,Astrotricha latifolia (pro parte misapplied) | Astrotricha latifolia (misapplied),Astrotricha,Araliaceae,Astrotricha floccosa,NA,NSW,native,Astrotricha floccosa DC.,https://id.biodiversity.org.au/node/apni/2896847,https://id.biodiversity.org.au/taxon/apni/51736769,https://id.biodiversity.org.au/taxon/apni/51736765,https://id.biodiversity.org.au/name/apni/109321,Astrotricha floccosa,NA,NA,NA +Falster_2003,Astrotricha floccosa,09,leaf_inclination_angle,31.3,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Astrotricha floccosa,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,Astrotricha latifolia (pro parte misapplied) | Astrotricha latifolia (misapplied),Astrotricha,Araliaceae,Astrotricha floccosa,NA,NSW,native,Astrotricha floccosa DC.,https://id.biodiversity.org.au/node/apni/2896847,https://id.biodiversity.org.au/taxon/apni/51736769,https://id.biodiversity.org.au/taxon/apni/51736765,https://id.biodiversity.org.au/name/apni/109321,Astrotricha floccosa,NA,NA,NA +Falster_2003,Astrotricha floccosa,10,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Astrotricha floccosa,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,Astrotricha latifolia (pro parte misapplied) | Astrotricha latifolia (misapplied),Astrotricha,Araliaceae,Astrotricha floccosa,NA,NSW,native,Astrotricha floccosa DC.,https://id.biodiversity.org.au/node/apni/2896847,https://id.biodiversity.org.au/taxon/apni/51736769,https://id.biodiversity.org.au/taxon/apni/51736765,https://id.biodiversity.org.au/name/apni/109321,Astrotricha floccosa,NA,NA,NA +Falster_2003,Banksia marginata,11,leaf_area,198,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Banksia marginata,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Banksia,Proteaceae,Banksia marginata,NA,"SA, NSW, ACT, Vic, Tas",native,Banksia marginata Cav.,https://id.biodiversity.org.au/taxon/apni/51445257,https://id.biodiversity.org.au/taxon/apni/51732900,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/108035,Banksia marginata,NA,https://id.biodiversity.org.au/taxon/apni/51445257,accepted +Falster_2003,Banksia marginata,11,leaf_inclination_angle,53.1,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Banksia marginata,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Banksia,Proteaceae,Banksia marginata,NA,"SA, NSW, ACT, Vic, Tas",native,Banksia marginata Cav.,https://id.biodiversity.org.au/taxon/apni/51445257,https://id.biodiversity.org.au/taxon/apni/51732900,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/108035,Banksia marginata,NA,https://id.biodiversity.org.au/taxon/apni/51445257,accepted +Falster_2003,Banksia marginata,12,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Banksia marginata,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Banksia,Proteaceae,Banksia marginata,NA,"SA, NSW, ACT, Vic, Tas",native,Banksia marginata Cav.,https://id.biodiversity.org.au/taxon/apni/51445257,https://id.biodiversity.org.au/taxon/apni/51732900,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/108035,Banksia marginata,NA,https://id.biodiversity.org.au/taxon/apni/51445257,accepted +Falster_2003,Banksia oblongifolia,13,leaf_area,1061,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Banksia oblongifolia,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Banksia,Proteaceae,Banksia oblongifolia,NA,"Qld, NSW",native,Banksia oblongifolia Cav.,https://id.biodiversity.org.au/node/apni/2890214,https://id.biodiversity.org.au/taxon/apni/51732900,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/108319,Banksia oblongifolia,NA,https://id.biodiversity.org.au/node/apni/2890214,accepted +Falster_2003,Banksia oblongifolia,13,leaf_inclination_angle,45,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Banksia oblongifolia,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Banksia,Proteaceae,Banksia oblongifolia,NA,"Qld, NSW",native,Banksia oblongifolia Cav.,https://id.biodiversity.org.au/node/apni/2890214,https://id.biodiversity.org.au/taxon/apni/51732900,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/108319,Banksia oblongifolia,NA,https://id.biodiversity.org.au/node/apni/2890214,accepted +Falster_2003,Banksia oblongifolia,14,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Banksia oblongifolia,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Banksia,Proteaceae,Banksia oblongifolia,NA,"Qld, NSW",native,Banksia oblongifolia Cav.,https://id.biodiversity.org.au/node/apni/2890214,https://id.biodiversity.org.au/taxon/apni/51732900,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/108319,Banksia oblongifolia,NA,https://id.biodiversity.org.au/node/apni/2890214,accepted +Falster_2003,Boronia pinnata,15,leaf_area,151,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Boronia pinnata,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,Boronia rivularis (pro parte misapplied) | Boronia safrolifera (pro parte misapplied) | Boronia latipinna (misapplied) | Boronia pilosa subsp. torquata (misapplied),Boronia,Rutaceae,Boronia pinnata,NA,NSW,native,Boronia pinnata Sm.,https://id.biodiversity.org.au/node/apni/2896858,https://id.biodiversity.org.au/taxon/apni/51446985,https://id.biodiversity.org.au/taxon/apni/51461748,https://id.biodiversity.org.au/name/apni/60829,Boronia pinnata,NA,NA,NA +Falster_2003,Boronia pinnata,15,leaf_inclination_angle,43.9,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Boronia pinnata,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,Boronia rivularis (pro parte misapplied) | Boronia safrolifera (pro parte misapplied) | Boronia latipinna (misapplied) | Boronia pilosa subsp. torquata (misapplied),Boronia,Rutaceae,Boronia pinnata,NA,NSW,native,Boronia pinnata Sm.,https://id.biodiversity.org.au/node/apni/2896858,https://id.biodiversity.org.au/taxon/apni/51446985,https://id.biodiversity.org.au/taxon/apni/51461748,https://id.biodiversity.org.au/name/apni/60829,Boronia pinnata,NA,NA,NA +Falster_2003,Boronia pinnata,16,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Boronia pinnata,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,Boronia rivularis (pro parte misapplied) | Boronia safrolifera (pro parte misapplied) | Boronia latipinna (misapplied) | Boronia pilosa subsp. torquata (misapplied),Boronia,Rutaceae,Boronia pinnata,NA,NSW,native,Boronia pinnata Sm.,https://id.biodiversity.org.au/node/apni/2896858,https://id.biodiversity.org.au/taxon/apni/51446985,https://id.biodiversity.org.au/taxon/apni/51461748,https://id.biodiversity.org.au/name/apni/60829,Boronia pinnata,NA,NA,NA +Falster_2003,Breynia oblongifolia,17,leaf_area,346,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Breynia oblongifolia,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Breynia,Phyllanthaceae,Breynia oblongifolia,NA,"Qld, NSW",native,Breynia oblongifolia (Müll.Arg.) Müll.Arg.,https://id.biodiversity.org.au/node/apni/2898881,https://id.biodiversity.org.au/taxon/apni/51291122,https://id.biodiversity.org.au/taxon/apni/51442162,https://id.biodiversity.org.au/name/apni/67150,Breynia oblongifolia,NA,https://id.biodiversity.org.au/node/apni/2898881,accepted +Falster_2003,Breynia oblongifolia,17,leaf_inclination_angle,33.7,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Breynia oblongifolia,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Breynia,Phyllanthaceae,Breynia oblongifolia,NA,"Qld, NSW",native,Breynia oblongifolia (Müll.Arg.) Müll.Arg.,https://id.biodiversity.org.au/node/apni/2898881,https://id.biodiversity.org.au/taxon/apni/51291122,https://id.biodiversity.org.au/taxon/apni/51442162,https://id.biodiversity.org.au/name/apni/67150,Breynia oblongifolia,NA,https://id.biodiversity.org.au/node/apni/2898881,accepted +Falster_2003,Breynia oblongifolia,18,leaf_compoundness,compound,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Breynia oblongifolia,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Breynia,Phyllanthaceae,Breynia oblongifolia,NA,"Qld, NSW",native,Breynia oblongifolia (Müll.Arg.) Müll.Arg.,https://id.biodiversity.org.au/node/apni/2898881,https://id.biodiversity.org.au/taxon/apni/51291122,https://id.biodiversity.org.au/taxon/apni/51442162,https://id.biodiversity.org.au/name/apni/67150,Breynia oblongifolia,NA,https://id.biodiversity.org.au/node/apni/2898881,accepted +Falster_2003,Conospermum longifolium,19,leaf_area,1363,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Conospermum longifolium,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Conospermum,Proteaceae,Conospermum longifolium,NA,NSW,native,Conospermum longifolium Sm.,https://id.biodiversity.org.au/node/apni/2891987,https://id.biodiversity.org.au/taxon/apni/51445613,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/76335,Conospermum longifolium,NA,https://id.biodiversity.org.au/node/apni/2891987,accepted +Falster_2003,Conospermum longifolium,19,leaf_inclination_angle,72.3,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Conospermum longifolium,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Conospermum,Proteaceae,Conospermum longifolium,NA,NSW,native,Conospermum longifolium Sm.,https://id.biodiversity.org.au/node/apni/2891987,https://id.biodiversity.org.au/taxon/apni/51445613,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/76335,Conospermum longifolium,NA,https://id.biodiversity.org.au/node/apni/2891987,accepted +Falster_2003,Conospermum longifolium,20,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Conospermum longifolium,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Conospermum,Proteaceae,Conospermum longifolium,NA,NSW,native,Conospermum longifolium Sm.,https://id.biodiversity.org.au/node/apni/2891987,https://id.biodiversity.org.au/taxon/apni/51445613,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/76335,Conospermum longifolium,NA,https://id.biodiversity.org.au/node/apni/2891987,accepted +Falster_2003,Epacris pulchella,21,leaf_area,5,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Epacris pulchella,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Epacris,Ericaceae,Epacris pulchella,NA,"Qld, NSW",native,Epacris pulchella Cav.,https://id.biodiversity.org.au/node/apni/2891416,https://id.biodiversity.org.au/taxon/apni/51435301,https://id.biodiversity.org.au/taxon/apni/51738121,https://id.biodiversity.org.au/name/apni/79402,Epacris pulchella,NA,https://id.biodiversity.org.au/node/apni/2891416,accepted +Falster_2003,Epacris pulchella,21,leaf_inclination_angle,42.9,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Epacris pulchella,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Epacris,Ericaceae,Epacris pulchella,NA,"Qld, NSW",native,Epacris pulchella Cav.,https://id.biodiversity.org.au/node/apni/2891416,https://id.biodiversity.org.au/taxon/apni/51435301,https://id.biodiversity.org.au/taxon/apni/51738121,https://id.biodiversity.org.au/name/apni/79402,Epacris pulchella,NA,https://id.biodiversity.org.au/node/apni/2891416,accepted +Falster_2003,Epacris pulchella,22,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Epacris pulchella,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Epacris,Ericaceae,Epacris pulchella,NA,"Qld, NSW",native,Epacris pulchella Cav.,https://id.biodiversity.org.au/node/apni/2891416,https://id.biodiversity.org.au/taxon/apni/51435301,https://id.biodiversity.org.au/taxon/apni/51738121,https://id.biodiversity.org.au/name/apni/79402,Epacris pulchella,NA,https://id.biodiversity.org.au/node/apni/2891416,accepted +Falster_2003,Eriostemon australasius,23,leaf_area,102,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Eriostemon australasius,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Eriostemon,Rutaceae,Eriostemon australasius,NA,"Qld, NSW",native,Eriostemon australasius Pers.,https://id.biodiversity.org.au/node/apni/2894257,https://id.biodiversity.org.au/taxon/apni/51447032,https://id.biodiversity.org.au/taxon/apni/51461748,https://id.biodiversity.org.au/name/apni/63723,Eriostemon australasius,NA,https://id.biodiversity.org.au/node/apni/2894257,accepted +Falster_2003,Eriostemon australasius,23,leaf_inclination_angle,62.1,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Eriostemon australasius,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Eriostemon,Rutaceae,Eriostemon australasius,NA,"Qld, NSW",native,Eriostemon australasius Pers.,https://id.biodiversity.org.au/node/apni/2894257,https://id.biodiversity.org.au/taxon/apni/51447032,https://id.biodiversity.org.au/taxon/apni/51461748,https://id.biodiversity.org.au/name/apni/63723,Eriostemon australasius,NA,https://id.biodiversity.org.au/node/apni/2894257,accepted +Falster_2003,Eriostemon australasius,24,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Eriostemon australasius,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Eriostemon,Rutaceae,Eriostemon australasius,NA,"Qld, NSW",native,Eriostemon australasius Pers.,https://id.biodiversity.org.au/node/apni/2894257,https://id.biodiversity.org.au/taxon/apni/51447032,https://id.biodiversity.org.au/taxon/apni/51461748,https://id.biodiversity.org.au/name/apni/63723,Eriostemon australasius,NA,https://id.biodiversity.org.au/node/apni/2894257,accepted +Falster_2003,Corymbia gummifera,25,leaf_area,1111,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Eucalyptus gummifera,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Corymbia,Myrtaceae,Corymbia gummifera,NA,"Qld, NSW, Vic",native,Corymbia gummifera (Gaertn.) K.D.Hill & L.A.S.Johnson,https://id.biodiversity.org.au/taxon/apni/51439703,https://id.biodiversity.org.au/taxon/apni/51439690,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/119407,Eucalyptus gummifera,NA,https://id.biodiversity.org.au/instance/apni/51439696,nomenclatural synonym +Falster_2003,Corymbia gummifera,25,leaf_inclination_angle,59.3,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Eucalyptus gummifera,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Corymbia,Myrtaceae,Corymbia gummifera,NA,"Qld, NSW, Vic",native,Corymbia gummifera (Gaertn.) K.D.Hill & L.A.S.Johnson,https://id.biodiversity.org.au/taxon/apni/51439703,https://id.biodiversity.org.au/taxon/apni/51439690,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/119407,Eucalyptus gummifera,NA,https://id.biodiversity.org.au/instance/apni/51439696,nomenclatural synonym +Falster_2003,Corymbia gummifera,26,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Eucalyptus gummifera,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Corymbia,Myrtaceae,Corymbia gummifera,NA,"Qld, NSW, Vic",native,Corymbia gummifera (Gaertn.) K.D.Hill & L.A.S.Johnson,https://id.biodiversity.org.au/taxon/apni/51439703,https://id.biodiversity.org.au/taxon/apni/51439690,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/119407,Eucalyptus gummifera,NA,https://id.biodiversity.org.au/instance/apni/51439696,nomenclatural synonym +Falster_2003,Eucalyptus haemastoma,27,leaf_area,1831,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Eucalyptus haemastoma,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Eucalyptus,Myrtaceae,Eucalyptus haemastoma,NA,NSW,native,Eucalyptus haemastoma Sm.,https://id.biodiversity.org.au/taxon/apni/51440615,https://id.biodiversity.org.au/taxon/apni/51738743,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/94219,Eucalyptus haemastoma,NA,https://id.biodiversity.org.au/taxon/apni/51440615,accepted +Falster_2003,Eucalyptus haemastoma,27,leaf_inclination_angle,69.9,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Eucalyptus haemastoma,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Eucalyptus,Myrtaceae,Eucalyptus haemastoma,NA,NSW,native,Eucalyptus haemastoma Sm.,https://id.biodiversity.org.au/taxon/apni/51440615,https://id.biodiversity.org.au/taxon/apni/51738743,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/94219,Eucalyptus haemastoma,NA,https://id.biodiversity.org.au/taxon/apni/51440615,accepted +Falster_2003,Eucalyptus haemastoma,28,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Eucalyptus haemastoma,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Eucalyptus,Myrtaceae,Eucalyptus haemastoma,NA,NSW,native,Eucalyptus haemastoma Sm.,https://id.biodiversity.org.au/taxon/apni/51440615,https://id.biodiversity.org.au/taxon/apni/51738743,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/94219,Eucalyptus haemastoma,NA,https://id.biodiversity.org.au/taxon/apni/51440615,accepted +Falster_2003,Gompholobium latifolium,29,leaf_area,254,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Gompholobium latifolium,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Gompholobium,Fabaceae,Gompholobium latifolium,NA,"Qld, NSW, Vic",native,Gompholobium latifolium Sm.,https://id.biodiversity.org.au/node/apni/2913896,https://id.biodiversity.org.au/taxon/apni/51436123,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/79047,Gompholobium latifolium,NA,https://id.biodiversity.org.au/node/apni/2913896,accepted +Falster_2003,Gompholobium latifolium,29,leaf_inclination_angle,26.9,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Gompholobium latifolium,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Gompholobium,Fabaceae,Gompholobium latifolium,NA,"Qld, NSW, Vic",native,Gompholobium latifolium Sm.,https://id.biodiversity.org.au/node/apni/2913896,https://id.biodiversity.org.au/taxon/apni/51436123,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/79047,Gompholobium latifolium,NA,https://id.biodiversity.org.au/node/apni/2913896,accepted +Falster_2003,Gompholobium latifolium,30,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Gompholobium latifolium,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Gompholobium,Fabaceae,Gompholobium latifolium,NA,"Qld, NSW, Vic",native,Gompholobium latifolium Sm.,https://id.biodiversity.org.au/node/apni/2913896,https://id.biodiversity.org.au/taxon/apni/51436123,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/79047,Gompholobium latifolium,NA,https://id.biodiversity.org.au/node/apni/2913896,accepted +Falster_2003,Grevillea buxifolia,31,leaf_area,52,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Grevillea buxifolia,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Grevillea,Proteaceae,Grevillea buxifolia,NA,NSW,native,Grevillea buxifolia (Sm.) R.Br.,https://id.biodiversity.org.au/node/apni/2916977,https://id.biodiversity.org.au/taxon/apni/51726302,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/108963,Grevillea buxifolia,NA,https://id.biodiversity.org.au/node/apni/2916977,accepted +Falster_2003,Grevillea buxifolia,31,leaf_inclination_angle,47.4,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Grevillea buxifolia,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Grevillea,Proteaceae,Grevillea buxifolia,NA,NSW,native,Grevillea buxifolia (Sm.) R.Br.,https://id.biodiversity.org.au/node/apni/2916977,https://id.biodiversity.org.au/taxon/apni/51726302,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/108963,Grevillea buxifolia,NA,https://id.biodiversity.org.au/node/apni/2916977,accepted +Falster_2003,Grevillea buxifolia,32,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Grevillea buxifolia,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Grevillea,Proteaceae,Grevillea buxifolia,NA,NSW,native,Grevillea buxifolia (Sm.) R.Br.,https://id.biodiversity.org.au/node/apni/2916977,https://id.biodiversity.org.au/taxon/apni/51726302,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/108963,Grevillea buxifolia,NA,https://id.biodiversity.org.au/node/apni/2916977,accepted +Falster_2003,Grevillea speciosa,33,leaf_area,108,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Grevillea speciosa,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Grevillea,Proteaceae,Grevillea speciosa,NA,NSW,native,Grevillea speciosa (Knight) McGill.,https://id.biodiversity.org.au/node/apni/2911382,https://id.biodiversity.org.au/taxon/apni/51726302,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/63737,Grevillea speciosa,NA,https://id.biodiversity.org.au/node/apni/2911382,accepted +Falster_2003,Grevillea speciosa,33,leaf_inclination_angle,60.1,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Grevillea speciosa,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Grevillea,Proteaceae,Grevillea speciosa,NA,NSW,native,Grevillea speciosa (Knight) McGill.,https://id.biodiversity.org.au/node/apni/2911382,https://id.biodiversity.org.au/taxon/apni/51726302,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/63737,Grevillea speciosa,NA,https://id.biodiversity.org.au/node/apni/2911382,accepted +Falster_2003,Grevillea speciosa,34,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Grevillea speciosa,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Grevillea,Proteaceae,Grevillea speciosa,NA,NSW,native,Grevillea speciosa (Knight) McGill.,https://id.biodiversity.org.au/node/apni/2911382,https://id.biodiversity.org.au/taxon/apni/51726302,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/63737,Grevillea speciosa,NA,https://id.biodiversity.org.au/node/apni/2911382,accepted +Falster_2003,Hakea dactyloides,35,leaf_area,882,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Hakea dactyloides,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Hakea,Proteaceae,Hakea dactyloides,NA,"WA (naturalised), NSW, Vic",native and naturalised,Hakea dactyloides (Gaertn.) Cav.,https://id.biodiversity.org.au/taxon/apni/51293434,https://id.biodiversity.org.au/taxon/apni/51445456,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/68163,Hakea dactyloides,NA,https://id.biodiversity.org.au/taxon/apni/51293434,accepted +Falster_2003,Hakea dactyloides,35,leaf_inclination_angle,60.6,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Hakea dactyloides,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Hakea,Proteaceae,Hakea dactyloides,NA,"WA (naturalised), NSW, Vic",native and naturalised,Hakea dactyloides (Gaertn.) Cav.,https://id.biodiversity.org.au/taxon/apni/51293434,https://id.biodiversity.org.au/taxon/apni/51445456,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/68163,Hakea dactyloides,NA,https://id.biodiversity.org.au/taxon/apni/51293434,accepted +Falster_2003,Hakea dactyloides,36,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Hakea dactyloides,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Hakea,Proteaceae,Hakea dactyloides,NA,"WA (naturalised), NSW, Vic",native and naturalised,Hakea dactyloides (Gaertn.) Cav.,https://id.biodiversity.org.au/taxon/apni/51293434,https://id.biodiversity.org.au/taxon/apni/51445456,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/68163,Hakea dactyloides,NA,https://id.biodiversity.org.au/taxon/apni/51293434,accepted +Falster_2003,Hibbertia bracteata,37,leaf_area,32,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Hibbertia bracteata,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Hibbertia,Dilleniaceae,Hibbertia bracteata,NA,NSW,native,Hibbertia bracteata (R.Br. ex DC.) Benth.,https://id.biodiversity.org.au/node/apni/2919490,https://id.biodiversity.org.au/taxon/apni/51434912,https://id.biodiversity.org.au/taxon/apni/51434913,https://id.biodiversity.org.au/name/apni/93940,Hibbertia bracteata,NA,https://id.biodiversity.org.au/node/apni/2919490,accepted +Falster_2003,Hibbertia bracteata,37,leaf_inclination_angle,47.2,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Hibbertia bracteata,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Hibbertia,Dilleniaceae,Hibbertia bracteata,NA,NSW,native,Hibbertia bracteata (R.Br. ex DC.) Benth.,https://id.biodiversity.org.au/node/apni/2919490,https://id.biodiversity.org.au/taxon/apni/51434912,https://id.biodiversity.org.au/taxon/apni/51434913,https://id.biodiversity.org.au/name/apni/93940,Hibbertia bracteata,NA,https://id.biodiversity.org.au/node/apni/2919490,accepted +Falster_2003,Hibbertia bracteata,38,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Hibbertia bracteata,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Hibbertia,Dilleniaceae,Hibbertia bracteata,NA,NSW,native,Hibbertia bracteata (R.Br. ex DC.) Benth.,https://id.biodiversity.org.au/node/apni/2919490,https://id.biodiversity.org.au/taxon/apni/51434912,https://id.biodiversity.org.au/taxon/apni/51434913,https://id.biodiversity.org.au/name/apni/93940,Hibbertia bracteata,NA,https://id.biodiversity.org.au/node/apni/2919490,accepted +Falster_2003,Isopogon anemonifolius,39,leaf_area,403,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Isopogon anemonifolius,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Isopogon,Proteaceae,Isopogon anemonifolius,NA,NSW,native,Isopogon anemonifolius (Salisb.) Knight,https://id.biodiversity.org.au/node/apni/2896366,https://id.biodiversity.org.au/taxon/apni/51445473,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/83372,Isopogon anemonifolius,NA,https://id.biodiversity.org.au/node/apni/2896366,accepted +Falster_2003,Isopogon anemonifolius,39,leaf_inclination_angle,46.3,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Isopogon anemonifolius,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Isopogon,Proteaceae,Isopogon anemonifolius,NA,NSW,native,Isopogon anemonifolius (Salisb.) Knight,https://id.biodiversity.org.au/node/apni/2896366,https://id.biodiversity.org.au/taxon/apni/51445473,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/83372,Isopogon anemonifolius,NA,https://id.biodiversity.org.au/node/apni/2896366,accepted +Falster_2003,Isopogon anemonifolius,40,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Isopogon anemonifolius,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Isopogon,Proteaceae,Isopogon anemonifolius,NA,NSW,native,Isopogon anemonifolius (Salisb.) Knight,https://id.biodiversity.org.au/node/apni/2896366,https://id.biodiversity.org.au/taxon/apni/51445473,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/83372,Isopogon anemonifolius,NA,https://id.biodiversity.org.au/node/apni/2896366,accepted +Falster_2003,Kunzea capitata,41,leaf_area,8,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Kunzea capitata,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Kunzea,Myrtaceae,Kunzea capitata,NA,NSW,native,Kunzea capitata (Sm.) Heynh.,https://id.biodiversity.org.au/taxon/apni/51440134,https://id.biodiversity.org.au/taxon/apni/51695251,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/61965,Kunzea capitata,NA,https://id.biodiversity.org.au/taxon/apni/51440134,accepted +Falster_2003,Kunzea capitata,41,leaf_inclination_angle,56.7,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Kunzea capitata,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Kunzea,Myrtaceae,Kunzea capitata,NA,NSW,native,Kunzea capitata (Sm.) Heynh.,https://id.biodiversity.org.au/taxon/apni/51440134,https://id.biodiversity.org.au/taxon/apni/51695251,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/61965,Kunzea capitata,NA,https://id.biodiversity.org.au/taxon/apni/51440134,accepted +Falster_2003,Kunzea capitata,42,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Kunzea capitata,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Kunzea,Myrtaceae,Kunzea capitata,NA,NSW,native,Kunzea capitata (Sm.) Heynh.,https://id.biodiversity.org.au/taxon/apni/51440134,https://id.biodiversity.org.au/taxon/apni/51695251,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/61965,Kunzea capitata,NA,https://id.biodiversity.org.au/taxon/apni/51440134,accepted +Falster_2003,Lambertia formosa,43,leaf_area,60,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Lambertia formosa,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Lambertia,Proteaceae,Lambertia formosa,NA,NSW,native,Lambertia formosa Sm.,https://id.biodiversity.org.au/node/apni/2920609,https://id.biodiversity.org.au/node/apni/2903088,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/115986,Lambertia formosa,NA,https://id.biodiversity.org.au/node/apni/2920609,accepted +Falster_2003,Lambertia formosa,43,leaf_inclination_angle,58.3,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Lambertia formosa,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Lambertia,Proteaceae,Lambertia formosa,NA,NSW,native,Lambertia formosa Sm.,https://id.biodiversity.org.au/node/apni/2920609,https://id.biodiversity.org.au/node/apni/2903088,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/115986,Lambertia formosa,NA,https://id.biodiversity.org.au/node/apni/2920609,accepted +Falster_2003,Lambertia formosa,44,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Lambertia formosa,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Lambertia,Proteaceae,Lambertia formosa,NA,NSW,native,Lambertia formosa Sm.,https://id.biodiversity.org.au/node/apni/2920609,https://id.biodiversity.org.au/node/apni/2903088,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/115986,Lambertia formosa,NA,https://id.biodiversity.org.au/node/apni/2920609,accepted +Falster_2003,Lasiopetalum ferrugineum,45,leaf_area,350,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Lasiopetalum ferrugineum,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Lasiopetalum,Malvaceae,Lasiopetalum ferrugineum,NA,"Qld, NSW, Vic",native,Lasiopetalum ferrugineum Sm. ex Andrews,https://id.biodiversity.org.au/node/apni/2919266,https://id.biodiversity.org.au/taxon/apni/51438987,https://id.biodiversity.org.au/taxon/apni/51439248,https://id.biodiversity.org.au/name/apni/71623,Lasiopetalum ferrugineum,NA,https://id.biodiversity.org.au/node/apni/2919266,accepted +Falster_2003,Lasiopetalum ferrugineum,45,leaf_inclination_angle,44.6,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Lasiopetalum ferrugineum,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Lasiopetalum,Malvaceae,Lasiopetalum ferrugineum,NA,"Qld, NSW, Vic",native,Lasiopetalum ferrugineum Sm. ex Andrews,https://id.biodiversity.org.au/node/apni/2919266,https://id.biodiversity.org.au/taxon/apni/51438987,https://id.biodiversity.org.au/taxon/apni/51439248,https://id.biodiversity.org.au/name/apni/71623,Lasiopetalum ferrugineum,NA,https://id.biodiversity.org.au/node/apni/2919266,accepted +Falster_2003,Lasiopetalum ferrugineum,46,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Lasiopetalum ferrugineum,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Lasiopetalum,Malvaceae,Lasiopetalum ferrugineum,NA,"Qld, NSW, Vic",native,Lasiopetalum ferrugineum Sm. ex Andrews,https://id.biodiversity.org.au/node/apni/2919266,https://id.biodiversity.org.au/taxon/apni/51438987,https://id.biodiversity.org.au/taxon/apni/51439248,https://id.biodiversity.org.au/name/apni/71623,Lasiopetalum ferrugineum,NA,https://id.biodiversity.org.au/node/apni/2919266,accepted +Falster_2003,Leptospermum sp. [Falster_2003],47,leaf_area,20,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Leptospermum spp,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",genus,genus accepted,APC,NA,Leptospermum,Myrtaceae,NA,NA,NA,NA,NA,NA,https://id.biodiversity.org.au/taxon/apni/51440260,https://id.biodiversity.org.au/taxon/apni/51738744,NA,Leptospermum sp. [Falster_2003],genus,NA,NA +Falster_2003,Leptospermum sp. [Falster_2003],47,leaf_inclination_angle,67.9,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Leptospermum spp,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",genus,genus accepted,APC,NA,Leptospermum,Myrtaceae,NA,NA,NA,NA,NA,NA,https://id.biodiversity.org.au/taxon/apni/51440260,https://id.biodiversity.org.au/taxon/apni/51738744,NA,Leptospermum sp. [Falster_2003],genus,NA,NA +Falster_2003,Leptospermum sp. [Falster_2003],48,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Leptospermum spp,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",genus,genus accepted,APC,NA,Leptospermum,Myrtaceae,NA,NA,NA,NA,NA,NA,https://id.biodiversity.org.au/taxon/apni/51440260,https://id.biodiversity.org.au/taxon/apni/51738744,NA,Leptospermum sp. [Falster_2003],genus,NA,NA +Falster_2003,Leptospermum trinervium,49,leaf_area,55,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Leptospermum trinervium,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Leptospermum,Myrtaceae,Leptospermum trinervium,NA,"Qld, NSW, ACT, Vic",native,Leptospermum trinervium (J.White) Joy Thomps.,https://id.biodiversity.org.au/node/apni/2908252,https://id.biodiversity.org.au/taxon/apni/51440260,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/101750,Leptospermum trinervium,NA,https://id.biodiversity.org.au/node/apni/2908252,accepted +Falster_2003,Leptospermum trinervium,49,leaf_inclination_angle,58.9,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Leptospermum trinervium,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Leptospermum,Myrtaceae,Leptospermum trinervium,NA,"Qld, NSW, ACT, Vic",native,Leptospermum trinervium (J.White) Joy Thomps.,https://id.biodiversity.org.au/node/apni/2908252,https://id.biodiversity.org.au/taxon/apni/51440260,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/101750,Leptospermum trinervium,NA,https://id.biodiversity.org.au/node/apni/2908252,accepted +Falster_2003,Leptospermum trinervium,50,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Leptospermum trinervium,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Leptospermum,Myrtaceae,Leptospermum trinervium,NA,"Qld, NSW, ACT, Vic",native,Leptospermum trinervium (J.White) Joy Thomps.,https://id.biodiversity.org.au/node/apni/2908252,https://id.biodiversity.org.au/taxon/apni/51440260,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/101750,Leptospermum trinervium,NA,https://id.biodiversity.org.au/node/apni/2908252,accepted +Falster_2003,Leucopogon microphyllus,51,leaf_area,1,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Leucopogon microphyllus,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Leucopogon,Ericaceae,Leucopogon microphyllus,NA,"Qld, NSW, ACT, Vic",native,Leucopogon microphyllus (Cav.) R.Br.,https://id.biodiversity.org.au/node/apni/2888801,https://id.biodiversity.org.au/taxon/apni/51435325,https://id.biodiversity.org.au/taxon/apni/51738121,https://id.biodiversity.org.au/name/apni/111371,Leucopogon microphyllus,NA,https://id.biodiversity.org.au/node/apni/2888801,accepted +Falster_2003,Leucopogon microphyllus,51,leaf_inclination_angle,52.4,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Leucopogon microphyllus,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Leucopogon,Ericaceae,Leucopogon microphyllus,NA,"Qld, NSW, ACT, Vic",native,Leucopogon microphyllus (Cav.) R.Br.,https://id.biodiversity.org.au/node/apni/2888801,https://id.biodiversity.org.au/taxon/apni/51435325,https://id.biodiversity.org.au/taxon/apni/51738121,https://id.biodiversity.org.au/name/apni/111371,Leucopogon microphyllus,NA,https://id.biodiversity.org.au/node/apni/2888801,accepted +Falster_2003,Leucopogon microphyllus,52,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Leucopogon microphyllus,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Leucopogon,Ericaceae,Leucopogon microphyllus,NA,"Qld, NSW, ACT, Vic",native,Leucopogon microphyllus (Cav.) R.Br.,https://id.biodiversity.org.au/node/apni/2888801,https://id.biodiversity.org.au/taxon/apni/51435325,https://id.biodiversity.org.au/taxon/apni/51738121,https://id.biodiversity.org.au/name/apni/111371,Leucopogon microphyllus,NA,https://id.biodiversity.org.au/node/apni/2888801,accepted +Falster_2003,Lomatia silaifolia,53,leaf_area,3950,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Lomatia siliafolia,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Lomatia,Proteaceae,Lomatia silaifolia,NA,"Qld, NSW",native,Lomatia silaifolia (Sm.) R.Br.,https://id.biodiversity.org.au/node/apni/2897191,https://id.biodiversity.org.au/taxon/apni/51445482,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/95180,Lomatia silaifolia,species,https://id.biodiversity.org.au/node/apni/2897191,accepted +Falster_2003,Lomatia silaifolia,53,leaf_inclination_angle,47.9,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Lomatia siliafolia,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Lomatia,Proteaceae,Lomatia silaifolia,NA,"Qld, NSW",native,Lomatia silaifolia (Sm.) R.Br.,https://id.biodiversity.org.au/node/apni/2897191,https://id.biodiversity.org.au/taxon/apni/51445482,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/95180,Lomatia silaifolia,species,https://id.biodiversity.org.au/node/apni/2897191,accepted +Falster_2003,Lomatia silaifolia,54,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Lomatia siliafolia,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Lomatia,Proteaceae,Lomatia silaifolia,NA,"Qld, NSW",native,Lomatia silaifolia (Sm.) R.Br.,https://id.biodiversity.org.au/node/apni/2897191,https://id.biodiversity.org.au/taxon/apni/51445482,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/95180,Lomatia silaifolia,species,https://id.biodiversity.org.au/node/apni/2897191,accepted +Falster_2003,Persoonia lanceolata,55,leaf_area,504,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Persoonia lanceolata,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Persoonia,Proteaceae,Persoonia lanceolata,NA,NSW,native,Persoonia lanceolata Andrews,https://id.biodiversity.org.au/node/apni/2892213,https://id.biodiversity.org.au/taxon/apni/51429033,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/113365,Persoonia lanceolata,NA,https://id.biodiversity.org.au/node/apni/2892213,accepted +Falster_2003,Persoonia lanceolata,55,leaf_inclination_angle,64.9,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Persoonia lanceolata,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Persoonia,Proteaceae,Persoonia lanceolata,NA,NSW,native,Persoonia lanceolata Andrews,https://id.biodiversity.org.au/node/apni/2892213,https://id.biodiversity.org.au/taxon/apni/51429033,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/113365,Persoonia lanceolata,NA,https://id.biodiversity.org.au/node/apni/2892213,accepted +Falster_2003,Persoonia lanceolata,56,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Persoonia lanceolata,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Persoonia,Proteaceae,Persoonia lanceolata,NA,NSW,native,Persoonia lanceolata Andrews,https://id.biodiversity.org.au/node/apni/2892213,https://id.biodiversity.org.au/taxon/apni/51429033,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/113365,Persoonia lanceolata,NA,https://id.biodiversity.org.au/node/apni/2892213,accepted +Falster_2003,Persoonia levis,57,leaf_area,1957,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Persoonia levis,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Persoonia,Proteaceae,Persoonia levis,NA,"NSW, Vic",native,Persoonia levis (Cav.) Domin,https://id.biodiversity.org.au/node/apni/2920199,https://id.biodiversity.org.au/taxon/apni/51429033,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/113337,Persoonia levis,NA,https://id.biodiversity.org.au/node/apni/2920199,accepted +Falster_2003,Persoonia levis,57,leaf_inclination_angle,73.5,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Persoonia levis,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Persoonia,Proteaceae,Persoonia levis,NA,"NSW, Vic",native,Persoonia levis (Cav.) Domin,https://id.biodiversity.org.au/node/apni/2920199,https://id.biodiversity.org.au/taxon/apni/51429033,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/113337,Persoonia levis,NA,https://id.biodiversity.org.au/node/apni/2920199,accepted +Falster_2003,Persoonia levis,58,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Persoonia levis,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Persoonia,Proteaceae,Persoonia levis,NA,"NSW, Vic",native,Persoonia levis (Cav.) Domin,https://id.biodiversity.org.au/node/apni/2920199,https://id.biodiversity.org.au/taxon/apni/51429033,https://id.biodiversity.org.au/taxon/apni/51732901,https://id.biodiversity.org.au/name/apni/113337,Persoonia levis,NA,https://id.biodiversity.org.au/node/apni/2920199,accepted +Falster_2003,Phyllota phylicoides,59,leaf_area,16,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Phyllota phylicoides,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Phyllota,Fabaceae,Phyllota phylicoides,NA,"Qld, NSW",native,Phyllota phylicoides (Sieber ex DC.) Benth.,https://id.biodiversity.org.au/taxon/apni/51429088,https://id.biodiversity.org.au/taxon/apni/51429089,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/96761,Phyllota phylicoides,NA,https://id.biodiversity.org.au/taxon/apni/51429088,accepted +Falster_2003,Phyllota phylicoides,59,leaf_inclination_angle,49.3,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Phyllota phylicoides,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Phyllota,Fabaceae,Phyllota phylicoides,NA,"Qld, NSW",native,Phyllota phylicoides (Sieber ex DC.) Benth.,https://id.biodiversity.org.au/taxon/apni/51429088,https://id.biodiversity.org.au/taxon/apni/51429089,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/96761,Phyllota phylicoides,NA,https://id.biodiversity.org.au/taxon/apni/51429088,accepted +Falster_2003,Phyllota phylicoides,60,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Phyllota phylicoides,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Phyllota,Fabaceae,Phyllota phylicoides,NA,"Qld, NSW",native,Phyllota phylicoides (Sieber ex DC.) Benth.,https://id.biodiversity.org.au/taxon/apni/51429088,https://id.biodiversity.org.au/taxon/apni/51429089,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/96761,Phyllota phylicoides,NA,https://id.biodiversity.org.au/taxon/apni/51429088,accepted +Falster_2003,Pomaderris ferruginea,61,leaf_area,1138,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Pomaderris ferruginea,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pomaderris,Rhamnaceae,Pomaderris ferruginea,NA,"Qld, NSW, Vic",native,Pomaderris ferruginea Sieber ex Fenzl,https://id.biodiversity.org.au/node/apni/2915166,https://id.biodiversity.org.au/taxon/apni/51446234,https://id.biodiversity.org.au/taxon/apni/51446206,https://id.biodiversity.org.au/name/apni/93990,Pomaderris ferruginea,NA,https://id.biodiversity.org.au/node/apni/2915166,accepted +Falster_2003,Pomaderris ferruginea,61,leaf_inclination_angle,31.8,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Pomaderris ferruginea,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pomaderris,Rhamnaceae,Pomaderris ferruginea,NA,"Qld, NSW, Vic",native,Pomaderris ferruginea Sieber ex Fenzl,https://id.biodiversity.org.au/node/apni/2915166,https://id.biodiversity.org.au/taxon/apni/51446234,https://id.biodiversity.org.au/taxon/apni/51446206,https://id.biodiversity.org.au/name/apni/93990,Pomaderris ferruginea,NA,https://id.biodiversity.org.au/node/apni/2915166,accepted +Falster_2003,Pomaderris ferruginea,62,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Pomaderris ferruginea,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pomaderris,Rhamnaceae,Pomaderris ferruginea,NA,"Qld, NSW, Vic",native,Pomaderris ferruginea Sieber ex Fenzl,https://id.biodiversity.org.au/node/apni/2915166,https://id.biodiversity.org.au/taxon/apni/51446234,https://id.biodiversity.org.au/taxon/apni/51446206,https://id.biodiversity.org.au/name/apni/93990,Pomaderris ferruginea,NA,https://id.biodiversity.org.au/node/apni/2915166,accepted +Falster_2003,Pultenaea daphnoides,63,leaf_area,153,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Pultenaea daphnoides,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pultenaea,Fabaceae,Pultenaea daphnoides,NA,"SA, Qld, NSW, Vic, Tas",native,Pultenaea daphnoides J.C.Wendl.,https://id.biodiversity.org.au/node/apni/2909053,https://id.biodiversity.org.au/taxon/apni/51436286,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/58650,Pultenaea daphnoides,NA,https://id.biodiversity.org.au/node/apni/2909053,accepted +Falster_2003,Pultenaea daphnoides,63,leaf_inclination_angle,36.7,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Pultenaea daphnoides,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pultenaea,Fabaceae,Pultenaea daphnoides,NA,"SA, Qld, NSW, Vic, Tas",native,Pultenaea daphnoides J.C.Wendl.,https://id.biodiversity.org.au/node/apni/2909053,https://id.biodiversity.org.au/taxon/apni/51436286,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/58650,Pultenaea daphnoides,NA,https://id.biodiversity.org.au/node/apni/2909053,accepted +Falster_2003,Pultenaea daphnoides,64,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Pultenaea daphnoides,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pultenaea,Fabaceae,Pultenaea daphnoides,NA,"SA, Qld, NSW, Vic, Tas",native,Pultenaea daphnoides J.C.Wendl.,https://id.biodiversity.org.au/node/apni/2909053,https://id.biodiversity.org.au/taxon/apni/51436286,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/58650,Pultenaea daphnoides,NA,https://id.biodiversity.org.au/node/apni/2909053,accepted +Falster_2003,Pultenaea tuberculata,65,leaf_area,28,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Pultenaea elliptica,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pultenaea,Fabaceae,Pultenaea tuberculata,NA,NSW,native,Pultenaea tuberculata Pers.,https://id.biodiversity.org.au/node/apni/2915405,https://id.biodiversity.org.au/taxon/apni/51436286,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/62958,Pultenaea elliptica,NA,https://id.biodiversity.org.au/instance/apni/824257,taxonomic synonym +Falster_2003,Pultenaea tuberculata,65,leaf_inclination_angle,40.8,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Pultenaea elliptica,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pultenaea,Fabaceae,Pultenaea tuberculata,NA,NSW,native,Pultenaea tuberculata Pers.,https://id.biodiversity.org.au/node/apni/2915405,https://id.biodiversity.org.au/taxon/apni/51436286,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/62958,Pultenaea elliptica,NA,https://id.biodiversity.org.au/instance/apni/824257,taxonomic synonym +Falster_2003,Pultenaea tuberculata,66,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Pultenaea elliptica,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pultenaea,Fabaceae,Pultenaea tuberculata,NA,NSW,native,Pultenaea tuberculata Pers.,https://id.biodiversity.org.au/node/apni/2915405,https://id.biodiversity.org.au/taxon/apni/51436286,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/62958,Pultenaea elliptica,NA,https://id.biodiversity.org.au/instance/apni/824257,taxonomic synonym +Falster_2003,Pultenaea stipularis,67,leaf_area,36,mm2,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Pultenaea stipularis,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pultenaea,Fabaceae,Pultenaea stipularis,NA,NSW,native,Pultenaea stipularis Sm.,https://id.biodiversity.org.au/node/apni/2916668,https://id.biodiversity.org.au/taxon/apni/51436286,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/62344,Pultenaea stipularis,NA,https://id.biodiversity.org.au/node/apni/2916668,accepted +Falster_2003,Pultenaea stipularis,67,leaf_inclination_angle,62.6,deg,population,mean,measurement,3,field,adult,01,NA,NA,NA,NA,02,NA,NA,NA,2000/2001,NA,01,NA,Pultenaea stipularis,Ku-ring-gai Chase National Park low nutrient,-33.69389,151.1431,"description==fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs;; geology (parent material)==derived from Hawkesbury Sandstone;; leaf area index==medium;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==94",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pultenaea,Fabaceae,Pultenaea stipularis,NA,NSW,native,Pultenaea stipularis Sm.,https://id.biodiversity.org.au/node/apni/2916668,https://id.biodiversity.org.au/taxon/apni/51436286,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/62344,Pultenaea stipularis,NA,https://id.biodiversity.org.au/node/apni/2916668,accepted +Falster_2003,Pultenaea stipularis,68,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Pultenaea stipularis,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Pultenaea,Fabaceae,Pultenaea stipularis,NA,NSW,native,Pultenaea stipularis Sm.,https://id.biodiversity.org.au/node/apni/2916668,https://id.biodiversity.org.au/taxon/apni/51436286,https://id.biodiversity.org.au/taxon/apni/51702961,https://id.biodiversity.org.au/name/apni/62344,Pultenaea stipularis,NA,https://id.biodiversity.org.au/node/apni/2916668,accepted +Falster_2003,Myrsine variabilis,69,leaf_area,1994,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Rapanea variabilis,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Myrsine,Primulaceae,Myrsine variabilis,NA,"Qld, NSW",native,Myrsine variabilis R.Br.,https://id.biodiversity.org.au/node/apni/2906517,https://id.biodiversity.org.au/node/apni/2896339,https://id.biodiversity.org.au/taxon/apni/51445200,https://id.biodiversity.org.au/name/apni/86626,Rapanea variabilis,NA,https://id.biodiversity.org.au/instance/apni/852151,nomenclatural synonym +Falster_2003,Myrsine variabilis,69,leaf_inclination_angle,33.6,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Rapanea variabilis,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Myrsine,Primulaceae,Myrsine variabilis,NA,"Qld, NSW",native,Myrsine variabilis R.Br.,https://id.biodiversity.org.au/node/apni/2906517,https://id.biodiversity.org.au/node/apni/2896339,https://id.biodiversity.org.au/taxon/apni/51445200,https://id.biodiversity.org.au/name/apni/86626,Rapanea variabilis,NA,https://id.biodiversity.org.au/instance/apni/852151,nomenclatural synonym +Falster_2003,Myrsine variabilis,70,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Rapanea variabilis,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Myrsine,Primulaceae,Myrsine variabilis,NA,"Qld, NSW",native,Myrsine variabilis R.Br.,https://id.biodiversity.org.au/node/apni/2906517,https://id.biodiversity.org.au/node/apni/2896339,https://id.biodiversity.org.au/taxon/apni/51445200,https://id.biodiversity.org.au/name/apni/86626,Rapanea variabilis,NA,https://id.biodiversity.org.au/instance/apni/852151,nomenclatural synonym +Falster_2003,Syncarpia glomulifera,71,leaf_area,1158,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Syncarpia glomulifera,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Syncarpia,Myrtaceae,Syncarpia glomulifera,NA,"Qld, NSW",native,Syncarpia glomulifera (Sm.) Nied.,https://id.biodiversity.org.au/node/apni/2900963,https://id.biodiversity.org.au/node/apni/2893498,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/63895,Syncarpia glomulifera,NA,https://id.biodiversity.org.au/node/apni/2900963,accepted +Falster_2003,Syncarpia glomulifera,71,leaf_inclination_angle,36.2,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Syncarpia glomulifera,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Syncarpia,Myrtaceae,Syncarpia glomulifera,NA,"Qld, NSW",native,Syncarpia glomulifera (Sm.) Nied.,https://id.biodiversity.org.au/node/apni/2900963,https://id.biodiversity.org.au/node/apni/2893498,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/63895,Syncarpia glomulifera,NA,https://id.biodiversity.org.au/node/apni/2900963,accepted +Falster_2003,Syncarpia glomulifera,72,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Syncarpia glomulifera,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Syncarpia,Myrtaceae,Syncarpia glomulifera,NA,"Qld, NSW",native,Syncarpia glomulifera (Sm.) Nied.,https://id.biodiversity.org.au/node/apni/2900963,https://id.biodiversity.org.au/node/apni/2893498,https://id.biodiversity.org.au/taxon/apni/51738744,https://id.biodiversity.org.au/name/apni/63895,Syncarpia glomulifera,NA,https://id.biodiversity.org.au/node/apni/2900963,accepted +Falster_2003,Synoum glandulosum,73,leaf_area,1153,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Synoum glandulosum,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Synoum,Meliaceae,Synoum glandulosum,NA,"Qld, NSW",native,Synoum glandulosum (Sm.) A.Juss.,https://id.biodiversity.org.au/node/apni/2905966,https://id.biodiversity.org.au/node/apni/2908290,https://id.biodiversity.org.au/node/apni/9261145,https://id.biodiversity.org.au/name/apni/64428,Synoum glandulosum,NA,https://id.biodiversity.org.au/node/apni/2905966,accepted +Falster_2003,Synoum glandulosum,73,leaf_inclination_angle,42.3,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Synoum glandulosum,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Synoum,Meliaceae,Synoum glandulosum,NA,"Qld, NSW",native,Synoum glandulosum (Sm.) A.Juss.,https://id.biodiversity.org.au/node/apni/2905966,https://id.biodiversity.org.au/node/apni/2908290,https://id.biodiversity.org.au/node/apni/9261145,https://id.biodiversity.org.au/name/apni/64428,Synoum glandulosum,NA,https://id.biodiversity.org.au/node/apni/2905966,accepted +Falster_2003,Synoum glandulosum,74,leaf_compoundness,compound,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Synoum glandulosum,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",species,accepted,APC,NA,Synoum,Meliaceae,Synoum glandulosum,NA,"Qld, NSW",native,Synoum glandulosum (Sm.) A.Juss.,https://id.biodiversity.org.au/node/apni/2905966,https://id.biodiversity.org.au/node/apni/2908290,https://id.biodiversity.org.au/node/apni/9261145,https://id.biodiversity.org.au/name/apni/64428,Synoum glandulosum,NA,https://id.biodiversity.org.au/node/apni/2905966,accepted +Falster_2003,Trema tomentosa var. aspera,75,leaf_area,1566,mm2,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Trema aspera,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. Aggregate descriptors of tufts were total leaf area, average leaf size, leaf number, tuft ellipsoidal area, tuft depth, main axis length (length of stem from tip to the oldest leaf ), total stem length, average branch inclination (angle of stems/branches from the horizontal) and branching bifurcation angles","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",variety,accepted,APC,NA,Trema,Cannabaceae,Trema tomentosa,Trema tomentosa var. aspera,"WA, Qld, NSW, Vic (presumed extinct)",native,Trema tomentosa var. aspera (Brongn.) Hewson,https://id.biodiversity.org.au/node/apni/2917190,https://id.biodiversity.org.au/node/apni/2913617,https://id.biodiversity.org.au/taxon/apni/51269919,https://id.biodiversity.org.au/name/apni/206199,Trema aspera,NA,https://id.biodiversity.org.au/instance/apni/856997,nomenclatural synonym +Falster_2003,Trema tomentosa var. aspera,75,leaf_inclination_angle,67.2,deg,population,mean,measurement,3,field,adult,02,NA,NA,NA,NA,01,NA,NA,NA,2000/2001,NA,01,NA,Trema aspera,Ku-ring-gai Chase National Park high nutrient,-33.57889,151.2922,"description==fire-sensitive closed forest, with an overstorey to 20 m;; geology (parent material)==weathered volcanic dyke;; leaf area index==low;; precipitation, MAP (mm)==1220;; soil P, total (mg/kg)==440",NA,NA,NA,NA,NA,"For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. The three-dimensional leaf arrangement of each plant was recorded using a FASTRAK 3D-digitizer (Polhemus, Colchester, VT, USA), in conjunction with the software package FLORADIG (CSIRO Entomology, Brisbane, Australia). The digitizer includes a magnetic signal receiver and pointer, allowing the user to record the 3D spatial co-ordinates of the pointer within a hemisphere of 3 m diameter from the receiver. Individual plants are digitally reconstructed by recording a series of point co-ordinates, and the relevant connectivity between points. Stem segments and petioles are characterized by their elevation angle, azimuth, length and diameter. Individual leaves are characterized by their length together with the azimuth and elevation angle of two vectors on the lamina surface. YPLANT software (Pearcy & Yang, 1996) was used to estimate light interception and a potential carbon gain for different sample periods throughout a single day and integrated across entire days. The 3D description of leaf arrangement recorded for each tuft in FLORADIG was converted to the appropriate YPLANT format using a program written in C. Sampling time for individual tufts ranged from 20 min to 2.5 h, depending on the number and size of leaves. Although still time consuming, the methods presented here represent a marked acceleration of data collection in architectural studies using the YPLANT software. Full details regarding the collection of architectural information are given in Appendix S1.","Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",variety,accepted,APC,NA,Trema,Cannabaceae,Trema tomentosa,Trema tomentosa var. aspera,"WA, Qld, NSW, Vic (presumed extinct)",native,Trema tomentosa var. aspera (Brongn.) Hewson,https://id.biodiversity.org.au/node/apni/2917190,https://id.biodiversity.org.au/node/apni/2913617,https://id.biodiversity.org.au/taxon/apni/51269919,https://id.biodiversity.org.au/name/apni/206199,Trema aspera,NA,https://id.biodiversity.org.au/instance/apni/856997,nomenclatural synonym +Falster_2003,Trema tomentosa var. aspera,76,leaf_compoundness,simple,NA,species,mode,expert_score,NA,field,adult,NA,NA,NA,NA,NA,NA,NA,NA,NA,2000/2001,NA,01,NA,Trema aspera,NA,NA,NA,NA,NA,NA,NA,NA,NA,expert opinion,"Study relating variation in architectural properties (leaf angle and leaf size) to cross-species patterns of leaf display, light capture and simulated carbon gain in branching-units of 38 perennial species occurring at two sites in Australian forest.","Two sites were chosen within Ku-ring-gai Chase National Park, Sydney, Australia. Both were temperate forest with a high diversity of shrub species under a moderately open eucalypt canopy. The sites differed in soil fertility (94 vs 440 mg kg-1 total P - Wright et al ., 2001) but had similar average annual rainfall (1220 mm distributed throughout the year) and temperature (22 deg , 13 deg C). The vegetation at the low nutrient site (33 deg 41' 38''S, 151 deg 8'35''E) was fire-prone low open sclerophyll woodland with a species rich understorey of woody shrubs, and emergent eucalypts to 15 m (Rice & Westoby, 1983). The site was last burnt in 1990. The soils are derived from Hawkesbury Sandstone parent material. The vegetation at the higher nutrient site (33 deg 34'44''S, 151 deg 17'32''E) is fire-sensitive closed forest, with an overstorey to 20 m dominated by Syncarpia glomulifera , Eucalyptus umbra and Livistona australis . Woody shrubs, climbers, ferns and cycads dominate the understorey. The soils are derived from a weathered volcanic dyke. Plant growth is continuous throughout the year, although species may exhibit a flush of new growth in spring. Further site details are provided by (Wright et al ., 2001). Hereafter, the sites are referred to as medium LAI (closed forest) and low LAI (open woodland) sites. Sampling At either site, a large number of small to moderate-sized woody perennial shrub species coexist in a similar light environment. Most species exhibit a rigid, sclerophyllous architecture, with comparatively little scope for diurnal or seasonal variation in leaf arrangement (pers. obs.). All species with flat or simply folded leaves, as assumed by the YPLANT software, were chosen for study. This included 26 species from the low LAI and 12 from the medium LAI site. The first three undamaged individuals of each species encountered further than 10 m away from an access track were sampled. Data were collected between 20 September 2000 and 26 November 2001. For each individual, architectural information about the leading vertical branching unit, or 'tuft', on each plant was recorded. A tuft was defined as all leaves and side branches back to the oldest leaf along a leaf age sequence. This level of organisation represents an intermediate scale between the leaf and the whole plant, spanning the full range of leaf ages and reflecting the tendency for plants to consist of repeated architectural units. Tufts, as opposed to whole plants, were sampled for practical reasons and in an attempt to provide a sizeindependent unit of comparison across species. For each individual a 3D description of the tuft leaf arrangement, basal and terminal stem diameters (vernier calipers) and plant height were recorded.",Falster_2003,"D. S. Falster and M. Westoby. “Leaf size and angle vary widely across species: what consequences for light interception?”. _New Phytologist_ 158.3 (2003), pp. 509-525. doi: [10.1046/j.1469-8137.2003.00765.x](https://doi.org/10.1046%2Fj.1469-8137.2003.00765.x).",NA,NA,NA,NA,NA,Elizabeth Wenk,"Falster, Daniel <>;; Westoby, Mark <>",variety,accepted,APC,NA,Trema,Cannabaceae,Trema tomentosa,Trema tomentosa var. aspera,"WA, Qld, NSW, Vic (presumed extinct)",native,Trema tomentosa var. aspera (Brongn.) Hewson,https://id.biodiversity.org.au/node/apni/2917190,https://id.biodiversity.org.au/node/apni/2913617,https://id.biodiversity.org.au/taxon/apni/51269919,https://id.biodiversity.org.au/name/apni/206199,Trema aspera,NA,https://id.biodiversity.org.au/instance/apni/856997,nomenclatural synonym diff --git a/tests/testthat/test-austraits_load_.R b/tests/testthat/test-austraits_load_.R index 7f1ad54..c4eb528 100644 --- a/tests/testthat/test-austraits_load_.R +++ b/tests/testthat/test-austraits_load_.R @@ -1,4 +1,3 @@ -library(purrr) versions <- c("3.0.2", "4.2.0", "5.0.0") path = "ignore/data/austraits" @@ -14,7 +13,7 @@ test_get_versions <- function(version, path){ }) } -walk(versions, +purrr::walk(versions, ~ test_get_versions(.x, path)) @@ -29,7 +28,7 @@ test_load_austraits <- function(version, path){ }) } -map(versions, +purrr::map(versions, ~ test_load_austraits(.x, path = path)) diff --git a/tests/testthat/test-database_create_combined_table.R b/tests/testthat/test-database_create_combined_table.R new file mode 100644 index 0000000..3bd8e78 --- /dev/null +++ b/tests/testthat/test-database_create_combined_table.R @@ -0,0 +1,152 @@ +# tests for combined table + +# Falster_2003 has many location properties +dataset_id <- "Falster_2003" +database <- extract_dataset(austraits_5.0.0_lite, dataset_id) +combined_table <- database_create_combined_table(database) + +# Crous_2013 has many context properties, from 4 of 5 possible categories +dataset_id_2 <- "Crous_2013" +database_2 <- extract_dataset(austraits_5.0.0_lite, dataset_id_2) +combined_table_2 <- database_create_combined_table(database_2) + +expected_output <- readr::read_csv("Falster_2003_combined_format.csv", show_col_types = FALSE) + +test_that("`database_create_combined_table` is working with format = single_column_pretty", { + expect_equal(combined_table$location_properties, expected_output$location_properties) + expect_equal(combined_table$data_contributors, expected_output$data_contributors) + expect_length(combined_table, 66) + expect_true(stringr::str_detect(combined_table$location_properties[1], "==")) + expect_true(stringr::str_detect(combined_table$data_contributors[1], "<")) +}) + +# test different packing formats for locations + +location_vars <- (database$locations %>% dplyr::distinct(location_property))$location_property + +many_location_columns_default_vars <- (database %>% join_location_properties(format = "many_columns"))$traits +many_location_columns_all_vars <- (database %>% join_location_properties(format = "many_columns", vars = "all"))$traits +locations_single_column_pretty <- (database %>% join_location_properties(format = "single_column_pretty"))$traits +locations_single_column_json <- (database %>% join_location_properties(format = "single_column_json"))$traits +locations_default_subset_vars <- (database %>% join_location_properties(format = "many_columns", vars = location_vars[4:6]))$traits + +test_that("`join_locations` is working with different formats, vars", { + expect_length(many_location_columns_default_vars, 32) + expect_equal(ncol(many_location_columns_default_vars %>% dplyr::select(dplyr::contains("location_property"))), 5) + expect_equal(ncol(locations_default_subset_vars %>% dplyr::select(dplyr::contains("location_property"))), 3) + expect_equal(ncol(many_location_columns_default_vars), ncol(many_location_columns_all_vars)) + expect_equal(names(many_location_columns_default_vars), names(many_location_columns_all_vars)) + expect_equal(intersect(names(many_location_columns_all_vars), c("latitude (deg")), character(0)) + expect_equal(ncol(locations_single_column_pretty %>% dplyr::select(dplyr::contains("location_prop"))), 1) + expect_equal(ncol(locations_single_column_json %>% dplyr::select(dplyr::contains("location_prop"))), 1) + expect_equal(nrow(locations_single_column_pretty %>% dplyr::distinct(location_properties) %>% dplyr::filter(!is.na(location_properties))), 2) + expect_equal(nrow(locations_single_column_json %>% dplyr::distinct(location_properties) %>% dplyr::filter(!is.na(location_properties))), 2) + expect_true(stringr::str_detect(locations_single_column_pretty$location_properties[1], "volcanic dyke;;")) + expect_true(stringr::str_detect(locations_single_column_json$location_properties[1], "volcanic dyke\"\\}")) +}) + +# test different vars options for contributors + +contributors_no_ORCID <- (database %>% join_contributors(vars = c("affiliation", "additional_role")))$traits +contributors_with_ORCID <- (database %>% join_contributors(vars = "all"))$traits +contributors_default <- (database %>% join_contributors())$traits + +test_that("`join_contributors` is working with vars options", { + expect_equal(length(contributors_no_ORCID), length(contributors_default)) + expect_equal(contributors_with_ORCID, contributors_default) + expect_true(stringr::str_detect(contributors_with_ORCID$data_contributors[3], "ORCID")) + expect_false(stringr::str_detect(contributors_no_ORCID$data_contributors[3], "ORCID")) +}) + +# test different packing formats & `include_description` for contexts + +context_vars <- (database_2$contexts %>% dplyr::distinct(context_property))$context_property + +contexts_default_no_desc <- (database_2 %>% join_context_properties(include_description = FALSE))$traits +contexts_default_yes_desc <- (database_2 %>% join_context_properties(include_description = TRUE))$traits +contexts_single_column_pretty_no_desc <- (database_2 %>% join_context_properties(include_description = FALSE, format = "single_column_pretty"))$traits +contexts_single_column_json_yes_desc <- (database_2 %>% join_context_properties(include_description = TRUE, format = "single_column_json"))$traits +contexts_many_columns_no_desc <- (database_2 %>% join_context_properties(include_description = FALSE, format = "many_columns"))$traits +contexts_default_no_desc_subset_vars <- (database_2 %>% join_context_properties(include_description = FALSE, vars = context_vars[1:3]))$traits + +test_that("join_context_properties arguments are working", { + expect_equal(contexts_default_no_desc, contexts_single_column_pretty_no_desc) + expect_true(stringr::str_detect(contexts_default_yes_desc$temporal_context_properties[1], "<<")) + expect_false(stringr::str_detect(contexts_default_no_desc$temporal_context_properties[1], "<<")) + expect_true(stringr::str_detect(contexts_default_yes_desc$temporal_context_properties[1], "<% dplyr::distinct(location_property))$location_property +method_vars <- c("dataset_id", "method_id", "sampling_strategy", "assistants") +method_vars2 <- c("assistants") +method_vars3 <- names(database$methods) +taxonomic_updates_vars <- c("original_name") +taxonomic_updates_vars2 <- c("aligned_name_taxonomic_status", "aligned_name") +taxonomic_updates_vars3 <- names(database$taxonomic_updates) +taxa_vars <- c("taxon_id") +taxa_vars2 <- c("taxon_id", "binomial", "trinomial") +taxa_vars3 <- names(database$taxa) + +test_that("join_ functions all a diversity of vars strings - 1 value, many values, all values", { + expect_silent((database %>% join_location_properties(vars = location_vars))$traits) + expect_silent((database %>% join_location_properties(vars = location_vars[1]))$traits) + expect_silent((database %>% join_location_properties(vars = "all"))$traits) + expect_silent((database %>% join_location_properties)$traits) + expect_silent((database %>% join_methods(vars = method_vars))$traits) + expect_silent((database %>% join_methods(vars = method_vars2))$traits) + expect_silent((database %>% join_methods(vars = method_vars3))$traits) + expect_silent((database %>% join_methods(vars = method_vars3[5]))$traits) + expect_silent((database %>% join_methods(vars = "all"))$traits) + expect_silent((database %>% join_methods)$traits) + expect_silent((database %>% join_taxonomic_updates(vars = taxonomic_updates_vars))$traits) + expect_silent((database %>% join_taxonomic_updates(vars = taxonomic_updates_vars2))$traits) + expect_silent((database %>% join_taxonomic_updates(vars = taxonomic_updates_vars3))$traits) + expect_silent((database %>% join_taxonomic_updates(vars = taxonomic_updates_vars3[5]))$traits) + expect_silent((database %>% join_taxonomic_updates(vars = "all"))$traits) + expect_silent((database %>% join_taxonomic_updates)$traits) + expect_silent((database %>% join_taxa(vars = taxa_vars))$traits) + expect_silent((database %>% join_taxa(vars = taxa_vars2))$traits) + expect_silent((database %>% join_taxa(vars = taxa_vars3))$traits) + expect_silent((database %>% join_taxa(vars = taxa_vars3[5]))$traits) + expect_silent((database %>% join_taxa(vars = "all"))$traits) + expect_silent((database %>% join_taxa)$traits) +}) + + +test_that("join_ functions given expected output", { + expect_equal(intersect(names((database %>% join_location_properties(vars = location_vars, format = "many_columns"))$traits), "location_property: leaf area index"), "location_property: leaf area index") + expect_equal(intersect(names((database %>% join_location_properties(vars = location_vars[1], format = "many_columns"))$traits), "location_property: leaf area index"), character(0)) + expect_equal(ncol((database %>% join_location_properties(format = "many_columns"))$traits), 32) + expect_equal(ncol((database %>% join_location_properties(format = "many_columns"))$traits), + ncol((database %>% join_location_properties(vars = location_vars, format = "many_columns"))$traits)) + expect_equal(ncol((database %>% join_location_properties(vars = location_vars[1], format = "many_columns"))$traits), 28) + expect_equal(ncol((database %>% join_location_properties(vars = "all"))$traits), 28) + expect_equal(ncol((database %>% join_location_properties)$traits), 28) + expect_equal(names((database %>% join_methods(vars = method_vars))$traits), + union(names(database$traits), method_vars)) + expect_equal(ncol((database %>% join_methods(vars = method_vars2))$traits), 26 + length(method_vars2)) + expect_equal(ncol((database %>% join_methods(vars = method_vars3[5]))$traits), 27) + expect_equal(names((database %>% join_methods(vars = "all"))$traits), + union(names(database$traits), names(database$methods))) + expect_equal(ncol((database %>% join_taxonomic_updates(vars = taxonomic_updates_vars3[6]))$traits), 27) + expect_equal(ncol((database %>% join_taxonomic_updates(vars = taxonomic_updates_vars3[2]))$traits), 26) + expect_equal(names((database %>% join_taxonomic_updates(vars = taxonomic_updates_vars2))$traits), + union(names(database$traits), taxonomic_updates_vars2)) + expect_equal(names((database %>% join_taxonomic_updates(vars = "all"))$traits), + union(names(database$traits), names(database$taxonomic_updates))) + expect_equal((database %>% join_taxonomic_updates(vars = "all"))$traits, + (database %>% join_taxonomic_updates(vars = taxonomic_updates_vars3))$traits) + expect_equal((database %>% join_taxa(vars = "all"))$traits, + (database %>% join_taxa(vars = taxa_vars3))$traits) + expect_equal(ncol((database %>% join_taxa(vars = taxa_vars3[5]))$traits), 27) + expect_equal(ncol((database %>% join_taxa(vars = taxa_vars3[1]))$traits), 26) + expect_equal(ncol((database %>% join_taxa(vars = taxa_vars2))$traits), 29) +}) diff --git a/tests/testthat/test-join_.R b/tests/testthat/test-join_.R index 150af8a..331130d 100644 --- a/tests/testthat/test-join_.R +++ b/tests/testthat/test-join_.R @@ -1,13 +1,13 @@ -not_supported_austraits <- list(austraits_3.0.2_lite, - austraits_4.2.0_lite) +not_supported_austraits <- list(austraits_3.0.2_lite, + austraits_4.2.0_lite) test_join_error <- function(austraits){ test_that("old versions will complain", { - expect_error(join_locations(austraits)) + expect_error(join_location_coordinates(austraits)) expect_error(join_methods(austraits)) - expect_error(join_contexts(austraits)) - expect_error(join_taxonomy(austraits)) - expect_error(join_all(austraits)) + expect_error(join_context_properties(austraits)) + expect_error(join_taxa(austraits)) + expect_error(join_taxonomic_updates(austraits)) }) } @@ -15,32 +15,29 @@ purrr::walk(not_supported_austraits, test_join_error) test_that("functions should work without warnings", { - expect_silent(join_locations(austraits_5.0.0_lite)) + expect_silent(join_location_coordinates(austraits_5.0.0_lite)) expect_silent(join_methods(austraits_5.0.0_lite)) - expect_silent(join_contexts(austraits_5.0.0_lite)) - expect_silent(join_taxonomy(austraits_5.0.0_lite)) - expect_silent(join_all(austraits_5.0.0_lite)) + expect_silent(join_context_properties(austraits_5.0.0_lite)) + expect_silent(join_taxa(austraits_5.0.0_lite)) + expect_silent(join_taxonomic_updates(austraits_5.0.0_lite)) }) test_that("structure doesn't change", { - expect_type(join_locations(austraits_5.0.0_lite), "list") + expect_type(join_location_coordinates(austraits_5.0.0_lite), "list") expect_type(join_methods(austraits_5.0.0_lite), "list") - expect_type((join_contexts(austraits_5.0.0_lite)), "list") - expect_type(join_taxonomy(austraits_5.0.0_lite), "list") - expect_type((join_all(austraits_5.0.0_lite)), "list") + expect_type(join_context_properties(austraits_5.0.0_lite), "list") + expect_type(join_taxa(austraits_5.0.0_lite), "list") + expect_type(join_taxonomic_updates(austraits_5.0.0_lite), "list") }) test_that("variables are added", { - expect_true(ncol(join_locations(austraits_5.0.0_lite)$traits) > ncol(austraits_5.0.0_lite$traits)) + expect_true(ncol(join_location_coordinates(austraits_5.0.0_lite)$traits) > ncol(austraits_5.0.0_lite$traits)) expect_true(ncol(join_methods(austraits_5.0.0_lite)$traits) > ncol(austraits_5.0.0_lite$traits)) - expect_true(ncol(join_contexts(austraits_5.0.0_lite)$traits) > ncol(austraits_5.0.0_lite$traits)) #Need an example where I have context information to add - expect_true(ncol(join_taxonomy(austraits_5.0.0_lite)$traits) > ncol(austraits_5.0.0_lite$traits)) - expect_true(ncol(join_all(austraits_5.0.0_lite)$traits) > ncol(austraits_5.0.0_lite$traits)) + expect_true(ncol(join_context_properties(austraits_5.0.0_lite)$traits) > ncol(austraits_5.0.0_lite$traits)) #Need an example where I have context information to add + expect_true(ncol(join_taxa(austraits_5.0.0_lite)$traits) > ncol(austraits_5.0.0_lite$traits)) + expect_true(ncol(join_taxonomic_updates(austraits_5.0.0_lite)$traits) > ncol(austraits_5.0.0_lite$traits)) - expect_true(any(names(join_locations(austraits_5.0.0_lite)$traits) %in% c("latitude (deg)","longitude (deg)"))) - expect_true(any(names(join_taxonomy(austraits_5.0.0_lite)$traits) %in%c("family", "genus"))) + expect_true(any(names(join_location_coordinates(austraits_5.0.0_lite)$traits) %in% c("latitude (deg)","longitude (deg)"))) + expect_true(any(names(join_taxa(austraits_5.0.0_lite)$traits) %in%c("family", "genus"))) expect_true(any(names(join_methods(austraits_5.0.0_lite)$traits) %in%c("methods"))) }) - - - diff --git a/tests/testthat/test-lookup_.R b/tests/testthat/test-lookup_.R new file mode 100644 index 0000000..94f028e --- /dev/null +++ b/tests/testthat/test-lookup_.R @@ -0,0 +1,16 @@ +# test lookup_ functions + +test_that("the lookup_ functions are working as intended", { + + expect_gt(length(austraits_5.0.0_lite %>% lookup_trait("leaf")), 50) + expect_error(austraits_5.0.0_lite %>% lookup_trait("this is not a trait")) + + expect_gt(length(austraits_5.0.0_lite %>% lookup_location_property("soil")), 10) + expect_vector(austraits_5.0.0_lite %>% lookup_location_property("precipitation")) + expect_error(austraits_5.0.0_lite %>% lookup_location_property("this is not a location property")) + + expect_gt(length(austraits_5.0.0_lite %>% lookup_context_property("temperature")), 1) + expect_vector(austraits_5.0.0_lite %>% lookup_context_property("season")) + expect_error(austraits_5.0.0_lite %>% lookup_context_property("this is not a context property")) + +}) diff --git a/tests/testthat/test-plot_.R b/tests/testthat/test-plot_.R index 76a0bee..830d5d0 100644 --- a/tests/testthat/test-plot_.R +++ b/tests/testthat/test-plot_.R @@ -5,7 +5,7 @@ test_that("Function doesn't throw error", { expect_invisible(austraits_5.0.0_lite %>% plot_trait_distribution_beeswarm("leaf_mass_per_area", "dataset_id", "Bloomfield_2018")) # this function is currently really slow, blokcing effective testing - expect_invisible((austraits_5.0.0_lite %>% extract_trait("wood_density") %>% join_locations())$trait %>% plot_locations()) + expect_invisible((austraits_5.0.0_lite %>% extract_trait("wood_density") %>% join_location_coordinates())$trait %>% plot_locations()) expect_invisible(austraits_5.0.0_lite %>% extract_trait("wood_density") %>% plot_locations()) }) diff --git a/vignettes/austraits.Rmd b/vignettes/austraits.Rmd index 12a34ca..e27bd17 100644 --- a/vignettes/austraits.Rmd +++ b/vignettes/austraits.Rmd @@ -301,12 +301,12 @@ head(data_leaf$traits) ## Join data from other tables and elements Once users have extracted the data they want, they may want to merge other study details into the main `traits` dataframe for their analyses. For example, users may require taxonomic information for a phylogenetic analysis. This is where the `join_` functions come in. -There are five `join_` functions in total, each designed to append specific information from other tables and elements in the `austraits` object. Their suffixes refer to the type of information that is joined, e.g. `join_taxonomy` appends taxonomic information to the `traits` dataframe. See `?join_all` for more details. +There are six `join_` functions in total, each designed to append specific information from other tables and elements in the `austraits` object. Their suffixes refer to the type of information that is joined, e.g. `join_taxa` appends taxonomic information to the `traits` dataframe. See `?join_location_coordinates` for more details. ```r # Join taxonomic information -(data_leaf %>% join_taxonomy)$traits %>% head() +(data_leaf %>% join_taxa)$traits %>% head() ``` ``` @@ -346,7 +346,7 @@ There are five `join_` functions in total, each designed to append specific info ```r # Join site based information -(data_leaf %>% join_sites)$traits %>% head() +(data_leaf %>% join_location_coordinates)$traits %>% head() ``` ``` @@ -366,7 +366,7 @@ There are five `join_` functions in total, each designed to append specific info ```r # Join context information -(data_leaf %>% join_contexts)$traits %>% head() +(data_leaf %>% join_context_properties)$traits %>% head() ``` ``` @@ -386,11 +386,11 @@ There are five `join_` functions in total, each designed to append specific info ```r # Alternatively users can join *all* information -(data_leaf %>% join_all)$traits %>% head() +data_leaf %>% database_create_combined_table() %>% head() ``` ``` -#> # A tibble: 6 × 22 +#> # A tibble: 6 × 66 #> dataset_id taxon_…¹ site_…² conte…³ obser…⁴ trait…⁵ value unit date value…⁶ repli…⁷ origi…⁸ #> #> 1 Falster_2003 Acacia … Ku-rin… Falste… leaf_a… 66.1 degr… site_m… 3 Acacia… @@ -408,11 +408,11 @@ There are five `join_` functions in total, each designed to append specific info ## Visualising data by site -`plot_site_locations` graphically summarises where trait data was collected from and how much data is available. The legend refers to the number of neighbouring points: the warmer the colour, the more data that is available. This function only works for studies that are geo-referenced. Users must first use `join_sites` to append latitude and longitude information into the trait dataframe before plotting +`plot_site_locations` graphically summarises where trait data was collected from and how much data is available. The legend refers to the number of neighbouring points: the warmer the colour, the more data that is available. This function only works for studies that are geo-referenced. Users must first use `join_location_coordinates` to append latitude and longitude information into the trait dataframe before plotting ```r -data_wood_dens <- data_wood_dens %>% join_sites() +data_wood_dens <- data_wood_dens %>% join_location_coordinates() plot_site_locations(data_wood_dens$traits) ``` diff --git a/vignettes/austraits.Rmd.orig b/vignettes/austraits.Rmd.orig index 257b95c..5f1e551 100644 --- a/vignettes/austraits.Rmd.orig +++ b/vignettes/austraits.Rmd.orig @@ -156,31 +156,34 @@ head(data_leaf$traits) ## Join data from other tables and elements Once users have extracted the data they want, they may want to merge other study details into the main `traits` dataframe for their analyses. For example, users may require taxonomic information for a phylogenetic analysis. This is where the `join_` functions come in. -There are five `join_` functions in total, each designed to append specific information from other tables and elements in the `austraits` object. Their suffixes refer to the type of information that is joined, e.g. `join_taxonomy` appends taxonomic information to the `traits` dataframe. See `?join_all` for more details. +There are five `join_` functions in total, each designed to append specific information from other tables and elements in the `austraits` object. Their suffixes refer to the type of information that is joined, e.g. `join_taxa` appends taxonomic information to the `traits` dataframe. See `?join_location_coordinates` for more details. ```{r, join_} # Join taxonomic information -(data_leaf %>% join_taxonomy)$traits %>% head() +(data_leaf %>% join_taxa)$traits %>% head() # Join methodological information (data_leaf %>% join_methods)$traits %>% head() -# Join site based information -(data_leaf %>% join_sites)$traits %>% head() +# Join location coordinates +(data_leaf %>% join_location_coordinates)$traits %>% head() + +# Join information pertaining to location properties +(data_leaf %>% join_location_coordinates)$traits %>% head() # Join context information -(data_leaf %>% join_contexts)$traits %>% head() +(data_leaf %>% join_context_properties)$traits %>% head() # Alternatively users can join *all* information -(data_leaf %>% join_all)$traits %>% head() +data_leaf %>% database_create_combined_table() %>% head() ``` ## Visualising data by site -`plot_site_locations` graphically summarises where trait data was collected from and how much data is available. The legend refers to the number of neighbouring points: the warmer the colour, the more data that is available. This function only works for studies that are geo-referenced. Users must first use `join_sites` to append latitude and longitude information into the trait dataframe before plotting +`plot_site_locations` graphically summarises where trait data was collected from and how much data is available. The legend refers to the number of neighbouring points: the warmer the colour, the more data that is available. This function only works for studies that are geo-referenced. Users must first use `join_location_coordinates` to append latitude and longitude information into the trait dataframe before plotting ```{r, site_plot, fig.align = "center", fig.width=5, fig.height=5} -data_wood_dens <- data_wood_dens %>% join_sites() +data_wood_dens <- data_wood_dens %>% join_location_coordinates() plot_site_locations(data_wood_dens$traits) ```