Movatterモバイル変換


[0]ホーム

URL:


Type:Package
Title:Airborne LiDAR Data Manipulation and Visualization for ForestryApplications
Version:4.2.2
Description:Airborne LiDAR (Light Detection and Ranging) interface for data manipulation and visualization. Read/write 'las' and 'laz' files, computation of metrics in area based approach, point filtering, artificial point reduction, classification from geographic data, normalization, individual tree segmentation and other manipulations.
URL:https://github.com/r-lidar/lidR
BugReports:https://github.com/r-lidar/lidR/issues
License:GPL-3
Depends:R (≥ 3.5.0), methods
Imports:classInt, data.table (≥ 1.12.0), glue, grDevices, lazyeval,Rcpp (≥ 1.0.3), rgl, rlas (≥ 1.8.2), sf, stats, stars, terra(≥ 1.5-17), tools, utils
Suggests:EBImage, future, geometry, gstat, raster, RCSF, RMCC, rjson,mapview, mapedit, progress, sp, testthat (≥ 2.1.0), knitr,rmarkdown
RoxygenNote:7.3.3
LinkingTo:BH (≥ 1.72.0),Rcpp,RcppArmadillo,Rnanoflann
Encoding:UTF-8
ByteCompile:true
VignetteBuilder:knitr
Biarch:true
Collate:'Class-LAS.R' 'Class-LAScatalog.R' 'Class-LAScluster.R''RcppExports.R' 'add_attribute.R' 'algorithm-dec.R''algorithm-dsm.R' 'algorithm-dtm.R' 'algorithm-gnd.R''algorithm-itd.R' 'algorithm-its.R' 'algorithm-noi.R''algorithm-out.R' 'algorithm-shp.R' 'algorithm-snag.R''algorithm-trk.R' 'backward_compatibility.R' 'catalog_apply.R''catalog_boundaries.R' 'catalog_fakerun.R''catalog_intersect.R' 'catalog_laxindex.R' 'catalog_overlaps.R''catalog_retile.R' 'catalog_select.R' 'classify.R''classify_ground.R' 'classify_noise.R' 'classify_poi.R''clip_roi.R' 'connected_components.R' 'decimate_points.R''io_readLAScatalog.R' 'io_readXLAS.R' 'deprecated.R''doc-drivers.R' 'doc-lidR.R' 'doc-parallelism.R''doc-spatialindex.R' 'engine.R' 'engine_apply.R''engine_chunks.R' 'engine_crop.R' 'engine_index.R''engine_merge.R' 'engine_options.R' 'engine_write.R''fasterize.R' 'filters.R' 'fit_shapes.R' 'fullwaveform.R''generate_las.R' 'io_readLAS.R' 'io_writeLAS.R' 'knn.R''las_check.R' 'las_compression.R' 'las_tools.R''locate_localmaxima.R' 'locate_trees.R' 'merge_spatial.R''methods-LAS.R' 'methods-LAScatalog.R' 'methods-LAScluster.R''methods-LASheader.R' 'metrics_cloud.R' 'metrics_crowns.R''metrics_hexagons.R' 'metrics_pixels.R' 'metrics_plot.R''metrics_point.R' 'metrics_polygon.R' 'metrics_stdmetrics.R''metrics_template.R' 'metrics_voxels.R' 'normalize.R''normalize_height.R' 'normalize_intensity.R' 'plot.R''plot.s3.R' 'plugins.R' 'print.R' 'rasterize.R''rasterize_canopy.R' 'rasterize_density.R''rasterize_terrain.R' 'retrieve_info.R' 'segment.R''segment_shapes.R' 'segment_snags.R' 'segment_trees.R''smooth_height.R' 'st_area.R' 'st_as_sf.R' 'st_bbox.R''st_coordinates.R' 'st_crs.R' 'st_hull.R' 'st_misc.R''st_transform.R' 'track_sensor.R' 'utils_assertive.R''utils_base.R' 'utils_chm.R' 'utils_colors.R''utils_constant.R' 'utils_delaunay.R' 'utils_geometry.R''utils_is.R' 'utils_misc.R' 'utils_raster.R''utils_spatial_index.R' 'utils_threads.R' 'voxelize_points.R''zzz.R'
NeedsCompilation:yes
Packaged:2025-11-05 20:41:18 UTC; jr
Author:Jean-Romain Roussel [aut, cre, cph], David Auty [aut, ctb] (Reviews the documentation), Florian De Boissieu [ctb] (Fixed bugs and improved catalog features), Andrew Sánchez Meador [ctb] (Implemented wing2015() for segment_snags()), Bourdon Jean-François [ctb] (Contributed to Roussel2020() for track_sensor()), Gatziolis Demetrios [ctb] (Implemented Gatziolis2019() for track_sensor()), Leon Steinmeier [ctb] (Contributed to parallelization management), Stanislaw Adaszewski [cph] (Author of the C++ concaveman code), Benoît St-Onge [cph] (Author of the 'chm_prep' function)
Maintainer:Jean-Romain Roussel <info@r-lidar.com>
Repository:CRAN
Date/Publication:2025-11-06 06:10:40 UTC

lidR: airborne LiDAR for forestry applications

Description

lidR provides a set of tools to manipulate airborne LiDAR data in forestry contexts. The packageworks with .las or .laz files. The toolbox includes algorithms for DSM, CHM, DTM, ABA,normalisation, tree detection, tree segmentation, tree delineation, colourization, validation andother tools, as well as a processing engine to process broad LiDAR coverage split into many files.

Details

To learn more about lidR, start with the vignettes: browseVignettes(package = "lidR"). Users can alsofind unofficial supplementary documentation in thelidR book.To ask "how to" questions please ask ongis.stackexchange.comwith the taglidr.

Package options

lidR.progress

Several functions have a progress bar for long operations (but not all).Should lengthy operations show a progress bar? Default: TRUE

lidR.progress.delay

The progress bar appears only for long operations. After how many secondsof computation does the progress bar appear? Default: 2

lidR.raster.default

The functions that return a raster are raster agnostic meaningthat they work either with rasters from packages 'raster', 'stars' or 'terra'. By default they returnrasters from 'stars'. Can be one of "raster", "stars" or "terra". Default: "terra"

lidR.check.nested.parallelism

The catalog processing engine (catalog_apply)checks the parallel strategy chosen by the user and verify if C++ parallelization withOpenMP should be disabled to avoid nested parallel loops. Default: TRUE. If FALSEthe catalog processing engine will not check for nested parallelismand will respect the settings ofset_lidr_threads.

Author(s)

Maintainer: Jean-Romain Rousselinfo@r-lidar.com [copyright holder]

Authors:

Other contributors:

See Also

Useful links:


Extract or Replace Parts of a LAS* Object

Description

Operators acting onLAS* objects. However, some have modified behaviors to prevent someirrelevant modifications. Indeed, aLAS* object cannot contain anything, as the contentis restricted by the LAS specifications. If a user attempts to use one of these functionsinappropriately an informative error will be thrown.

Usage

## S4 method for signature 'LAS'x$name## S4 method for signature 'LAS,ANY,missing'x[[i, j, ...]]## S4 replacement method for signature 'LAS'x$name <- value## S4 replacement method for signature 'LAS,ANY,missing'x[[i, j]] <- value## S4 method for signature 'LAS,numeric,ANY'x[i]## S4 method for signature 'LAS,logical,ANY'x[i]## S4 method for signature 'LAS,sf,ANY'x[i]## S4 method for signature 'LAS,sfc,ANY'x[i]## S4 method for signature 'LAScatalog'x$name## S4 method for signature 'LAScatalog,ANY,missing'x[[i, j, ...]]## S4 method for signature 'LAScatalog,ANY,ANY'x[i, j, ..., drop = FALSE]## S4 method for signature 'LAScatalog,logical,ANY'x[i]## S4 method for signature 'LAScatalog,sf,ANY'x[i]## S4 method for signature 'LAScatalog,sfc,ANY'x[i]## S4 replacement method for signature 'LAScatalog,ANY,ANY'x[[i, j]] <- value## S4 replacement method for signature 'LAScatalog'x$name <- value## S4 method for signature 'LASheader'x$name## S4 replacement method for signature 'LASheader'x$name <- value## S4 method for signature 'LASheader,ANY,missing'x[[i, j, ...]]## S4 replacement method for signature 'LASheader,character,missing'x[[i]] <- value

Arguments

x

ALAS* object

name

A literal character string or a name (possibly backtick quoted).

i

string, name of elements to extract or replace.

j

Unused.

...

Unused

value

typically an array-like R object of a similar class as x.

drop

Unused

Examples

LASfile <- system.file("extdata", "example.laz", package="rlas")las = readLAS(LASfile)las$Intensitylas[["Z"]]las[["Number of points by return"]]## Not run: las$Z = 2Llas[["Z"]] = 1:10las$NewCol = 0las[["NewCol"]] = 0## End(Not run)

An S4 class to represent a .las or .laz file

Description

Class LAS is the representation of a las/laz file according to theLAS file format specifications.

Usage

LAS(data, header = list(), crs = sf::NA_crs_, check = TRUE, index = NULL, ...)

Arguments

data

adata.table containing the data of a las or laz file.

header

alist or aLASheader containing the header ofa las or laz file.

crs

crs object of classcrs from sf

check

logical. Conformity tests while building the object.

index

list with two elementslist(sensor = 0L, index = 0L).Seespatial indexing

...

internal use

Details

ALAS object contains adata.table with the data read from alas/laz file andaLASheader (see the ASPRS documentation for the LAS file format for more information).Because las files are standardized the table of attributes read from the las/laz file is also standardized.Columns are named:

Value

An object of classLAS

Functions

Slots

crs

Object of classcrs from sf.

data

Object of classdata.table. Point cloud data according to the LAS file format.

header

Object of classLASheader. LAS file header according to the LAS file format.

index

list. Seespatial indexing.

See Also

readLAS

Examples

# Read a las/laz fileLASfile <- system.file("extdata", "example.laz", package="rlas")las <- readLAS(LASfile)las# Creation of a LAS object out of external datadata <- data.frame(X = runif(100, 0, 100),                   Y = runif(100, 0, 100),                   Z = runif(100, 0, 20))# 'data' has many decimal digitsdata# Create a default header and quantize *by reference*# the coordinates to fit with offset and scale factorscloud <- LAS(data)# 'data' has been updated and coordinates were quantizeddatacloud# Be careful when providing a header the function assumes that# it corresponds to the data and won't quantize the coordinatesdata <- data.frame(X = runif(100, 0, 100),                   Y = runif(100, 0, 100),                   Z = runif(100, 0, 20))header <- header(las)# This works but triggers warnings and creates an invalid LAS objectcloud <- LAS(data, header)las_check(cloud)

An S4 class to represent a collection of .las or .laz files

Description

ALAScatalog object is a representation of a collection of las/laz files. ALAScatalog isa way to manage and batch process a lidar coverage. It allows the user to process a large area, or toselectively clip data from a large area without loading all the data into computer memory.ALAScatalog can be built with the functionreadLAScatalog.

Details

ALAScatalog contains ansf object to store the geometry and metadata. It is extended with slotsthat contain processing options. InlidR, each function that supports aLAScatalog asinput will respect these processing options. Internally, processing a catalog is almost always thesame and relies on a few steps:

  1. Define chunks. A chunk is an arbitrarily-defined region of interest (ROI) of thecollection. Altogether, the chunks are a wall-to-wall set of ROIs that encompass the whole dataset.

  2. Loop over each chunk (in parallel or not).

  3. For each chunk, load the points inside the ROI into R, run some R functions,return the expected output.

  4. Merge the outputs of the different chunks once they are all processed to build a continuous(wall-to-wall) output.

So basically, aLAScatalog is an object that allows for batch processing but with the specificitythatlidR does not loop through LAS or LAZ files, but loops seamlessly through chunks that do notnecessarily match with the file pattern. This waylidR can sequentially process tiny ROIs even ifeach file may be individually too big to fit in memory. This is also why point cloud indexationwithlax files may significantly speed-up the processing.

It is important to note that catalogs with files that overlap each other are not natively supportedbylidR. When encountering such datasets the user should always filter any overlaps ifpossible. This is possible if the overlapping points are flagged, for example in the'withheld' attribute. OtherwiselidR will not be able to process the dataset correctly.

Slots

data

sf. Ansfdata.frame with the bounding box of each file as well as all the informationread from the header of each LAS/LAZ file.

processing_options

list. A list that contains some settings describing how the collection will beprocessed (see dedicated section).

chunk_options

list. A list that contains some settings describing how the collection will besub-divided into chunks to be processed (see dedicated section).

output_options

list. A list that contains some settings describing how the collection will returnthe outputs (see dedicated section).

input_options

list. A list of parameters to pass toreadLAS (see dedicated section).

index

list. Seespatial indexing.

Processing options

The slot⁠@processing_options⁠ contains alist of options that determine how chunks(the sub-areas that are sequentially processed) are processed.

Chunk options

The slot⁠@chunk_options⁠ contains alist of options that determine how chunks(the sub-areas that are sequentially processed) are made.

Output options

The slot⁠@output_options⁠ contains alist of options that determine how chunks(the sub-areas that are sequentially processed) are written. By "written" we mean written to filesor written in R memory.

Input options

The slot⁠@input_options⁠ contains alist of options that are passed to the functionreadLAS. Indeed, thereadLAS function is not called directly by the user but by theinternal processing engine. Users can propagate these options through theLAScatalog settings.

Examples

## Not run: # Build a catalogctg <- readLAScatalog("filder/to/las/files/", filter =  "-keep_first")# Summary gives a summary of how the catalog will be processedsummary(ctg)# We can seamlessly use lidR functionshmean <- pixel_metrics(ctg, ~~mean(Z), 20)ttops <- tree_detection(ctg, lmf(5))# For low memory config it is probably advisable not to load entire files# and process chunks insteadopt_chunk_size(ctg) <- 500# Sometimes the output is likely to be very large# e.g. large coverage and small resolutiondtm <- rasterize_terrain(ctg, 1, tin())# In that case it is advisable to write the output(s) to filesopt_output_files(ctg) <- "path/to/folder/DTM_chunk_{XLEFT}_{YBOTTOM}"# Raster will be written to disk. The list of written files is returned# or, in this specific case, a virtual raster mosaic.dtm <- rasterize_terrain(ctg, 1, tin())# When chunks are files the original names of the las files can be preservedopt_chunk_size(ctg) <- 0opt_output_files(ctg) <- "path/to/folder/DTM_{ORIGINALFILENAME}"dtm <- rasterize_terrain(ctg, 1, tin())# For some functions, files MUST be written to disk. Indeed, it is certain that R cannot# handle the entire output.opt_chunk_size(ctg) <- 0opt_output_files(ctg) <- "path/to/folder/{ORIGINALFILENAME}_norm"opt_laz_compression(ctg) <- TRUEnew_ctg <- normalize_height(ctg, tin())# The user has access to the catalog engine through the functions catalog_apply# and catalog_mapoutput <- catalog_apply(ctg, FUN, ...)## End(Not run)

Create aLASheader object

Description

Creates aLASheader object either from a rawlist containing all theelements named according to therlas package or creates a header from adata.frameordata.table containing a point cloud. In the latter case it will generate a headeraccording to the data usingrlas::header_create(). It willguess the LAS file format, the point data format, and initialize the scale factors and offsets,but these may not suit a user's needs. Users are advised tomanually modify the results to fit their specific needs.

Usage

LASheader(data = list())

Arguments

data

a list containing the data from the header of a LAS file. Can also beadata.frame ordata.table

Value

An object of classLASheader

Examples

data = data.frame(X = c(339002.889, 339002.983, 339002.918),                  Y = c(5248000.515, 5248000.478, 5248000.318),                  Z = c(975.589, 974.778, 974.471),                  gpstime = c(269347.28141, 269347.28142, 269347.28143),                  Intensity = c(82L, 54L, 27L),                  ReturnNumber = c(1L, 1L, 2L),                  NumberOfReturns = c(1L, 1L, 2L),                  ScanDirectionFlag = c(1L, 1L, 1L),                  EdgeOfFlightline = c(1L, 0L, 0L),                  Classification = c(1L, 1L, 1L),                  ScanAngleRank = c(-21L, -21L, -21L),                  UserData = c(32L, 32L, 32L),                  PointSourceID = c(17L, 17L, 17L))header = LASheader(data)header# Record an EPSG codeepsg(header) <- 32618headerlas <- LAS(data, header)las# The function inferred a LAS 1.2 format 1 which is correct# Upgrade to LAS 1.4 for the exampleheader@VLR <- list() # Erase VLR previously writtenheader@PHB[["Global Encoding"]][["WKT"]] <- TRUEheader@PHB[["Version Minor"]] <- 4Lheader@PHB[["Header Size"]] <- 375Lheader@PHB[["Offset to point data"]] <- 375Lwkt(header) <- sf::st_crs("EPSG:32618")$wktheaderlas1.4 <- LAS(data, header)las1.4

An S4 class to represent the header of .las or .laz files

Description

An S4 class to represent the header of .las or .laz files according to theLAS file format specifications.ALASheader object contains alist in the slot⁠@PHB⁠ withthe data read from the Public Header Block, alist in the slot⁠@VLR⁠ withthe data read from the Variable Length Records and alist in the slotEVLR with the data readfrom the Extended Variable Lenght Records.

Slots

PHB

list. Represents the Public Header Block

VLR

list. Represents the Variable Length Records

EVLR

list. Represents the Extended Variable Length Records


Add attributes into a LAS object

Description

ALAS object represents a las file in R. According to theLAS specificationsa las file contains a core of defined attributes, such as XYZ coordinates, intensity, return number,and so on, for each point. It is possible to add supplementary attributes.

Usage

add_attribute(las, x, name)add_lasattribute(las, x, name, desc)add_lasattribute_manual(  las,  x,  name,  desc,  type,  offset = NULL,  scale = NULL,  NA_value = NULL)add_lasrgb(las, R, G, B)add_lasnir(las, NIR)remove_lasattribute(las, name)

Arguments

las

An object of classLAS

x

a vector that needs to be added in the LAS object. Foradd_lasattribute* it canbe missing (see details).

name

character. The name of the extra bytes attribute to add in the file.

desc

character. A short description of the extra bytes attribute to add in the file (32 characters).

type

character. The data type of the extra bytes attribute. Can be "uchar", "char", "ushort","short", "uint", "int", "uint64", "int64", "float", "double".

scale,offset

numeric. The scale and offset of the data. NULL if not relevant.

NA_value

numeric or integer. NA is not a valid value in a las file. At time of writing it willbe replaced by this value that will be considered as NA. NULL if not relevant.

R,G,B,NIR

integer. RGB and NIR values. Values are automatically scaled to 16 bits if they arecoded on 8 bits (0 to 255).

Details

Users cannot assign names that are the same as the names of the core attributes. These functions arededicated to adding data that are not part of the LAS specification. For example,add_lasattribute(las, x, "R")will fail becauseR is a name reserved for the red channel of a .las file that contains RGBattributes. Useadd_lasrgb instead.

add_attribute

Simply adds a new column in the data but does not update the header. Thus the LASobject is not strictly valid. These data will be temporarily usable at the R level but will notbe written in a las file withwriteLAS.

add_lasattribute

Does the same asadd_attribute but automatically updates the header ofthe LAS object. Thus, the LAS object is valid and the new data is considered as "extra bytes". This newdata will be written in a las file withwriteLAS.

add_lasattribute_manual

Allows the user to manually write all the extra bytes metadata.This function is reserved for experienced users with a good knowledge of the LAS specifications.The function does not perform tests to check the validity of the information.When usingadd_lasattribute andadd_lasattribute_manual,x can only be of type numeric,(integer ordouble). It cannot be of typecharacter orlogical as these arenot supported by the LAS specifications. The types that are supported in lidR are types 0 to 10(Table 24 on page 25 of the specification). Types greater than 10 are not supported.

add_lasrgb

Adds 3 columns named RGB and updates the point format of the LAS objectfor a format that supports RGB attributes. If the RGB values are ranging from 0 to 255 they areautomatically scaled on 16 bits.

Value

An object of classLAS

Examples

LASfile <- system.file("extdata", "example.laz", package="rlas")las <- readLAS(LASfile, select = "xyz")print(las)print(header(las))x <- 1:30las <- add_attribute(las, x, "mydata")print(las)        # The las object has a new attribute called "mydata"print(header(las)) # But the header has not been updated. This new data will not be writtenlas <- add_lasattribute(las, x, "mydata2", "A new data")print(las)        # The las object has a new attribute called "mydata2"print(header(las)) # The header has been updated. This new data will be written# Optionally if the data is already in the LAS object you can update the header skipping the# parameter xlas <- add_attribute(las, x, "newattr")las <- add_lasattribute(las, name = "newattr", desc = "Amplitude")print(header(las))# Remove an extra bytes attributelas <- remove_lasattribute(las, "mydata2")print(las)print(header(las))las <- remove_lasattribute(las, "mydata")print(las)print(header(las))

Metric derivation at different levels of regularization

Description

template_metrics() computes a series of user-defined descriptive statistics for a LiDAR datasetwithin each element of a template. Depending on the template it can be for each pixel of a raster(area-based approach), or each polygon, or each segmented tree, or on the whole point cloud. Otherfunctions are convenient and simplified wrappers aroundtemplate_metrics() and are expected to bethe actual functions used. See Details and Examples.

Usage

cloud_metrics(las, func, ...)crown_metrics(  las,  func,  geom = "point",  concaveman = c(3, 0),  attribute = "treeID",  ...)hexagon_metrics(las, func, area = 400, ...)pixel_metrics(las, func, res = 20, start = c(0, 0), ...)plot_metrics(las, func, geometry, ..., radius)polygon_metrics(las, func, geometry, ...)template_metrics(las, func, template, filter = NULL, by_echo = "all", ...)voxel_metrics(las, func, res = 1, ..., all_voxels = FALSE)

Arguments

las

An object of classLAS orLAScatalog.

func

formula or expression. An expression to be applied to each element of the template (seesection "Parameter func").

...

propagated totemplate_metrics i.e.filter andby_echo.pixel_metrics() alsosupportspkg = "terra|raster|stars" to get an output inSpatRaster,⁠Raster*⁠orstars format. Default isgetOption("lidR.raster.default").

geom

character. Geometry type of the output. Can be 'point', 'convex', 'concave' or 'bbox'.

concaveman

numeric. Only iftype = "concave". Vector with the two parameters of thefunctionconcaveman.

attribute

character. The column name of the attribute containing tree IDs. Default is"treeID"

area

numeric. Area of the hexagons

res

numeric. The resolution of the output. Can optionally be aRasterLayer or astars oraSpatRaster. In that case the raster is used as the template.

start

vector of x and y coordinates for the reference raster. Default is (0,0) meaning that thegrid aligns on (0,0). Not consiered ifres is a raster

geometry

A spatial vector object.sp andsf' objects are supported.plot_metrics()supports point and polygons butpolygon_metrics() supports only polygons.

radius

numeric. If the geometry is spatial points a radius must be defined. Support oneradius or a vector of radii for variable plot sizes.

template

can be of many types and corresponds to the different levels of regularization.RasterLayer/stars/SpatRaster,sf/sfc (polygons),numeric,bbox,NULL. The metrics arecomputed for each element of the template. See examples.

filter

formula of logical predicates. Enables the function to run only on points of interestin an optimized way. See examples.

by_echo

characters. The metrics are computed multiple times for different echo types. Canbe one or more of "all", "first", "intermediate", "lastofmany", "single", and "multiple". See examples.Default is "all" meaning that it computes metrics with all points provided.

all_voxels

boolean. By default the function returns only voxels thatcontain 1 or more points. Empty voxels do not exist as the metrics are undefined.Ifall_voxels = TRUE all the voxels are returned and metrics are NA forvoxels with 0 points.

Details

pixel_metrics

Area-based approach. Computes metrics in a square tessellation. The output is araster.

hexagon_metrics

Computes metrics in an hexagon tessellation. The output is asf/sfc_POLYGON

plot_metrics

Computes metrics for each plot of a ground inventory by 1. clipping the plotinventories withclip_roi, 2. computing the user's metrics for each plot withcloud_metrics, and3. combining spatial data and metrics into one data.frame ready for statistical modelling withcbind. The output is of the class of the input.

cloud_metrics

Computes a series of user-defined descriptive statistics for an entire point cloud.The output is alist

crown_metrics

Once the trees are segmented, i.e. attributes exist in thepoint cloud that reference each tree, computes a set of user-defined descriptive statistics foreach individual tree. The output can be spatial points or spatial polygons (sf/sfc_POINT orsf/sfc_POLYGON)

voxel_metrics

Is a 3D version ofpixel_metrics. It creates a 3D matrix of voxels with a givenresolution. It creates a voxel from the cloud of points if there is at least one point. The output isadata.frame

point_metrics

Is a bit more complex and is documented inpoint_metrics

Value

Depends on the function, the template and the number of metrics. Can be aRasterLayer,aRasterBrick, astars, aSpatRaster asf/sfc, alist, aSpatialPolygonDataFrame, oradata.table. Functions are supposed to return an object that is best suited for storing the levelof regularization needed.

Parameterfunc

The function to be applied to each cell is a classical function (see examples) thatreturns a labelled list of metrics. For example, the following functionf is correctly formed.

