knitr::opts_chunk$set(
  echo = FALSE,
  message = FALSE,
  warning = FALSE,
  collapse = TRUE,
  comment = "#>"
)
library(dplyr)
library(fgeo)
library(pkgdoc)
url_fgeo <- "https://forestgeo.github.io/"

fgeo_reference_concept <- function(x) {
  reference_concept(x, url = url_fgeo, packages = fgeo:::fgeo_packages()) %>% 
    custom_table()
}

fgeo_reference_package <- function(x) {
  reference_package(x, url = url_fgeo, packages = fgeo:::fgeo_packages()) %>% 
    custom_table()
}

custom_table <- function(x) {
  x %>% 
    select(-package, -concept) %>% 
    unique() %>%
    knitr::kable(
      x, 
      format = "html",
      col.names = NULL,
      escape = FALSE
    ) %>%
    kableExtra::column_spec(1, bold = TRUE) %>% 
    kableExtra::column_spec(2, width = "20em")
}

Search globally in the search box below, or navigate the index clicking the menu on the right.

Global search

fgeo:::fgeo_packages() %>% 
  purrr::map_dfr(reference_package, url = url_fgeo) %>% 
  select(-package, -concept) %>% 
  unique() %>% 
  purrr::set_names(c("", "object", "description")) %>% 
  DT::datatable(
    escape = FALSE,
    rownames = NULL,
    options = list(
      # f: filter, t: table, i: information
      dom = "fti",
      search = list(search = "topography")
    )
  )

Explore fgeo

fgeo_reference_concept("functions to explore fgeo")

Plot

fgeo_reference_concept("plot functions")

Abundance

fgeo_reference_concept("functions for abundance and basal area")

Demography

fgeo_reference_concept("demography functions") 

Habitat

fgeo_reference_concept("habitat functions")

Import and manipulate ForestGEO data

Import ForestGEO data

fgeo_reference_concept("functions to import ForestGEO data")

Edit data in place

fgeo_reference_concept(c(
  "functions to edit ForestGEO data in place",
  "general functions to edit data in place"
))

Pick/drop rows with matching conditions

fgeo_reference_concept(c(
  "general functions to pick or drop rows of a dataframe",
  "functions to pick or drop rows of a ForestGEO dataframe"
))

Add new columns to a dataframe

fgeo_reference_concept("functions to add columns to dataframes")

Datasets

fgeo_reference_concept("datasets")


forestgeo/fgeo documentation built on Dec. 24, 2019, 8:07 p.m.