f = function(x) {list(mean = mean(x), max = max(x))}

And could be applied either on theZ coordinates or on the intensities. These twostatements are valid:

pixel_metrics(las, f(Z), res = 20)voxel_metrics(las, f(Intensity), res = 2)

The following existing functions allow the user tocompute some predefined metrics:stdmetricsentropy,VCI,LAD. But usually users must write their ownfunctions to create metrics.template_metrics will dispatch the point cloud in the user'sfunction.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las <- readLAS(LASfile, filter = "-keep_random_fraction 0.5")col <- sf::sf.colors(15)fun1 <- ~list(maxz = max(Z))fun2 <- ~list(q85 = quantile(Z, probs = 0.85))set_lidr_threads(1) ; data.table::setDTthreads(1) # for cran only# ================# CLOUD METRICS# ================cloud_metrics(las, .stdmetrics_z)# ================# PIXEL METRICS# ================m <- pixel_metrics(las, fun1, 20)#plot(m, col = col)# ================# PLOT METRICS# ================shpfile <- system.file("extdata", "efi_plot.shp", package="lidR")inventory <- sf::st_read(shpfile, quiet = TRUE)inventory # contains an ID and a Value Of Interest (VOI) per plotm <- plot_metrics(las, fun2, inventory, radius = 11.28)#plot(header(las))#plot(m["q85"], pch = 19, cex = 3, add = TRUE)# Works with polygons as wellinventory <- sf::st_buffer(inventory, 11.28)#plot(header(las))#plot(sf::st_geometry(inventory), add = TRUE)m <- plot_metrics(las, .stdmetrics_z, inventory)#plot(m["zq85"], pch = 19, cex = 3, add = TRUE)# ================# VOXEL METRICS# ================m <- voxel_metrics(las, length(Z), 8)m <- voxel_metrics(las, mean(Intensity), 8)#plot(m, color = "V1", colorPalette = heat.colors(50), trim = 60)#plot(m, color = "V1", colorPalette = heat.colors(50), trim = 60, voxel = TRUE)# ================# CROWN METRICS# ================# Already tree-segmented point cloudLASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")trees <- readLAS(LASfile, filter = "-drop_z_below 0")metrics <- crown_metrics(trees, .stdtreemetrics)#plot(metrics["Z"], pch = 19)metrics <- crown_metrics(trees, .stdtreemetrics, geom = "convex")#plot(metrics["Z"])metrics <- crown_metrics(trees, .stdtreemetrics, geom = "bbox")#plot(metrics["Z"])metrics <- crown_metrics(trees, .stdtreemetrics, geom = "concave")#plot(metrics["Z"])# ================# ARGUMENT FILTER# ================# Compute using only some points: basicfirst = filter_poi(las, ReturnNumber == 1)metrics = pixel_metrics(first, mean(Z), 20)# Compute using only some points: optimized# faster and uses less memory. No intermediate objectmetrics = pixel_metrics(las, mean(Z), 20, filter = ~ReturnNumber == 1)# Compute using only some points: best# ~50% faster and uses ~10x less memorylas = readLAS(LASfile, filter = "-keep_first")metrics = pixel_metrics(las, mean(Z), 20)# ================# ARGUMENT BY_ECHO# ================func = ~list(avgI = mean(Intensity))echo = c("all", "first","multiple")# func defines one metric but 3 are computed respectively for: (1) all echo types,# (2) for first returns only and (3) for multiple returns onlymetrics <- pixel_metrics(las, func, 20, by_echo = echo)#plot(metrics, col = heat.colors(25))cloud_metrics(las, func, by_echo = echo)## Not run: # ================# TEMPLATE METRICS# ================# a raster as templatetemplate <- raster::raster(extent(las), nrow = 15, ncol = 15)raster::crs(template) <- crs(las)m <- template_metrics(las, fun1, template)#plot(m, col = col)# a sfc_POLYGON as templatesfc <- sf::st_as_sfc(st_bbox(las))template <- sf::st_make_grid(sfc, cellsize = 20, square = FALSE)m <- template_metrics(las, fun1, template)#plot(m)# a bbox as templatetemplate <- st_bbox(las) + c(50,30,-50,-70)plot(sf::st_as_sfc(st_bbox(las)), col = "gray")plot(sf::st_as_sfc(template), col = "darkgreen", add = TRUE)m <- template_metrics(las, fun2, template)print(m)# ================# CUSTOM METRICS# ================# Define a function that computes custom metrics# in an R&D perspective.myMetrics = function(z, i) {  metrics = list(     zwimean = sum(z*i)/sum(i), # Mean elevation weighted by intensities     zimean  = mean(z*i),       # Mean products of z by intensity     zsqmean = sqrt(mean(z^2))) # Quadratic mean   return(metrics)}# example with a stars templatetemplate <- stars::st_as_stars(st_bbox(las), dx = 10, dy = 10)m <- template_metrics(las, myMetrics(Z, Intensity), template)#plot(m, col = col)## End(Not run)

Transform to a list

Description

Functions to construct, coerce and check for both kinds of R lists.

Usage

## S3 method for class 'LASheader'as.list(x, ...)

Arguments

x

A LASheader object

...

unused


ASPRS LAS Classification

Description

A set of global variables corresponding to the point classification defined by the ASPRS for theLAS format. Instead of remembering the classification table of the specification it is possibleto use one of these global variables.

Usage

LASNONCLASSIFIEDLASUNCLASSIFIEDLASGROUNDLASLOWVEGETATIONLASMEDIUMVEGETATIONLASHIGHVEGETATIONLASBUILDINGLASLOWPOINTLASKEYPOINTLASWATERLASRAILLASROADSURFACELASWIREGUARDLASWIRECONDUCTORLASTRANSMISSIONTOWERLASBRIGDELASNOISE

Format

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

An object of classinteger of length 1.

Examples

LASfile <- system.file("extdata", "example.laz", package="rlas")las = readLAS(LASfile)las2 = filter_poi(las, Classification %in% c(LASGROUND, LASWATER))print(LASGROUND)

LAScatalog processing engine

Description

This function gives users access to theLAScatalog processing engine.It allows the application of a user-defined routine over a collection of LAS/LAZ files. TheLAScatalog processing engine is explained in theLAScatalog class

catalog_apply() is the core of the lidR package. It drives every single function that can process aLAScatalog. It is flexible and powerful but also complex.catalog_map() is a simplified versionofcatalog_apply() that suits for 90% of use cases.

catalog_sapply() is a previous attempt to provide simplified version ofcatalog_apply(). Usecatalog_map() instead.

Usage

catalog_apply(ctg, FUN, ..., .options = NULL)catalog_sapply(ctg, FUN, ..., .options = NULL)catalog_map(ctg, FUN, ..., .options = NULL)

Arguments

ctg

ALAScatalog object.

FUN

A user-defined function that respects a given template (see section function template)

...

Optional arguments to FUN.

.options

See dedicated section and examples.

Edge artifacts

It is important to take precautions to avoid 'edge artifacts' when processing wall-to-walltiles. If the points from neighbouring tiles are not included during certain processes,this could create 'edge artifacts' at the tile boundaries. For example, empty or incompletepixels in a rasterization process, or dummy elevations in a ground interpolation. The LAScatalogprocessing engine provides internal tools to load buffered data 'on-the-fly'.catalog_map() takescare of removing automatically the results computed in the buffered area to avoid unexpected outputwith duplicated entries or conflict between values computed twice. It does that in predefined waythat may not suit all cases.catalog_apply() does not remove the buffer and leave users freeto handle this in a custom way. This is whycatalog_apply() is more complex but gives more freedomto build new applications.

Buffered data

The LAS objects loaded in theses functions have a special attribute called 'buffer' that indicates,for each point, if it comes from a buffered area or not. Points from non-buffered areas have a'buffer' value of 0, while points from buffered areas have a 'buffer' value of 1, 2, 3 or 4, where1 is the bottom buffer and 2, 3 and 4 are the left, top and right buffers, respectively. This allowsfor filtering of buffer points if required.

Function template

The parameterFUN ofcatalog_apply expects a function with a first argument that will besupplied automatically by theLAScatalog processing engine. This first argument is aLAScluster.ALAScluster is an internal undocumented class but the user needs to know only three things aboutthis class:

A user-defined function must be templated like this:

myfun <- function(chunk, ...) {   # Load the chunk + buffer   las <- readLAS(chunk)   if (is.empty(las)) return(NULL)   # do something   output <- do_something(las, ...)   # remove the buffer of the output   bbox <- bbox(chunk)   output <- remove_buffer(output, bbox)   return(output)}

The lineif (is.empty(las)) return(NULL) is important because some clusters (chunks) may contain0 points (we can't know this before reading the file). In this case an empty point cloud with 0 pointsis returned byreadLAS() and this may fail in subsequent code. Thus, exiting early from the user-definedfunction by returningNULL indicates to the internal engine that the chunk was empty.

catalog_map is much simpler (but less versatile). It automatically takes care of reading the chunkand checks if the point cloud is empty. It also automatically crop the buffer. The way it crops thebuffer suits for most cases but for some special cases it may be advised to handle this in a morespecific way i.e. usingcatalog_apply(). Forcatalog_map() the first argument is aLAS and thetemplate is:

myfun <- function(las, ...) {   # do something   output <- do_something(las, ...)   return(output)}

.options

Users may have noticed that some lidR functions throw an error when the processing options areinappropriate. For example, some functions need a buffer and thusbuffer = 0 is forbidden.Users can add the same constraints to protect against inappropriate options. The.optionsargument is alist that allows users to tune the behaviour of the processing engine.

When the functionFUN returns a raster it is important to ensure that the chunks are alignedwith the raster to avoid edge artifacts. Indeed, if the edge of a chunk does not correspond to the edgeof the pixels, the output will not be strictly continuous and will have edge artifacts (that mightnot be visible). Users can check this with the optionsraster_alignment, that can take theresolution of the raster as input, as well as the starting point if needed. The following are accepted:

# check if chunks are aligned with a raster of resolution 20raster_alignment = 20raster_alignment = list(res = 20)# check if chunks are aligned with a raster of resolution 20# that starts at (0,10)raster_alignment = list(res = 20, start = c(0,10))

Examples

# More examples might be avaible in the official lidR vignettes or# on the github book <https://jean-romain.github.io/lidRbook/>## =========================================================================## Example 1: detect all the tree tops over an entire catalog## (this is basically a reproduction of the existing function 'locate_trees')## =========================================================================# 1. Build the user-defined function that analyzes each chunk of the catalog.# The function's first argument is a LAScluster object. The other arguments can be freely# chosen by the users.my_tree_detection_method <- function(chunk, ws){  # The chunk argument is a LAScluster object. The users do not need to know how it works.  # readLAS will load the region of interest (chunk) with a buffer around it, taking advantage of  # point cloud indexation if possible. The filter and select options are propagated automatically  las <- readLAS(chunk)  if (is.empty(las)) return(NULL)  # Find the tree tops using a user-developed method  # (here simply a LMF for the example).  ttops <- locate_trees(las, lmf(ws))  # ttops is an sf object that contains the tree tops in our region of interest  # plus the trees tops in the buffered area. We need to remove the buffer otherwise we will get  # some trees more than once.  bbox  <- st_bbox(chunk)  ttops <- sf::st_crop(ttops, bbox)  return(ttops)}# 2. Build a collection of file# (here, a single file LAScatalog for the purposes of this simple example).LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")ctg <- readLAScatalog(LASfile)plot(ctg)# 3. Set some processing options.# For this small single file example, the chunk size is 100 m + 10 m of bufferopt_chunk_buffer(ctg) <- 10opt_chunk_size(ctg)   <- 100            # Small because this is a dummy example.opt_chunk_alignment(ctg) <- c(-50, -35) # Align such as it creates 2 chunks only.opt_select(ctg)       <- "xyz"          # Read only the coordinates.opt_filter(ctg)       <- "-keep_first"  # Read only first returns.# 4. Apply a user-defined function to take advantage of the internal engineopt    <- list(need_buffer = TRUE,   # catalog_apply will throw an error if buffer = 0               automerge   = TRUE)   # catalog_apply will merge the outputs into a single objectoutput <- catalog_apply(ctg, my_tree_detection_method, ws = 5, .options = opt)plot(output)## =========================================================================## Example 1: simplified. There is nothing that requires special data## manipulation in the previous example. Everything can be handled automatically##=========================================================================# 1. Build the user-defined function that analyzes a point cloud.my_tree_detection_method <- function(las, ws){  # Find the tree tops using a user-developed method  # (here simply a LMF for the example).  ttops <- locate_trees(las, lmf(ws))  return(ttops)}# 2. Build a projectLASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")ctg <- readLAScatalog(LASfile)plot(ctg)# 3. Set some processing options.# For this dummy example, the chunk size is 100 m and the buffer is 10 mopt_chunk_buffer(ctg) <- 10opt_chunk_size(ctg)   <- 100            # small because this is a dummy example.opt_chunk_alignment(ctg) <- c(-50, -35) # Align such as it creates 2 chunks only.opt_select(ctg)       <- "xyz"          # Read only the coordinates.opt_filter(ctg)       <- "-keep_first"  # Read only first returns.# 4. Apply a user-defined function to take advantage of the internal engineopt    <- list(need_buffer = TRUE)   # catalog_apply will throw an error if buffer = 0output <- catalog_map(ctg, my_tree_detection_method, ws = 5, .options = opt)## Not run: ## ===================================================## Example 2: compute a rumple index on surface points## ===================================================rumple_index_surface = function(las, res){  las    <- filter_surfacepoints(las, 1)  rumple <- pixel_metrics(las, ~rumple_index(X,Y,Z), res)  return(rumple)}LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")ctg <- readLAScatalog(LASfile)opt_chunk_buffer(ctg) <- 1opt_chunk_size(ctg)   <- 140     # small because this is a dummy example.opt_select(ctg)       <- "xyz"   # read only the coordinates.opt    <- list(raster_alignment = 20) # catalog_apply will adjust the chunks if requiredoutput <- catalog_map(ctg, rumple_index_surface, res = 20, .options = opt)plot(output, col = height.colors(25))## End(Not run)

Computes the polygon that encloses the points

Description

Computes the polygon that encloses the points. It reads all the files one by one and computes aconcave hull using thest_concave_hull function. When all the hulls are computed it updates theLAScatalog to set the true polygons instead of the bounding boxes.

Usage

catalog_boundaries(ctg, ...)

Arguments

ctg

A LAScatalog

...

propagated tost_concave_hull

Value

A LAScatalog with true boundaries

Non-supported LAScatalog options

The options 'select', 'output files', 'chunk size', 'chunk buffer', 'chunk alignment' are notsupported and not respected in 'catalog_boundaries*' because the function must always process byfile, without buffer and knows which attributes to load.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")ctg <- readLAScatalog(LASfile, filter = "-drop_z_below 0.5")ctg2 <- catalog_boundaries(ctg, concavity = 1, length_threshold = 15)plot(ctg)plot(ctg2, add = TRUE)

Subset a LAScatalog

Description

Subset a LAScatalog interactively using the mouse. Subset a LAScatalog with a spatial object tokeep only the tiles of interest. It can be used to select tiles of interest that encompass spatialobjects.

Usage

catalog_intersect(  ctg,  y,  ...,  subset = c("subset", "flag_unprocessed", "flag_processed"))catalog_select(  ctg,  mapview = TRUE,  subset = c("subset", "flag_unprocessed", "flag_processed"))

Arguments

ctg

ALAScatalog

y

'bbox', 'sf', 'sfc', 'Extent', 'Raster*', 'Spatial*' objects

...

ignored

subset

character. By default it subsets the collection It is also possible to flagthe files to maintain the collection as a whole but process only a subset of its content.flag_unprocessed flags the files that will not be processed.flag_processed flags the files that will be processed.

mapview

logical. IfFALSE, use R base plot instead of mapview (no pan, no zoom, seealsoplot)

Value

A LAScatalog object

Examples

## Not run: ctg = readLAScatalog("<Path to a folder containing a set of .las files>")new_ctg = catalog_select(ctg)## End(Not run)

Retile a LAScatalog

Description

Splits or merges files to reshape the original files collection (.las or .laz) into smaller or largerfiles. It also enables the addition or removal of a buffer around the tiles. Internally, thefunction reads and writes the chunks defined by the internal processing options of aLAScatalog. Thus, the function is flexible and enables the user to retilethe dataset, retile while adding or removing a buffer (negative buffers are allowed), or optionallyto compress the data by retiling without changing the pattern but by changingthe format (las/laz).This function is does not load the point cloud into R memory It streamsfrom input file(s) to output file(s) and can be applied to large point-cloud with low memorycomputer.

Note that this function is not actually very useful becauselidR manages everything(clipping, processing, buffering, ...) internally using the proper options. Thus, retiling may beuseful for working in other software, for example, but not inlidR

Usage

catalog_retile(ctg)

Arguments

ctg

ALAScatalog object

Value

A newLAScatalog object

Non-supported LAScatalog options

The optionselect is not supported and not respected because it always preserves the fileformat and all the attributes.select = "*" is imposed internally.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")ctg = readLAScatalog(LASfile)plot(ctg)# Create a new set of 200 x 200 m.las files with first returns onlyopt_chunk_buffer(ctg) <- 0opt_chunk_size(ctg) <- 200opt_filter(ctg) <- "-keep_first"opt_chunk_alignment(ctg) <- c(275, 90)opt_output_files(ctg) <- paste0(tempdir(), "/retile_{XLEFT}_{YBOTTOM}")# preview the chunk patternplot(ctg, chunk = TRUE)newctg = catalog_retile(ctg)plot(newctg)# Create a new set of 200 x 200 m.las files# but extended with a 50 m buffer in the folderopt_chunk_buffer(ctg) <- 25opt_chunk_size(ctg) <- 200opt_filter(ctg) <- ""opt_chunk_alignment(ctg) <- c(275, 90)opt_output_files(ctg) <- paste0(tempdir(), "/{XLEFT}_{YBOTTOM}_buffered")newctg = catalog_retile(ctg)plot(newctg)## Not run: # Create a new set of compressed .laz file equivalent to the original, keeping only# first returns above 2 mopt_chunk_buffer(ctg) <- 0opt_chunk_size(ctg) <- 0opt_laz_compression(ctg) <- TRUEopt_filter(ctg) <- "-keep_first -drop_z_below 2"opt_output_files(ctg) <- paste0(tempdir(), "/{ORIGINALFILENAME}_first_2m")newctg = catalog_retile(ctg)## End(Not run)

Classify points

Description

Classify points that meet some criterion and/or that belong in a region of interest. Thefunctions updates the attributeClassification of the LAS object according tolas specifications

Usage

classify_ground(las, algorithm, last_returns = TRUE)classify_noise(las, algorithm)classify_poi(  las,  class,  poi = NULL,  roi = NULL,  inverse_roi = FALSE,  by_reference = FALSE)

Arguments

las

An object of classLAS orLAScatalog.

algorithm

An algorithm for classification. lidR has has:sor,ivf for noiseclassification, andpmf,csf,mcc for ground classification (see respectivedocumentation).

last_returns

logical. The algorithm will use only the last returns (including the first returnsin cases of a single return) to run the algorithm. If FALSE all the returns are used. If the attributes'ReturnNumber' or'NumberOfReturns' are absent,'last_returns' is turnedtoFALSE automatically.

class

The ASPRS class to attribute to the points that meet the criterion.

poi

a formula of logical predicates. The points that areTRUE will be classifiedclass.

roi

A⁠SpatialPolygons*⁠, fromsp or asf/sfc_POLYGON fromsf.The points that are in the region of interest delimited by the polygon(s) are classifiedclass.

inverse_roi

bool. Inverses theroi. The points that are outside the polygon(s)are classifiedclass.

by_reference

bool. Updates the classification in place (LAS only).

Details

classify_noise

Classify points as 'noise' (outliers) with several possible algorithms.lidR has:sor,ivf. The points classified as 'noise' are assigned a value of 18.

classify_ground

Classify points as 'ground' with several possible algorithms.lidR haspmf,csf andmcc. The points classified as 'ground' are assigned avalue of 2

classify_poi

Classify points that meet some logical criterion and/or that belong in aregion of interest with class of choice.

Non-supported LAScatalog options

The optionselect is not supported and not respected because it always preserves the file formatand all the attributes.select = "*" is imposed internally.

Examples

# ===============# Classify ground# ===============if (require(RCSF, quietly = TRUE)){LASfile <- system.file("extdata", "Topography.laz", package="lidR")las <- readLAS(LASfile, select = "xyzrn", filter = "-inside 273450 5274350 273550 5274450")# (Parameters chosen mainly for speed)mycsf <- csf(TRUE, 1, 1, time_step = 1)las <- classify_ground(las, mycsf)#plot(las, color = "Classification")}# ===============# Classify noise# ===============LASfile <- system.file("extdata", "Topography.laz", package="lidR")las <- readLAS(LASfile, filter = "-inside 273450 5274350 273550 5274450")# Add 20 artificial outliersset.seed(314)id = round(runif(20, 0, npoints(las)))set.seed(42)err = runif(20, -50, 50)las$Z[id] = las$Z[id] + err# Using IVFlas <- classify_noise(las, ivf(5,2))#plot(las, color = "Classification")# Remove outliers using filter_poi()las_denoise <- filter_poi(las, Classification != LASNOISE)# ===============# Classify POI# ===============LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")shp <- system.file("extdata", "lake_polygons_UTM17.shp", package = "lidR")las  <- readLAS(LASfile, filter = "-keep_random_fraction 0.1")lake <- sf::st_read(shp, quiet = TRUE)# Classifies the points that are NOT in the lake and that are NOT ground points as class 5poi <- ~Classification != LASGROUNDlas <- classify_poi(las, LASHIGHVEGETATION, poi = poi, roi = lake, inverse = TRUE)# Classifies the points that are in the lake as class 9las <- classify_poi(las, LASWATER, roi = lake, inverse = FALSE)#plot(las, color = "Classification")

Clip points in regions of interest

Description

Clip points within a given region of interest (ROI) from a point cloud (LAS object) or a collectionof files (LAScatalog object).

Usage

clip_roi(las, geometry, ...)clip_rectangle(las, xleft, ybottom, xright, ytop, ...)clip_polygon(las, xpoly, ypoly, ...)clip_circle(las, xcenter, ycenter, radius, ...)clip_transect(las, p1, p2, width, xz = FALSE, ...)

Arguments

las

An object of classLAS orLAScatalog.

geometry

a geometric object. spatial points, spatial polygons in sp or sf/sfc format, Extent,bbox, 2x2 matrix

...

inclip_roi: optional supplementary options (see supported geometries). Unused inother functions

xleft,ybottom,xright,ytop

numeric. coordinates of one or several rectangles.

xpoly,ypoly

numeric. x coordinates of a polygon.

xcenter,ycenter

numeric. x coordinates of on or several disc centres.

radius

numeric. disc radius or radii.

p1,p2

numeric vectors of length 2 that gives the coordinates of two points that define atransect

width

numeric. width of the transect.

xz

bool. IfTRUE the point cloud is reoriented to fit on XZ coordinates

Value

If the input is a LAS object: an object of class LAS, or alist of LAS objects if thequery implies several regions of interest.

If the input is a LAScatalog object: an object of class LAS, or alist of LASobjects if the query implies several regions of interest, or a LAScatalog if thequeries are immediately written into files without loading anything in R.

Non-supported LAScatalog options

The option⁠chunk size⁠,buffer,⁠chunk alignment⁠ andselect are not supported by⁠clip_*⁠because they are meaningless in this context.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")# Load the file and clip the region of interestlas = readLAS(LASfile, select = "xyz", filter = "-keep_first")subset1 = clip_rectangle(las, 684850, 5017850, 684900, 5017900)# Do not load the file(s), extract only the region of interest# from a bigger datasetctg = readLAScatalog(LASfile, progress = FALSE, filter = "-keep_first")subset2 = clip_rectangle(ctg, 684850, 5017850, 684900, 5017900)# Extract all the polygons from a shapefilef <- system.file("extdata", "lake_polygons_UTM17.shp", package = "lidR")lakes <- sf::st_read(f, quiet = TRUE)subset3 <- clip_roi(las, lakes)# Extract the polygons for a catalog, write them in files named# after the lake names, do not load anything in Ropt_output_files(ctg) <- paste0(tempfile(), "_{LAKENAME_1}")new_ctg = clip_roi(ctg, lakes)plot(new_ctg)# Extract a transectp1 <- c(684800, y = 5017800)p2 <- c(684900, y = 5017900)tr1 <- clip_transect(las, p1, p2, width = 4)## Not run: plot(subset1)plot(subset2)plot(subset3)plot(tr1, axis = TRUE, clear_artifacts = FALSE)## End(Not run)

Connected-Component Labeling

Description

Assigns an ID to each cluster of connected components in a point cloud. The point cloud is subdividedinto a 3D grid, and a classical Connected-Component Labeling algorithm is applied in 3D.

Usage

connected_components(las, res, min_pts, name = "clusterID", connectivity = 6)

Arguments

las

A LAS object representing the point cloud data.

res

Grid resolution. If two non-empty voxels are contiguous, they are considered part ofthe same component.

min_pts

Minimum number of points in a cluster. If a cluster contains fewer thanmin_ptspoints, it is assigned an ID of 0, indicating that it does not belong to any group.

name

A string specifying the name of the new attribute used to store the ID of each cluster.

connectivity

integer. 6, 18 or 26 neighbors search.

Value

A LAS object with an additional attribute named as specified byname.


Decimate a LAS object

Description

Reduce the number of points using several possible algorithms.

Usage

decimate_points(las, algorithm)

Arguments

las

An object of classLAS orLAScatalog.

algorithm

function. An algorithm of point decimation.lidR have:random,homogenize,highest,lowest,random_per_voxel andbarycenter_per_voxel.

Value

If the input is aLAS object, returns aLAS object. If the input is aLAScatalog, returns aLAScatalog.

Non-supported LAScatalog options

The option 'select' is not supported and not respected because it always preserves the file formatand all the attributes. 'select = "*"' is imposed internally.
The options 'chunk buffer' is not supported and not respected because it is not needed.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las <- readLAS(LASfile, select = "xyz")# Select points randomly to reach an overall density of 1thinned1 <- decimate_points(las, random(1))#plot(rasterize_density(las))#plot(rasterize_density(thinned1))# Select points randomly to reach an homogeneous density of 1thinned2 <- decimate_points(las, homogenize(1,5))#plot(rasterize_density(thinned2))# Select the highest point within each pixel of an overlayed gridthinned3 = decimate_points(las, highest(5))#plot(thinned3)

Deprecated functions in lidR

Description

These functions are provided for compatibility with older versions of lidR but are deprecated.

Usage

readALSLAS(files, select = "*", filter = "")readTLSLAS(files, select = "*", filter = "", sort = TRUE)readUAVLAS(files, select = "*", filter = "", sort = TRUE)readDAPLAS(files, select = "*", filter = "", sort = TRUE)readALSLAScatalog(folder, ...)readTLSLAScatalog(folder, ...)readUAVLAScatalog(folder, ...)readDAPLAScatalog(folder, ...)filter_surfacepoints(las, res)## S3 method for class 'LAS'filter_surfacepoints(las, res)## S3 method for class 'LAScatalog'filter_surfacepoints(las, res)

Arguments

files,select,filter,sort

See the new functions that replace the old ones

folder,...

See the new functions that replace the old ones

las,res

See the new functions that replace the old ones


Digital Surface Model Algorithm

Description

This function is made to be used inrasterize_canopy. It implements the pit-free algorithmdeveloped by Khosravipour et al. (2014), which is based on the computation of a set of classicaltriangulations at different heights (see references). Thesubcircle tweak replaces eachpoint with 8 points around the original one. This allows for virtual 'emulation' of the fact thata lidar point is not a point as such, but more realistically a disc. This tweak densifies the pointcloud and the resulting canopy model is smoother and contains fewer 'pits' and empty pixels.

Usage

pitfree(  thresholds = c(0, 2, 5, 10, 15),  max_edge = c(0, 1),  subcircle = 0,  highest = TRUE)

Arguments

thresholds

numeric. Set of height thresholds according to the Khosravipour et al. (2014) algorithmdescription (see references)

max_edge

numeric. Maximum edge length of a triangle in the Delaunay triangulation.If a triangle has an edge length greater than this value it will be removed. The first number is the valuefor the classical triangulation (threshold = 0, see alsodsmtin), the second numberis the value for the pit-free algorithm (for thresholds > 0). Ifmax_edge = 0 no trimmingis done (see examples).

subcircle

numeric. radius of the circles. To obtain fewer empty pixels the algorithmcan replace each return with a circle composed of 8 points (see details).

highest

bool. By default it keeps only the highest point per pixel before to triangulate todecrease computation time. If highest = FALSE all first returns are used.

References

Khosravipour, A., Skidmore, A. K., Isenburg, M., Wang, T., & Hussin, Y. A. (2014).Generating pit-free canopy height models from airborne lidar. Photogrammetric Engineering &Remote Sensing, 80(9), 863-872.

See Also

Other digital surface model algorithms:dsm_point2raster,dsm_tin

Examples

LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")poi = "-drop_z_below 0 -inside 481280 3812940 481330 3812990"las <- readLAS(LASfile, filter = poi)col <- height.colors(50)# Basic triangulation and rasterization of first returnschm <- rasterize_canopy(las, res = 0.5, dsmtin())plot(chm, col = col)# Khosravipour et al. pitfree algorithmchm <- rasterize_canopy(las, res = 0.5, pitfree(c(0,2,5,10,15), c(0, 1.5)))plot(chm, col = col)## Not run: # Potentially complex concave subset of point cloudx = c(481340, 481340, 481280, 481300, 481280, 481340)y = c(3812940, 3813000, 3813000, 3812960, 3812940, 3812940)las2 = clip_polygon(las,x,y)plot(las2)# Because the TIN interpolation is done within the convex hull of the point cloud# dummy pixels are interpolated that are correct according to the interpolation# method used, but meaningless in our CHMchm <- rasterize_canopy(las2, res = 0.5, pitfree(max_edge = c(0, 1.5)))plot(chm, col = col)chm = rasterize_canopy(las2, res = 0.5, pitfree(max_edge = c(3, 1.5)))plot(chm, col = col)## End(Not run)

Digital Surface Model Algorithm

Description

This function is made to be used inrasterize_canopy. It implements an algorithm for digitalsurface model computation based on a points-to-raster method: for each pixel of the output rasterthe function attributes the height of the highest point found. Thesubcircle tweak replaceseach point with 8 points around the original one. This allows for virtual 'emulation' of the factthat a lidar point is not a point as such, but more realistically a disc. This tweak densifies thepoint cloud and the resulting canopy model is smoother and contains fewer 'pits' and empty pixels.

Usage

p2r(subcircle = 0, na.fill = NULL)

Arguments

subcircle

numeric. Radius of the circles. To obtain fewer empty pixels the algorithmcan replace each return with a circle composed of 8 points (see details).

na.fill

function. A function that implements an algorithm to compute spatial interpolationto fill the empty pixel often left by points-to-raster methods.lidR hasknnidw,tin, andkriging (see alsorasterize_terrain for more details).

See Also

Other digital surface model algorithms:dsm_pitfree,dsm_tin

Examples

LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")las <- readLAS(LASfile)col <- height.colors(50)# Points-to-raster algorithm with a resolution of 1 meterchm <- rasterize_canopy(las, res = 1, p2r())plot(chm, col = col)# Points-to-raster algorithm with a resolution of 0.5 meters replacing each# point by a 20 cm radius circle of 8 pointschm <- rasterize_canopy(las, res = 0.5, p2r(0.2))plot(chm, col = col)## Not run: chm <- rasterize_canopy(las, res = 0.5, p2r(0.2, na.fill = tin()))plot(chm, col = col)## End(Not run)

Digital Surface Model Algorithm

Description

This function is made to be used inrasterize_canopy. It implements an algorithm for digitalsurface model computation using a Delaunay triangulation of first returns with a linear interpolationwithin each triangle.

Usage

dsmtin(max_edge = 0, highest = TRUE)

Arguments

max_edge

numeric. Maximum edge length of a triangle in the Delaunay triangulation.If a triangle has an edge length greater than this value it will be removed to trim dummy interpolationon non-convex areas. Ifmax_edge = 0 no trimming is done (see examples).

highest

bool. By default it keeps only the highest point per pixel before to triangulate todecrease computation time. If highest = FALSE all first returns are used.

See Also

Other digital surface model algorithms:dsm_pitfree,dsm_point2raster

Examples

LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")las <- readLAS(LASfile)col <- height.colors(50)# Basic triangulation and rasterization of first returnschm <- rasterize_canopy(las, res = 1, dsmtin())plot(chm, col = col)## Not run: # Potentially complex concave subset of point cloudx = c(481340, 481340, 481280, 481300, 481280, 481340)y = c(3812940, 3813000, 3813000, 3812960, 3812940, 3812940)las2 = clip_polygon(las,x,y)plot(las2)# Because the TIN interpolation is done within the convex hull of the point cloud# dummy pixels are interpolated that are correct according to the interpolation method# used, but meaningless in our CHMchm <- rasterize_canopy(las2, res = 0.5, dsmtin())plot(chm, col = col)# Use 'max_edge' to trim dummy triangleschm = rasterize_canopy(las2, res = 0.5, dsmtin(max_edge = 3))plot(chm, col = col)## End(Not run)

Spatial Interpolation Algorithm

Description

This function is made to be used inrasterize_terrain ornormalize_height. It implements an algorithmfor spatial interpolation. Interpolation is done using a k-nearest neighbour (KNN) approach withan inverse-distance weighting (IDW).

Usage

knnidw(k = 10, p = 2, rmax = 50)

Arguments

k

integer. Number of k-nearest neighbours. Default 10.

p

numeric. Power for inverse-distance weighting. Default 2.

rmax

numeric. Maximum radius where to search for knn. Default 50.

See Also

Other dtm algorithms:dtm_kriging,dtm_tin

Examples

LASfile <- system.file("extdata", "Topography.laz", package="lidR")las = readLAS(LASfile)#plot(las)dtm = rasterize_terrain(las, algorithm = knnidw(k = 6L, p = 2))#plot(dtm)#plot_dtm3d(dtm)

Spatial Interpolation Algorithm

Description

This function is made to be used inrasterize_terrain ornormalize_height. Itimplements an algorithm for spatial interpolation. Spatial interpolation is based on universalkriging using thekrige() function fromgstat. This method combines theKNN approach with the kriging approach. For each point of interest it kriges the terrain usingthe k-nearest neighbour ground points. This method is more difficult to manipulate but it is alsothe most advanced method for interpolating spatial data.

Usage

kriging(model = gstat::vgm(0.59, "Sph", 874), k = 10L)

Arguments

model

A variogram model computed withvgm() from packagegstat. If NULL it performs an ordinaryor weighted least squares prediction.

k

numeric. Number of k-nearest neighbours. Default 10.

See Also

Other dtm algorithms:dtm_idw,dtm_tin

Examples

## Not run: LASfile <- system.file("extdata", "Topography.laz", package="lidR")las = readLAS(LASfile)plot(las)dtm = rasterize_terrain(las, algorithm = kriging())plot(dtm)plot_dtm3d(dtm)## End(Not run)

Spatial Interpolation Algorithm

Description

This function is made to be used inrasterize_terrain ornormalize_height. Itimplements an algorithm for spatial interpolation. Spatial interpolation is based on a Delaunaytriangulation, which performs a linear interpolation within each triangle. There are usually afew points outside the convex hull, determined by the ground points at the very edge of the dataset,that cannot be interpolated with a triangulation. Extrapolation can be performed with another algorithm.

Usage

tin(..., extrapolate = knnidw(3, 1, 50))

Arguments

...

unused

extrapolate

There are usually a few points outside the convex hull, determined by the groundpoints at the very edge of the dataset, that cannot be interpolated with a triangulation.Extrapolation is done usingknnidw by default.

See Also

Other dtm algorithms:dtm_idw,dtm_kriging

Examples

LASfile <- system.file("extdata", "Topography.laz", package="lidR")las = readLAS(LASfile, filter = "-inside 273450 5274350 273550 5274450")#plot(las)dtm = rasterize_terrain(las, algorithm = tin())#plot(dtm)#plot_dtm3d(dtm)

Functions for the LAScatalog processing engine not meant to be called directly by users

Description

Functions for the LAScatalog processing engine not meant to be called directly by users.They are exported for debugging and to simplify export of internal functions when processing inparallel

Usage

engine_apply(  .CHUNKS,  .FUN,  .PROCESSOPT,  .OUTPUTOPT,  .GLOBALS = NULL,  .AUTOREAD = FALSE,  .AUTOCROP = FALSE,  ...)engine_chunks(ctg, realignment = FALSE, plot = opt_progress(ctg))engine_crop(x, bbox)engine_merge(ctg, any_list, ...)engine_write(x, path, drivers)

Arguments

.CHUNKS

list. list of LAScluster

.FUN

function. function that respects a template (seecatalog_apply)

.PROCESSOPT

list. Processing option

.OUTPUTOPT

list. Output option

.GLOBALS

list. Force export of some object in workers

.AUTOREAD

bool. Enable autoread

.AUTOCROP

bool. Enable autocrop

...

parameters of .FUN

ctg

LAScatalog

realignment

FALSE orlist(res = x, start = c(y,z)). Sometimes the chunk mustbe aligned with a raster, for example to ensure the continuity of the output. If the chunk size is800 and the expected product is a raster with a resolution of 35, 800 and 35 are not compatibleand will create 2 different partial pixels on the edges. The realignment option forces thechunk to fit the grid alignment.

plot

logical. Displays the chunk pattern.

x

LAS, Raster, stars, SpatRaster,sf, sfc, Spatial

bbox

bbox

any_list

list of LAS, Raster, stars, SpatRaster, sf, sfc, Spatial, data.frame

path

strings

drivers

list. Drivers of a LAScatalog

See Also

Other LAScatalog processing engine:engine_options

Other LAScatalog processing engine:engine_options


Get or set LAScatalog processing engine options

Description

The names of the options and their roles are documented inLAScatalog.The options are used by all the functions that support aLAScatalog as input. Most options areeasy to understand and to link to the documentation ofLAScatalog but someneed more details. See section 'Details'.

Usage

opt_chunk_buffer(ctg)opt_chunk_buffer(ctg) <- valueopt_chunk_size(ctg)opt_chunk_size(ctg) <- valueopt_chunk_alignment(ctg)opt_chunk_alignment(ctg) <- valueopt_restart(ctg) <- valueopt_progress(ctg)opt_progress(ctg) <- valueopt_stop_early(ctg)opt_stop_early(ctg) <- valueopt_wall_to_wall(ctg)opt_wall_to_wall(ctg) <- valueopt_independent_files(ctg)opt_independent_files(ctg) <- valueopt_output_files(ctg)opt_output_files(ctg) <- valueopt_laz_compression(ctg)opt_laz_compression(ctg) <- valueopt_merge(ctg)opt_merge(ctg) <- valueopt_select(ctg)opt_select(ctg) <- valueopt_filter(ctg)opt_filter(ctg) <- value

Arguments

ctg

An object of classLAScatalog

value

An appropriate value depending on the expected input.

Details

See Also

Other LAScatalog processing engine:engine

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")ctg = readLAScatalog(LASfile)plot(ctg, chunk_pattern = TRUE)opt_chunk_size(ctg) <- 150plot(ctg, chunk_pattern = TRUE)opt_chunk_buffer(ctg) <- 10plot(ctg, chunk_pattern = TRUE)opt_chunk_alignment(ctg) <- c(270,250)plot(ctg, chunk_pattern = TRUE)summary(ctg)opt_output_files(ctg) <- "/path/to/folder/templated_filename_{XBOTTOM}_{ID}"summary(ctg)

Filter points of interest

Description

Filter points of interest (POI) from a LAS object where conditions are true.

Usage

filter_poi(las, ...)filter_first(las)filter_firstlast(las)filter_firstofmany(las)filter_ground(las)filter_last(las)filter_nth(las, n)filter_single(las)filter_duplicates(las)## S3 method for class 'LAS'filter_duplicates(las)## S3 method for class 'LAScatalog'filter_duplicates(las)remove_noise(las)remove_ground(las)remove_water(las)

Arguments

las

An object of classLAS

...

Logical predicates. Multiple conditions are combined with '&' or ','

n

integer ReturnNumber == n

Details

Value

An object of classLAS

Non-supported LAScatalog options

The optionselect is not supported and not respected because it always preserves the file formatand all the attributes.select = "*" is imposed internally.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")lidar = readLAS(LASfile)# Select the first returns classified as groundfirstground = filter_poi(lidar, Classification == 2L & ReturnNumber == 1L)# Multiple arguments are equivalent to &firstground = filter_poi(lidar, Classification == 2L, ReturnNumber == 1L)# Multiple criteriafirst_or_ground = filter_poi(lidar, Classification == 2L | ReturnNumber == 1L)

Fits 2D Circles on a Point Cloud

Description

Fits a 2D horizontally-aligned circle to a set of 3D points. The method uses RANSAC-based fittingfor robust estimation. The function returns a list with the circle parameters and additional datato help determine whether the points form a circular shape. While it is always possible to fit acircle to any dataset, the additional information assists in evaluating if the data genuinelyrepresent a circular pattern. The root mean square error (RMSE) may not always be a reliable metricfor assessing the quality of the fit due to non-circular elements (such as branches) that can arbitrarilyincrease the RMSE of an otherwise well-fitted circle, as shown in the example below. Therefore, thefunction also returns the angular range of the data, which indicates the spread of the inlier points:360 degrees suggests a full circle, 180 degrees indicates a half-circle, or a smaller range maysuggest a partial arc.

Usage

fit_circle(points, num_iterations = 100, inlier_threshold = 0.01)

Arguments

points

A LAS object representing a clustered slice, or an nx3 matrix of point coordinates.

num_iterations

The number of iterations for the RANSAC fitting algorithm.

inlier_threshold

A threshold value; points are considered inliers if their residuals arebelow this value.

Value

A list containing the circle parameters and additional information for determining whetherthe data fit a circular shape:

Examples

LASfile <- system.file("extdata", "dbh.laz", package="lidR")las <- readTLS(LASfile, select = "xyz")xyz = sf::st_coordinates(las)circle = fit_circle(xyz)plot(xyz, asp = 1, pch = 19, cex = 0.1)symbols(circle$center_x, circle$center_y, circles = circle$radius,  add = TRUE, fg = "red", inches = FALSE)trunk = las[circle$inliers]# Fitting a half-circlehalf = xyz[xyz[,1] > 101.45,]circle = fit_circle(half)plot(half, asp = 1, pch = 19, cex = 0.1)symbols(circle$center_x, circle$center_y, circles = circle$radius,  add = TRUE, fg = "red", inches = FALSE)circle$covered_arc_degree

Ground Segmentation Algorithm

Description

This function is made to be used inclassify_ground. It implements an algorithm for segmentationof ground points base on a Cloth Simulation Filter. This method is a strict implementation ofthe CSF algorithm made by Zhang et al. (2016) (see references) that relies on the authors' originalsource code written and exposed to R via the theRCSF package.

Usage

csf(  sloop_smooth = FALSE,  class_threshold = 0.5,  cloth_resolution = 0.5,  rigidness = 1L,  iterations = 500L,  time_step = 0.65)

Arguments

sloop_smooth

logical. When steep slopes exist, set this parameter to TRUE to reduceerrors during post-processing.

class_threshold

scalar. The distance to the simulated cloth to classify a point cloud into groundand non-ground. The default is 0.5.

cloth_resolution

scalar. The distance between particles in the cloth. This is usually set to theaverage distance of the points in the point cloud. The default value is 0.5.

rigidness

integer. The rigidness of the cloth. 1 stands for very soft (to fit ruggedterrain), 2 stands for medium, and 3 stands for hard cloth (for flat terrain). The default is 1.

iterations

integer. Maximum iterations for simulating cloth. The default value is 500. Usually,there is no need to change this value.

time_step

scalar. Time step when simulating the cloth under gravity. The default valueis 0.65. Usually, there is no need to change this value. It is suitable for most cases.

References

W. Zhang, J. Qi*, P. Wan, H. Wang, D. Xie, X. Wang, and G. Yan, “An Easy-to-Use Airborne LiDAR DataFiltering Method Based on Cloth Simulation,” Remote Sens., vol. 8, no. 6, p. 501, 2016.(http://www.mdpi.com/2072-4292/8/6/501/htm)

See Also

Other ground segmentation algorithms:gnd_mcc,gnd_pmf

Examples

if (require(RCSF, quietly = TRUE)){LASfile <- system.file("extdata", "Topography.laz", package="lidR")las <- readLAS(LASfile, select = "xyzrn")mycsf <- csf(TRUE, 1, 1, time_step = 1)las <- classify_ground(las, mycsf)#plot(las, color = "Classification")}

Ground Segmentation Algorithm

Description

This function is made to be used inclassify_ground. It implements analgorithm for segmentation of ground points base on a Multiscale CurvatureClassification. This method is a strict implementation of the MCC algorithmmade by Evans and Hudak. (2007) (see references) that relies on the authors'original source code written and exposed to R via the theRMCC package.

Usage

mcc(s = 1.5, t = 0.3)

Arguments

s

numeric. Scale parameter. The optimal scale parameter is a function of1) the scale of the objects (e.g., trees) on the ground, and 2) the samplinginterval (post spacing) of the lidar data.

t

numeric. Curvature threshold

Details

There are two parameters that the user must define, the scale (s) parameter andthe curvature threshold (t). The optimal scale parameter is a function of1) the scale of the objects (e.g., trees) on the ground, and 2) the samplinginterval (post spacing) of the lidar data. Current lidar sensors are capableof collecting high density data (e.g., 8 pulses/m2) that translate to a spatialsampling frequency (post spacing) of 0.35 m/pulse (1/sqrt(8 pulses/m2) = 0.35 m/pulse),which is small relative to the size of mature trees and will oversample largertrees (i.e., nominally multiple returns/tree). Sparser lidar data (e.g., 0.25 pulses/m2)translate to a post spacing of 2.0 m/pulse (1/sqrt(0.25 pulses/m2) = 2.0 m/pulse),which would undersample trees and fail to sample some smaller trees (i.e.,nominally <1 return/tree).

Therefore, a bit of trial and error is warranted to determine the best scaleand curvature parameters to use. Select a las tile containing a good varietyof canopy and terrain conditions, as it's likely the parameters that work bestthere will be applicable to the rest of your project area tiles. As a startingpoint: if the scale (post spacing) of the lidar survey is 1.5 m, then try 1.5.Try varying it up or down by 0.5 m increments to see if it produces a more desirabledigital terrain model (DTM) interpolated from the classified ground returns inthe output file. Use units that match the units of the lidar data. For example,if your lidar data were delivered in units of feet with a post spacing of 3 ft,set the scale parameter to 3, then try varying it up or down by 1 ft incrementsand compare the resulting interpolated DTMs. If the trees are large, thenit's likely that a scale parameter of 1 m (3 ft) will produce a cleaner DTMthan a scale parameter of 0.3 m (1 ft), even if the pulse density is 0.3 m(1 ft). As for the curvature threshold, a good starting value to try might be0.3 (if data are in meters; 1 if data are in feet), and then try varying thisup or down by 0.1 m increments (if data are in meters; 0.3 if data are in feet).

References

Evans, Jeffrey S.; Hudak, Andrew T. 2007. A multiscale curvaturealgorithm for classifying discrete return LiDAR in forested environments.IEEE Transactions on Geoscience and Remote Sensing. 45(4): 1029-1038.

See Also

Other ground segmentation algorithms:gnd_csf,gnd_pmf

Examples

if (require(RMCC, quietly = TRUE)){LASfile <- system.file("extdata", "Topography.laz", package="lidR")las <- readLAS(LASfile, select = "xyzrn", filter = "-inside 273450 5274350 273550 5274450")las <- classify_ground(las, mcc(1.5,0.3))#plot(las, color = "Classification")}

Ground Segmentation Algorithm

Description

This function is made to be used inclassify_ground. It implements an algorithm for segmentationof ground points based on a progressive morphological filter. This method is an implementation ofthe Zhang et al. (2003) algorithm (see reference). Note that this is not a strict implementationof Zhang et al. This algorithm works at the point cloud level without any rasterization process.The morphological operator is applied on the point cloud, not on a raster. Also, Zhang et al.proposed some formulas (eq. 4, 5 and 7) to compute the sequence of windows sizes and thresholds.Here, these parameters are free and specified by the user. The functionutil_makeZhangParamenables computation of the parameters according to the original paper.

Usage

pmf(ws, th)util_makeZhangParam(  b = 2,  dh0 = 0.5,  dhmax = 3,  s = 1,  max_ws = 20,  exp = FALSE)

Arguments

ws

numeric. Sequence of windows sizes to be used in filtering ground returns.The values must be positive and in the same units as the point cloud (usually meters, occasionallyfeet).

th

numeric. Sequence of threshold heights above the parameterized ground surface to beconsidered a ground return. The values must be positive and in the same units as the point cloud.

b

numeric. This is the parameterb in Zhang et al. (2003) (eq. 4 and 5).

dh0

numeric. This isdh_0 in Zhang et al. (2003) (eq. 7).

dhmax

numeric. This isdh_{max} in Zhang et al. (2003) (eq. 7).

s

numeric. This iss in Zhang et al. (2003) (eq. 7).

max_ws

numeric. Maximum window size to be used in filtering ground returns. This limitsthe number of windows created.

exp

logical. The window size can be increased linearly or exponentially (eq. 4 or 5).

Details

The progressive morphological filter allows for any sequence of parameters. The 'util_makeZhangParam'function enables computation of the sequences using equations (4),(5) and (7) from Zhang et al. (see reference and details).

In the original paper the windows size sequence is given by eq. 4 or 5:

w_k = 2kb + 1

or

w_k = 2b^k + 1

In the original paper the threshold sequence is given by eq. 7:

th_k = s*(w_k - w_{k-1})*c + th_0

Because the functionclassify_ground applies the morphological operation at the pointcloud level the parameterc is set to 1 and cannot be modified.

References

Zhang, K., Chen, S. C., Whitman, D., Shyu, M. L., Yan, J., & Zhang, C. (2003). A progressivemorphological filter for removing nonground measurements from airborne LIDAR data. IEEETransactions on Geoscience and Remote Sensing, 41(4 PART I), 872–882. http:#doi.org/10.1109/TGRS.2003.810682.

See Also

Other ground segmentation algorithms:gnd_csf,gnd_mcc

Examples

LASfile <- system.file("extdata", "Topography.laz", package="lidR")las <- readLAS(LASfile, select = "xyzrn", filter = "-inside 273450 5274350 273550 5274450")ws <- seq(3,12, 3)th <- seq(0.1, 1.5, length.out = length(ws))las <- classify_ground(las, pmf(ws, th))#plot(las, color = "Classification")

Convert full waveform data into a regular point cloud

Description

Full waveform can be difficult to manipulate and visualize in R. This function convertsa LAS object with full waveform data into a regular point cloud. Each waveform recordbecomes a point with XYZ coordinates and an amplitude (units: volts) and an ID that recordseach original pulse. Notice that this has the effect of drastically inflating the size of theobject in memory, which is likely already very large

Usage

interpret_waveform(las)

Arguments

las

An object of class LAS with full waveform data

Value

An object of class LAS 1.2 format 0 with one point per records

Full waveform

With most recent versions of therlas package, full waveform (FWF) can be read andlidRprovides some compatible functions. However, the support of FWF is still a work-in-progressin therlas package. How it is read, interpreted and represented in R may change. Consequently,tools provided bylidR may also change until the support of FWF becomes mature andstable inrlas. See alsorlas::read.las.

Remember that FWF represents an insanely huge amount of data. It terms of memory it is likehaving between 10 to 100 times more points. Consequently, loading FWF data in R should berestricted to relatively small point clouds.

Examples

## Not run: LASfile <- system.file("extdata", "fwf.laz", package="rlas")fwf <- readLAS(LASfile)las <- interpret_waveform(fwf)x <- plot(fwf, size = 3, pal = "red")plot(las, color = "Amplitude", bg = "white", add = x, size = 2)## End(Not run)

A set of boolean tests on objects

Description

is.empty tests if aLAS object is a point cloud with 0 points.
is.overlapping tests if aLAScatalog has overlapping tiles.
is.indexed tests if the points of aLAScatalog are indexed with.lax files.
is.algorithm tests if an object is an algorithm of the lidR package.
is.parallelised tests if an algorithm of the lidR package is natively parallelised with OpenMP.Returns TRUE if the algorithm is at least partially parallelised i.e. if some portion of the code iscomputed in parallel.

Usage

## S4 method for signature 'LAS'is.empty(x)is.overlapping(catalog)is.indexed(catalog)is.algorithm(x)is.parallelised(algorithm)

Arguments

x

LAS object or any R object.

catalog

ALAScatalog object.

algorithm

Analgorithm object.

Value

TRUE or FALSE

Examples

LASfile <- system.file("extdata", "example.laz", package="rlas")las = readLAS(LASfile)is.empty(las)las = new("LAS")is.empty(las)f <- lmf(2)is.parallelised(f)g <- pitfree()is.parallelised(g)ctg <- readLAScatalog(LASfile)is.indexed(ctg)

Individual Tree Detection Algorithm

Description

This function is made to be used inlocate_trees. It implements an algorithm for treedetection based on a local maximum filter. The windows size can be fixed or variable and itsshape can be square or circular. The internal algorithm works either with a raster or a point cloud.It is deeply inspired by Popescu & Wynne (2004) (see references).

Usage

lmf(ws, hmin = 2, shape = c("circular", "square"), ws_args = "Z")

Arguments

ws

numeric or function. Length or diameter of the moving window used to detect the localmaxima in the units of the input data (usually meters). If it is numeric a fixed window size is used.If it is a function, the function determines the size of the window at any given location on the canopy.By default function takes the height of a given pixel or point as its only argument and return thedesired size of the search window when centered on that pixel/point. This can be controled withthe 'ws_args' parameter

hmin

numeric. Minimum height of a tree. Threshold below which a pixel or a pointcannot be a local maxima. Default is 2.

shape

character. Shape of the moving window used to find the local maxima. Can be "square"or "circular".

ws_args

list. Named list of argument for the function 'ws' if 'ws' is a function.

References

Popescu, Sorin & Wynne, Randolph. (2004). Seeing the Trees in the Forest: Using Lidar andMultispectral Data Fusion with Local Filtering and Variable Window Size for Estimating Tree Height.Photogrammetric Engineering and Remote Sensing. 70. 589-604. 10.14358/PERS.70.5.589.

See Also

Other individual tree detection algorithms:itd_manual

Examples

LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")las <- readLAS(LASfile, select = "xyzi", filter = "-inside 481250 3812980 481300 3813050")# =================# point-cloud-based# =================# 5x5 m fixed window sizettops <- locate_trees(las, lmf(5))#plot(las) |> add_treetops3d(ttops)# variable windows sizef <- function(x) { x * 0.07 + 3}ttops <- locate_trees(las, lmf(f))#plot(las) |> add_treetops3d(ttops)# Very custom variable windows sizef <- function(x, y, z) { x * 0.07 + y * 0.01 + z}ws_args <- list(x = "Z", y = "Intensity", z = 3)ttops <- locate_trees(las, lmf(f, ws_args = ws_args))# ============# raster-based# ============chm <- rasterize_canopy(las, res = 1, p2r(0.15), pkg = "terra")ttops <- locate_trees(chm, lmf(5))plot(chm, col = height.colors(30))plot(sf::st_geometry(ttops), add = TRUE, col = "black", cex = 0.5, pch = 3)# variable window sizef <- function(x) { x * 0.07 + 3 }ttops <- locate_trees(chm, lmf(f))plot(chm, col = height.colors(30))plot(sf::st_geometry(ttops), add = TRUE, col = "black", cex = 0.5, pch = 3)

Individual Tree Detection Algorithm

Description

This function is made to be used inlocate_trees. It implements an algorithm for manualtree detection. Users can pinpoint the tree top positions manually and interactively using the mouse.This is only suitable for small-sized plots. First the point cloud is displayed, then the user isinvited to select a rectangular region of interest in the scene using the mouse button.Within the selected region the highest point will be flagged as 'tree top' in the scene. Once all the treesare labelled the user can exit the tool by selecting an empty region. Points can also be unflagged.The goal of this tool is mainly for minor correction of automatically-detected tree outputs.
This algorithm does not preserve tree IDs fromdetected and renumber all trees. It also loosesall attributes

Usage

manual(detected = NULL, radius = 0.5, color = "red", button = "middle", ...)

Arguments

detected

SpatialPoints* orsf/sfc_POINT' with 2 or 3D points of already found tree topsthat need manual correction. Can be NULL

radius

numeric. Radius of the spheres displayed on the point cloud (aesthetic purposes only).

color

character. Colour of the spheres displayed on the point cloud (aesthetic purposes only).

button

Which button to use for selection. One of "left", "middle", "right". lidR using leftfor rotation and right for dragging using one of left or right will disable either rotation or dragging

...

supplementary parameters to be passed toplot.

See Also

Other individual tree detection algorithms:itd_lmf

Examples

## Not run: LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")las = readLAS(LASfile)# Full manual tree detectionttops = locate_trees(las, manual())# Automatic detection with manual correctionttops = locate_trees(las, lmf(5))ttops = locate_trees(las, manual(ttops))## End(Not run)

Individual Tree Segmentation Algorithm

Description

This function is made to be used insegment_trees. It implements an algorithm for treesegmentation based on Dalponte and Coomes (2016) algorithm (see reference).This is a seeds + growing region algorithm. This algorithm exists in the packageitcSegment.This version has been written from the paper in C++. Consequently it is hundreds to millions timesfaster than the original version. Note that this algorithm strictly performs a segmentation, while theoriginal method as implemented initcSegment and described in the manuscript also performspre- and post-processing tasks. Here these tasks are expected to be done by the user in separate functions.

Usage

dalponte2016(  chm,  treetops,  th_tree = 2,  th_seed = 0.45,  th_cr = 0.55,  max_cr = 10,  ID = "treeID")

Arguments

chm

'RasterLayer', 'SpatRaster' or 'stars'. Canopy height model. Can be computed withrasterize_canopy or read froman external file.

treetops

'SpatialPoints*' or 'sf/sfc_POINT' with 2D or 3D coordinates. Can be computed withlocate_trees or read from an external file

th_tree

numeric. Threshold below which a pixel cannot be a tree. Default is 2.

th_seed

numeric. Growing threshold 1. See reference in Dalponte et al. 2016. A pixelis added to a region if its height is greater than the tree height multiplied by this value.It should be between 0 and 1. Default is 0.45.

th_cr

numeric. Growing threshold 2. See reference in Dalponte et al. 2016. A pixelis added to a region if its height is greater than the current mean height of the regionmultiplied by this value. It should be between 0 and 1. Default is 0.55.

max_cr

numeric. Maximum value of the crown diameter of a detected tree (in pixels).Default is 10.

ID

character. Iftreetops contains an attribute with the ID foreach tree, the name of this attribute. This way, original IDs will be preserved.

Details

Because this algorithm works on a CHM only there is no actual need for a point cloud. Sometimes theuser does not even have the point cloud that generated the CHM.lidR is a point cloud-orientedlibrary, which is why this algorithm must be used insegment_trees to merge the result with the pointcloud. However the user can use this as a stand-alone function like this:

 chm <- raster("chm.tif") ttops <- locate_trees(chm, lmf(3)) crowns <- dalponte2016(chm, ttops)()

References

Dalponte, M. and Coomes, D. A. (2016), Tree-centric mapping of forest carbon density fromairborne laser scanning and hyperspectral data. Methods Ecol Evol, 7: 1236–1245. doi:10.1111/2041-210X.12575.

See Also

Other individual tree segmentation algorithms:its_li2012,its_silva2016,its_watershed

Other raster based tree segmentation algorithms:its_silva2016,its_watershed

Examples

LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")poi <- "-drop_z_below 0 -inside 481280 3812940 481320 3812980"las <- readLAS(LASfile, select = "xyz", filter = poi)col <- pastel.colors(200)chm <- rasterize_canopy(las, 0.5, p2r(0.3))ker <- matrix(1,3,3)chm <- terra::focal(chm, w = ker, fun = mean, na.rm = TRUE)ttops <- locate_trees(chm, lmf(4, 2))las   <- segment_trees(las, dalponte2016(chm, ttops))#plot(las, color = "treeID", colorPalette = col)

Individual Tree Segmentation Algorithm

Description

This functions is made to be used insegment_trees. It implements an algorithm for treesegmentation based on Li et al. (2012) (see reference). This method is a growing regionmethod working at the point cloud level. It is an implementation by lidR authors, from the originalpaper, as close as possible from the original description. However we added a parameterhminto prevent over-segmentation for objects that are too low. This algorithm is known to be slow becauseit has an algorithmic complexity worst that O(n^2).

Usage

li2012(dt1 = 1.5, dt2 = 2, R = 2, Zu = 15, hmin = 2, speed_up = 10)

Arguments

dt1

numeric. Threshold number 1. See reference page 79 in Li et al. (2012). Default is 1.5.

dt2

numeric. Threshold number 2. See reference page 79 in Li et al. (2012). Default is 2.

R

numeric. Search radius. See page 79 in Li et al. (2012). Default is 2. IfR = 0all the points are automatically considered as local maxima and the search step is skipped (muchfaster).

Zu

numeric. If point elevation is greater than Zu,dt2 is used, otherwisedt1 isused. See page 79 in Li et al. (2012). Default is 15.

hmin

numeric. Minimum height of a detected tree. Default is 2.

speed_up

numeric. Maximum radius of a crown. Any value greater than a crown isgood because this parameter does not affect the result. However, it greatly affects thecomputation speed by restricting the number of comparisons to perform.The lower the value, the faster the method. Default is 10.

References

Li, W., Guo, Q., Jakubowski, M. K., & Kelly, M. (2012). A new method for segmenting individualtrees from the lidar point cloud. Photogrammetric Engineering & Remote Sensing, 78(1), 75-84.

See Also

Other individual tree segmentation algorithms:its_dalponte2016,its_silva2016,its_watershed

Examples

LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")poi <- "-drop_z_below 0 -inside 481280 3812940 481320 3812980"las <- readLAS(LASfile, select = "xyz", filter = poi)col <- pastel.colors(200)las <- segment_trees(las, li2012(dt1 = 1.4))#plot(las, color = "treeID", colorPalette = col)

Individual Tree Segmentation Algorithm

Description

This functions is made to be used insegment_trees. It implements an algorithm for treesegmentation based on Silva et al. (2016) (see reference). This is a simple methodbased on seed + voronoi tesselation (equivalent to nearest neighbour). This algorithm is implementedin the packagerLiDAR. This version is not the version fromrLiDAR. It iscode written from the original article by the lidR authors and is considerably (between 250and 1000 times) faster.

Usage

silva2016(chm, treetops, max_cr_factor = 0.6, exclusion = 0.3, ID = "treeID")

Arguments

chm

'RasterLayer', 'SpatRaster' or 'stars'. Canopy height model. Can be computed withrasterize_canopy or read froman external file.

treetops

'SpatialPoints*' or 'sf/sfc_POINT' with 2D or 3D coordinates. Can be computed withlocate_trees or read from an external file

max_cr_factor

numeric. Maximum value of a crown diameter given as a proportion of thetree height. Default is 0.6, meaning 60% of the tree height.

exclusion

numeric. For each tree, pixels with an elevation lower thanexclusionmultiplied by the tree height will be removed. Thus, this number belongs between 0 and 1.

ID

character. Iftreetops contains an attribute with the ID foreach tree, the name of this attribute. This way, original IDs will be preserved.

Details

Because this algorithm works on a CHM only there is no actual need for a point cloud. Sometimes theuser does not even have the point cloud that generated the CHM.lidR is a point cloud-orientedlibrary, which is why this algorithm must be used insegment_trees to merge the result into the pointcloud. However, the user can use this as a stand-alone function like this:

 chm <- raster("chm.tif") ttops <- locate_trees(chm, lmf(3)) crowns <- silva2016(chm, ttops)()

References

Silva, C. A., Hudak, A. T., Vierling, L. A., Loudermilk, E. L., O’Brien, J. J., Hiers,J. K., Khosravipour, A. (2016). Imputation of Individual Longleaf Pine (Pinus palustris Mill.)Tree Attributes from Field and LiDAR Data. Canadian Journal of Remote Sensing, 42(5), 554–573.https://doi.org/10.1080/07038992.2016.1196582.

See Also

Other individual tree segmentation algorithms:its_dalponte2016,its_li2012,its_watershed

Other raster based tree segmentation algorithms:its_dalponte2016,its_watershed

Examples

LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")poi <- "-drop_z_below 0 -inside 481280 3812940 481320 3812980"las <- readLAS(LASfile, select = "xyz", filter = poi)col <- pastel.colors(200)chm <- rasterize_canopy(las, res = 0.5, p2r(0.3))ker <- matrix(1,3,3)chm <- terra::focal(chm, w = ker, fun = mean, na.rm = TRUE)ttops <- locate_trees(chm, lmf(4, 2))las   <- segment_trees(las, silva2016(chm, ttops))#plot(las, color = "treeID", colorPalette = col)

Individual Tree Segmentation Algorithm

Description

This function is made to be used insegment_trees. It implements an algorithm for treesegmentation based on a watershed. It is based on the bioconductor packageEBIimage. Youneed to install this package to run this method (see itsgithub page).Internally, the function EBImage::watershed is called.

Usage

watershed(chm, th_tree = 2, tol = 1, ext = 1)

Arguments

chm

'RasterLayer', 'SpatRaster' or 'stars'. Canopy height model. Can be computed withrasterize_canopy or read froman external file.

th_tree

numeric. Threshold below which a pixel cannot be a tree. Default is 2.

tol

numeric. Tolerance see ?EBImage::watershed.

ext

numeric. see ?EBImage::watershed.

Details

Because this algorithm works on a CHM only there is no actual need for a point cloud. Sometimes theuser does not even have the point cloud that generated the CHM.lidR is a point cloud-orientedlibrary, which is why this algorithm must be used insegment_trees to merge the result into the pointcloud. However, the user can use this as a stand-alone function like this:

 chm <- raster("chm.tif") crowns <- watershed(chm)()

See Also

Other individual tree segmentation algorithms:its_dalponte2016,its_li2012,its_silva2016

Other raster based tree segmentation algorithms:its_dalponte2016,its_silva2016

Examples

## Not run: LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")poi <- "-drop_z_below 0 -inside 481280 3812940 481320 3812980"las <- readLAS(LASfile, select = "xyz", filter = poi)col <- pastel.colors(250)# Using raster because focal does not exist in starschm <- rasterize_canopy(las, res = 0.5, p2r(0.3), pkg = "raster")ker <- matrix(1,3,3)chm <- raster::focal(chm, w = ker, fun = mean, na.rm = TRUE)las <- segment_trees(las, watershed(chm))plot(las, color = "treeID", colorPalette = col)## End(Not run)

Search Nearest Neighbors

Description

Fast parallelized k-neareast neighbor searching algorithms for point cloud in LAS format

Usage

knn(data, k = 10)knnx(data, query, k = 10)

Arguments

data

LAS object for input point cloud

k

number of nearest neighbors to search.

query

LAS object for query locations

Value

a list contains:

  1. **nn.index** an n x k matrix for the nearest neighbor indice.

  2. **nn.dist** an n x k matrix for the nearest neighbor Euclidean distances.


Computes the Distance to k-Nearest Neighbors

Description

Computes the average distance between each point and its k-nearest neighbors in a point cloud.The results are stored in a new attribute.

Usage

knn_distance(las, k = 10, name = "distance")

Arguments

las

A LAS object representing the point cloud data.

k

The number of nearest neighbors.

name

A string specifying the name of the new attribute used to store the computed distances.

Value

A LAS object with an additional attribute named as specified by 'name'.

Examples

LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")las <- readLAS(LASfile, select = "xyz", filter = "-inside 481250 3812980 481300 3813030")las = knn_distance(las)#plot(las, color = "distance", breaks = "quantile", legend = TRUE)

Inspect a LAS object

Description

Performs a deep inspection of a LAS or LAScatalog object and prints a report.

For a LAS object it checks:

For a LAScatalog object it checks:

For the pre-processing tests the function only makes an estimation and may not be correct.

Usage

las_check(las, print = TRUE, ...)

Arguments

las

An object of classLAS orLAScatalog.

print

logical. By default, prints a report and returns alist invisibly. Ifprint = FALSE the functions returns alist visibly and do not print the report.

...

Usedeep = TRUE on a LAScatalog only. Instead of a shallow inspection it readsall the files and performs a deep inspection.

Value

A list with three elements namedmessage,warnings anderrors. This list is returnedinvisibly ifprint = TRUE. Ifdeep = TRUE a nested list is returned with one elementper file.

See Also

Other las utilities:las_utilities

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las <- readLAS(LASfile)las_check(las)

Compression of the point cloud

Description

Package rlas 1.6.0 supports compact representation of non populated attributes. For exampleUserDatais usually populated with zeros (not populated). Yet it takes 32 bits per point to store each 0.With rlas 1.6.0 it can now use 644 bits no matter the number of points loaded if it is notpopulated or populated with a unique value.

Usage

las_is_compressed(las)las_size(las)

Arguments

las

A LAS object.

Details

las_is_compressed test each attributes and returns a named vector with TRUE if the attribute iscompressed FALSE otherwise.

las_size returns the true size of a LAS object by considering the compression.object.size frombase R does not account for ALTREP and consequently cannot measure properly the size of a LAS object

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las = readLAS(LASfile)las_is_compressed(las)format(object.size(las), units = "MB")format(las_size(las), units = "MB")

LAS utilities

Description

Tools to manipulate LAS objects maintaining compliance withASPRS specification

Usage

las_rescale(las, xscale, yscale, zscale)las_reoffset(las, xoffset, yoffset, zoffset)las_quantize(las, by_reference = TRUE)las_update(las)quantize(x, scale, offset, by_reference = TRUE, ...)is.quantized(x, scale, offset, ...)count_not_quantized(x, scale, offset)storable_coordinate_range(scale, offset)header(las)payload(las)phb(las)vlr(las)evlr(las)

Arguments

las

An object of class LAS

xscale,yscale,zscale

scalar. Can be missing if not relevant.

xoffset,yoffset,zoffset

scalar. Can be missing if not relevant.

by_reference

bool. Update the data in place without allocating new memory.

x

numeric. Coordinates vector

scale,offset

scalar. scale and offset

...

Unused.

Details

In the specification of the LAS format the coordinates are expected to be givenwith a certain precision e.g. 0.01 for a millimeter precision (or millifeet), meaningthat a file records e.g. 123.46 not 123.45678. Also, coordinates are stored asintegers. This is made possible with a scale and offset factor. For example,123.46 with an offset of 100 and a scale factor of 0.01 is actually stored as(123.46 - 100)/0.01 = 2346. Storing 123.45678 with a scale factor of 0.01 and an offsetof 100 is invalid because it does not convert to an integer: (123.45678-100)/0.01= 2345.678. Having an invalid LAS object may be critical in some lidR applications.When writing into a LAS file, users will loose the extra precision withoutwarning and some algorithms in lidR use the integer conversion to make integer-basedcomputation and thus speed-up some algorithms and use less memory. Creation of aninvalid LAS object may cause problems and incorrect outputs.

See Also

Other las utilities:las_check()

Examples

LASfile <- system.file("extdata", "example.laz", package="rlas")las = readLAS(LASfile)# Manual modification of the coordinates (e.g. rotation, re-alignment, ...)las@data$X <- las@data$X + 2/3las@data$Y <- las@data$Y - 5/3# The point cloud is no longer validlas_check(las)# It is important to fix thatlas_quantize(las)# Now the file is almost validlas_check(las)# Update the object to set up-to-date header datalas <- las_update(las)las_check(las)# In practice the above code is not useful for regular users because the operators# $<- already perform such operations on-the-fly. Thus the following# syntax must be preferred and returns valid objects. Previous tools# were only intended to be used in very specific cases.las$X <- las$X + 2/3las$Y <- las$Y - 5/3# Rescale and reoffset recompute the coordinates with# new scales and offsets according to LAS specificationlas <- las_rescale(las, xscale = 0.01, yscale = 0.01)las <- las_reoffset(las, xoffset = 300000, yoffset = 5248000)

LAScatalog drivers

Description

This document explains how objects are written on disk when processing a LAScatalog. As mentionedinLAScatalog-class, users can set a templated filename to store the outputs on disk insteadof in R memory. By defautLAS objects are stored in .las files withwriteLAS,raster objects are stored in .tif files using native write function forraster,stars orterra,⁠Spatial*⁠ objects are stored in .shp files with after coercion tosf withst_write,sf object are stored to.gpkg files withst_write.data.frame objects arestored in .csv files withfwrite, and other objects are not supported.However, users can modify all these default settings and even add new drivers.This manual page explain how. One may also refer to some unofficial documentationhere orhere.

Generic form of a driver

A driver is stored in the slot⁠@output_options⁠ of aLAScatalog. It is a list that contains:

write

A function that receives an object and a path, and writes the object into a file usingthe path. The function can also have extra options.

extension

A string that gives the file extension.

object

A string that gives the name of the argument used to pass the object to write in thefunction used to write the object.

path

A string that gives the name of the argument used to pass the path of the file to writein the function used to write the object.

param

A labelled list of extra parameters for the function used to write the object

For example, the driver to write a⁠Raster*⁠ is

list( write = raster::writeRaster, extension = ".tif", object = "x", path = "filename", param = list(format = "GTiff"))

And the driver to write aLAS is

list( write = lidR::writeLAS, extension = ".las", object = "las", path = "file", param = list())

Modify a driver (1/2)

Users can modify the drivers to write different file types than the default. For example, to write inshapefile instead of a GeoPackage, one must change thesf driver:

ctg@output_options$drivers$sf$extension <- ".shp"

To write a⁠Raster*⁠ in .grd files instead of .tif files one must change theRaster driver:

ctg@output_options$drivers$Raster$extension <- ".grd"ctg@output_options$drivers$Raster$param$format <- "raster"

To write in .laz files instead of .las files one must change theLAS driver:

ctg@output_options$drivers$LAS$extension <- ".laz"

Add a new driver

The drivers allowLAS,Spatial,⁠sf,⁠Raster,stars,SpatRaster anddata.frame objectsto be written. When using the engine (catalog_apply) to build new tools, users may need tobe able to write other objects such as alist. To do that users need to add alist elementinto⁠@output_options⁠:

ctg@output_options$drivers$list = list( write = base::saveRDS, object = "object", path = "file", extension = ".rds", param = list(compress = TRUE))

TheLAScatalog now has a new driver capable of writing alist.

Modify a driver (2/2)

It is also possible to completely overwrite an existing driver. By defaultsf objects are writteninto GeoPackage withst_write.st_write can also wite in GeoJSON and even inSQLlite database objects. But it cannot add data into an existing SQLlite database. Let's createour own driver for asf. First we need a function able to write and append asf into aSQLlitedatabase from the object and the path.

dbWrite_sf = function(x, path, name){ x <- sf::st_drop_geometry(x) con <- RSQLite::dbConnect(RSQLite::SQLite(), path) RSQLite::dbWriteTable(con, name, x, append = TRUE) RSQLite::dbDisconnect(con)}

Then we create the driver. User-defined drivers supersede default drivers:

ctg@output_options$drivers$sf = list( write = dbWrite_sf, extension = ".sqlite", object = "x", path = "path", param = list(name = "layername"))

Then to be sure that we do not write several .sqlite files, we don't use templated filename.

opt_output_files(ctg) <- paste0(tempdir(), "/mysqlitefile")

And all thesf will be appended in a single database. To preserve the geometry one can


Parallel computation in lidR

Description

This document explains how to process point clouds taking advantage of parallel processing in thelidR package. The lidR package has two levels of parallelism, which is why it is difficult tounderstand how it works. This page aims to provide users with a clear overview of how to take advantageof multicore processing even if they are not comfortable with the parallelism concept.

Algorithm-based parallelism

When processing a point cloud we are applying an algorithm on data. This algorithm may or may not benatively parallel. In lidR some algorithms are fully computed in parallel, but some are not because they arenot parallelizable, while some are only partially parallelized. It means that some portions of the codeare computed in parallel and some are not. When an algorithm is natively parallel in lidR it is alwaysa C++ based parallelization with OpenMP. The advantage is that the computation is faster without anyconsequence for memory usage because the memory is shared between the processors. In short,algorithm-based parallelism provides a significant gain without any cost for your R session andyour system (but obviously there is a greater workload for the processors). By default lidR useshalf of your cores but you can control this withset_lidr_threads. For example, thelmfalgorithm is natively parallel. The following code is computed in parallel:

las  <- readLAS("file.las")tops <- locate_trees(las, lmf(2))

However, as stated above, not all algorithms are parallelized or even parallelizable. For example,li2012 is not parallelized. The following code is computed in serial:

las <- readLAS("file.las")dtm <- segment_trees(las, li2012())

To know which algorithms are parallelized users can refer to the documentation or use thefunctionis.parallelised.

is.parallelised(lmf(2))   #> TRUEis.parallelised(li2012()) #> FALSE

Chunk-based parallelism

When processing aLAScatalog, the internal engine splits the dataset into chunks and each chunk isread and processed sequentially in a loop. This loop can be parallelized with thefuture package. By default the chunks are processed sequentially, but they can be processedin parallel by registering an evaluation strategy. For example, the following code is evaluatedsequentially:

ctg <- readLAScatalog("folder/")out <- pixel_metrics(ctg, ~mean(Z))

But this one is evaluated in parallel with two cores:

library(future)plan(multisession, workers = 2L)ctg <- readLAScatalog("folder/")out <- pixel_metrics(ctg, ~mean(Z))

With chunk-based parallelism any algorithm can be parallelized by processing several subsets ofa dataset. However, there is a strong cost associated with this type of parallelism. When processing severalchunks at a time, the computer needs to load the corresponding point clouds. Assuming the user processesone square kilometer chunks in parallel with 4 cores, then 4 chunks are loaded in the computermemory. This may be too much and the speed-up is not guaranteed since there is some overhead involved inreading several files at a time. Once this point is understood, chunk-based parallelism is verypowerful since all the algorithms can be parallelized whether or not they are natively parallel.It also allows to parallelize the computation on several machines on the network or to work on a HPC.

Nested parallelism - part 1

Previous sections stated that some algorithms are natively parallel, such aslmf, and some arenot, such asli2012. Anyway, users can split the dataset into chunks to process them simultaneouslywith the LAScatalog processing engine. Let's assume that the user's computer has four cores,what happens in this case:

library(future)plan(multisession, workers = 4L)set_lidr_threads(4L)ctg <- readLAScatalog("folder/")out <- locate_trees(ctg, lmf(2))

Here the catalog will be split into chunks that will be processed in parallel. And each computationitself implies a parallelized task. This is a nested parallelism task and it is dangerous! Hopefullythe lidR package handles such cases and chooses by default to give precedence to chunk-basedparallelism. In this case chunks will be processed in parallel and the points will be processedserially by disabling OpenMP.

Nested parallelism - part 2

We explained rules of precedence. But actually the user can tune the engine more accurately. Let'sdefine the following function:

myfun = function(las, ws, ...){  las  <- normalize_height(las, tin())  tops <- locate_tree(las, lmf(ws))  return(tops)}out <- catalog_map(ctg, myfun, ws = 5)

This function used two algorithms, one is partially parallelized (tin) and one is fullyparallelizedlmf. The user can manually use both OpenMP and future. By default the enginewill give precedence to chunk-based parallelism because it works in all cases but the user canimpose something else. In the following 2 workers are attributed to future and 2 workers areattributed to OpenMP.

plan(multisession, workers = 2L)set_lidr_threads(2L)catalog_map(ctg, myfun, ws = 5)

The rule is simple. If the number of workers needed is greater than the number ofavailable workers then OpenMP is disabled. Let suppose we have a 4 cores:

# 2 chunks 2 threads: OKplan(multisession, workers = 2L)set_lidr_threads(2L)# 4 chunks 1 threads: OKplan(multisession, workers = 4L)set_lidr_threads(1L)# 1 chunks 4 threads: OKplan(sequential)set_lidr_threads(4L)# 3 chunks 2 threads: NOT OK# Needs 6 workers, OpenMP threads are set to 1 i.e. sequential processingplan(multisession, workers = 3L)set_lidr_threads(2L)

Complex computing architectures

For more complex processing architectures such as multiple computers controlled remotelyor HPC a finer tuning might be necessary. Using

options(lidR.check.nested.parallelism = FALSE)

lidR will no longer check for nested parallelism and will never automatically disable OpenMP.


Spatial index

Description

This document explains how to process point-clouds taking advantage of different spatialindexes available in the lidR package. lidR can use several types of spatial indexes toapply algorithms (that need a spatial indexing) as fast as possible. The choice of the spatialindex depends on the type of point-cloud that is processed and the algorithm that is performed.lidR can use a grid partition, a voxel partition, a quadtree or an octree. See details.

Usage

sensor(las, h = FALSE)sensor(las) <- valueindex(las, h = FALSE)index(las) <- value

Arguments

las

An object of classLAS orLAScatalog.

h

boolean. Human readable. Everything is stored as integers that are understoodinternally. Useh = TRUE for user readable output.

value

integer or character. A code for referring to a sensor type or a spatialindex type. Use one of"unknown","als","tls","uav","dap","multispectral"for sensor type and one of"auto","gridpartition","voxelpartition","quadtree","octree"for spatial index type.

Details

From lidR (>= 3.1.0), aLAS object records the sensor used to samplethe point-cloud (ALS, TLS, UAV, DAP) as well as the spatial index that must be usedfor processing the point cloud. This can be set manually by the user but the simplest isto use one of theread*LAS() functions. By default a point-cloud is associatedto a sensor and the best spatial index is chosen on-the-fly depending on the algorithmapplied. It is possible to force the use of a specific spatial index.

Information relative to the spatial indexing is stored in slot⁠@index⁠ that containsalist with two elements:

By default the spatial index code is 0 ("automatic") meaning that each function is freeto choose a different spatial index depending on the recorded sensor. If the code is not0 then each function will be forced to used the spatial index that is imposed. This,obviously, applies only to functions that use spatial indexing.

LAScatalog objects also record such information that is automaticallypropagated to the LAS objects when processing.

Note: before version 3.1.0, point-clouds were all considered as ALS because lidR was originallydesigned for ALS. Consequently, for legacy and backwards-compatibility reasons,readLAS()andreadALSLAS() are actually equivalent.readLAS() tags the point cloud with "unknown"sensor whilereadALSLAS() tags it with 'ALS'. Both behave the same and this isespecially true compared with versions < 3.1. As a consequence, usingreadLAS() providesthe same performance (no degradation) than in previous versions, while using one of theread*LAS()functions may improve the performance.

Examples

LASfile <- system.file("extdata", "example.laz", package="rlas")las <- readLAS(LASfile)# By default the sensor and spatial index codes are 0sensor(las)index(las)# Codes are used internally and not intended to be known by users# Use h option for human readable outputsensor(las, h = TRUE)index(las, h = TRUE)# Modification of the sensor enables users to select a better spatial index# when processing the point-cloud.sensor(las) <- "tls"sensor(las, h = TRUE)index(las, h = TRUE)# Modification of the spatial index forces users to choose one of the available# spatial indexes.index(las) <- "quadtree"sensor(las, h = TRUE)index(las, h = TRUE)# The simplest way to take advantage of appropriate spatial indexing is# to use one of the read*LAS() functions.las <- readTLSLAS(LASfile)sensor(las, h = TRUE)index(las, h = TRUE)# But for some specific point-clouds / algorithms it might be advisable to force# the use of a specific spatial index to perform the computation fasterindex(las) <- "voxelpartition"index(las, h = TRUE)# With a LAScatalog, spatial indexing information is propagated to the# different chunksctg = readTLSLAScatalog(LASfile)index(ctg) <- "voxelpartition"sensor(ctg, h = TRUE)index(ctg, h = TRUE)# ==================# PERFORMANCE TESTS# ==================## Not run: # Performance tests on TLS# ------------------------# The package does not include TLS data# so we can generate something that looks TLS-ish# >>>>>>>>>>>X <- runif(50, -25, 25)Y <- runif(50, -25, 25)X <- as.numeric(sapply(X, function(x) rnorm(2000, x, 2)))Y <- as.numeric(sapply(Y, function(x) rnorm(2000, x, 2)))Z <- abs(rnorm(length(Y), 10, 5))veg <- data.frame(X,Y,Z)X <- runif(5000, -30, 30)Y <- runif(5000, -30, 30)Z <- runif(5000, 0, 1)ground <- data.frame(X,Y,Z)X <- runif(30, -30, 30)Y <- runif(30, -30, 30)Z <- runif(30, 0, 30)noise <- data.frame(X,Y,Z)las <- LAS(rbind(ground, veg, noise))# <<<<<<<<<<<<<plot(las)# If read with readALSLAS()sensor(las) <- "als"system.time(classify_noise(las, sor(20, 8)))#> 1.5 sec# If read with readTLSLAS()sensor(las) <- "tls"system.time(classify_noise(las, sor(20, 8)))#> 0.6 sec# Performance tests on ALS# ------------------------# The package does not include large ALS data# so we can generate something that looks ALS-ish# >>>>>>>>>>>X <- runif(4e5, 0, 1000)Y <- runif(4e5, 0, 1000)Z <- 40*sin(0.01*X) + 50*cos(0.005*Y) + abs(rnorm(length(Y), 10, 5))veg <- data.frame(X,Y,Z)X <- runif(100, 0, 1000)Y <- runif(100, 0, 1000)Z <- 40*sin(0.01*X) + 50*cos(0.005*Y) + abs(rnorm(length(Y), 10, 5)) + runif(100, 30, 70)noise <- data.frame(X,Y,Z)las <- LAS(rbind(veg, noise))# <<<<<<<<<<<<<plot(las)# If read with readALSLAS()sensor(las) <- "als"system.time(classify_noise(las, sor(15, 8)))#> 3 sec# If read with readTLSLAS()sensor(las) <- "tls"system.time(classify_noise(las, sor(15, 8)))#> 4.3 sec## End(Not run)

Individual tree detection

Description

Individual tree detection function that find the position of the trees using several possiblealgorithms.

Usage

locate_trees(las, algorithm, uniqueness = "incremental")

Arguments

las

An object of classLAS orLAScatalog. Can also be a raster fromraster,stars orterrarepresenting a canopy height model, in which case it is processed like a regularly-spaced point cloud.

algorithm

An algorithm for individual tree detection. lidR has:lmf andmanual.More experimental algorithms may be found in the packagelidRplugins.

uniqueness

character. A method to compute a unique ID. Can be 'incremental', 'gpstime' or'bitmerge'. See section 'Uniqueness'. This feature must be considered as 'experimental'.

Value

locate_trees returns an sf object with POINT Z geometries. The table of attributescontains a columntreeID with an individual ID for each tree. The height of the trees (Z) arealso repeated in the table of attribute to be analysed as an attribute and not as a coordinate.

Uniqueness

By default the tree IDs are numbered from 1 to n, n being the number of trees found. The problemwith such incremental numbering is that, while it ensures a unique ID is assigned for each tree ina given point-cloud, it also guarantees duplication of tree IDs in different tiles or chunks whenprocessing aLAScatalog. This is because each chunk/file is processed independently of the othersand potentially in parallel on different computers. Thus, the index always restarts at 1 on eachchunk/file. Worse, in a tree segmentation process, a tree that is located exactly between2 chunks/files will have two different IDs for its two halves.

This is why we introduced some uniqueness strategies that are all imperfect and that should be seenas experimental. Please report any troubleshooting. Using a uniqueness-safe strategy ensures thattrees from different files will not share the same IDs. It also ensures that two halves of a treeon the edge of a processing chunk will be assigned the same ID.

incremental

Number from 0 to n. This methoddoes not ensure uniqueness of the IDs. Thisis the legacy method.

gpstime

This method uses the gpstime of the highest point of a tree (apex) to create aunique ID. This ID is not an integer but a 64-bit decimal number, which is suboptimal but atleast it is expected to be uniqueif the gpstime attribute is consistent across files.If inconsistencies with gpstime are reported (for example gpstime records the week time and wasreset to 0 in a coverage that takes more than a week to complete), there is a (low) probability ofgetting ID attribution errors.

bitmerge

This method uses the XY coordinates of the highest point (apex) of a tree tocreate a single 64-bit number with a bitwise operation. First, XY coordinates are converted to32-bit integers using the scales and offsets of the point cloud. For example, if the apex is at(10.32, 25.64) with a scale factor of 0.01 and an offset of 0, the 32-bit integer coordinates areX = 1032 and Y = 2564. Their binary representations are, respectively, (here displayed as 16 bits)0000010000001000 and 0000101000000100. X is shifted by 32 bits and becomes a 64-bit integer. Y is keptas-is and the binary representations are unionized into a 64-bit integer like (here displayed as 32 bit)00000100000010000000101000000100 that is guaranteed to be unique. However Rdoes not support 64-bit integers. The previous steps are done at C++ level and the 64-bit binaryrepresentation is reinterpreted into a 64-bit decimal number to be returned in R. The IDs thus generatedare somewhat weird. For example, the tree ID 00000100000010000000101000000100 which is 67635716 ifinterpreted as an integer becomes 3.34164837074751323479078607289E-316 if interpreted as a decimalnumber. This is far from optimal but at least it is guaranteed to be uniqueif all files havethe same offsets and scale factors.

All the proposed options are suboptimal because they either do not guarantee uniqueness in all cases(inconsistencies in the collection of files), or they imply that IDs are based on non-integers ormeaningless numbers. But at least it works and deals with some of the limitations of R.

Examples

LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")las <- readLAS(LASfile, select = "xyz", filter = "-inside 481250 3812980 481300 3813030")ttops <- locate_trees(las, lmf(ws = 5))#plot(las) |> add_treetops3d(ttops)

Merge a point cloud with a source of spatial data

Description

Merge a point cloud with a source of spatial data. It adds an attribute along each point based ona value found in the spatial data. Sources of spatial data can be a⁠SpatialPolygons*⁠, ansf/sfc,a⁠Raster*⁠, astars, or aSpatRaster.

Usage

merge_spatial(las, source, attribute = NULL)

Arguments

las

An object of classLAS

source

An object of class⁠SpatialPolygons*⁠ orsf orsfc orRasterLayer orRasterStack orRasterBrick orstars.

attribute

character. The name of an attribute in the table of attributes orthe name of a new column in the LAS object. Not relevant for RGB colorization.

Value

aLAS object

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")shp     <- system.file("extdata", "lake_polygons_UTM17.shp", package = "lidR")las   <- readLAS(LASfile, filter = "-keep_random_fraction 0.1")lakes <- sf::st_read(shp, quiet = TRUE)# The attribute "inlake" does not exist in the shapefile.# Points are classified as TRUE if in a polygonlas    <- merge_spatial(las, lakes, "inlakes")     # New attribute 'inlakes' is added.names(las)forest <- filter_poi(las, inlakes == FALSE)#plot(forest)# The attribute "LAKENAME_1" exists in the shapefile.# Points are classified with the values of the polygonslas <- merge_spatial(las, lakes, "LAKENAME_1")     # New column 'LAKENAME_1' is added.names(las)

Noise Segmentation Algorithm

Description

This function is made to be used inclassify_noise. It implements analgorithm for outliers (noise) segmentation based on isolated voxels filter (IVF).The algorithm finds points that have only a few other points in their surrounding3 x 3 x 3 = 27 voxels.

Usage

ivf(res = 5, n = 6)

Arguments

res

numeric. Resolution of the voxels

n

integer. The maximal number of 'other points' in the 27 voxels

See Also

Other noise segmentation algorithms:noise_sor

Examples

LASfile <- system.file("extdata", "Topography.laz", package="lidR")las <- readLAS(LASfile, filter = "-inside 273450 5274350 273550 5274450")# Add some artificial outliersset.seed(314)id = round(runif(20, 0, npoints(las)))set.seed(42)err = runif(20, -50, 50)las$Z[id] = las$Z[id] + errlas <- classify_noise(las, ivf(5,2))

Noise Segmentation Algorithm

Description

This function is made to be used inclassify_noise. It implements analgorithm for outliers (noise) segmentation based on Statistical OutliersRemoval (SOR) methods first described in the PCL libraryand also implemented in CloudCompare (see references).For each point, it computes the mean distance to all its k-nearest neighbours.The points that are farther than the average distance plus a number of times(multiplier) the standard deviation are considered noise.

Usage

sor(k = 10, m = 3, quantile = FALSE)

Arguments

k

numeric. The number of neighbours

m

numeric. Multiplier. The maximum distance will be:⁠avg distance + m * std deviation⁠.Ifquantile = TRUE,m becomes the quantile threshold.

quantile

boolean. Modification of the original SOR to use a quantilethreshold instead of a standard deviation multiplier. In this case the maximumdistance will be:quantile(distances, probs = m)

References

https://pointclouds.org/documentation/tutorials/statistical_outlier.html
https://www.cloudcompare.org/doc/wiki/index.php?title=SOR_filter

See Also

Other noise segmentation algorithms:noise_ivf

Examples

LASfile <- system.file("extdata", "Topography.laz", package="lidR")las <- readLAS(LASfile, filter = "-inside 273450 5274350 273550 5274450")# Add some artificial outliers because the original# dataset is 'clean'set.seed(314)id = round(runif(20, 0, npoints(las)))set.seed(42)err = runif(20, -50, 50)las$Z[id] = las$Z[id] + errlas <- classify_noise(las, sor(15,7))

Normalize point cloud

Description

Normalize elevation or intensity values using multiple methods.

Usage

normalize_height(las, algorithm, use_class = c(2L, 9L), dtm = NULL, ...)unnormalize_height(las)## S4 method for signature 'LAS,ANY'e1 - e2height_above_ground(las, ...)normalize_intensity(las, algorithm)

Arguments

las

An object of classLAS orLAScatalog.

algorithm

(1) An algorithm for spatial interpolation.lidR hastin,kriging,knnidw or a raster representing a digital terrainmodel. (2) An algorithm for intensity normalization.lidR currently hasrange_correction.

use_class

integer vector. By default the terrain is computed by using ground points(class 2) and water points (class 9). Relevant only for a normalization without a raster DTM.

dtm

raster. Ifdtm is provided, then the DTM is used in place of ground points. This isdifferent than providing a DTM inalgorithm. Ifalgorithm = dtm the dtm is subtracted naively.Ifalgorithm = tin() anddtm = raster the ground points are not used and the DTM isinterpolated as if it were made of regularly-spaced ground points.

...

passed tonormalized_height()

e1

a LAS object

e2

A raster representing a digital terrain model in format fromraster,stars orterra..

Details

normalize_height

Subtract digital terrain model (DTM) from a LiDAR point cloud to create adataset normalized with the ground at 0. The DTM can be a raster, but it can also be computedon-the-fly. In this case the algorithm does not use rasterized data and each point is interpolated.There is no inaccuracy due to the discretization of the terrain and the resolution of the terrainis virtually infinite. A new attribute 'Zref' records the former elevation values, which enablesthe use ofunnormalize_height to restore original point elevations.

normalize_intensity

Normalize intensity values using multiple methods. The attribute 'Intensity'records the normalized intensity. An extra attribute named 'RawIntensity' records the originalintensities.

height_above_ground

instead of normalizing the point cloud, records the height above ground (HAG)in a new attribute named 'hag'

Non-supported LAScatalog options

The optionselect is not supported and not respected because it always preserves the file formatand all the attributes.select = "*" is imposed internally.

Examples

LASfile <- system.file("extdata", "Topography.laz", package="lidR")las <- readLAS(LASfile)# ====================# Normalize elevation# ====================# First option: use a raster as DTM# --------------------------------------dtm <- rasterize_terrain(las, 1, knnidw(k = 6L, p = 2))nlas <- normalize_height(las, dtm)# restore original elevationslas <- unnormalize_height(nlas)# operator - can be used. This is equivalent to the previousnlas <- las - dtm# restore original elevationslas <- unnormalize_height(las)# Second option: interpolate each point (no discretization)# ---------------------------------------------------------nlas <- normalize_height(las, tin())# operator - can be used. This is equivalent to the previouslas <- unnormalize_height(nlas)nlas <- las - tin()## Not run: # All the following syntaxes are correctlas <- normalize_height(las, knnidw())las <- normalize_height(las, knnidw(k = 8, p = 2))las <- las - knnidw()las <- las - knnidw(k = 8)las <- normalize_height(las, kriging())las <- las - kriging(k = 8)## End(Not run)# ====================# Normalize intensity# ====================# pmin = 15 because it is an extremely small file# strongly decimated to reduce its size. There are# actually few multiple returnssensor <- track_sensor(las, Roussel2020(pmin = 15))# Here the effect is virtually null because the size of# the sample is too small to notice any effect of rangelas <- normalize_intensity(las, range_correction(sensor, Rs = 2000))

Predefined non standard metrics

Description

Functions and metrics from the literature. See details and references

Usage

rumple_index(x, y = NULL, z = NULL, ...)gap_fraction_profile(z, dz = 1, z0 = 2)LAD(z, dz = 1, k = 0.5, z0 = 2)entropy(z, by = 1, zmax = NULL)VCI(z, zmax, by = 1)

Arguments

x

ARasterLayer, astars aSpatRaster or a vector of x coordinates.

y

numeric. Ifx is a vector of coordinates: the associated y coordinates.

z

vector of positive z coordinates

...

unused

z0

numeric. The bottom limit of the profile

k

numeric. is the extinction coefficient

by,dz

numeric. The thickness of the layers used (height bin)

zmax

numeric. Maximum elevation for an entropy normalized to zmax.

Details

rumple_index

Computes the roughness of a surface as the ratio between its area and itsprojected area on the ground. If the input is a gridded object (raster) the function computes thesurfaces using Jenness's algorithm (see references). If the input is a point cloud the functionuses a Delaunay triangulation of the points and computes the area of each triangle.

gap_fraction_profile

Computes the gap fraction profile using the method of Bouvier et al.(see reference). The function assesses the number of laser points that actually reached the layerz+dz and those that passed through the layer [z, z+dz]. By definition the layer 0will always return 0 because no returns pass through the ground. Therefore, the layer 0 is removedfrom the returned results.

LAD

Computes a leaf area density profile based on the method of Bouvier et al. (see reference)The function assesses the number of laser points that actually reached the layer z+dz and those thatpassed through the layer [z, z+dz] (seegap_fraction_profile).Then it computes the log of this quantity and divides it by the extinction coefficient k asdescribed in Bouvier et al. By definition the layer 0 will always return infinity because no returnspass through the ground. Therefore, the layer 0 is removed from the returned results.

entropy

A normalized Shannon vertical complexity index. The Shannon diversity index is ameasure for quantifying diversity and is based on the number and frequency of species present. This index,developed by Shannon and Weaver for use in information theory, was successfully transferredto the description of species diversity in biological systems (Shannon 1948). Here it is appliedto quantify the diversity and the evenness of an elevational distribution of las points. Itmakes bins between 0 and the maximum elevation. If there are negative values the functionreturns NA.

VCI

Vertical Complexity Index. A fixed normalization of the entropy function from van Ewijket al. (2011) (see references)

Value

numeric. The computed Rumple index.

A data.frame containing the bin elevations (z) and the gap fraction for each bin (gf)

A number between 0 and 1

A number between 0 and 1

References

Jenness, J. S. (2004). Calculating landscape surface area from digital elevationmodels. Wildlife Society Bulletin, 32(3), 829–839.

Bouvier, M., Durrieu, S., Fournier, R. a, & Renaud, J. (2015). Generalizing predictivemodels of forest inventory attributes using an area-based approach with airborne las data. RemoteSensing of Environment, 156, 322-334. http://doi.org/10.1016/j.rse.2014.10.004

Pretzsch, H. (2008). Description and Analysis of Stand Structures. Springer Berlin Heidelberg. http://doi.org/10.1007/978-3-540-88307-4 (pages 279-280)Shannon, Claude E. (1948), "A mathematical theory of communication," Bell System Tech. Journal 27, 379-423, 623-656.

van Ewijk, K. Y., Treitz, P. M., & Scott, N. A. (2011). Characterizing Forest Succession in Central Ontario using LAS-derived Indices. Photogrammetric Engineering and Remote Sensing, 77(3), 261-269. Retrieved from <Go to ISI>://WOS:000288052100009

Examples

x <- runif(20, 0, 100)y <- runif(20, 0, 100)if (require(geometry, quietly = TRUE)){# Perfectly flat surface, rumple_index = 1z <- rep(10, 20)rumple_index(x, y, z)# Rough surface, rumple_index > 1z <- runif(20, 0, 10)rumple_index(x, y, z)# Rougher surface, rumple_index increasesz <- runif(20, 0, 50)rumple_index(x, y, z)# Measure of roughness is scale-dependentrumple_index(x, y, z)rumple_index(x/10, y/10, z)}z <- c(rnorm(1e4, 25, 6), rgamma(1e3, 1, 8)*6, rgamma(5e2, 5,5)*10)z <- z[z<45 & z>0]hist(z, n=50)gapFraction = gap_fraction_profile(z)plot(gapFraction, type="l", xlab="Elevation", ylab="Gap fraction")z <- c(rnorm(1e4, 25, 6), rgamma(1e3, 1, 8)*6, rgamma(5e2, 5,5)*10)z <- z[z<45 & z>0]lad <- LAD(z)plot(lad, type="l", xlab="Elevation", ylab="Leaf area density")z <- runif(10000, 0, 10)# expected to be close to 1. The highest diversity is given for a uniform distributionentropy(z, by = 1) z <- runif(10000, 9, 10)# Must be 0. The lowest diversity is given for a unique possibilityentropy(z, by = 1)z <- abs(rnorm(10000, 10, 1))# expected to be between 0 and 1.entropy(z, by = 1)z <- runif(10000, 0, 10)VCI(z, by = 1, zmax = 20)z <- abs(rnorm(10000, 10, 1))# expected to be closer to 0.VCI(z, by = 1, zmax = 20)

Older R Spatial Packages

Description

lidR 4.0.0 no longer uses thesp andraster packages. New functions are based onsf,terra andstars.However, to maintain backward compatibility the old functions from v<4.0.0 were preserved.

rgdal andrgeos will be retired on Jan 1st 2024. Theraster andsp packages are based onrgdal andrgeos.lidR was based onraster andsp because it was created before thesf,terraandstars packages. This means that sooner or later users and packages that are still based onold R spatial packages will run into trouble. According to Edzer Pebesma, Roger Bivand:

R users who have been around a bit longer, in particular before packages likesf andstars weredeveloped, may be more familiar with older packages likemaptools,sp,rgeos, andrgdal. A fairquestion is whether they should migrate existing code and/or existing R packages depending on thesepackages. The answer is: yes (see reference).

The following functions are not formally deprecated but users should definitely move their workflow to modernspatial packages. lidR will maintain the old functions as long as it does not generate issueson CRAN. So, it might be until Jan 1st 2024 or later, who knows...

Usage

as.spatial(x)## S3 method for class 'LAS'as.spatial(x)## S3 method for class 'LAScatalog'as.spatial(x)tree_metrics(las, func = ~list(Z = max(Z)), attribute = "treeID", ...)grid_canopy(las, res, algorithm)grid_density(las, res = 4)grid_terrain(  las,  res = 1,  algorithm,  ...,  keep_lowest = FALSE,  full_raster = FALSE,  use_class = c(2L, 9L),  Wdegenerated = TRUE,  is_concave = FALSE)grid_metrics(  las,  func,  res = 20,  start = c(0, 0),  filter = NULL,  by_echo = "all")find_trees(las, algorithm, uniqueness = "incremental")delineate_crowns(  las,  type = c("convex", "concave", "bbox"),  concavity = 3,  length_threshold = 0,  func = NULL,  attribute = "treeID")

Arguments

x,las

an object of class LAS*

func

seetemplate_metrics

attribute,type

seecrown_metrics

...

ignored

res,start

seepixel_metrics

algorithm

seerasterize_canopy,rasterize_terrain

full_raster,use_class,Wdegenerated,is_concave,keep_lowest

seerasterize_density

filter,by_echo

seetemplate_metrics

uniqueness

seecrown_metrics

concavity,length_threshold

seeconcaveman

References

Edzer Pebesma, Roger Bivand Spatial Data Science with applications in Rhttps://keen-swartz-3146c4.netlify.app/older.html


Pits and spikes filling

Description

Pits and spikes filling for raster. Typically used for post-processing CHM. This algorithmis from St-Onge 2008 (see reference).

Usage

pitfill_stonge2008(  x,  lap_size = 3L,  thr_lap = 0.1,  thr_spk = -0.1,  med_size = 3L,  dil_radius = 0L)

Arguments

x

raster. SpatRaster, RasterLayer, stars.

lap_size

integer. Size of the Laplacian filter kernel (integer value, in pixels).

thr_lap

numeric. Threshold Laplacian value for detecting a cavity (all values above thisvalue will be considered a cavity). A positive value.

thr_spk

numeric. Threshold Laplacian value for detecting a spike (all values below thisvalue will be considered a spike). A negative value.

med_size

integer. Size of the median filter kernel (integer value, in pixels).

dil_radius

integer. Dilation radius (integer value, in pixels).

References

St-Onge, B., 2008. Methods for improving the quality of a true orthomosaic of Vexcel UltraCamimages created using alidar digital surface model, Proceedings of the Silvilaser 2008, Edinburgh,555-562. https://citeseerx.ist.psu.edu/document?repid=rep1&type=pdf&doi=81365288221f3ac34b51a82e2cfed8d58defb10e

Examples

LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")las <- readLAS(LASfile)chm <- rasterize_canopy(las, 0.5, dsmtin())sto <- pitfill_stonge2008(chm)#terra::plot(c(chm, sto), col = lidR::height.colors(25))

Plot a LAS* object

Description

Plot displays a 3D interactive windows based on rgl forLAS objects

Plot displays an interactive view forLAScatalog objects with pan andzoom capabilities based on 'mapview()' from package 'mapview'. If the coordinate referencesystem (CRS) of theLAScatalog is non empty, the plot can be displayed on top of base maps(satellite data, elevation, street, and so on).

Plot displays aLASheader object exactly like it displays a LAScatalogobject.

Usage

plot(x, y, ...)## S4 method for signature 'LAS,missing'plot(  x,  y,  ...,  color = "Z",  pal = "auto",  bg = "black",  breaks = "pretty",  nbreaks = "auto",  backend = "rgl",  clear_artifacts = TRUE,  axis = FALSE,  legend = FALSE,  add = FALSE,  voxel = FALSE,  NAcol = "lightgray",  mapview = FALSE)## S4 method for signature 'LAScatalog,missing'plot(x, y, mapview = FALSE, chunk_pattern = FALSE, overlaps = FALSE, ...)## S4 method for signature 'LASheader,missing'plot(x, y, mapview = FALSE, ...)height.colors(n)forest.colors(n)random.colors(n)pastel.colors(n)

Arguments

x

ALAS* object

y

Unused (inherited from R base)

...

Will be passed topoints3d (LAS) orplotifmapview = FALSE or to 'mapview()' ifmapview = TRUE (LAScatalog).

color

characters. The attribute used to color the point cloud. Default is Z coordinates. RGBis an allowed string even if it refers to three attributes simultaneously.

pal

palette function, similar to heat.colors, or palette values. Default is"auto"providing an automatic coloring depending on the attributecolor

bg

The color for the background. Default is black.

breaks

either a numeric vector with the actual breaks, or a name of a method acceptedby the style argument ofclassIntervals

nbreaks

Number of colors breaks.

backend

character. Can be"rgl" or"lidRviewer". If"rgl" is chosenthe display relies on thergl package. If"lidRviewer" is chosen it relies on thelidRviewer package, which is much more efficient and can handle million of pointsusing less memory.lidRviewer is not available on CRAN yet and shouldbe installed from github (see.https://github.com/r-lidar/lidRviewer).

clear_artifacts

logical. It is a known and documented issue that the 3D visualisation withrgl displays artifacts. The points look aligned and/or regularly spaced in some view angles.This is becausergl computes with single precisionfloat. To fix that the pointcloud is shifted to (0,0) to reduce the number of digits needed to represent its coordinates.The drawback is that the point cloud is not plotted at its actual coordinates.

axis

logical. Display axis on XYZ coordinates.

legend

logical. Display a gradient colour legend.

add

IfFALSE normal behaviour otherwise must be the output of a prior plot functionto enable the alignment of a second point cloud.

voxel

boolean or numeric. Displays voxels instead of points. Useful to render the outputofvoxelize_points, for example. However it is computationally demanding to render and caneasily take 15 seconds for 10000 voxels. It should be reserved for small scenes. If boolean the voxelresolution is guessed automatically. Otherwise users can provide the size of the voxels. To reduce the rendering time,an internal optimization removes voxels that are not visible when surrounded by other voxels.

NAcol

a color for NA values.

mapview

logical. IfFALSE the catalog is displayed in a regular plot from R base.Since v4.0.4 'mapview = TRUE' is also possible with LAS objects.

chunk_pattern

logical. Display the current chunk pattern used to process the catalog.

overlaps

logical. Highlight the overlaps between files.

n

The number of colors (> 1) to be in the palette

Examples

## Not run: LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")las <- readLAS(LASfile)plot(las)plot(las, color = "Intensity")plot(las, color = "ScanAngleRank", pal = rainbow)# If outliers break the color range, use the breaks parameterlas$Intensity[150] <- 1000Lplot(las, color = "Intensity")plot(las, color = "Intensity", breaks = "quantile", nbreaks = 50)plot(las, color = "Classification")# This dataset is already tree segmentedplot(las, color = "treeID")plot(las, color = "treeID", pal = random.colors)# single file LAScatalog using data provided in lidRctg = readLAScatalog(LASfile)plot(ctg)plot(ctg, map = T, map.types = "Esri.WorldImagery")## End(Not run)

Plot voxelized LiDAR data

Description

This function implements a 3D plot method for 'lasmetrics3d' objects

Usage

## S3 method for class 'lasmetrics3d'plot(x, y, ...)

Arguments

x

An object of the classlasmetrics3d

y

Unused (inherited from R base)

...

Supplementary parameters forplot. The function internally uses thesame plot function than LAS objects.

Examples

## Not run: LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")lidar = readLAS(LASfile)voxels = voxel_metrics(lidar, list(Imean = mean(Intensity)), res = 5)plot(voxels, color = "Imean", colorPalette = heat.colors(50), trim=60)## End(Not run)

Add a spatial object to a point cloud scene

Description

Add a raster ('raster', 'stars' 'terra') object that represents a digital terrain model or a'SpatialPointsDataFrame' or 'sf' that represents tree tops to a point cloud scene. To add elementsto a scene with a point cloud plotted with the function plot from lidR, the functions 'add_*'take as first argument the output of the plot function (see examples), because the plot functiondoes not plot the actual coordinates of the point cloud, but offset values. See functionplot and its argument 'clear_artifacts' for more details. It works onlywith 'rgl' i.e. 'backend = "rgl"' which is the default.

Usage

plot_dtm3d(dtm, bg = "black", clear_artifacts = TRUE, ...)add_dtm3d(x, dtm, ...)add_treetops3d(x, ttops, z = "Z", ...)add_flightlines3d(x, flightlines, z = "Z", ...)add_circle3d(x, center_x, center_y, radius, height)

Arguments

dtm

An object of the class 'RasterLayer' or 'stars' or 'SpatRaster'

bg

The color for the background. Default is black.

clear_artifacts

logical. It is a known and documented issue that 3D visualisation withrgl displays artifacts. The points and lines are inaccurately positioned in the space and thusthe rendering may look false or weird. This is because 'rgl' computes with single precision 'float'.To fix this, the objects are shifted to (0,0) to reduce the number of digits needed to representtheir coordinates. The drawback is that the objects are not plotted at their actual coordinates.

...

Supplementary parameters forsurface3d orspheres3d.

x

The output of the function plot used with a LAS object.

ttops

A 'SpatialPointsDataFrame' or 'sf/sfc' that contains tree tops coordinates.

z

character. The name of the attribute that contains the height of the tree tops or of theflightlines. Only for XY geometries Ignored if the input have XYZ geometries

flightlines

A 'SpatialPointsDataFrame' or 'sf' that contains flightlines coordinates.

center_x,center_y,radius,height

horizontal circle parameters

Examples

## Not run: LASfile <- system.file("extdata", "Topography.laz", package="lidR")las <- readLAS(LASfile)dtm <- rasterize_terrain(las, algorithm = tin())ttops <- locate_trees(las, lmf(ws = 5))plot_dtm3d(dtm)x <- plot(las)add_dtm3d(x, dtm)add_treetops3d(x, ttops)plot(las) |> add_dtm3d(dtm) |> add_treetops3d(ttops)## End(Not run)

Plugin system

Description

Tools to build plugin functions for lidR

Usage

plugin_dsm(f, omp = FALSE)plugin_dtm(f, omp = FALSE)plugin_gnd(f, omp = FALSE)plugin_decimate(f, omp = FALSE)plugin_shape(f, omp = FALSE)plugin_snag(f, omp = FALSE)plugin_track(f, omp = FALSE)plugin_nintensity(f, omp = FALSE)plugin_outliers(f, omp = FALSE)plugin_itd(f, omp = FALSE, raster_based = FALSE)plugin_its(f, omp = FALSE, raster_based = FALSE)

Arguments

f

a function

omp

logical is the function natively parallized with OpenMP

raster_based

logical. For ITS and ITD algorithms, is the method raster-based oror point-cloud-based?

Examples

## Not run: mba <- function(n = 1, m = 1, h = 8, extend = TRUE) {  f <- function(las, where) {    res <- MBA::mba.points(las@data, where, n, m , h, extend)    return(res$xyz.est[,3])  }  f <- plugin_dtm(f)  return(f)}LASfile <- system.file("extdata", "Topography.laz", package="lidR")las = readLAS(LASfile)dtm = rasterize_terrain(las, algorithm = mba())## End(Not run)

Point-based metrics

Description

Computes a series of user-defined descriptive statistics for a LiDAR dataset for each point basedon its k-nearest neighbours or its sphere neighbourhood.

Usage

point_metrics(las, func, k, r, xyz = FALSE, filter = NULL, ...)point_eigenvalues(  las,  k,  r,  xyz = FALSE,  metrics = FALSE,  coeffs = FALSE,  filter = NULL)

Arguments

las

An object of class LAS

func

formula. An expression to be applied to each point neighbourhood (see alsotemplate_metrics).

k,r

integer and numeric respectively for k-nearest neighbours and radius of the neighborhoodsphere. If k is given and r is missing, computes with the knn, if r is given and k is missingcomputes with a sphere neighborhood, if k and r are given computes with the knn and a limit on thesearch distance.

xyz

logical. Coordinates of each point are returned in addition to each metric. Otherwise anID referring to each point.

filter

formula of logical predicates. Enables the function to run only on points of interestin an optimized way. See examples.

...

unused.

metrics

logical. Compute metrics or not

coeffs

logical. Principal component coefficients are returned

Details

When the neighbourhood is knn the user-defined function is fed with the currentprocessed point and its k-1 neighbours. The current point being considered asthe 1-neighbour with a distance 0 to the reference point. The points are orderedby distance to the central point. When the neighbourhood is a sphere the processedpoint is also included in the query but points are coming in a random order.point_eigenmetricscomputes the eigenvalues of the covariance matrix and computes associated metrics followingLucas et al, 2019 (see references). It is equivalent topoint_metrics(las, .stdshapemetrics)but much faster because it is optimized and parallelized internally.

Performances

It is important to bear in mind that this function is very fast for the feature it provides i.e.mapping a user-defined function at the point level using optimized memory management. However, itis still computationally demanding.

To help users to get an idea of how computationally demanding this function is, let's compare it topixel_metrics. Assuming we want to applymean(Z) on a 1 km² tile with 1 point/m²with a resolution of 20 m (400 m² cells), then the functionmean is called roughly 2500times (once per cell). On the contrary, withpoint_metrics,mean is called 1000000times (once per point). So the function is expected to be more than 400 times slower in this specificcase (but it does not provide the same feature).

This is why the user-defined function is expected to be well-optimized, otherwise it might drasticallyslow down this already heavy computation. See examples.

Examples

## Not run: LASfile <- system.file("extdata", "Topography.laz", package="lidR")# Read only 0.5 points/m^2 for the purposes of this examplelas = readLAS(LASfile, filter = "-thin_with_grid 2")# Computes the eigenvalues of the covariance matrix of the neighbouring# points and applies a test on these values. This function simulates the# 'shp_plane()' algorithm from 'segment_shape()'plane_metrics1 = function(x,y,z, th1 = 25, th2 = 6) {  xyz <- cbind(x,y,z)  cov_m <- cov(xyz)  eigen_m <- eigen(cov_m)$value  is_planar <- eigen_m[2] > (th1*eigen_m[3]) && (th2*eigen_m[2]) > eigen_m[1]  return(list(planar = is_planar))}# Apply a user-defined functionM <- point_metrics(las, ~plane_metrics1(X,Y,Z), k = 25)#> Computed in 6.3 seconds# We can verify that it returns the same as 'shp_plane'las <- segment_shapes(las, shp_plane(k = 25), "planar")#> Computed in 0.1 secondsall.equal(M$planar, las$planar)# At this stage we can be clever and find that the bottleneck is# the eigenvalue computation. Let's write a C++ version of it with# Rcpp and RcppArmadilloRcpp::sourceCpp(code = "#include <RcppArmadillo.h>// [[Rcpp::depends(RcppArmadillo)]]// [[Rcpp::export]]SEXP eigen_values(arma::mat A) {arma::mat coeff;arma::mat score;arma::vec latent;arma::princomp(coeff, score, latent, A);return(Rcpp::wrap(latent));}")plane_metrics2 = function(x,y,z, th1 = 25, th2 = 6) {  xyz <- cbind(x,y,z)  eigen_m <- eigen_values(xyz)  is_planar <- eigen_m[2] > (th1*eigen_m[3]) && (th2*eigen_m[2]) > eigen_m[1]  return(list(planar = is_planar))}M <- point_metrics(las, ~plane_metrics2(X,Y,Z), k = 25)#> Computed in 0.5 secondsall.equal(M$planar, las$planar)# Here we can see that the optimized version is way better but is still 5-times slower# because of the overhead of calling R functions and switching back and forth from R to C++.M <- point_eigenvalues(las, k = 25)is_planar = M$eigen_medium > (25*M$eigen_smallest) & (6*M$eigen_medium) > M$eigen_largest# Use the filter argument to process only first returnsM1 <- point_metrics(las, ~plane_metrics2(X,Y,Z), k = 25, filter = ~ReturnNumber == 1)dim(M1) # 13894 instead of 17182 previously.## End(Not run)

Tools inherited from base R for LAS* objects

Description

Tools inherited from base R for LAS* objects

Usage

## S3 method for class 'LAS'print(x, ...)## S3 method for class 'LAScatalog'print(x, ...)## S3 method for class 'lidRAlgorithm'print(x, ...)## S3 method for class 'raster_template'print(x, ...)## S3 method for class 'LAS'summary(object, ...)## S3 method for class 'LAScatalog'summary(object, ...)## S3 method for class 'LAS'dim(x)## S3 method for class 'LAScatalog'dim(x)ncol.LAS(x)nrow.LAScatalog(x)## S3 method for class 'LAS'names(x)## S3 method for class 'LASheader'names(x)## S3 method for class 'LAS'rbind(...)npoints(x, ...)density(x, ...)## S4 method for signature 'LAS'density(x, ...)## S4 method for signature 'LASheader'density(x, ...)## S4 method for signature 'LAScatalog'density(x, ...)

Arguments

x

a LAS* object

...

LAS* objects if it is the sole argurment (e.g. in rbind())

object

ALAS* object or other lidR related objects.


Intensity normalization algorithm

Description

This function is made to be used innormalize_intensity. It corrects intensity with arange correction according to the formula (see references):

I_{norm} = I_{obs} \left(\frac{R}{Rs}\right)^f

To achieve the range correction the position of the sensor must be known at different discrete times.Using the 'gpstime' of each point, the position of the sensor is interpolated from the referenceand a range correction is applied.

Usage

range_correction(sensor, Rs, f = 2.3, gpstime = "gpstime", elevation = "Z")get_range(las, sensor, gpstime = "gpstime", elevation = "Z")

Arguments

sensor

'SpatialPointsDataDrame' or 'sf' object containing the coordinates ofthe sensor at different timepoints t. The time and elevation are stored as attributes(default names are 'gpstime' and 'Z'). Z can also come from the geometry if the input records XYZcoordinates. It can be computed withtrack_sensor.

Rs

numeric. Range of reference.

f

numeric. Exponent. Usually between 2 and 3 in vegetation contexts.

gpstime,elevation

character. The name of the attributes that store the gpstime of theposition and the elevation of the sensor respectively. If the input contains 3 coordinates points,'elevation' is not considered.

las

an object of class LAS.get_range() is a regular function documented here forconvenience.

References

Gatziolis, D. (2011). Dynamic Range-based Intensity Normalization for Airborne, Discrete ReturnLidar Data of Forest Canopies. Photogrammetric Engineering & Remote Sensing, 77(3), 251–259.https://doi.org/10.14358/pers.77.3.251

Examples

# A valid file properly populatedLASfile <- system.file("extdata", "Topography.laz", package="lidR")las <- readLAS(LASfile)# pmin = 15 because it is an extremely tiny file# strongly decimated to reduce its size. There are# actually few multiple returnssensor <- track_sensor(las, Roussel2020(pmin = 15))# Here the effect is virtually null because the size of# the sample is too small to notice any effect of rangelas <- normalize_intensity(las, range_correction(sensor, Rs = 2000))# This might be useful for some applicationsR = get_range(las, sensor)

Rasterize a point cloud

Description

Rasterize a point cloud in different ways to compute a DTM, a CHM or a density map. Mostraster products can be computed withpixel_metrics but some are more complex and requirededicated and optimized functions. See Details and Examples.

Usage

rasterize_canopy(las, res = 1, algorithm = p2r(), ...)rasterize_density(las, res = 4, ...)rasterize_terrain(  las,  res = 1,  algorithm = tin(),  use_class = c(2L, 9L),  shape = "convex",  ...)

Arguments

las

An object of classLAS orLAScatalog.

res

numeric. The size of a grid cell in point cloud coordinates units. Can also beRasterLayer or astars or aSpatRaster used as layout.

algorithm

function. A function that implements an algorithm to compute a digital surface modelor a digital terrain model.lidR implementsp2r,dsmtin,pitfreefor digital surface models, andknnidw,tin, andkriging for digital terrainmodels (see respective documentation and examples).

...

Usepkg = "terra|raster|stars" to get an output inSpatRaster,RasterLayerorstars format. Default isgetOption("lidR.raster.default").

use_class

integer vector. By default the terrain is computed by using ground points(class 2) and water points (class 9).

shape

By default the interpolation is made only within the"convex" hull ofthe point cloud to get a DTM with the shape of the point cloud. This prevents meaninglessinterpolations where there is no data. It can also be"concave" or"bbox". It can also be ansfcto define a polygon in which to perform the interpolation.

Details

rasterize_terrain

Interpolates the ground points and creates a rasterizeddigital terrain model. The algorithm uses the points classified as "ground" and "water"(Classification = 2 and 9, respectively, according toLAS file format specifications)to compute the interpolation. How well the edges of the dataset are interpolated depends on theinterpolation method used. A buffer around the region of interest is always recommended to avoidedge effects.

rasterize_canopy

Creates a digital surface model (DSM) using severalpossible algorithms. If the user provides a normalized point cloud, the output is indeed a canopyheight model (CHM).

rasterize_density

Creates a map of the point density. If a "pulseID"attribute is found, also returns a map of the pulse density.

Value

RasterLayer or astars or aSpatRaster depending on the settings.

Non-supported LAScatalog options

The optionselect is not supported and not respected in⁠rasterize_*⁠ because it is internallyknown what is best to select.
The optionchunk_buffer is not supported and not respected inrasterize_canopy andrasterize_density because it is not necessary.

Examples

# =====================# Digital Terrain Model# =====================LASfile <- system.file("extdata", "Topography.laz", package="lidR")las = readLAS(LASfile, filter = "-inside 273450 5274350 273550 5274450")#plot(las)dtm1 = rasterize_terrain(las, algorithm = knnidw(k = 6L, p = 2))dtm2 = rasterize_terrain(las, algorithm = tin())## Not run: dtm3 = rasterize_terrain(las, algorithm = kriging(k = 10L))plot(dtm1, col = gray(0:25/25))plot(dtm2, col = gray(0:25/25))plot(dtm3, col = gray(0:25/25))plot_dtm3d(dtm1)plot_dtm3d(dtm2)plot_dtm3d(dtm3)## End(Not run)# =====================# Digital Surface Model# =====================LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")las <- readLAS(LASfile, filter = "-inside 481280 3812940 481330 3812990")col <- height.colors(15)# Points-to-raster algorithm with a resolution of 1 meterchm <- rasterize_canopy(las, res = 1, p2r())plot(chm, col = col)# Points-to-raster algorithm with a resolution of 0.5 meters replacing each# point by a 20-cm radius circle of 8 pointschm <- rasterize_canopy(las, res = 0.5, p2r(0.2))plot(chm, col = col)# Basic triangulation and rasterization of first returnschm <- rasterize_canopy(las, res = 0.5, dsmtin())plot(chm, col = col)# Khosravipour et al. pitfree algorithmchm <- rasterize_canopy(las, res = 0.5, pitfree(c(0,2,5,10,15), c(0, 1.5)))plot(chm, col = col)# ====================# Digital Density Map# ====================LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las <- readLAS(LASfile,  filter = "-inside 684800 5017800 684900 5017900")d <- rasterize_density(las, 5)plot(d)las <- retrieve_pulses(las)d <- rasterize_density(las)plot(d)

Read .las or .laz files

Description

Reads .las or .laz files into an object of classLAS. If several files are read atonce the returned LAS object is considered as one LAS file. The optional parameters enable the userto save a substantial amount of memory by choosing to load only the attributes or points of interest.LAS formats 1.0 to 1.4 are supported. Point Data Record Format 0 to 10 are supported.

readLAS is the original function and always works. Using one of thereadALS orreadTLS functionsadds information to the returned object to register a point-cloud type. Registering the correct pointtype improves the performance of some functions by enabling users to select an appropriate spatial index.Seespatial indexing. Notice that by legacy and for backwards-compatibility reasons,readLAS() andreadALS() are equivalent because lidR was originally designed for ALS and thus theoriginal functionreadLAS() was (supposedly) used for ALS. Reading a TLS dataset withreadLAS() insteadofreadTLS() is perfectly valid but less powerful.

Usage

readALS(files, select = "*", filter = "")readTLS(files, select = "*", filter = "", sort = TRUE)readMSLAS(files1, files2, files3, select = "*", filter = "")readLAS(files, select = "*", filter = "")

Arguments

files

characters. Path(s) to one or several a file(s). Can also be aLAScatalog object.

select

character. Read only attributes of interest to save memory (see details).

filter

character. Read only points of interest to save memory (see details).

sort

boolean. To optimize even more the computation speed the point cloud is spatially sorted

files1,files2,files3

characters. Path(s) to one or several a file(s). Each argument beingone channel (see section 'Multispectral data'). 'files2' and 'files3' can be missing.

Details

Select: the 'select' argument specifies the data that will actually be loaded. For example,'xyzia' means that the x, y, and z coordinates, the intensity and the scan angle will be loaded.The supported entries are t - gpstime, a - scan angle, i - intensity, n - number of returns,r - return number, c - classification, s - synthetic flag, k - keypoint flag, w - withheld flag,o - overlap flag (format 6+), u - user data, p - point source ID, e - edge of flight line flag,d - direction of scan flag, R - red channel of RGB color, G - green channel of RGB color,B - blue channel of RGB color, N - near-infrared channel, C - scanner channel (format 6+),W - Full waveform.Also numbers from 1 to 9 for the extra bytes data numbers 1 to 9. 0 enables all extra bytes to beloaded and '*' is the wildcard that enables everything to be loaded from the LAS file.
Note that x, y, z are implicit and always loaded. 'xyzia' is equivalent to 'ia'.

Filter: the 'filter' argument allows filtering of the point cloud while reading files.This is much more efficient thanfilter_poi in many ways. If the desired filters are knownbefore reading the file, the internal filters should always be preferred. The available filters arethose fromLASlib and can be found by running the following command:readLAS(filter = "-help").(see alsorlas::read.las). Fromrlas v1.3.6 the transformation commandscan also be passed via the argument filter.

Value

A LAS object

Multispectral data

Multispectral laser data are often stored in 3 different files. If this is the casereadMSLAS reads the .las or .laz files of each channel and merges them intoan object of classLAS and takes care of attributing an ID to eachchannel. If the multisprectral point cloud is already stored in a single fileleavefile2 andfile3 missing.

Full waveform

With most recent versions of therlas package, full waveform (FWF) can be read andlidRprovides some compatible functions. However, the support of FWF is still a work-in-progressin therlas package. How it is read, interpreted and represented in R may change. Consequently,tools provided bylidR may also change until the support of FWF becomes mature andstable inrlas. See alsorlas::read.las.

Remember that FWF represents an insanely huge amount of data. It terms of memory it is likehaving between 10 to 100 times more points. Consequently, loading FWF data in R should berestricted to relatively small point clouds.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las = readLAS(LASfile)las = readLAS(LASfile, select = "xyz")las = readLAS(LASfile, select = "xyzi", filter = "-keep_first")las = readLAS(LASfile, select = "xyziar", filter = "-keep_first -drop_z_below 0")# Negation of attributes is also possible (all except intensity and angle)las = readLAS(LASfile, select = "* -i -a")

Create an object of class LAScatalog

Description

Create an object of classLAScatalog from a folderor a collection of filenames. A LAScatalog is a representation of a collectionof las/laz files. A computer cannot load all the data at once. ALAScatalogis a simple way to manage all the files sequentially. Most functions fromlidR can be used seamlessly with a LAScatalog using the internalLAScatalog processing engine. To take advantage of theLAScatalogprocessing engine the user must first adjust some processing options using theappropriate functions. Careful reading of theLAScatalog class documentation is required to use theLAScatalog class correctly.

readLAScatalog is the original function and always works. Using one of theread*LAScatalog functionsadds information to the returned object to register a point-cloud type. Registering the correct pointtypemay improve the performance of some functions by enabling users to select an appropriate spatial index.Seespatial indexing. Notice that by legacy and for backwards-compatibilityreasonsreadLAScatalog() andreadALSLAScatalog() are equivalent because lidR was originally designedfor ALS and thus the original functionreadLAScatalog() was (supposedly) used for ALS.

Usage

readLAScatalog(  folder,  progress = TRUE,  select = "*",  filter = "",  chunk_size = 0,  chunk_buffer = 30,  ...)readALScatalog(folder, ...)readTLScatalog(folder, ...)catalog(folder, ...)

Arguments

folder

string. The path of a folder containing a set of las/laz files.Can also be a vector of file paths.

progress,select,filter,chunk_size,chunk_buffer

Easily accessible processingoptions tuning. SeeLAScatalog-class andengine_options.

...

Extra parameters tolist.files. Typicallyrecursive = TRUE. Propagates also toreadLAScatalog

Value

ALAScatalog object

Examples

# A single file LAScatalog using data provided with the packageLASfile <- system.file("extdata", "Megaplot.laz", package="lidR")ctg = readLAScatalog(LASfile)plot(ctg)## Not run: ctg <- readLAScatalog("</path/to/folder/of/las/>")# Internal engine will sequentially process chunks of size 500 x 500 mopt_chunk_size(ctg) <- 500# Internal engine will align the 500 x 500 m chunks on x = 250 and y = 300opt_alignment(ctg) <- c(250, 300)# Internal engine will not display a progress estimationopt_progress(ctg) <- FALSE# Internal engine will not return results into R.# Instead it will write results in files.# Files will be named e.g.# filename_256000_1.ext# filename_257000_2.ext# filename_258000_3.ext# ...opt_output_files(ctg) <- "/path/filename_{XBOTTOM}_{ID}"# More details in the documentationhelp("LAScatalog-class", "lidR")help("engine_options", "lidR")## End(Not run)

Read a .las or .laz file header

Description

Reads a .las or .laz file header into an object of classLASheader.This function strictly reads the header while the functionreadLAS can alter the header tofit the actual data loaded.

Usage

readLASheader(file)

Arguments

file

characters. Path to one file.

Value

A LASheader object

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")header = readLASheader(LASfile)print(header)plot(header)## Not run: plot(header, mapview = TRUE)## End(Not run)

Retrieve individual pulses, flightlines or scanlines

Description

Retrieve each individual pulse, individual flightline or individual scanline and assigns a numberto each point. The LAS object must be properly populated according to LAS specifications otherwiseusers could find unexpected outputs.

Usage

retrieve_pulses(las)retrieve_flightlines(las, dt = 30)retrieve_scanlines(las)

Arguments

las

A LAS object

dt

numeric. The threshold time-lag used to retrieve flightlines

Details

retrieve_pulses

Retrieves each individual pulse. It uses GPS time. An attributepulseID is added in theLAS object

retrieve_scanlines

Retrieves each individual scanline. When data are sampled according to asaw-tooth pattern (oscillating mirror), a scanline is one line, or row of data. The function relieson the GPS field time to order the data. Then, theScanDirectionFlag attribute is used toretrieve each scanline. An attributescanlineID is added in theLAS object

retrieve_flightlines

Retrieves each individual flightline. It uses GPS time. In acontinuous dataset, once points are ordered by GPS time, the time between two consecutive pointsdoes not exceed a few milliseconds. If the time between two consecutive points is too long it meansthat the second point is from a different flightline. The default threshold is 30 seconds.An attributeflightlineID is added in theLAS object.

Value

An object of classLAS

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las <- readLAS(LASfile)las <- retrieve_pulses(las)laslas <- retrieve_flightlines(las)#plot(las, color = "flightlineID")

Point Cloud Decimation Algorithm

Description

This function is made to be used indecimate_points. It implements an algorithm thatcreates a grid with a given resolution and filters the point cloud by randomly selecting somepoints in each cell. It is designed to produce point clouds that have uniform densities throughoutthe coverage area. For each cell, the proportion of points or pulses that will be retained is computedusing the actual local density and the desired density. If the desired density is greater than the actualdensity it returns an unchanged set of points (it cannot increase the density). The cell size must belarge enough to compute a coherent local density. For example, in a 2 points/m^2 point cloud, 25 squaremeters would be feasible; however 1 square meter cells would not be feasible because density doesnot have meaning at this scale.

Usage

homogenize(density, res = 5, use_pulse = FALSE)

Arguments

density

numeric. The desired output density.

res

numeric. The resolution of the grid used to filter the point cloud

use_pulse

logical. Decimate by removing random pulses instead of random points (requires runningretrieve_pulses first)

See Also

Other point cloud decimation algorithms:sample_maxima,sample_per_voxel,sample_random

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las = readLAS(LASfile, select = "xyz")# Select points randomly to reach an homogeneous density of 1thinned <- decimate_points(las, homogenize(1,5))plot(rasterize_density(thinned, 10))

Point Cloud Decimation Algorithm

Description

These functions are made to be used indecimate_points. They implement algorithms thatcreate a grid with a given resolution and filters the point cloud by selecting the highest/lowestpoint within each cell.

Usage

highest(res = 1)lowest(res = 1)

Arguments

res

numeric. The resolution of the grid used to filter the point cloud

See Also

Other point cloud decimation algorithms:sample_homogenize,sample_per_voxel,sample_random

Other point cloud decimation algorithms:sample_homogenize,sample_per_voxel,sample_random

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las = readLAS(LASfile, select = "xyz")# Select the highest point within each cell of an overlayed gridthinned = decimate_points(las, highest(4))#plot(thinned)# Select the lowest point within each cell of an overlayed gridthinned = decimate_points(las, lowest(4))#plot(thinned)

Point Cloud Decimation Algorithm

Description

These functions are made to be used indecimate_points. They implements algorithm thatcreates a 3D grid with a given resolution and filters the point cloud by selectingpoints of interest within each voxel. 'random_per_voxel()' sample random points. 'barycenter_per_voxel()'samples the point that is the closest to the barycenter of the points within a given voxel.'[lowest|highest]_attribute_per_voxel()' sample respectively the point that have the highest/lowestattribute (e.g. Intensity) per voxel.

Usage

random_per_voxel(res = 1, n = 1)barycenter_per_voxel(res = 1)lowest_attribute_per_voxel(res, attribute = "Z")highest_attribute_per_voxel(res, attribute = "Z")

Arguments

res

numeric. The resolution of the voxel grid used to filter the point cloud

n

integer. The number of points to select

attribute

string name of an attribute (such as 'intensity')

See Also

Other point cloud decimation algorithms:sample_homogenize,sample_maxima,sample_random

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las <- readLAS(LASfile, select = "xyz")thinned <- decimate_points(las, random_per_voxel(8, 1))#plot(thinned)

Point Cloud Decimation Algorithm

Description

This function is made to be used indecimate_points. It implements an algorithm thatrandomly removes points or pulses to reach the desired density over the area.

Usage

random(density, use_pulse = FALSE)

Arguments

density

numeric. The desired output density.

use_pulse

logical. Decimate by removing random pulses instead of random points (requires runningretrieve_pulses first)

See Also

Other point cloud decimation algorithms:sample_homogenize,sample_maxima,sample_per_voxel

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las = readLAS(LASfile, select = "xyz")# Reach a pulse density of 1 on the overall datasetthinned1 = decimate_points(las, random(1))plot(rasterize_density(las))plot(rasterize_density(thinned1))

Segment a point cloud

Description

Segment a point cloud using different methods.⁠segment_*⁠ functions add a new attribute to thepoint cloud to label each point. They segment either individual trees, snags, orgeometrical features.

Usage

segment_shapes(las, algorithm, attribute = "Shape", filter = NULL)segment_snags(las, algorithm, attribute = "snagCls")segment_trees(las, algorithm, attribute = "treeID", uniqueness = "incremental")

Arguments

las

An object of classLAS orLAScatalog.

algorithm

function. An algorithm for segmentation. For individual tree segmentation, lidRhasdalponte2016,watershed,li2012, andsilva2016. More experimentalalgorithms may be found in the packagelidRplugins.For snag segmentation,lidR haswing2015. For geometry segmentation, lidR hasshp_plane,shp_hplane, andshp_line.

attribute

character. The returned LAS object as a new attribute (in a new column).This parameter controls the name of the new attribute.

filter

formula of logical predicates. Enables the function to run only on points of interestin an optimized way. See the examples.

uniqueness

character. A method to compute a unique ID. Can be 'incremental', 'gpstime' or'bitmerge'. See section 'Uniqueness'. This feature must be considered as 'experimental'.

Details

segment_trees

Individual tree segmentation with several possible algorithms. The returnedpoint cloud has a new extra byte attribute named after the parameterattribute independentlyof the algorithm used.

segment_shapes

Computes, for each point, the eigenvalues of the covariance matrix of theneighbouring points. The eigenvalues are later used either to segment linear/planar points or tocompute derived metrics. The points that meet a given criterion based on the eigenvalue are labelledas approximately coplanar/colinear or any other shape supported.

segment_snags

Snag segmentation using several possible algorithms. The function attributesa number identifying a snag class (snagCls attribute) to each point of the point cloud.The classification/segmentation is done at the point cloud level and currently only one algorithm isimplemented, which uses LiDAR intensity thresholds and specified neighbourhoods to differentiatebole and branch from foliage points.

Non-supported LAScatalog options

The optionselect is not supported and not respected because it always preserves the file formatand all the attributes.select = "*" is imposed internally.

Uniqueness

By default the tree IDs are numbered from 1 to n, n being the number of trees found. The problemwith such incremental numbering is that, while it ensures a unique ID is assigned for each tree ina given point-cloud, it also guarantees duplication of tree IDs in different tiles or chunks whenprocessing aLAScatalog. This is because each chunk/file is processed independently of the othersand potentially in parallel on different computers. Thus, the index always restarts at 1 on eachchunk/file. Worse, in a tree segmentation process, a tree that is located exactly between2 chunks/files will have two different IDs for its two halves.

This is why we introduced some uniqueness strategies that are all imperfect and that should be seenas experimental. Please report any troubleshooting. Using a uniqueness-safe strategy ensures thattrees from different files will not share the same IDs. It also ensures that two halves of a treeon the edge of a processing chunk will be assigned the same ID.

incremental

Number from 0 to n. This methoddoes not ensure uniqueness of the IDs. Thisis the legacy method.

gpstime

This method uses the gpstime of the highest point of a tree (apex) to create aunique ID. This ID is not an integer but a 64-bit decimal number, which is suboptimal but atleast it is expected to be uniqueif the gpstime attribute is consistent across files.If inconsistencies with gpstime are reported (for example gpstime records the week time and wasreset to 0 in a coverage that takes more than a week to complete), there is a (low) probability ofgetting ID attribution errors.

bitmerge

This method uses the XY coordinates of the highest point (apex) of a tree tocreate a single 64-bit number with a bitwise operation. First, XY coordinates are converted to32-bit integers using the scales and offsets of the point cloud. For example, if the apex is at(10.32, 25.64) with a scale factor of 0.01 and an offset of 0, the 32-bit integer coordinates areX = 1032 and Y = 2564. Their binary representations are, respectively, (here displayed as 16 bits)0000010000001000 and 0000101000000100. X is shifted by 32 bits and becomes a 64-bit integer. Y is keptas-is and the binary representations are unionized into a 64-bit integer like (here displayed as 32 bit)00000100000010000000101000000100 that is guaranteed to be unique. However Rdoes not support 64-bit integers. The previous steps are done at C++ level and the 64-bit binaryrepresentation is reinterpreted into a 64-bit decimal number to be returned in R. The IDs thus generatedare somewhat weird. For example, the tree ID 00000100000010000000101000000100 which is 67635716 ifinterpreted as an integer becomes 3.34164837074751323479078607289E-316 if interpreted as a decimalnumber. This is far from optimal but at least it is guaranteed to be uniqueif all files havethe same offsets and scale factors.

All the proposed options are suboptimal because they either do not guarantee uniqueness in all cases(inconsistencies in the collection of files), or they imply that IDs are based on non-integers ormeaningless numbers. But at least it works and deals with some of the limitations of R.

Examples

# ==============# Segment trees# ==============LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")las <- readLAS(LASfile, select = "xyz", filter = "-drop_z_below 0")# Using Li et al. (2012)las <- segment_trees(las, li2012(R = 3, speed_up = 5))#plot(las, color = "treeID")# ==============# Segment shapes# ==============LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las <- readLAS(LASfile, filter = "-keep_random_fraction 0.5")# Use the eigenvalues to estimate if points are part of a local planlas <- segment_shapes(las, shp_plane(k = 15), "Coplanar")#plot(las, color = "Coplanar")## Not run: # Drop ground point at runtimelas <- segment_shapes(las, shp_plane(k = 15), "Coplanar", filter = ~Classification != 2L)#plot(las, color = "Coplanar")# ==============# Segment snags# ==============LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")las <- readLAS(LASfile, select = "xyzi", filter="-keep_first") # Wing also included -keep_single# For the Wing2015 method, supply a matrix of snag BranchBolePtRatio conditional# assessment thresholds (see Wing et al. 2015, Table 2, pg. 172)bbpr_thresholds <- matrix(c(0.80, 0.80, 0.70,                            0.85, 0.85, 0.60,                            0.80, 0.80, 0.60,                            0.90, 0.90, 0.55),                            nrow =3, ncol = 4)# Run snag classification and assign classes to each pointlas <- segment_snags(las, wing2015(neigh_radii = c(1.5, 1, 2), BBPRthrsh_mat = bbpr_thresholds))# Plot it all, tree and snag points...plot(las, color="snagCls", colorPalette = rainbow(5))# Filter and plot snag points onlysnags <- filter_poi(las, snagCls > 0)plot(snags, color="snagCls", colorPalette = rainbow(5)[-1])# Wing et al's (2015) methods ended with performing tree segmentation on the# classified and filtered point cloud using the watershed method## End(Not run)

Set or get number of threads that lidR should use

Description

Set and get number of threads to be used in lidR functions that are parallelized with OpenMP.0 means to utilize all CPU available.get_lidr_threads() returns the numberof threads that will be used. This affectslidR package but also thedata.table packageby internally callingsetDTthreads because several functions oflidR rely ondata.table but it does not change R itself or other packages using OpenMP.

Usage

set_lidr_threads(threads)get_lidr_threads()

Arguments

threads

Positive scalar. Default 0 means use all CPU available. Values > 1 meanusing n cores, values in ]0, 1[ mean using a fraction of the cores e.g. 0.5 = half.

See Also

lidR-parallelism


Algorithms for shape detection of the local point neighbourhood

Description

These functions are made to be used insegment_shapes. They implement algorithms for localneighbourhood shape estimation.

Usage

shp_plane(th1 = 25, th2 = 6, k = 8)shp_hplane(th1 = 25, th2 = 6, th3 = 0.98, k = 8)shp_line(th1 = 10, k = 8)shp_hline(th1 = 10, th2 = 0.02, k = 8)shp_vline(th1 = 10, th2 = 0.98, k = 8)

Arguments

th1,th2,th3

numeric. Threshold values (see details)

k

integer. Number of neighbours used to estimate the neighborhood.

Details

In the following,a_1, a_2, a_3 denote the eigenvalues of the covariance matrixof the neighbouring points in ascending order.|Z_1|, |Z_2|, |Z_3| denotethe norm of the Z component of first, second and third axis of the decomposition.th_1, th_2, th_3 denote a set of threshold values. Points are labelledTRUE if they meet the following criteria.FALSE otherwise.

shp_plane

Detection of plans based on criteria defined by Limberger & Oliveira (2015) (seereferences). A point is labelled TRUE if the neighborhood is approximately planar, that is:

a_2 > (th_1 \times a_1) \& (th_2 \times a_2) > a_3

shp_hplane

The same as 'plane' but with an extra test on the orientation of the Z vectorof the principal components to test the horizontality of the surface.

a_2 > (th_1 \times a_1) \& (th_2 \times a_2) > a_3 \& |Z_3| > th_3

In theory|Z_3| should be exactly equal to 1. In practice 0.98 or 0.99 should be fine

shp_line

Detection of lines inspired by the Limberger & Oliveira (2015) criterion. A point islabelled TRUE if the neighbourhood is approximately linear, that is:

th_1 \times a_2 < a_3 \& th_1 \times a_1 < a_3

shp_hline

Detection of horizontal lines inspired by the Limberger & Oliveira (2015) criterion.A point is labelled TRUE if the neighbourhood is approximately linear and horizontal, that is:

th_1 \times a_2 < a_3 \& th_1 \times a_1 < a_3 \& |Z_1| < th_2

In theory|Z_1| should be exactly equal to 0. In practice 0.02 or 0.01 should be fine

shp_vline

Detection of vertical lines inspired by the Limberger & Oliveira (2015) criterion.A point is labelled TRUE if the neighbourhood is approximately linear and vertical, that is:

th_1 \times a_2 < a_3 \& th_1 \times a_1 < a_3 \& |Z_1| > th_2

In theory|Z_1| should be exactly equal to 1. In practice 0.98 or 0.99 should be fine

References

Limberger, F. A., & Oliveira, M. M. (2015). Real-time detection of planar regions in unorganizedpoint clouds. Pattern Recognition, 48(6), 2043–2053. https://doi.org/10.1016/j.patcog.2014.12.020

Examples

# Generating some datan = 400xplane = runif(n,0,6)yplane = runif(n,0,6)zplane = xplane + 0.8 * yplane + runif(n, 0, 0.1)plane = data.frame(X = xplane, Y = yplane, Z = zplane)xhplane = runif(n,5,15)yhplane = runif(n,0,10)zhplane = 5 + runif(n, 0, 0.)hplane = data.frame(X = xhplane, Y = yhplane, Z = zhplane)tline = 1:nxline = 0.05*tlineyline = 0.01*tlinezline = 0.02*tline + runif(n, 0, 0.1)line = data.frame(X = xline, Y = yline, Z = zline)thline = 1:nxhline = 0.05*thline + runif(n, 0, 0.05)yhline = 10 - 0.01*thline + runif(n, 0, 0.05)zhline = 3 + runif(n, 0, 0.05)hline = data.frame(X = xhline, Y = yhline, Z = zhline)tvline = 1:nxvline = 5 + runif(n, 0, 0.05)yvline = 5 + runif(n, 0, 0.05)zvline = 0.02*tlinevline = data.frame(X = xvline, Y = yvline, Z = zvline)las <- rbind(plane, line, hplane, hline, vline)las <- LAS(las)las <- segment_shapes(las, shp_plane(k = 20), "plane")las <- segment_shapes(las, shp_hplane(k = 20), "hplane")las <- segment_shapes(las, shp_line(k = 20), "line")las <- segment_shapes(las, shp_hline(k = 20), "hline")las <- segment_shapes(las, shp_vline(k = 20), "vline")#plot(las)#plot(las, color = "plane")#plot(las, color = "hplane")#plot(las, color = "line")#plot(las, color = "hline")#plot(las, color = "vline")

Smooth a point cloud

Description

Point cloud-based smoothing algorithm. Two methods are available: average within a window andGaussian smooth within a window. The attributeZ of the returned LAS object is the smoothed Z.A new attributeZraw is added to store the original values and can be used to restore thepoint cloud withunsmooth_height.

Usage

smooth_height(  las,  size,  method = c("average", "gaussian"),  shape = c("circle", "square"),  sigma = size/6)unsmooth_height(las)

Arguments

las

An object of classLAS

size

numeric. The size of the windows used to smooth.

method

character. Smoothing method. Can be 'average' or 'gaussian'.

shape

character. The shape of the windows. Can be circle or square.

sigma

numeric. The standard deviation of the gaussian if the method is gaussian.

Details

This method does not use raster-based methods to smooth the point cloud. This is a true point cloudsmoothing. It is not really useful by itself but may be interesting in combination with filters,for example to develop new algorithms.

Value

An object of the classLAS.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las <- readLAS(LASfile, select = "xyz")las <- decimate_points(las, highest(1))#plot(las)las <- smooth_height(las, 5, "gaussian", "circle", sigma = 2)#plot(las)las <- unsmooth_height(las)#plot(las)

Snags Segmentation Algorithm

Description

This function is made to be used insegment_snags. It implements an algorithms for snags segmentationbased on Wing et al (2015) (see references). This is an automated filtering algorithm that utilizesthree dimensional neighborhood lidar point-based intensity and density statistics to remove lidarpoints associated with live trees and retain lidar points associated with snags.

Usage

wing2015(  neigh_radii = c(1.5, 1, 2),  low_int_thrsh = 50,  uppr_int_thrsh = 170,  pt_den_req = 3,  BBPRthrsh_mat = NULL)

Arguments

neigh_radii

numeric. A vector of three radii used in quantifying local-area centeredneighborhoods. See Wing et al. (2015) reference page 171 and Figure 4. Defaults are 1.5,1, and 2 for the sphere, small cylinder and large cylinder neighborhoods, respectively.

low_int_thrsh

numeric. The lower intensity threshold filtering value. See Winget al. (2015) page 171. Default is 50.

uppr_int_thrsh

numeric. The upper intensity threshold filtering value. See Winget al. (2015) page 171. Default is 170.

pt_den_req

numeric. Point density requirement based on plot-level point densitydefined classes. See Wing et al. (2015) page 172. Default is 3.

BBPRthrsh_mat

matrix. A 3x4 matrix providing the four average BBPR (branch and bolepoint ratio) values for each of the three neighborhoods (sphere, small cylinder and largecylinder) to be used for conditional assessments and classification into the following four snagclasses: 1) general snag 2) small snag 3) live crown edge snag 4) high canopycover snag. See Wing et al. (2015) page 172 and Table 2. This matrix must be provided bythe user.

Details

Note that this algorithm strictly performs a classification based on user input whilethe original publication's methods also included a segmentation step and some pre-(filtering for first and single returns only) and post-process (filtering for only thesnag classified points prior to segmentation) tasks which are now expected to be performedby the user. Also, this implementation may have some differences compared with the originalmethod due to potential mis-interpretation of the Wing et al. manuscript, specificallyTable 2 where they present four groups of conditional assessments with their requiredneighborhood point density and average BBPR values (BBPR = branch and bole point ratio;PDR = point density requirement).

This algorithm attributes each point in the point cloud (snagCls column) into thefollowing five snag classes:

Author(s)

Implementation by Andrew Sánchez Meador & Jean-Romain Roussel

References

Wing, Brian M.; Ritchie, Martin W.; Boston, Kevin; Cohen, Warren B.; Olsen, Michael J. 2015.Individual snag detection using neighborhood attribute filtered airborne lidar data. RemoteSensing of Environment. 163: 165-179 https://doi.org/10.1016/j.rse.2015.03.013

Examples

LASfile <- system.file("extdata", "MixedConifer.laz", package="lidR")# Wing also included -keep_singlepoi ="-keep_first -inside 481260 3812920 481310 3812960"las <- readLAS(LASfile, select = "xyzi", filter = poi)# For the Wing2015 method, supply a matrix of snag BranchBolePtRatio conditional# assessment thresholds (see Wing et al. 2015, Table 2, pg. 172)bbpr_thresholds <- matrix(c(0.80, 0.80, 0.70,                          0.85, 0.85, 0.60,                          0.80, 0.80, 0.60,                          0.90, 0.90, 0.55),                          nrow =3, ncol = 4)# Run snag classification and assign classes to each pointlas <- segment_snags(las, wing2015(neigh_radii = c(1.5, 1, 2), BBPRthrsh_mat = bbpr_thresholds))# Plot it all, tree and snag points...#plot(las, color="snagCls", colorPalette = rainbow(5))# Filter and plot snag points onlysnags <- filter_poi(las, snagCls > 0)#plot(snags, color="snagCls", colorPalette = rainbow(5)[-1])# Wing et al's (2015) methods ended with performing tree segmentation on the# classified and filtered point cloud using the watershed method

Surface covered by a LAS* object

Description

Surface covered by a⁠LAS*⁠ object. The surface covered by a point cloud is mathematically 0.To compute non zero values the function uses different strategies. The area is computed based onthe number of occupied cells, or on the area of the convex hull of the points depending on the densityand the size of the point cloud. The result is necessarily an approximation that depends on the methodused.
For aLAScatalog it is computed as the sum of the bounding boxes of the files. Foroverlapping tiles the value may be larger than the total area covered because some regions aresampled twice. For aLASheader it is computed with the bounding box. As a consequence, for the same filest_area applied on a LASheader or on a LAS can return slightly different values.st_area()extendssf:st_area(),area() extendsraster:area().area() is provided for backwardcompatibility.

Usage

## S3 method for class 'LAS'st_area(x, ...)## S3 method for class 'LASheader'st_area(x, ...)## S3 method for class 'LAScatalog'st_area(x, ...)## S4 method for signature 'LAS'area(x, ...)## S4 method for signature 'LASheader'area(x, ...)## S4 method for signature 'LAScatalog'area(x, ...)

Arguments

x

An object of classLAS*.

...

unused.

Value

numeric. A number in the same units as the coordinate reference system.


Bounding box of a LAS* object

Description

Bounding box of a⁠LAS*⁠ object.st_bbox() extendssf, andext() extendsterra. The values returned are similar to theirparent functions.

Usage

## S3 method for class 'LAS'st_bbox(obj, ...)## S3 method for class 'LASheader'st_bbox(obj, ...)## S3 method for class 'LAScatalog'st_bbox(obj, ...)## S3 method for class 'LAScluster'st_bbox(obj, ...)## S4 method for signature 'LAS'ext(x, ...)## S4 method for signature 'LASheader'ext(x, ...)## S4 method for signature 'LAScatalog'ext(x, ...)## S4 method for signature 'LAScluster'ext(x, ...)

Arguments

obj,x

An object of classLAS*.

...

unused

Value

Abbox from sf, or aSpatExtent fromterra.

Examples

f <- system.file("extdata", "example.las", package="rlas")las <- readLAS(f)st_bbox(las)ext(las)

Coordinates of a LAS* object in a matrix form

Description

Retrieve coordinates of a⁠LAS*⁠ object in matrix form. It creates a copy of the coordinatesbecause of the coercion fromdata.frame tomatrix. This function inheritssf::st_coordinates

Usage

## S3 method for class 'LAS'st_coordinates(x, z = TRUE, ...)## S3 method for class 'LAScatalog'st_coordinates(x, ...)

Arguments

x

A LAS* object

z

bool. Return XY or XYZ matrix

...

unused.

Value

matrix

Examples

LASfile <- system.file("extdata", "example.laz", package="rlas")las <- readLAS(LASfile)sf::st_coordinates(las)

Get or set the projection of a LAS* object

Description

Get or set the projection of a⁠LAS*⁠ object.st_crs() extendssf:st_crs(),projection() andcrs() extendraster:projection() andraster:crs().projection() andcrs() are providedfor backward compatibility. Forepsg() andwkt(), see details.

Usage

## S3 method for class 'LAS'st_crs(x, ...)## S3 method for class 'LAScatalog'st_crs(x, ...)## S3 method for class 'LASheader'st_crs(x, ...)## S3 method for class 'LAScluster'st_crs(x, ...)## S3 replacement method for class 'LAS'st_crs(x) <- value## S3 replacement method for class 'LASheader'st_crs(x) <- value## S3 replacement method for class 'LAScatalog'st_crs(x) <- valueprojection(x, asText = TRUE)projection(x) <- value## S4 method for signature 'LASheader'crs(x)## S4 method for signature 'LAS'crs(x)## S4 replacement method for signature 'LAS'crs(x, ...) <- value## S4 method for signature 'LAScatalog'crs(x, asText = FALSE)## S4 method for signature 'LAScluster'crs(x, asText = FALSE)## S4 replacement method for signature 'LAScatalog'crs(x, ...) <- value## S4 replacement method for signature 'LASheader'crs(x, ...) <- valueepsg(object, ...)epsg(object) <- value## S4 method for signature 'LASheader'epsg(object, ...)## S4 replacement method for signature 'LASheader'epsg(object) <- value## S4 method for signature 'LAS'epsg(object)## S4 replacement method for signature 'LAS'epsg(object) <- valuewkt(obj)wkt(obj) <- value## S4 method for signature 'LASheader'wkt(obj)## S4 replacement method for signature 'LASheader'wkt(obj) <- value## S4 method for signature 'LAS'wkt(obj)## S4 replacement method for signature 'LAS'wkt(obj) <- value

Arguments

x,object,obj

An object of class LAS*

...

Unused.

value

ACRS or acrs or aproj4string string or WKT string or an EPSG code.

asText

logical. If TRUE, the projection is returned as text. Otherwise a CRS object is returned.

Details

There are two ways to store the CRS of a point cloud in a LAS file:

On the other hand, R spatial packages use acrs object to store the CRS. This is why the CRS is duplicatedin a LAS object. The information belongs within the header in a format that can be written in aLAS file and in the slotcrs, and also in a format that can be understood by other R packages.

Value

Ast_crs() returns asf::crs.projection() andcrs() return asp::CRS and shouldno longer be used.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las <- readLAS(LASfile)# Get the EPSG code stored in the header (returns 0 if not recorded)epsg(las)# Get the WKT string stored in the header (LAS >= 1.4)wkt(las)# Overwrite the CRS (but does not reproject)st_crs(las) <- 26918las

Concave and convex hulls for LAS objects

Description

Concave and convex hulls for LAS objects.st_convex_hull extendssf::st_convex_hull for LASobjects. Both functions return asfc_POLYGON.concaveman is very a fast 2D concave hull algorithmfor a set of points.

Usage

st_concave_hull(x, method = "concaveman", ...)## S3 method for class 'LAS'st_convex_hull(x)concaveman(x, y = NULL, concavity = 2, length_threshold = 0)

Arguments

x,y

An object of class LAS or XY coordinates of points in case ofconcaveman. This can bespecified as two vectors x and y, a 2-column matrix x, a list with two components, etc.

method

string. currently supports "concaveman".

...

Propagate to the method.

concavity

numeric a relative measure of concavity. 1 results in a relatively detailed shape,Infinity results in a convex hull. You can use values lower than 1, but they can produce pretty crazyshapes.

length_threshold

numeric. When a segment length is below this threshold, it stops beingconsidered for further detailed processing. Higher values result in simpler shapes.

Details

The concaveman algorithm is based on ideas from Park and Oh (2012). A first implementation inJavaScript was proposed by Vladimir Agafonkin inmapbox.This implementation dramatically improved performance over the one stated in the paperusing a spatial index. The algorithm was then ported to R by Joël Gombin in the R packageconcaveman that runs the JavaScriptimplementation proposed by Vladimir Agafonkin. Later, a C++ version of Vladimir Agafonkin'sJavaScript implementation was proposed by Stanislaw Adaszewski inconcaveman-cpp. This concavemanfunction uses Stanislaw Adaszewski's C++ code making the concaveman algorithm anorder of magnitude (up to 50 times) faster than the Javascript version.

Value

Asfc_POLYGON fromsf or adata.frame in the case ofconcaveman

References

Park, J.-S & Oh, S.-J. (2013). A New Concave Hull Algorithm and Concaveness Measurefor n-dimensional Datasets. Journal of Information Science and Engineering. 29. 379-392.

Examples

x <- runif(35)y <- runif(35)hull <- concaveman(x,y)plot(x,y, asp = 1)lines(hull, lwd = 3, col = "red")LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las = readLAS(LASfile, filter = "-drop_z_below 1")hull = st_concave_hull(las, length_threshold = 10)plot(hull)

Transform or convert coordinates of LAS objects

Description

Transform or convert coordinates of LAS objectsst_transform() extendssf::st_transform()

Usage

## S3 method for class 'LAS'st_transform(x, crs, ...)

Arguments

x

An object of class LAS

crs

crs object from sf or CRS object from sp

...

additional argumentsscale andxoffset,yoffset,zoffsetfor the output LAS objects. It is not mandatory but recommended to consider providing suchinformation. Otherwise it will be guessed automatically which might not be the best choice.

Value

A LAS object

Examples

LASfile <- system.file("extdata", "example.laz", package="rlas")las = readLAS(LASfile)st_crs(las)$Namest_bbox(las)tlas <- sf::st_transform(las, sf::st_crs(26918))st_crs(tlas)$Namest_bbox(tlas)

Predefined standard metrics functions

Description

Predefined metrics functions intended to me used in⁠*_metrics⁠ function such aspixel_metrics,cloud_metrics,crown_metrics,voxel_metrics andso on. Each function comes with a convenient shortcuts for lazy coding. ThelidR package aimsto provide an easy way to compute user-defined metrics rather than to provide them. However, forefficiency and to save time, sets of standard metrics have been predefined (see details). Everyfunction can be computed by every⁠*_metrics⁠ functions however⁠stdmetrics*⁠ aremore pixel-based metrics,stdtreemetrics are more tree-based metrics andstdshapemetrics aremore point-based metrics. For example the metriczmean computed bystdmetrics_z makes sensewhen computed at the pixel level but brings no information at the voxel level.

Usage

stdmetrics(x, y, z, i, rn, class, dz = 1, th = 2, zmin = 0)stdmetrics_z(z, dz = 1, th = 2, zmin = 0)stdmetrics_i(i, z = NULL, class = NULL, rn = NULL)stdmetrics_rn(rn, class = NULL)stdmetrics_pulse(pulseID, rn)stdmetrics_ctrl(x, y, z)stdtreemetrics(x, y, z)stdshapemetrics(x, y, z).stdmetrics.stdmetrics_z.stdmetrics_i.stdmetrics_rn.stdmetrics_pulse.stdmetrics_ctrl.stdtreemetrics.stdshapemetrics

Arguments

x,y,z,i

Coordinates of the points, Intensity

rn,class

ReturnNumber, Classification

dz

numeric. Layer thickness metricentropy

th

numeric. Threshold for metrics pzabovex. Can be a vector to compute with several thresholds.

zmin

numeric. Lower bound of the integral for zpcumx metrics.Seewiki page and Wood et al.(2008) reference.

pulseID

The number referencing each pulse

Format

An object of classformula of length 2.

An object of classformula of length 2.

An object of classformula of length 2.

An object of classformula of length 2.

An object of classformula of length 2.

An object of classformula of length 2.

An object of classformula of length 2.

An object of classformula of length 2.

Details

The function names, their parameters and the output names of the metrics rely on a nomenclaturechosen for brevity:

For example the metric namedzq60 refers to the elevation, quantile, 60 i.e. the 60th percentileof elevations. The metricpground refers to a percentage. It is the percentage of pointsclassified as ground. The functionstdmetric_i refers to metrics of intensity. A description ofeach existing metric can be found on thelidR wiki page.

Some functions have optional parameters. If these parameters are not provided the functioncomputes only a subset of existing metrics. For example,stdmetrics_i requires the intensityvalues, but if the elevation values are also provided it can compute additional metrics such ascumulative intensity at a given percentile of height.

Each function has a convenient associated variable. It is the name of the function, with adot before the name. This enables the function to be used without writing parameters. The costof such a feature is inflexibility. It corresponds to a predefined behaviour (see examples)

stdmetrics

is a combination ofstdmetrics_ctrl +stdmetrics_z +stdmetrics_i +stdmetrics_rn

stdtreemetrics

is a special function that works withcrown_metrics. Actually,it won't fail with other functions but the output makes more sense if computed at theindividual tree level.

stdshapemetrics

is a set of eigenvalue based feature described in Lucas et al, 2019(see references).

References

M. Woods, K. Lim, and P. Treitz. Predicting forest stand variables from LiDAR data inthe Great Lakes – St. Lawrence forest of Ontario. The Forestry Chronicle. 84(6): 827-839.https://doi.org/10.5558/tfc84827-6

Lucas, C., Bouten, W., Koma, Z., Kissling, W. D., & Seijmonsbergen, A. C. (2019). Identificationof Linear Vegetation Elements in a Rural Landscape Using LiDAR Point Clouds. Remote Sensing, 11(3), 292.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las <- readLAS(LASfile, select = "*", filter = "-keep_random_fraction 0.5")# All the predefined metricsm1 <- pixel_metrics(las, ~stdmetrics(X,Y,Z,Intensity,ReturnNumber,Classification,dz=1), res = 40)# Convenient shortcutm2 <- pixel_metrics(las, .stdmetrics, res = 40)# Basic metrics from intensitiesm3 <- pixel_metrics(las, ~stdmetrics_i(Intensity), res = 40)# All the metrics from intensitiesm4 <- pixel_metrics(las, ~stdmetrics_i(Intensity, Z, Classification, ReturnNumber), res = 40)# Convenient shortcut for the previous examplem5 <- pixel_metrics(las, .stdmetrics_i, res = 40)# Combine some predefined function with your own new metrics# Here convenient shortcuts are no longer usable.myMetrics = function(z, i, rn){  first  <- rn == 1L  zfirst <- z[first]  nfirst <- length(zfirst)  above2 <- sum(z > 2)  x <- above2/nfirst*100  # User's metrics  metrics <- list(     above2aboven1st = x,       # Num of returns above 2 divided by num of 1st returns     zimean  = mean(z*i),       # Mean products of z by intensity     zsqmean = sqrt(mean(z^2))  # Quadratic mean of z   )  # Combined with standard metrics  return( c(metrics, stdmetrics_z(z)) )}m10 <- pixel_metrics(las, ~myMetrics(Z, Intensity, ReturnNumber), res = 40)# Users can write their own convenient shorcuts like this:.myMetrics = ~myMetrics(Z, Intensity, ReturnNumber)m11 <- pixel_metrics(las, .myMetrics, res = 40)

Reconstruct the trajectory of the LiDAR sensor using multiple returns

Description

Use multiple returns to estimate the positioning of the sensor by computing the intersection inspace of the line passing through the first and last returns. To work, this function requires adataset where the 'gpstime', 'ReturnNumber', 'NumberOfReturns' and 'PointSourceID' attributes areproperly populated, otherwise the output may be incorrect or weird. For LAScatalog processingit is recommended to use large chunks and large buffers (e.g. a swath width). The point cloud mustnot be normalized.

Usage

track_sensor(  las,  algorithm,  extra_check = TRUE,  thin_pulse_with_time = 0.001,  multi_pulse = FALSE)

Arguments

las

An object of classLAS orLAScatalog.

algorithm

function. An algorithm to compute sensor tracking.lidR implementsRoussel2020 andGatziolis2019 (see respective documentation and examples).

extra_check

boolean. Datasets are rarely perfectly populated, leading to unexpected errors.Time-consuming checks of data integrity are performed. These checks can be skipped as they accountfor an significant proportion of the computation time. See also section 'Tests of data integrity'.

thin_pulse_with_time

numeric. In practice, it is not useful to compute the position using allmultiple returns. It is more computationally demanding but not necessarily more accurate. This keepsonly one pulse every x seconds. Set to 0 to use all multiple returns. Use 0 if the file has alreadybeen read withfilter = "-thin_pulses_with_time 0.001".

multi_pulse

logical. TRUE only for systems with multiple pulses. Pulse ID must be recordedin the UserData attribute.

Value

An sf object with POINT Z geometries. Information about the time interval and the score ofthe positioning (according to the method used) are also in the table of attributes.

Non-supported LAScatalog options

The option 'select' is not supported and not respected because it is internally known what is thebest to select
The option 'output_files' is not supported and not respected because the output must be post-processedas a whole

Test of data integrity

In theory, sensor tracking is a simple problem to solve as long as each pulse is properlyidentified from a well-populated dataset. In practice, many problems may arise from datasets that are populatedincorrectly. Here is a list of problems that may happen. Those with a * denote problems already encountered andinternally checked to remove weird points:

For a given time interval, when weird points are not filtered, the position is not computed for thisinterval.

Author(s)

Jean-Francois Bourdon & Jean-Romain Roussel

Examples

# A valid file properly populatedLASfile <- system.file("extdata", "Topography.laz", package="lidR")las = readLAS(LASfile)#plot(las)# pmin = 15 because it is an extremely small file# strongly decimated to reduce its size. There are# actually few multiple returnsflightlines <- track_sensor(las, Roussel2020(pmin = 15))plot(las@header)plot(sf::st_geometry(flightlines), add = TRUE)#plot(las) |> add_flightlines3d(flightlines, radius = 10)## Not run: # With a LAScatalog "-drop_single" and "-thin_pulses_with_time"# are used by defaultctg = readLAScatalog("folder/")flightlines <- track_sensor(ctg,  Roussel2020(pmin = 15))plot(flightlines)## End(Not run)

Sensor tracking algorithm

Description

This function is made to be used intrack_sensor. It implements an algorithm from Gatziolisand McGaughey 2019 (see reference) for sensor tracking using multiple returns to estimate the positioningof the sensor by computing the intersection in space of the lines passing through the first andlast returns.

Usage

Gatziolis2019(SEGLENFactor = 1.0059, AngleFactor = 0.8824, deltaT = 0.5)

Arguments

SEGLENFactor

scalar. Weighting factor for the distance b/w 1st and last pulse returns

AngleFactor

scalar. Weighting factor for view angle of mother pulse of a return

deltaT

scalar. TimeBlock duration (in seconds)

Details

In the original paper, two steps are described: (1) closest point approach (CPA) and (2) cubicspline fitting. Technically, the cubic spline fitting step is a post-processing step and is notincluded in this algorithm.

The source code of the algorithm is a slight modification of the original source code providedwith the paper to fit with the lidR package.

Author(s)

Demetrios Gaziolis and Jean-Romain Roussel

References

Gatziolis, D., & McGaughey, R. J. (2019). Reconstructing Aircraft Trajectories fromMulti-Return Airborne Laser-Scanning Data. Remote Sensing, 11(19), 2258.

Examples

# A valid file properly populatedLASfile <- system.file("extdata", "Topography.laz", package="lidR")las = readLAS(LASfile)flightlines <- track_sensor(las, Gatziolis2019())plot(las@header)plot(flightlines, add = TRUE)

Sensor tracking algorithm

Description

This function is made to be used intrack_sensor. It implements an algorithm from Roussel etal. 2020 (see reference) for sensor tracking using multiple returns to estimate the positioning ofthe sensor by computing the intersection in space of the lines passing through the first and lastreturns.

Usage

Roussel2020(interval = 0.5, pmin = 50)

Arguments

interval

numeric. Interval used to bin the gps times and group the pulses to computea position at a given timepoint t.

pmin

integer. Minimum number of pulses needed to estimate a sensor position.For a given interval, the sensor position is not computed if the number of pulses is lower thanpmin.

Details

When multiple returns from a single pulse are detected, the sensor computes their positions as beingin the center of the footprint and thus all aligned. Because of that behavior, a linedrawn between and beyond those returns must cross the sensor. Thus, several consecutive pulsesemitted in a tight interval (e.g. 0.5 seconds) can be used to approximate an intersectionpoint in the sky that corresponds to the sensor position given that the sensor carrier hasn'tmoved much during this interval. A weighted least squares method gives an approximation of theintersection by minimizing the squared sum of the distances between the intersection point and allthe lines.

References

Roussel Jean-Romain, Bourdon Jean-Francois, Achim Alexis, (2020) Range-based intensitynormalization of ALS data over forested areas using a sensor tracking method from multiple returns(preprint) Retrieved from eartharxiv.org/k32qw https://doi.org/10.31223/osf.io/k32qw

Examples

# A valid file properly populatedLASfile <- system.file("extdata", "Topography.laz", package="lidR")las = readLAS(LASfile)# pmin = 15 because it is an extremely tiny file# strongly decimated to reduce its size. There are# actually few multiple returnsflightlines <- track_sensor(las, Roussel2020(pmin = 15))plot(las@header)plot(flightlines, add = TRUE)

Voxelize a point cloud

Description

Reduce the number of points by voxelizing the point cloud. If the Intensity is part of the attributesit is preserved and aggregated asmean(Intensity). Other attributes cannot be aggregated andare lost.

Usage

voxelize_points(las, res)

Arguments

las

An object of classLAS orLAScatalog.

res

numeric. The resolution of the voxels.res = 1 for a 1x1x1 cubic voxels. Optionallyres = c(1,2) for non-cubic voxels (1x1x2 cuboid voxel).

Value

If the input is aLAS object, returns aLAS object. If the input is aLAScatalog, returns aLAScatalog.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las = readLAS(LASfile, select = "xyz")las2 = voxelize_points(las, 5)#plot(las2, voxel = TRUE)

Write a .las or .laz file

Description

Write aLAS object into a binary .las or .laz file (compressionspecified in filename)

Usage

writeLAS(las, file, index = FALSE)

Arguments

las

an object of class LAS.

file

character. A character string naming an output file.

index

boolean. Also write a lax file to index the points in the files

Value

Nothing. This function is used for its side-effect of writing a file.

Examples

LASfile <- system.file("extdata", "Megaplot.laz", package="lidR")las = readLAS(LASfile)subset = clip_rectangle(las, 684850, 5017850, 684900, 5017900)writeLAS(subset, tempfile(fileext = ".laz"))

[8]ページ先頭

©2009-2025 Movatter.jp