diff --git a/DESCRIPTION b/DESCRIPTION index c0b34d6d..110df115 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,6 +1,6 @@ Package: qgisprocess Title: Use 'QGIS' Processing Algorithms -Version: 0.1.0.9178 +Version: 0.1.0.9179 Authors@R: c( person("Dewey", "Dunnington", , "dewey@fishandwhistle.net", role = "aut", comment = c(ORCID = "0000-0002-9415-4582", affiliation = "Voltron Data")), diff --git a/NAMESPACE b/NAMESPACE index 88c9341f..a9d3974f 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -8,6 +8,8 @@ S3method(as_qgis_argument,RasterBrick) S3method(as_qgis_argument,RasterLayer) S3method(as_qgis_argument,SpatExtent) S3method(as_qgis_argument,SpatRaster) +S3method(as_qgis_argument,SpatVector) +S3method(as_qgis_argument,SpatVectorProxy) S3method(as_qgis_argument,bbox) S3method(as_qgis_argument,character) S3method(as_qgis_argument,crs) @@ -41,6 +43,7 @@ S3method(qgis_as_raster,qgis_outputRaster) S3method(qgis_as_raster,qgis_result) S3method(qgis_as_terra,qgis_outputLayer) S3method(qgis_as_terra,qgis_outputRaster) +S3method(qgis_as_terra,qgis_outputVector) S3method(qgis_as_terra,qgis_result) S3method(qgis_clean_argument,default) S3method(qgis_clean_argument,qgis_dict_input) diff --git a/R/compat-sf.R b/R/compat-sf.R index c3e5e5f7..7dd45f89 100644 --- a/R/compat-sf.R +++ b/R/compat-sf.R @@ -46,17 +46,17 @@ st_as_sf.qgis_result <- function(x, ...) { #' @rdname st_as_sf #' @exportS3Method sf::st_as_sf st_as_sf.qgis_outputVector <- function(x, ...) { - if (grepl("\\|layer", x)) { - output_splitted <- strsplit(x, "\\|layer.*=")[[1]] - sf::read_sf(output_splitted[1], output_splitted[2], ...) - } else { - sf::read_sf(x, ...) - } + qgis_as_sf(x, ...) } #' @rdname st_as_sf #' @exportS3Method sf::st_as_sf st_as_sf.qgis_outputLayer <- function(x, ...) { + qgis_as_sf(x, ...) +} + +#' @keywords internal +qgis_as_sf <- function(x, ...) { if (grepl("\\|layer", x)) { output_splitted <- strsplit(x, "\\|layer.*=")[[1]] sf::read_sf(output_splitted[1], output_splitted[2], ...) diff --git a/R/compat-terra.R b/R/compat-terra.R index 630e1e4c..7a6f9cfe 100644 --- a/R/compat-terra.R +++ b/R/compat-terra.R @@ -1,12 +1,20 @@ #' Convert a qgis_result object or one of its elements to a terra object #' +#' This function performs coercion to one of the terra classes +#' `SpatRaster`, `SpatVector` or `SpatVectorProxy` (add `proxy = TRUE` for the +#' latter). +#' The distinction between `SpatRaster` and `SpatVector` is based on the +#' output type. +#' #' @family topics about coercing processing output #' @family topics about accessing or managing processing results #' -#' @param ... Arguments passed to [terra::rast()]. +#' @param ... Arguments passed to [terra::rast()] or [terra::vect()], depending +#' on the output type of `x` (or one of its elements, if `x` is a +#' `qgis_result`). #' @inheritParams qgis_as_raster #' -#' @returns A `SpatRaster` or a `SpatVector` object. +#' @returns A `SpatRaster`, `SpatVector` or `SpatVectorProxy` object. #' #' @examplesIf has_qgis() && requireNamespace("terra", quietly = TRUE) #' \donttest{ @@ -23,6 +31,20 @@ #' # if you need more control, extract the needed output element first: #' output_raster <- qgis_extract_output(result, "OUTPUT") #' qgis_as_terra(output_raster) +#' +#' # Same holds for coercion to SpatVector +#' result2 <- qgis_run_algorithm( +#' "native:buffer", +#' INPUT = system.file("longlake/longlake.gpkg", package = "qgisprocess"), +#' DISTANCE = 100 +#' ) +#' +#' qgis_as_terra(result2) +#' output_vector <- qgis_extract_output(result2, "OUTPUT") +#' qgis_as_terra(output_vector) +#' +#' # SpatVectorProxy: +#' qgis_as_terra(result2, proxy = TRUE) #' } #' #' @name qgis_as_terra @@ -42,27 +64,52 @@ qgis_as_terra.qgis_outputRaster <- function(x, ...) { #' @rdname qgis_as_terra #' @export qgis_as_terra.qgis_outputLayer <- function(x, ...) { - terra::rast(unclass(x), ...) + tryCatch( + terra::rast(unclass(x), ...), + error = function(e) { + qgis_as_spatvector(x, ...) + }, + warning = function(w) { + if (!grepl("not recognized as a supported file format", w)) { + warning(w) + } + qgis_as_spatvector(x, ...) + } + ) +} + +#' @rdname qgis_as_terra +#' @export +qgis_as_terra.qgis_outputVector <- function(x, ...) { + qgis_as_spatvector(x, ...) } #' @rdname qgis_as_terra #' @export qgis_as_terra.qgis_result <- function(x, ...) { - result <- qgis_extract_output_by_class(x, c("qgis_outputRaster", "qgis_outputLayer")) - terra::rast(unclass(result), ...) + result <- qgis_extract_output_by_class( + x, + c("qgis_outputRaster", "qgis_outputVector", "qgis_outputLayer") + ) + qgis_as_terra(result, ...) } +#' @keywords internal +qgis_as_spatvector <- function(x, ...) { + if (grepl("\\|layer", unclass(x))) { + output_splitted <- strsplit(unclass(x), "\\|layer.*=")[[1]] + terra::vect(output_splitted[1], output_splitted[2], ...) + } else { + terra::vect(unclass(x), ...) + } +} + + # @param x A [terra::rast()]. #' @keywords internal #' @export as_qgis_argument.SpatRaster <- function(x, spec = qgis_argument_spec(), use_json_input = FALSE) { - as_qgis_argument_terra(x, spec, use_json_input) -} - -#' @keywords internal -as_qgis_argument_terra <- function(x, spec = qgis_argument_spec(), - use_json_input = FALSE) { if (!isTRUE(spec$qgis_type %in% c("raster", "layer", "multilayer"))) { abort(glue("Can't convert '{ class(x)[1] }' object to QGIS type '{ spec$qgis_type }'")) } @@ -83,13 +130,20 @@ as_qgis_argument_terra <- function(x, spec = qgis_argument_spec(), sources <- sources$source } - if (!identical(sources, "") && length(sources) == 1) { + if (!identical(sources, "") && identical(length(sources), 1L)) { accepted_ext <- c("grd", "asc", "sdat", "rst", "nc", "tif", "tiff", "gtiff", "envi", "bil", "img") file_ext <- stringr::str_to_lower(tools::file_ext(sources)) if (file_ext %in% accepted_ext) { - names_match <- identical(names(x), names(terra::rast(sources))) - if (names_match) { + reread <- terra::rast(sources) + names_match <- identical(names(x), names(reread)) + crs_match <- identical(terra::crs(x), terra::crs(reread)) + if (names_match && crs_match) { return(sources) + } else if (!crs_match) { + message(glue( + "Rewriting the SpatRaster object as a temporary file before passing to QGIS, since ", + "its CRS has been set to another value than that in the source file '{ sources }'." + )) } else if (terra::nlyr(x) > 1L) { message(glue( "Rewriting the multi-band SpatRaster object as a temporary file before passing to QGIS, since ", @@ -110,6 +164,102 @@ as_qgis_argument_terra <- function(x, spec = qgis_argument_spec(), structure(path, class = "qgis_tempfile_arg") } + + +#' @keywords internal +#' @export +as_qgis_argument.SpatVector <- function(x, spec = qgis_argument_spec(), + use_json_input = FALSE) { + as_qgis_argument_terra_vector(x, spec, use_json_input) +} + + +#' @keywords internal +#' @export +as_qgis_argument.SpatVectorProxy <- function(x, spec = qgis_argument_spec(), + use_json_input = FALSE) { + as_qgis_argument_terra_vector(x, spec, use_json_input) +} + + +#' @keywords internal +as_qgis_argument_terra_vector <- function(x, + spec = qgis_argument_spec(), + use_json_input = FALSE) { + class <- class(x)[1] + + if (!isTRUE(spec$qgis_type %in% c("source", "layer", "vector", "multilayer", "point"))) { + abort(glue("Can't convert '{ class }' object to QGIS type '{ spec$qgis_type }'")) + } + + # try to use a filename if present + sources <- terra::sources(x) + if (!is.character(sources)) { + sources <- sources$source + } + if ( + !identical(sources, "") && + identical(length(sources), 1L) && + !identical(spec$qgis_type, "point") + ) { + # rewrite if attribute names differ from source: + if (grepl("::", sources)) { + chunks <- strsplit(sources, "::")[[1]] + proxy <- terra::vect(chunks[1], chunks[2], proxy = TRUE) + source_names <- names(proxy) + } else { + proxy <- terra::vect(sources, proxy = TRUE) + source_names <- names(proxy) + } + if (!identical(names(x), source_names)) { + message(glue( + "Rewriting the {class} object as a temporary file before passing to QGIS, since ", + "its attribute names (including order, selection) differ from those in the source file '{ sources }'." + )) + # rewrite if CRS differs (terra source reference is kept if CRS is reset, + # not if data is transformed): + } else if (!identical(terra::crs(x), terra::crs(proxy))) { + message(glue( + "Rewriting the {class} object as a temporary file before passing to QGIS, since ", + "its CRS has been set to another value than that in the source file '{ sources }'." + )) + } else { + return(sub("::", "|layername=", sources)) + } + } + + if (identical(spec$qgis_type, "point")) { + assert_that( + identical(terra::geomtype(x), "points"), # is.points() not defined for proxy + identical(nrow(x), 1), + msg = glue( + "QGIS argument type 'point' can take a {class} object, but it must ", + "have exactly one row and the geometry must be a point." + ) + ) + crs_code <- as.character(terra::crs(x, describe = TRUE)[, c("authority", "code")]) + if (inherits(x, "SpatVectorProxy")) { + x <- terra::query(x, n = 1) + } + coord <- terra::geom(x)[1, c("x", "y")] + if (!any(is.na(crs_code))) { + return(glue("{coord[1]},{coord[2]}[{crs_code[1]}:{crs_code[2]}]")) + } else { + return(glue("{coord[1]},{coord[2]}")) + } + } + + # (re)write to file + if (inherits(x, "SpatVectorProxy")) { + x <- terra::query(x) + } + path <- qgis_tmp_vector() + terra::writeVector(x, path) + structure(path, class = "qgis_tempfile_arg") +} + + + #' @keywords internal #' @export as_qgis_argument.SpatExtent <- function(x, spec = qgis_argument_spec(), diff --git a/man/qgis_as_terra.Rd b/man/qgis_as_terra.Rd index cdc91998..1add0555 100644 --- a/man/qgis_as_terra.Rd +++ b/man/qgis_as_terra.Rd @@ -4,6 +4,7 @@ \alias{qgis_as_terra} \alias{qgis_as_terra.qgis_outputRaster} \alias{qgis_as_terra.qgis_outputLayer} +\alias{qgis_as_terra.qgis_outputVector} \alias{qgis_as_terra.qgis_result} \title{Convert a qgis_result object or one of its elements to a terra object} \usage{ @@ -13,19 +14,27 @@ qgis_as_terra(x, ...) \method{qgis_as_terra}{qgis_outputLayer}(x, ...) +\method{qgis_as_terra}{qgis_outputVector}(x, ...) + \method{qgis_as_terra}{qgis_result}(x, ...) } \arguments{ \item{x}{A \code{qgis_result} object from \code{\link[=qgis_run_algorithm]{qgis_run_algorithm()}} or a \verb{qgis_output*} object from one of the \code{\link[=qgis_extract_output]{qgis_extract_output()}} functions.} -\item{...}{Arguments passed to \code{\link[terra:rast]{terra::rast()}}.} +\item{...}{Arguments passed to \code{\link[terra:rast]{terra::rast()}} or \code{\link[terra:vect]{terra::vect()}}, depending +on the output type of \code{x} (or one of its elements, if \code{x} is a +\code{qgis_result}).} } \value{ -A \code{SpatRaster} or a \code{SpatVector} object. +A \code{SpatRaster}, \code{SpatVector} or \code{SpatVectorProxy} object. } \description{ -Convert a qgis_result object or one of its elements to a terra object +This function performs coercion to one of the terra classes +\code{SpatRaster}, \code{SpatVector} or \code{SpatVectorProxy} (add \code{proxy = TRUE} for the +latter). +The distinction between \code{SpatRaster} and \code{SpatVector} is based on the +output type. } \examples{ \dontshow{if (has_qgis() && requireNamespace("terra", quietly = TRUE)) (if (getRversion() >= "3.4") withAutoprint else force)(\{ # examplesIf} @@ -43,6 +52,20 @@ qgis_as_terra(result) # if you need more control, extract the needed output element first: output_raster <- qgis_extract_output(result, "OUTPUT") qgis_as_terra(output_raster) + +# Same holds for coercion to SpatVector +result2 <- qgis_run_algorithm( + "native:buffer", + INPUT = system.file("longlake/longlake.gpkg", package = "qgisprocess"), + DISTANCE = 100 +) + +qgis_as_terra(result2) +output_vector <- qgis_extract_output(result2, "OUTPUT") +qgis_as_terra(output_vector) + +# SpatVectorProxy: +qgis_as_terra(result2, proxy = TRUE) } \dontshow{\}) # examplesIf} } diff --git a/misc/algorithms/outputs.csv b/misc/algorithms/outputs.csv index 7bf39ea8..edb11573 100644 --- a/misc/algorithms/outputs.csv +++ b/misc/algorithms/outputs.csv @@ -1,41 +1,145 @@ algorithm,name,description,qgis_output_type 3d:tessellate,OUTPUT,Tessellated,outputVector +NetworkGT:1D Flow,1D Flow,1D Flow,outputVector +NetworkGT:2D Flow,outGrid,2D Flow Grid,outputVector +NetworkGT:Aperture,Output,Aperture,outputVector +NetworkGT:Branches and Nodes,Branches,Branches,outputVector +NetworkGT:Branches and Nodes,Nodes,Nodes,outputVector +NetworkGT:Clusters,Output Clusters,Output Clusters,outputVector +NetworkGT:Clusters,Output Statistics,Statistics,outputFile +NetworkGT:Connect Y Nodes,Connect Y Nodes,Snap Y Nodes,outputVector +NetworkGT:Contour Grid,Grid,Grid,outputVector +NetworkGT:Define Fracture Lines,Output,Output,outputVector +NetworkGT:Define Sets,Output,Output,outputVector +NetworkGT:Digitise Fracture Network,Network,Network,outputVector +NetworkGT:Grid Calculator,outGrid,Grid Calculation,outputVector +NetworkGT:Grid Statistics,outGrid,Calculated Statistics,outputVector +NetworkGT:Identify Blocks,Blocks,Identified Blocks,outputVector +NetworkGT:Identify Blocks,Output,Output,outputVector +NetworkGT:Line Grid,Line Grid,Line Grid,outputVector +NetworkGT:Percolation,Output,Percolation,outputVector +NetworkGT:Permeability Tensor,Output,Permeability Tensor,outputVector +NetworkGT:Repair Topology,Intermediate Step,Multiple Intersections Repair,outputVector +NetworkGT:Repair Topology,Output,Repaired,outputVector +NetworkGT:Shortest Pathway,Shorestest Pathway,Shortest Pathway,outputVector +NetworkGT:Simplify Network,Simplified,Simplified Network,outputVector +NetworkGT:Snap Nodes,Snap I Nodes,Snapped Nodes,outputVector +NetworkGT:Theoretical Blocks,Output,Output,outputVector +NetworkGT:Thresholding,Output Raster,Output Raster,outputRaster +NetworkGT:Topology Parameters,Topology Parameters,Topology Parameters,outputVector +NetworkGT:Tortuosity,Tortuosity Line,Tortuosity,outputVector +NetworkGT:Trim and Extend,Output,Output,outputVector +Networks:GravityIndicators,Output,Output,outputFile +Networks:MintNetwork,MintNetworkFile,Mint network file,outputFile +Networks:MultimodalGravityIndicators,Output,Output,outputFile +Networks:auto_connectors,CONNECTEURS,Connectors file,outputVector +Networks:build_connectors,CONNECTEURS,Connectors file,outputVector +Networks:build_graph,NOEUDS,Nodes layer,outputVector +Networks:concatenate_network_files,DESTINATION,Global network,outputFile +Networks:concatenate_networks_folder,DESTINATION,Global network,outputFile +Networks:create_update_links,OUTPUT,Result network,outputVector +Networks:get_link_flows_data,OUTPUT,Flows layer,outputVector +Networks:gtfs_import,REP_SORTIE,Ouput folder,outputFolder +Networks:import_gtfs_v2,OUTPUT,Mint network layer,outputVector +Networks:indicators_by_OD,FICHIER_RESULTAT,OD indicator file,outputFile +Networks:indicators_by_link,FICHIER_RESULTAT,Link indicators file,outputFile +Networks:indicators_by_link_and_day,FICHIER_RESULTAT,Link indicators file,outputFile +Networks:indicators_by_link_multiple_points,FICHIER_RESULTAT,Link indicators file,outputFile +Networks:indicators_by_node,FICHIER_RESULTAT,Nodes indicators file,outputFile +Networks:indicators_by_node_and_day,FICHIER_RESULTAT,Nodes indicators file,outputFile +Networks:indicators_by_node_customized,FICHIER_RESULTAT,Nodes indicators file,outputFile +Networks:indicators_by_path,FICHIER_RESULTAT,Path indicators file,outputFile +Networks:isolated_nodes,NOEUDS_UTILES,Connected nodes,outputVector +Networks:isovalues_polygons,CONTOURS,Isovalue polygons,outputVector +Networks:linear_interpolation,RESULTAT,Raster file,outputRaster +Networks:mint_calculation,SORTIE,Output,outputFile +Networks:mint_parameters,output,Mint parameters file,outputFile +Networks:musliw_calculation,SORTIE,Output,outputFile +Networks:musliw_individual_network,OUTPUT,Musliw network,outputFile +Networks:musliw_matrix_double_list,SORTIE,Musliw matrix,outputFile +Networks:musliw_matrix_simple_list,SORTIE,Musliw matrix,outputFile +Networks:musliw_matrix_table,SORTIE,Musliw matrix,outputFile +Networks:musliw_parameters,SORTIE,Parameters file,outputFile +Networks:musliw_simple_matrix,OUTPUT,Musliw matrix,outputFile +Networks:musliw_timetable_network,OUTPUT,Musliw timetable network,outputFile +Networks:path_analysis,OUTPUT,Output,outputVector +Networks:preparegtfs,REP_RESULTAT,GTFS output folder,outputFolder +Networks:reverse,RESULTAT,Reverted network,outputVector +Networks:routes,OUTPUT,Output,outputVector +Networks:spatialaggregation,RESULT,Output,outputVector +Networks:ti_arcs,OUTPUT,Output layer,outputVector +Networks:variable_buffer_polygons,POLYGONES,Variable buffer polygons,outputVector +Valhalla:directions_from_point_layer_auto,OUTPUT,Routing Auto From Point,outputVector +Valhalla:directions_from_point_layer_bicycle,OUTPUT,Routing Bicycle From Point,outputVector +Valhalla:directions_from_point_layer_pedestrian,OUTPUT,Routing Pedestrian From Point,outputVector +Valhalla:directions_from_point_layer_truck,OUTPUT,Routing Truck From Point,outputVector +Valhalla:directions_from_points_2_layers_auto,OUTPUT,Routing Auto From 2 Points,outputVector +Valhalla:directions_from_points_2_layers_bicycle,OUTPUT,Routing Bicycle From 2 Points,outputVector +Valhalla:directions_from_points_2_layers_pedestrian,OUTPUT,Routing Pedestrian From 2 Points,outputVector +Valhalla:directions_from_points_2_layers_truck,OUTPUT,Routing Truck From 2 Points,outputVector +Valhalla:directions_from_polylines_auto,OUTPUT,Routing Auto From LineString,outputVector +Valhalla:directions_from_polylines_bicycle,OUTPUT,Routing Bicycle From LineString,outputVector +Valhalla:directions_from_polylines_pedestrian,OUTPUT,Routing Pedestrian From LineString,outputVector +Valhalla:directions_from_polylines_truck,OUTPUT,Routing Truck From LineString,outputVector +Valhalla:isochrones_auto,OUTPUT_DISTANCE,Isodistances auto,outputVector +Valhalla:isochrones_auto,OUTPUT_INPUT_POINTS,,outputVector +Valhalla:isochrones_auto,OUTPUT_SNAPPED_POINTS,,outputVector +Valhalla:isochrones_auto,OUTPUT_TIME,Isochrones auto,outputVector +Valhalla:isochrones_bicycle,OUTPUT_DISTANCE,Isodistances bicycle,outputVector +Valhalla:isochrones_bicycle,OUTPUT_INPUT_POINTS,,outputVector +Valhalla:isochrones_bicycle,OUTPUT_SNAPPED_POINTS,,outputVector +Valhalla:isochrones_bicycle,OUTPUT_TIME,Isochrones bicycle,outputVector +Valhalla:isochrones_pedestrian,OUTPUT_DISTANCE,Isodistances pedestrian,outputVector +Valhalla:isochrones_pedestrian,OUTPUT_INPUT_POINTS,,outputVector +Valhalla:isochrones_pedestrian,OUTPUT_SNAPPED_POINTS,,outputVector +Valhalla:isochrones_pedestrian,OUTPUT_TIME,Isochrones pedestrian,outputVector +Valhalla:isochrones_truck,OUTPUT_DISTANCE,Isodistances truck,outputVector +Valhalla:isochrones_truck,OUTPUT_INPUT_POINTS,,outputVector +Valhalla:isochrones_truck,OUTPUT_SNAPPED_POINTS,,outputVector +Valhalla:isochrones_truck,OUTPUT_TIME,Isochrones truck,outputVector +Valhalla:matrix_auto,OUTPUT,Matrix Auto,outputVector +Valhalla:matrix_bicycle,OUTPUT,Matrix Bicycle,outputVector +Valhalla:matrix_pedestrian,OUTPUT,Matrix Pedestrian,outputVector +Valhalla:matrix_truck,OUTPUT,Matrix Truck,outputVector +cartographytools:averagelines,OUTPUT,Output layer,outputVector +cartographytools:collapsedualcarriageway,OUTPUT,Output layer,outputVector +cartographytools:removecrossroads,OUTPUT,Output layer,outputVector +cartographytools:removeculdesacs,OUTPUT,Output layer,outputVector +cartographytools:removeroundabouts,OUTPUT,Output layer,outputVector gdal:aspect,OUTPUT,Aspect,outputRaster gdal:assignprojection,OUTPUT,Layer with projection,outputRaster gdal:buffervectors,OUTPUT,Buffer,outputVector gdal:buildvirtualraster,OUTPUT,Virtual,outputRaster gdal:buildvirtualvector,OUTPUT,Virtual vector,outputVector gdal:buildvirtualvector,VRT_STRING,Virtual string,outputString -gdal:cliprasterbyextent,OUTPUT,Clipped ,outputRaster -gdal:cliprasterbymasklayer,OUTPUT,Clipped ,outputRaster -gdal:clipvectorbyextent,OUTPUT,Clipped ,outputVector -gdal:clipvectorbypolygon,OUTPUT,Clipped ,outputVector +gdal:cliprasterbyextent,OUTPUT,Clipped (extent),outputRaster +gdal:cliprasterbymasklayer,OUTPUT,Clipped (mask),outputRaster +gdal:clipvectorbyextent,OUTPUT,Clipped (extent),outputVector +gdal:clipvectorbypolygon,OUTPUT,Clipped (mask),outputVector gdal:colorrelief,OUTPUT,Color relief,outputRaster gdal:contour,OUTPUT,Contours,outputVector gdal:contour_polygon,OUTPUT,Contours,outputVector gdal:convertformat,OUTPUT,Converted,outputVector gdal:dissolve,OUTPUT,Dissolved,outputVector gdal:executesql,OUTPUT,SQL result,outputVector -gdal:extractprojection,WORLD_FILE,World file,outputFile gdal:extractprojection,PRJ_FILE,ESRI Shapefile prj file,outputFile +gdal:extractprojection,WORLD_FILE,World file,outputFile gdal:fillnodata,OUTPUT,Filled,outputRaster gdal:gdal2tiles,OUTPUT,Output directory,outputFolder gdal:gdal2xyz,OUTPUT,XYZ ASCII file,outputFile gdal:gdalinfo,OUTPUT,Layer information,outputHtml -gdal:gridaverage,OUTPUT,Interpolated ,outputRaster -gdal:griddatametrics,OUTPUT,Interpolated ,outputRaster -gdal:gridinversedistance,OUTPUT,Interpolated ,outputRaster -gdal:gridinversedistancenearestneighbor,OUTPUT,Interpolated ,outputRaster -gdal:gridlinear,OUTPUT,Interpolated ,outputRaster -gdal:gridnearestneighbor,OUTPUT,Interpolated ,outputRaster +gdal:gridaverage,OUTPUT,Interpolated (moving average),outputRaster +gdal:griddatametrics,OUTPUT,Interpolated (data metrics),outputRaster +gdal:gridinversedistance,OUTPUT,Interpolated (IDW),outputRaster +gdal:gridinversedistancenearestneighbor,OUTPUT,Interpolated (IDW with NN search),outputRaster +gdal:gridlinear,OUTPUT,Interpolated (Linear),outputRaster +gdal:gridnearestneighbor,OUTPUT,Interpolated (Nearest neighbor),outputRaster gdal:hillshade,OUTPUT,Hillshade,outputRaster -gdal:importvectorintopostgisdatabaseavailableconnections,NA,NA,NA -gdal:importvectorintopostgisdatabasenewconnection,NA,NA,NA gdal:merge,OUTPUT,Merged,outputRaster gdal:nearblack,OUTPUT,Nearblack,outputRaster gdal:offsetcurve,OUTPUT,Offset curve,outputVector gdal:ogrinfo,OUTPUT,Layer information,outputHtml -gdal:onesidebuffer,OUTPUT,One,outputVector +gdal:onesidebuffer,OUTPUT,One-sided buffer,outputVector gdal:overviews,OUTPUT,Pyramidized,outputRaster gdal:pansharp,OUTPUT,Output,outputRaster gdal:pcttorgb,OUTPUT,PCT to RGB,outputRaster @@ -48,7 +152,7 @@ gdal:rasterize_over,OUTPUT,Rasterized,outputRaster gdal:rasterize_over_fixed_value,OUTPUT,Rasterized,outputRaster gdal:rearrange_bands,OUTPUT,Converted,outputRaster gdal:retile,OUTPUT,Output directory,outputFolder -gdal:retile,OUTPUT_CSV,CSV file containing the tile,outputFile +gdal:retile,OUTPUT_CSV,CSV file containing the tile(s) georeferencing information,outputFile gdal:rgbtopct,OUTPUT,RGB to PCT,outputRaster gdal:roughness,OUTPUT,Roughness,outputRaster gdal:sieve,OUTPUT,Sieved,outputRaster @@ -59,16 +163,17 @@ gdal:translate,OUTPUT,Converted,outputRaster gdal:triterrainruggednessindex,OUTPUT,Terrain Ruggedness Index,outputRaster gdal:viewshed,OUTPUT,Output,outputRaster gdal:warpreproject,OUTPUT,Reprojected,outputRaster +grass7:g.extension.list,html,List of addons,outputHtml grass7:i.albedo,output,Albedo,outputRaster grass7:i.aster.toar,output,Output Directory,outputFolder grass7:i.atcorr,output,Atmospheric correction,outputRaster grass7:i.biomass,output,Biomass,outputRaster grass7:i.cca,output,Output Directory,outputFolder -grass7:i.cluster,signaturefile,Signature File,outputFile grass7:i.cluster,reportfile,Final Report File,outputFile -grass7:i.colors.enhance,redoutput,Enhanced Red,outputRaster -grass7:i.colors.enhance,greenoutput,Enhanced Green,outputRaster +grass7:i.cluster,signaturefile,Signature File,outputFile grass7:i.colors.enhance,blueoutput,Enhanced Blue,outputRaster +grass7:i.colors.enhance,greenoutput,Enhanced Green,outputRaster +grass7:i.colors.enhance,redoutput,Enhanced Red,outputRaster grass7:i.eb.eta,output,Evapotranspiration,outputRaster grass7:i.eb.evapfr,evaporativefraction,Evaporative Fraction,outputRaster grass7:i.eb.evapfr,soilmoisture,Root Zone Soil Moisture,outputRaster @@ -80,14 +185,14 @@ grass7:i.evapo.mh,output,Evapotranspiration,outputRaster grass7:i.evapo.pm,output,Evapotranspiration,outputRaster grass7:i.evapo.pt,output,Evapotranspiration,outputRaster grass7:i.evapo.time,output,Temporal integration,outputRaster -grass7:i.fft,real,Real part arrays,outputRaster grass7:i.fft,imaginary,Imaginary part arrays,outputRaster +grass7:i.fft,real,Real part arrays,outputRaster grass7:i.gensig,signaturefile,Signature File,outputFile grass7:i.gensigset,signaturefile,Signature File,outputFile grass7:i.group,group,Multiband raster,outputRaster -grass7:i.his.rgb,red,Red,outputRaster -grass7:i.his.rgb,green,Green,outputRaster grass7:i.his.rgb,blue,Blue,outputRaster +grass7:i.his.rgb,green,Green,outputRaster +grass7:i.his.rgb,red,Red,outputRaster grass7:i.ifft,output,Inverse Fast Fourier Transform,outputRaster grass7:i.image.mosaic,output,Mosaic Raster,outputRaster grass7:i.in.spotvgt,output,SPOT NDVI Raster,outputRaster @@ -97,29 +202,28 @@ grass7:i.maxlik,output,Classification,outputRaster grass7:i.maxlik,reject,Reject Threshold,outputRaster grass7:i.modis.qc,output,QC Classification,outputRaster grass7:i.oif,output,OIF File,outputFile -grass7:i.pansharpen,redoutput,Enhanced Red,outputRaster -grass7:i.pansharpen,greenoutput,Enhanced Green,outputRaster grass7:i.pansharpen,blueoutput,Enhanced Blue,outputRaster +grass7:i.pansharpen,greenoutput,Enhanced Green,outputRaster +grass7:i.pansharpen,redoutput,Enhanced Red,outputRaster grass7:i.pca,output,Output Directory,outputFolder grass7:i.rgb.his,hue,Hue,outputRaster grass7:i.rgb.his,intensity,Intensity,outputRaster grass7:i.rgb.his,saturation,Saturation,outputRaster -grass7:i.segment,output,Segmented Raster,outputRaster grass7:i.segment,goodness,Goodness Raster,outputRaster -grass7:i.smap,output,Classification,outputRaster +grass7:i.segment,output,Segmented Raster,outputRaster grass7:i.smap,goodness,Goodness_of_fit,outputRaster +grass7:i.smap,output,Classification,outputRaster grass7:i.tasscap,output,Output Directory,outputFolder grass7:i.topo.coor.ill,output,Illumination Model,outputRaster grass7:i.topo.corr,output,Output Directory,outputFolder grass7:i.vi,output,Vegetation Index,outputRaster grass7:i.zc,output,Zero crossing,outputRaster grass7:m.cogo,output,Output text file,outputFile -grass7:nviz,NA,NA,NA grass7:r.basins.fill,output,Watersheds,outputRaster grass7:r.blend.combine,output,Blended,outputRaster -grass7:r.blend.rgb,output_red,Blended Red,outputRaster -grass7:r.blend.rgb,output_green,Blended Green,outputRaster grass7:r.blend.rgb,output_blue,Blended Blue,outputRaster +grass7:r.blend.rgb,output_green,Blended Green,outputRaster +grass7:r.blend.rgb,output_red,Blended Red,outputRaster grass7:r.buffer,output,Buffer,outputRaster grass7:r.buffer.lowmem,output,Buffer,outputRaster grass7:r.carve,output,Modified elevation,outputRaster @@ -134,35 +238,35 @@ grass7:r.colors.out,rules,Color Table,outputFile grass7:r.colors.stddev,output,Stddev Colors,outputRaster grass7:r.composite,output,Composite,outputRaster grass7:r.contour,output,Contours,outputVector -grass7:r.cost,output,Cumulative cost,outputRaster grass7:r.cost,nearest,Cost allocation map,outputRaster grass7:r.cost,outdir,Movement directions,outputRaster +grass7:r.cost,output,Cumulative cost,outputRaster grass7:r.covar,html,Covariance report,outputHtml grass7:r.cross,output,Cross product,outputRaster grass7:r.describe,html,Categories,outputHtml grass7:r.distance,html,Distance,outputHtml -grass7:r.drain,output,Least cost path,outputRaster grass7:r.drain,drain,Drain,outputVector -grass7:r.fill.dir,output,Depressionless DEM,outputRaster -grass7:r.fill.dir,direction,Flow direction,outputRaster +grass7:r.drain,output,Least cost path,outputRaster grass7:r.fill.dir,areas,Problem areas,outputRaster +grass7:r.fill.dir,direction,Flow direction,outputRaster +grass7:r.fill.dir,output,Depressionless DEM,outputRaster grass7:r.fill.stats,output,Output Map,outputRaster grass7:r.fill.stats,uncertainty,Uncertainty Map,outputRaster grass7:r.fillnulls,output,Filled,outputRaster -grass7:r.flow,flowline,Flow line,outputVector -grass7:r.flow,flowlength,Flow path length,outputRaster grass7:r.flow,flowaccumulation,Flow accumulation,outputRaster +grass7:r.flow,flowlength,Flow path length,outputRaster +grass7:r.flow,flowline,Flow line,outputVector grass7:r.geomorphon,forms,Most common geomorphic forms,outputRaster grass7:r.grow,output,Expanded,outputRaster grass7:r.grow.distance,distance,Distance,outputRaster grass7:r.grow.distance,value,Value of nearest cell,outputRaster +grass7:r.gwflow,budget,Groundwater budget for each cell [m^3/s],outputRaster grass7:r.gwflow,output,Groundwater flow,outputRaster -grass7:r.gwflow,vx,Groundwater filter velocity vector part in x direction ,outputRaster -grass7:r.gwflow,vy,Groundwater filter velocity vector part in y direction ,outputRaster -grass7:r.gwflow,budget,Groundwater budget for each cell ,outputRaster -grass7:r.his,red,Red,outputRaster -grass7:r.his,green,Green,outputRaster +grass7:r.gwflow,vx,Groundwater filter velocity vector part in x direction [m/s],outputRaster +grass7:r.gwflow,vy,Groundwater filter velocity vector part in y direction [m/s],outputRaster grass7:r.his,blue,Blue,outputRaster +grass7:r.his,green,Green,outputRaster +grass7:r.his,red,Red,outputRaster grass7:r.horizon,output,Folder to get horizon rasters,outputFolder grass7:r.horizon.height,html,Horizon,outputHtml grass7:r.in.lidar,output,Lidar Raster,outputRaster @@ -215,7 +319,7 @@ grass7:r.out.gridatb,output,GRIDATB,outputFile grass7:r.out.mat,output,MAT File,outputFile grass7:r.out.mpeg,output,MPEG file,outputFile grass7:r.out.png,output,PNG File,outputFile -grass7:r.out.pov,output,Name of output povray file ,outputFile +grass7:r.out.pov,output,Name of output povray file (TGA height field file),outputFile grass7:r.out.ppm,output,PPM,outputFile grass7:r.out.ppm3,output,Name for new PPM file,outputFile grass7:r.out.vrml,output,VRML,outputFile @@ -223,11 +327,16 @@ grass7:r.out.vtk,output,VTK File,outputFile grass7:r.out.xyz,output,XYZ File,outputFile grass7:r.param.scale,output,Morphometric parameter,outputRaster grass7:r.patch,output,Patched,outputRaster +grass7:r.path,raster_path,Name for output raster path map,outputRaster +grass7:r.path,vector_path,Name for output vector path map,outputVector +grass7:r.path.coordinate.txt,raster_path,Name for output raster path map,outputRaster +grass7:r.path.coordinate.txt,vector_path,Name for output vector path map,outputVector grass7:r.plane,output,Plane,outputRaster grass7:r.profile,output,Profile,outputFile grass7:r.proj,output,Reprojected raster,outputRaster -grass7:r.quant,output,Quantized raster,outputFolder +grass7:r.quant,output,Quantized raster(s),outputFolder grass7:r.quantile,file,Quantiles,outputHtml +grass7:r.quantile.plain,file,Quantiles,outputFile grass7:r.random,raster,Random raster,outputRaster grass7:r.random,vector,Random vector,outputVector grass7:r.random.cells,output,Random,outputRaster @@ -236,61 +345,61 @@ grass7:r.reclass,output,Reclassified,outputRaster grass7:r.reclass.area,output,Reclassified,outputRaster grass7:r.recode,output,Recoded,outputRaster grass7:r.regression.line,html,Regression coefficients,outputHtml -grass7:r.regression.multi,residuals,Residual Map,outputRaster grass7:r.regression.multi,estimates,Estimates Map,outputRaster grass7:r.regression.multi,html,Regression coefficients,outputHtml +grass7:r.regression.multi,residuals,Residual Map,outputRaster grass7:r.relief,output,Output shaded relief layer,outputRaster grass7:r.relief.scaling,output,Output shaded relief layer,outputRaster grass7:r.report,output,Name for output file to hold the report,outputFile -grass7:r.resamp.bspline,output,Resampled BSpline,outputRaster grass7:r.resamp.bspline,grid,Interpolation Grid,outputVector +grass7:r.resamp.bspline,output,Resampled BSpline,outputRaster grass7:r.resamp.filter,output,Resampled Filter,outputRaster grass7:r.resamp.interp,output,Resampled interpolated,outputRaster -grass7:r.resamp.rst,elevation,Resampled RST,outputRaster -grass7:r.resamp.rst,slope,Slope raster,outputRaster grass7:r.resamp.rst,aspect,Aspect raster,outputRaster +grass7:r.resamp.rst,elevation,Resampled RST,outputRaster +grass7:r.resamp.rst,mcurvature,Mean curvature raster,outputRaster grass7:r.resamp.rst,pcurvature,Profile curvature raster,outputRaster +grass7:r.resamp.rst,slope,Slope raster,outputRaster grass7:r.resamp.rst,tcurvature,Tangential curvature raster,outputRaster -grass7:r.resamp.rst,mcurvature,Mean curvature raster,outputRaster grass7:r.resamp.stats,output,Resampled aggregated,outputRaster grass7:r.resample,output,Resampled NN,outputRaster grass7:r.rescale,output,Rescaled,outputRaster grass7:r.rescale.eq,output,Rescaled equalized,outputRaster -grass7:r.rgb,red,Red,outputRaster -grass7:r.rgb,green,Green,outputRaster grass7:r.rgb,blue,Blue,outputRaster +grass7:r.rgb,green,Green,outputRaster +grass7:r.rgb,red,Red,outputRaster grass7:r.ros,base_ros,Base ROS,outputRaster -grass7:r.ros,max_ros,Max ROS,outputRaster grass7:r.ros,direction_ros,Direction ROS,outputRaster +grass7:r.ros,max_ros,Max ROS,outputRaster grass7:r.ros,spotting_distance,Spotting Distance,outputRaster grass7:r.series,output,Aggregated,outputRaster grass7:r.series.accumulate,output,Accumulated,outputRaster grass7:r.series.interp,output_dir,Interpolated rasters,outputFolder grass7:r.shade,output,Shaded,outputRaster -grass7:r.sim.sediment,transport_capacity,Transport capacity ,outputRaster -grass7:r.sim.sediment,tlimit_erosion_deposition,Transport limited erosion,outputRaster -grass7:r.sim.sediment,sediment_concentration,Sediment concentration ,outputRaster -grass7:r.sim.sediment,sediment_flux,Sediment flux ,outputRaster -grass7:r.sim.sediment,erosion_deposition,Erosion,outputRaster -grass7:r.sim.sediment,walkers_output,Name of the output walkers vector points layer,outputVector +grass7:r.sim.sediment,erosion_deposition,Erosion-deposition [kg/m2s],outputRaster grass7:r.sim.sediment,logfile,Name for sampling points output text file.,outputFile -grass7:r.sim.water,depth,Water depth ,outputRaster -grass7:r.sim.water,discharge,Water discharge ,outputRaster -grass7:r.sim.water,error,Simulation error ,outputRaster -grass7:r.sim.water,walkers_output,Name of the output walkers vector points layer,outputVector +grass7:r.sim.sediment,sediment_concentration,Sediment concentration [particle/m3],outputRaster +grass7:r.sim.sediment,sediment_flux,Sediment flux [kg/ms],outputRaster +grass7:r.sim.sediment,tlimit_erosion_deposition,Transport limited erosion-deposition [kg/m2s],outputRaster +grass7:r.sim.sediment,transport_capacity,Transport capacity [kg/ms],outputRaster +grass7:r.sim.sediment,walkers_output,Name of the output walkers vector points layer,outputVector +grass7:r.sim.water,depth,Water depth [m],outputRaster +grass7:r.sim.water,discharge,Water discharge [m3/s],outputRaster +grass7:r.sim.water,error,Simulation error [m],outputRaster grass7:r.sim.water,logfile,Name for sampling points output text file.,outputFile -grass7:r.slope.aspect,slope,Slope,outputRaster +grass7:r.sim.water,walkers_output,Name of the output walkers vector points layer,outputVector grass7:r.slope.aspect,aspect,Aspect,outputRaster -grass7:r.slope.aspect,pcurvature,Profile curvature,outputRaster -grass7:r.slope.aspect,tcurvature,Tangential curvature,outputRaster -grass7:r.slope.aspect,dx,First order partial derivative dx ,outputRaster -grass7:r.slope.aspect,dy,First order partial derivative dy ,outputRaster +grass7:r.slope.aspect,dx,First order partial derivative dx (E-W slope),outputRaster grass7:r.slope.aspect,dxx,Second order partial derivative dxx,outputRaster -grass7:r.slope.aspect,dyy,Second order partial derivative dyy,outputRaster grass7:r.slope.aspect,dxy,Second order partial derivative dxy,outputRaster +grass7:r.slope.aspect,dy,First order partial derivative dy (N-S slope),outputRaster +grass7:r.slope.aspect,dyy,Second order partial derivative dyy,outputRaster +grass7:r.slope.aspect,pcurvature,Profile curvature,outputRaster +grass7:r.slope.aspect,slope,Slope,outputRaster +grass7:r.slope.aspect,tcurvature,Tangential curvature,outputRaster grass7:r.solute.transport,output,Solute Transport,outputRaster -grass7:r.solute.transport,vx,Calculate and store the groundwater filter velocity vector part in x direction ,outputRaster -grass7:r.solute.transport,vy,Calculate and store the groundwater filter velocity vector part in y direction ,outputRaster +grass7:r.solute.transport,vx,Calculate and store the groundwater filter velocity vector part in x direction [m/s],outputRaster +grass7:r.solute.transport,vy,Calculate and store the groundwater filter velocity vector part in y direction [m/s],outputRaster grass7:r.spread,output,Spread Time,outputRaster grass7:r.spread,x_output,X Back Coordinates,outputRaster grass7:r.spread,y_output,Y Back Coordinates,outputRaster @@ -300,21 +409,21 @@ grass7:r.stats,html,Statistics,outputHtml grass7:r.stats.quantile.out,file,Statistics File,outputFile grass7:r.stats.quantile.rast,output,Output Directory,outputFolder grass7:r.stats.zonal,output,Resultant raster,outputRaster -grass7:r.stream.extract,stream_raster,Unique stream ids ,outputRaster -grass7:r.stream.extract,stream_vector,Unique stream ids ,outputVector grass7:r.stream.extract,direction,Flow direction,outputRaster +grass7:r.stream.extract,stream_raster,Unique stream ids (rast),outputRaster +grass7:r.stream.extract,stream_vector,Unique stream ids (vect),outputVector +grass7:r.sun.incidout,beam_rad,Beam irradiance [W.m-2],outputRaster +grass7:r.sun.incidout,diff_rad,Diffuse irradiance [W.m-2],outputRaster +grass7:r.sun.incidout,glob_rad,Global (total) irradiance/irradiation [W.m-2],outputRaster grass7:r.sun.incidout,incidout,incidence angle raster map,outputRaster -grass7:r.sun.incidout,beam_rad,Beam irradiance ,outputRaster -grass7:r.sun.incidout,diff_rad,Diffuse irradiance ,outputRaster -grass7:r.sun.incidout,refl_rad,Ground reflected irradiance ,outputRaster -grass7:r.sun.incidout,glob_rad,Global ,outputRaster -grass7:r.sun.insoltime,insol_time,Insolation time ,outputRaster -grass7:r.sun.insoltime,beam_rad,Irradiation raster map ,outputRaster -grass7:r.sun.insoltime,diff_rad,Irradiation raster map ,outputRaster -grass7:r.sun.insoltime,refl_rad,Irradiation raster map ,outputRaster -grass7:r.sun.insoltime,glob_rad,Irradiance,outputRaster -grass7:r.sunhours,elevation,Solar Elevation Angle,outputRaster +grass7:r.sun.incidout,refl_rad,Ground reflected irradiance [W.m-2],outputRaster +grass7:r.sun.insoltime,beam_rad,Irradiation raster map [Wh.m-2.day-1],outputRaster +grass7:r.sun.insoltime,diff_rad,Irradiation raster map [Wh.m-2.day-1],outputRaster +grass7:r.sun.insoltime,glob_rad,Irradiance/irradiation raster map [Wh.m-2.day-1],outputRaster +grass7:r.sun.insoltime,insol_time,Insolation time [h] ,outputRaster +grass7:r.sun.insoltime,refl_rad,Irradiation raster map [Wh.m-2.day-1],outputRaster grass7:r.sunhours,azimuth,Solar Azimuth Angle,outputRaster +grass7:r.sunhours,elevation,Solar Elevation Angle,outputRaster grass7:r.sunhours,sunhour,Sunshine Hours,outputRaster grass7:r.sunmask.datetime,output,Shadows,outputRaster grass7:r.sunmask.position,output,Shadows,outputRaster @@ -324,12 +433,12 @@ grass7:r.surf.fractal,output,Fractal Surface,outputRaster grass7:r.surf.gauss,output,Gaussian deviates,outputRaster grass7:r.surf.idw,output,Interpolated IDW,outputRaster grass7:r.surf.random,output,Random,outputRaster -grass7:r.terraflow,filled,Filled ,outputRaster -grass7:r.terraflow,direction,Flow direction,outputRaster -grass7:r.terraflow,swatershed,Sink,outputRaster grass7:r.terraflow,accumulation,Flow accumulation,outputRaster -grass7:r.terraflow,tci,Topographic convergence index ,outputRaster +grass7:r.terraflow,direction,Flow direction,outputRaster +grass7:r.terraflow,filled,Filled (flooded) elevation,outputRaster grass7:r.terraflow,stats,Runtime statistics,outputFile +grass7:r.terraflow,swatershed,Sink-watershed,outputRaster +grass7:r.terraflow,tci,Topographic convergence index (tci),outputRaster grass7:r.texture,output,Texture files directory,outputFolder grass7:r.thin,output,Thinned,outputRaster grass7:r.tile,output,Tiles Directory,outputFolder @@ -344,22 +453,22 @@ grass7:r.uslek,output,USLE R Raster,outputRaster grass7:r.usler,output,USLE R Raster,outputRaster grass7:r.viewshed,output,Intervisibility,outputRaster grass7:r.volume,centroids,Centroids,outputVector -grass7:r.walk.coords,output,Cumulative cost,outputRaster grass7:r.walk.coords,outdir,Movement Directions,outputRaster -grass7:r.walk.points,output,Cumulative cost,outputRaster +grass7:r.walk.coords,output,Cumulative cost,outputRaster grass7:r.walk.points,outdir,Movement Directions,outputRaster -grass7:r.walk.rast,output,Cumulative cost,outputRaster +grass7:r.walk.points,output,Cumulative cost,outputRaster grass7:r.walk.rast,outdir,Movement Directions,outputRaster +grass7:r.walk.rast,output,Cumulative cost,outputRaster grass7:r.water.outlet,output,Basin,outputRaster grass7:r.watershed,accumulation,Number of cells that drain through each cell,outputRaster -grass7:r.watershed,drainage,Drainage direction,outputRaster grass7:r.watershed,basin,Unique label for each watershed basin,outputRaster +grass7:r.watershed,drainage,Drainage direction,outputRaster +grass7:r.watershed,half_basin,Half-basins,outputRaster +grass7:r.watershed,length_slope,Slope length and steepness (LS) factor for USLE,outputRaster +grass7:r.watershed,slope_steepness,Slope steepness (S) factor for USLE,outputRaster +grass7:r.watershed,spi,Stream power index a * tan(b),outputRaster grass7:r.watershed,stream,Stream segments,outputRaster -grass7:r.watershed,half_basin,Half,outputRaster -grass7:r.watershed,length_slope,Slope length and steepness ,outputRaster -grass7:r.watershed,slope_steepness,Slope steepness ,outputRaster -grass7:r.watershed,tci,Topographic index ln,outputRaster -grass7:r.watershed,spi,Stream power index a ,outputRaster +grass7:r.watershed,tci,Topographic index ln(a / tan(b)),outputRaster grass7:r.what.color,html,Colors file,outputHtml grass7:r.what.coords,output,Raster Value File,outputFile grass7:r.what.points,output,Raster Values File,outputFile @@ -367,8 +476,8 @@ grass7:v.buffer,output,Buffer,outputVector grass7:v.build.check,error,Topological errors,outputVector grass7:v.build.polylines,output,Polylines,outputVector grass7:v.class,html,Classification,outputHtml -grass7:v.clean,output,Cleaned,outputVector grass7:v.clean,error,Errors,outputVector +grass7:v.clean,output,Cleaned,outputVector grass7:v.cluster,output,Clustered,outputVector grass7:v.db.select,file,Attributes,outputFile grass7:v.decimate,output,Output vector map,outputVector @@ -380,8 +489,8 @@ grass7:v.drape,output,3D vector,outputVector grass7:v.edit,output,Edited,outputVector grass7:v.extract,output,Selected,outputVector grass7:v.extrude,output,3D Vector,outputVector -grass7:v.generalize,output,Generalized,outputVector grass7:v.generalize,error,Errors,outputVector +grass7:v.generalize,output,Generalized,outputVector grass7:v.hull,output,Convex hull,outputVector grass7:v.in.ascii,output,ASCII,outputVector grass7:v.in.dxf,output,Converted,outputVector @@ -396,7 +505,7 @@ grass7:v.kcv,output,Partition,outputVector grass7:v.kernel.rast,output,Kernel,outputRaster grass7:v.kernel.vector,output,Kernel,outputVector grass7:v.lidar.correction,output,Classified,outputVector -grass7:v.lidar.correction,terrain,Only ,outputVector +grass7:v.lidar.correction,terrain,Only 'terrain' points,outputVector grass7:v.lidar.edgedetection,output,Edges,outputVector grass7:v.lidar.growing,output,Buildings,outputVector grass7:v.mkgrid,map,Grid,outputVector @@ -410,8 +519,8 @@ grass7:v.net.components,output,Network_Components_Line,outputVector grass7:v.net.components,output_point,Network_Components_Point,outputVector grass7:v.net.connectivity,output,Network_Connectivity,outputVector grass7:v.net.distance,output,Network_Distance,outputVector -grass7:v.net.flow,output,Network_Flow,outputVector grass7:v.net.flow,cut,Network_Cut,outputVector +grass7:v.net.flow,output,Network_Flow,outputVector grass7:v.net.iso,output,Network_Iso,outputVector grass7:v.net.nreport,output,NReport,outputHtml grass7:v.net.path,output,Network_Path,outputVector @@ -423,19 +532,18 @@ grass7:v.net.steiner,output,Network Steiner,outputVector grass7:v.net.timetable,output,Network Timetable,outputVector grass7:v.net.visibility,output,Network Visibility,outputVector grass7:v.normal,html,Normality,outputHtml -grass7:v.out.ascii,output,Name for output ASCII file or ASCII vector name if ,outputFile +grass7:v.out.ascii,output,Name for output ASCII file or ASCII vector name if '-o' is defined,outputFile grass7:v.out.dxf,output,DXF vector,outputFile -grass7:v.out.postgis,NA,NA,NA grass7:v.out.pov,output,POV vector,outputFile grass7:v.out.svg,output,SVG File,outputFile grass7:v.out.vtk,output,VTK File,outputFile -grass7:v.outlier,output,Layer without outliers,outputVector grass7:v.outlier,outlier,Outliers,outputVector +grass7:v.outlier,output,Layer without outliers,outputVector grass7:v.overlay,output,Overlay,outputVector grass7:v.pack,output,Packed archive,outputFile grass7:v.parallel,output,Parallel lines,outputVector -grass7:v.patch,output,Combined,outputVector grass7:v.patch,bbox,Bounding boxes,outputVector +grass7:v.patch,output,Combined,outputVector grass7:v.perturb,output,Perturbed,outputVector grass7:v.proj,output,Output vector map,outputVector grass7:v.qcount,output,Quadrats,outputVector @@ -452,15 +560,15 @@ grass7:v.split,output,Split by length,outputVector grass7:v.surf.bspline,output,Output vector,outputVector grass7:v.surf.bspline,raster_output,Interpolated spline,outputRaster grass7:v.surf.idw,output,Interpolated IDW,outputRaster -grass7:v.surf.rst,elevation,Interpolated RST,outputRaster -grass7:v.surf.rst,slope,Slope,outputRaster grass7:v.surf.rst,aspect,Aspect,outputRaster +grass7:v.surf.rst,deviations,Deviations,outputVector +grass7:v.surf.rst,elevation,Interpolated RST,outputRaster +grass7:v.surf.rst,mcurvature,Mean curvature,outputRaster +grass7:v.surf.rst,overwin,Overlapping Windows,outputVector grass7:v.surf.rst,pcurvature,Profile curvature,outputRaster +grass7:v.surf.rst,slope,Slope,outputRaster grass7:v.surf.rst,tcurvature,Tangential curvature,outputRaster -grass7:v.surf.rst,mcurvature,Mean curvature,outputRaster -grass7:v.surf.rst,deviations,Deviations,outputVector grass7:v.surf.rst,treeseg,Quadtree Segmentation,outputVector -grass7:v.surf.rst,overwin,Overlapping Windows,outputVector grass7:v.surf.rst.cvdev,cvdev,Cross Validation Errors,outputVector grass7:v.to.3d,output,3D,outputVector grass7:v.to.lines,output,Lines,outputVector @@ -474,6 +582,15 @@ grass7:v.voronoi,output,Voronoi,outputVector grass7:v.voronoi.skeleton,output,Voronoi,outputVector grass7:v.what.rast,output,Sampled,outputVector grass7:v.what.vect,output,Updated,outputVector +latlontools:ecef2lla,OutputLayer,Output pointZ layer,outputVector +latlontools:field2geom,OutputLayer,Output layer,outputVector +latlontools:geom2field,OutputLayer,Output layer,outputVector +latlontools:geom2wkt,OUTPUT,Output layer,outputVector +latlontools:lla2ecef,OutputLayer,Output layer,outputVector +latlontools:mgrs2point,OutputLayer,Output layer,outputVector +latlontools:pluscodes2point,OutputLayer,Output layer,outputVector +latlontools:point2mgrs,OutputLayer,Output layer,outputVector +latlontools:point2pluscodes,OutputLayer,Output layer,outputVector native:addautoincrementalfield,OUTPUT,Incremented,outputVector native:addfieldtoattributestable,OUTPUT,Added,outputVector native:adduniquevalueindexfield,OUTPUT,Layer with index field,outputVector @@ -481,39 +598,67 @@ native:adduniquevalueindexfield,SUMMARY_OUTPUT,Class summary,outputVector native:addxyfields,OUTPUT,Added fields,outputVector native:affinetransform,OUTPUT,Transformed,outputVector native:aggregate,OUTPUT,Aggregated,outputVector +native:alignrasters,OUTPUT_LAYERS,Aligned rasters,outputMultilayer +native:alignsingleraster,OUTPUT,Aligned raster,outputRaster native:angletonearest,OUTPUT,Aligned layer,outputVector native:antimeridiansplit,OUTPUT,Split,outputVector native:arrayoffsetlines,OUTPUT,Offset lines,outputVector native:arraytranslatedfeatures,OUTPUT,Translated,outputVector native:aspect,OUTPUT,Aspect,outputRaster native:assignprojection,OUTPUT,Assigned CRS,outputVector -native:atlaslayouttoimage,NA,NA,NA native:atlaslayouttopdf,OUTPUT,PDF file,outputFile +native:b3dmtogltf,OUTPUT,Output file,outputFile +native:batchnominatimgeocoder,OUTPUT,Geocoded,outputVector native:bookmarkstolayer,OUTPUT,Output,outputVector native:boundary,OUTPUT,Boundary,outputVector native:boundingboxes,OUTPUT,Bounds,outputVector native:buffer,OUTPUT,Buffered,outputVector native:bufferbym,OUTPUT,Buffered,outputVector +native:calculateexpression,OUTPUT,Value,outputVariant native:calculatevectoroverlaps,OUTPUT,Overlap,outputVector -native:cellstatistics,OUTPUT,Output layer,outputRaster -native:cellstatistics,EXTENT,Extent,outputString +native:cellstackpercentile,CRS_AUTHID,CRS authority identifier,outputString +native:cellstackpercentile,EXTENT,Extent,outputString +native:cellstackpercentile,HEIGHT_IN_PIXELS,Height in pixels,outputNumber +native:cellstackpercentile,OUTPUT,Output layer,outputRaster +native:cellstackpercentile,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:cellstackpercentile,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:cellstackpercentrankfromrasterlayer,CRS_AUTHID,CRS authority identifier,outputString +native:cellstackpercentrankfromrasterlayer,EXTENT,Extent,outputString +native:cellstackpercentrankfromrasterlayer,HEIGHT_IN_PIXELS,Height in pixels,outputNumber +native:cellstackpercentrankfromrasterlayer,OUTPUT,Output layer,outputRaster +native:cellstackpercentrankfromrasterlayer,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:cellstackpercentrankfromrasterlayer,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:cellstackpercentrankfromvalue,CRS_AUTHID,CRS authority identifier,outputString +native:cellstackpercentrankfromvalue,EXTENT,Extent,outputString +native:cellstackpercentrankfromvalue,HEIGHT_IN_PIXELS,Height in pixels,outputNumber +native:cellstackpercentrankfromvalue,OUTPUT,Output layer,outputRaster +native:cellstackpercentrankfromvalue,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:cellstackpercentrankfromvalue,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:cellstatistics,CRS_AUTHID,CRS authority identifier,outputString -native:cellstatistics,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:cellstatistics,EXTENT,Extent,outputString native:cellstatistics,HEIGHT_IN_PIXELS,Height in pixels,outputNumber +native:cellstatistics,OUTPUT,Output layer,outputRaster native:cellstatistics,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:cellstatistics,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:centroids,OUTPUT,Centroids,outputVector native:clip,OUTPUT,Clipped,outputVector native:collect,OUTPUT,Collected,outputVector +native:combinestyles,COLORRAMPS,Color ramp count,outputNumber +native:combinestyles,LABELSETTINGS,Label settings count,outputNumber native:combinestyles,OUTPUT,Output style database,outputFile native:combinestyles,SYMBOLS,Symbol count,outputNumber -native:combinestyles,COLORRAMPS,Color ramp count,outputNumber native:combinestyles,TEXTFORMATS,Text format count,outputNumber -native:combinestyles,LABELSETTINGS,Label settings count,outputNumber +native:concavehull,OUTPUT,Concave hull,outputVector +native:convertgpsdata,OUTPUT,Output,outputFile +native:convertgpsdata,OUTPUT_LAYER,Output layer,outputVector +native:convertgpxfeaturetype,OUTPUT,Output,outputFile +native:convertgpxfeaturetype,OUTPUT_LAYER,Output layer,outputVector native:converttocurves,OUTPUT,Curves,outputVector native:convexhull,OUTPUT,Convex hulls,outputVector native:countpointsinpolygon,OUTPUT,Count,outputVector native:createattributeindex,OUTPUT,Indexed layer,outputVector native:createconstantrasterlayer,OUTPUT,Constant,outputRaster +native:createdirectory,OUTPUT,Directory,outputFolder native:creategrid,OUTPUT,Grid,outputVector native:createpointslayerfromtable,OUTPUT,Points from table,outputVector native:createrandombinomialrasterlayer,OUTPUT,Output raster,outputRaster @@ -525,158 +670,199 @@ native:createrandomnormalrasterlayer,OUTPUT,Output raster,outputRaster native:createrandompoissonrasterlayer,OUTPUT,Output raster,outputRaster native:createrandomuniformrasterlayer,OUTPUT,Output raster,outputRaster native:createspatialindex,OUTPUT,Indexed layer,outputVector -native:dbscanclustering,OUTPUT,Clusters,outputVector native:dbscanclustering,NUM_CLUSTERS,Number of clusters,outputNumber +native:dbscanclustering,OUTPUT,Clusters,outputVector +native:delaunaytriangulation,OUTPUT,Delaunay triangulation,outputVector +native:deletecolumn,OUTPUT,Remaining fields,outputVector +native:deleteduplicategeometries,DUPLICATE_COUNT,Count of discarded duplicate records,outputNumber native:deleteduplicategeometries,OUTPUT,Cleaned,outputVector native:deleteduplicategeometries,RETAINED_COUNT,Count of retained records,outputNumber -native:deleteduplicategeometries,DUPLICATE_COUNT,Count of discarded duplicate records,outputNumber native:deleteholes,OUTPUT,Cleaned,outputVector native:densifygeometries,OUTPUT,Densified,outputVector native:densifygeometriesgivenaninterval,OUTPUT,Densified,outputVector -native:detectvectorchanges,UNCHANGED,Unchanged features,outputVector native:detectvectorchanges,ADDED,Added features,outputVector -native:detectvectorchanges,DELETED,Deleted features,outputVector -native:detectvectorchanges,UNCHANGED_COUNT,Count of unchanged features,outputNumber native:detectvectorchanges,ADDED_COUNT,Count of features added in revised layer,outputNumber +native:detectvectorchanges,DELETED,Deleted features,outputVector native:detectvectorchanges,DELETED_COUNT,Count of features deleted from original layer,outputNumber +native:detectvectorchanges,UNCHANGED,Unchanged features,outputVector +native:detectvectorchanges,UNCHANGED_COUNT,Count of unchanged features,outputNumber native:difference,OUTPUT,Difference,outputVector native:dissolve,OUTPUT,Dissolved,outputVector +native:downloadgpsdata,OUTPUT,Output,outputFile +native:downloadgpsdata,OUTPUT_LAYER,Output layer,outputVector +native:downloadvectortiles,OUTPUT,Output,outputVectorTile native:dropgeometries,OUTPUT,Dropped geometries,outputVector -native:dropmzvalues,OUTPUT,Z,outputVector -native:equaltofrequency,OUTPUT,Output layer,outputRaster -native:equaltofrequency,OCCURRENCE_COUNT,Count of value occurrences,outputNumber -native:equaltofrequency,FOUND_LOCATIONS_COUNT,Count of cells with equal value occurrences,outputNumber -native:equaltofrequency,MEAN_FREQUENCY_PER_LOCATION,Mean frequency at valid cell locations,outputNumber -native:equaltofrequency,EXTENT,Extent,outputString +native:dropmzvalues,OUTPUT,Z/M Dropped,outputVector +native:dtmslopebasedfilter,OUTPUT_GROUND,Output layer (ground),outputRaster +native:dtmslopebasedfilter,OUTPUT_NONGROUND,Output layer (non-ground objects),outputRaster +native:dxfexport,OUTPUT,DXF,outputFile native:equaltofrequency,CRS_AUTHID,CRS authority identifier,outputString -native:equaltofrequency,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:equaltofrequency,EXTENT,Extent,outputString +native:equaltofrequency,FOUND_LOCATIONS_COUNT,Count of cells with equal value occurrences,outputNumber native:equaltofrequency,HEIGHT_IN_PIXELS,Height in pixels,outputNumber +native:equaltofrequency,MEAN_FREQUENCY_PER_LOCATION,Mean frequency at valid cell locations,outputNumber +native:equaltofrequency,OCCURRENCE_COUNT,Count of value occurrences,outputNumber +native:equaltofrequency,OUTPUT,Output layer,outputRaster native:equaltofrequency,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:equaltofrequency,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:explodehstorefield,OUTPUT,Exploded,outputVector native:explodelines,OUTPUT,Exploded,outputVector +native:exportlayersinformation,OUTPUT,Output,outputVector +native:exportmeshedges,OUTPUT,Output vector layer,outputVector +native:exportmeshfaces,OUTPUT,Output vector layer,outputVector +native:exportmeshongrid,OUTPUT,Output vector layer,outputVector +native:exportmeshvertices,OUTPUT,Output vector layer,outputVector +native:exporttospreadsheet,OUTPUT,Destination spreadsheet,outputFile +native:exporttospreadsheet,OUTPUT_LAYERS,Layers within spreadsheet,outputMultilayer native:extendlines,OUTPUT,Extended,outputVector native:extenttolayer,OUTPUT,Extent,outputVector native:extractbinary,FOLDER,Destination folder,outputFolder -native:extractbyattribute,OUTPUT,Extracted ,outputVector -native:extractbyattribute,FAIL_OUTPUT,Extracted ,outputVector +native:extractbyattribute,FAIL_OUTPUT,Extracted (non-matching),outputVector +native:extractbyattribute,OUTPUT,Extracted (attribute),outputVector +native:extractbyexpression,FAIL_OUTPUT,Non-matching,outputVector native:extractbyexpression,OUTPUT,Matching features,outputVector -native:extractbyexpression,FAIL_OUTPUT,Non,outputVector native:extractbyextent,OUTPUT,Extracted,outputVector -native:extractbylocation,OUTPUT,Extracted ,outputVector +native:extractbylocation,OUTPUT,Extracted (location),outputVector +native:extractlabels,OUTPUT,Extracted labels,outputVector native:extractmvalues,OUTPUT,Extracted,outputVector native:extractspecificvertices,OUTPUT,Vertices,outputVector native:extractvertices,OUTPUT,Vertices,outputVector +native:extractwithindistance,OUTPUT,Extracted (location),outputVector native:extractzvalues,OUTPUT,Extracted,outputVector native:fieldcalculator,OUTPUT,Calculated,outputVector native:filedownloader,OUTPUT,File destination,outputFile native:fillnodata,OUTPUT,Output raster,outputRaster +native:filterbygeometry,LINES,Line features,outputVector +native:filterbygeometry,LINE_COUNT,Total count of line features,outputNumber +native:filterbygeometry,NO_GEOMETRY,Features with no geometry,outputVector +native:filterbygeometry,NO_GEOMETRY_COUNT,Total count of features without geometry,outputNumber +native:filterbygeometry,POINTS,Point features,outputVector +native:filterbygeometry,POINT_COUNT,Total count of point features,outputNumber +native:filterbygeometry,POLYGONS,Polygon features,outputVector +native:filterbygeometry,POLYGON_COUNT,Total count of polygon features,outputNumber +native:filterlayersbytype,RASTER,Raster layer,outputRaster +native:filterlayersbytype,VECTOR,Vector features,outputVector native:filterverticesbym,OUTPUT,Filtered,outputVector native:filterverticesbyz,OUTPUT,Filtered,outputVector native:fixgeometries,OUTPUT,Fixed geometries,outputVector native:flattenrelationships,OUTPUT,Flattened layer,outputVector native:forcerhr,OUTPUT,Reoriented,outputVector -native:fuzzifyrastergaussianmembership,EXTENT,Extent,outputString native:fuzzifyrastergaussianmembership,CRS_AUTHID,CRS authority identifier,outputString -native:fuzzifyrastergaussianmembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:fuzzifyrastergaussianmembership,EXTENT,Extent,outputString native:fuzzifyrastergaussianmembership,HEIGHT_IN_PIXELS,Height in pixels,outputNumber -native:fuzzifyrastergaussianmembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:fuzzifyrastergaussianmembership,OUTPUT,Fuzzified raster,outputRaster -native:fuzzifyrasterlargemembership,EXTENT,Extent,outputString +native:fuzzifyrastergaussianmembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:fuzzifyrastergaussianmembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:fuzzifyrasterlargemembership,CRS_AUTHID,CRS authority identifier,outputString -native:fuzzifyrasterlargemembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:fuzzifyrasterlargemembership,EXTENT,Extent,outputString native:fuzzifyrasterlargemembership,HEIGHT_IN_PIXELS,Height in pixels,outputNumber -native:fuzzifyrasterlargemembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:fuzzifyrasterlargemembership,OUTPUT,Fuzzified raster,outputRaster -native:fuzzifyrasterlinearmembership,EXTENT,Extent,outputString +native:fuzzifyrasterlargemembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:fuzzifyrasterlargemembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:fuzzifyrasterlinearmembership,CRS_AUTHID,CRS authority identifier,outputString -native:fuzzifyrasterlinearmembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:fuzzifyrasterlinearmembership,EXTENT,Extent,outputString native:fuzzifyrasterlinearmembership,HEIGHT_IN_PIXELS,Height in pixels,outputNumber -native:fuzzifyrasterlinearmembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:fuzzifyrasterlinearmembership,OUTPUT,Fuzzified raster,outputRaster -native:fuzzifyrasternearmembership,EXTENT,Extent,outputString +native:fuzzifyrasterlinearmembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:fuzzifyrasterlinearmembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:fuzzifyrasternearmembership,CRS_AUTHID,CRS authority identifier,outputString -native:fuzzifyrasternearmembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:fuzzifyrasternearmembership,EXTENT,Extent,outputString native:fuzzifyrasternearmembership,HEIGHT_IN_PIXELS,Height in pixels,outputNumber -native:fuzzifyrasternearmembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:fuzzifyrasternearmembership,OUTPUT,Fuzzified raster,outputRaster -native:fuzzifyrasterpowermembership,EXTENT,Extent,outputString +native:fuzzifyrasternearmembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:fuzzifyrasternearmembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:fuzzifyrasterpowermembership,CRS_AUTHID,CRS authority identifier,outputString -native:fuzzifyrasterpowermembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:fuzzifyrasterpowermembership,EXTENT,Extent,outputString native:fuzzifyrasterpowermembership,HEIGHT_IN_PIXELS,Height in pixels,outputNumber -native:fuzzifyrasterpowermembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:fuzzifyrasterpowermembership,OUTPUT,Fuzzified raster,outputRaster -native:fuzzifyrastersmallmembership,EXTENT,Extent,outputString +native:fuzzifyrasterpowermembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:fuzzifyrasterpowermembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:fuzzifyrastersmallmembership,CRS_AUTHID,CRS authority identifier,outputString -native:fuzzifyrastersmallmembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:fuzzifyrastersmallmembership,EXTENT,Extent,outputString native:fuzzifyrastersmallmembership,HEIGHT_IN_PIXELS,Height in pixels,outputNumber -native:fuzzifyrastersmallmembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:fuzzifyrastersmallmembership,OUTPUT,Fuzzified raster,outputRaster +native:fuzzifyrastersmallmembership,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:fuzzifyrastersmallmembership,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:generatepointspixelcentroidsinsidepolygons,OUTPUT,Pixel centroids,outputVector native:geometrybyexpression,OUTPUT,Modified geometry,outputVector -native:greaterthanfrequency,OUTPUT,Output layer,outputRaster -native:greaterthanfrequency,OCCURRENCE_COUNT,Count of value occurrences,outputNumber -native:greaterthanfrequency,FOUND_LOCATIONS_COUNT,Count of cells with equal value occurrences,outputNumber -native:greaterthanfrequency,MEAN_FREQUENCY_PER_LOCATION,Mean frequency at valid cell locations,outputNumber -native:greaterthanfrequency,EXTENT,Extent,outputString +native:gltftovector,OUTPUT_LINES,Output lines,outputVector +native:gltftovector,OUTPUT_POLYGONS,Output polygons,outputVector native:greaterthanfrequency,CRS_AUTHID,CRS authority identifier,outputString -native:greaterthanfrequency,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:greaterthanfrequency,EXTENT,Extent,outputString +native:greaterthanfrequency,FOUND_LOCATIONS_COUNT,Count of cells with equal value occurrences,outputNumber native:greaterthanfrequency,HEIGHT_IN_PIXELS,Height in pixels,outputNumber +native:greaterthanfrequency,MEAN_FREQUENCY_PER_LOCATION,Mean frequency at valid cell locations,outputNumber +native:greaterthanfrequency,OCCURRENCE_COUNT,Count of value occurrences,outputNumber +native:greaterthanfrequency,OUTPUT,Output layer,outputRaster native:greaterthanfrequency,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber -native:highestpositioninrasterstack,OUTPUT,Output layer,outputRaster -native:highestpositioninrasterstack,EXTENT,Extent,outputString +native:greaterthanfrequency,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:highestpositioninrasterstack,CRS_AUTHID,CRS authority identifier,outputString -native:highestpositioninrasterstack,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:highestpositioninrasterstack,EXTENT,Extent,outputString native:highestpositioninrasterstack,HEIGHT_IN_PIXELS,Height in pixels,outputNumber +native:highestpositioninrasterstack,OUTPUT,Output layer,outputRaster native:highestpositioninrasterstack,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:highestpositioninrasterstack,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:hillshade,OUTPUT,Hillshade,outputRaster native:hublines,OUTPUT,Hub lines,outputVector -native:importphotos,OUTPUT,Photos,outputVector native:importphotos,INVALID,Invalid photos table,outputVector +native:importphotos,OUTPUT,Photos,outputVector native:interpolatepoint,OUTPUT,Interpolated points,outputVector native:intersection,OUTPUT,Intersection,outputVector -native:joinattributesbylocation,OUTPUT,Joined layer,outputVector -native:joinattributesbylocation,NON_MATCHING,Unjoinable features from first layer,outputVector native:joinattributesbylocation,JOINED_COUNT,Number of joined features from input table,outputNumber -native:joinattributestable,OUTPUT,Joined layer,outputVector -native:joinattributestable,NON_MATCHING,Unjoinable features from first layer,outputVector +native:joinattributesbylocation,NON_MATCHING,Unjoinable features from first layer,outputVector +native:joinattributesbylocation,OUTPUT,Joined layer,outputVector native:joinattributestable,JOINED_COUNT,Number of joined features from input table,outputNumber +native:joinattributestable,NON_MATCHING,Unjoinable features from first layer,outputVector +native:joinattributestable,OUTPUT,Joined layer,outputVector native:joinattributestable,UNJOINABLE_COUNT,Number of unjoinable features from input table,outputNumber -native:joinbynearest,OUTPUT,Joined layer,outputVector -native:joinbynearest,NON_MATCHING,Unjoinable features from first layer,outputVector +native:joinbylocationsummary,OUTPUT,Joined layer,outputVector native:joinbynearest,JOINED_COUNT,Number of joined features from input table,outputNumber +native:joinbynearest,NON_MATCHING,Unjoinable features from first layer,outputVector +native:joinbynearest,OUTPUT,Joined layer,outputVector native:joinbynearest,UNJOINABLE_COUNT,Number of unjoinable features from input table,outputNumber +native:keepnbiggestparts,OUTPUT,Parts,outputVector native:kmeansclustering,OUTPUT,Clusters,outputVector native:layertobookmarks,COUNT,Count of bookmarks added,outputNumber -native:lessthanfrequency,OUTPUT,Output layer,outputRaster -native:lessthanfrequency,OCCURRENCE_COUNT,Count of value occurrences,outputNumber -native:lessthanfrequency,FOUND_LOCATIONS_COUNT,Count of cells with equal value occurrences,outputNumber -native:lessthanfrequency,MEAN_FREQUENCY_PER_LOCATION,Mean frequency at valid cell locations,outputNumber -native:lessthanfrequency,EXTENT,Extent,outputString native:lessthanfrequency,CRS_AUTHID,CRS authority identifier,outputString -native:lessthanfrequency,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:lessthanfrequency,EXTENT,Extent,outputString +native:lessthanfrequency,FOUND_LOCATIONS_COUNT,Count of cells with equal value occurrences,outputNumber native:lessthanfrequency,HEIGHT_IN_PIXELS,Height in pixels,outputNumber +native:lessthanfrequency,MEAN_FREQUENCY_PER_LOCATION,Mean frequency at valid cell locations,outputNumber +native:lessthanfrequency,OCCURRENCE_COUNT,Count of value occurrences,outputNumber +native:lessthanfrequency,OUTPUT,Output layer,outputRaster native:lessthanfrequency,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:lessthanfrequency,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:linedensity,OUTPUT,Line density raster,outputRaster native:lineintersections,OUTPUT,Intersections,outputVector native:linesubstring,OUTPUT,Substring,outputVector -native:lowestpositioninrasterstack,OUTPUT,Output layer,outputRaster -native:lowestpositioninrasterstack,EXTENT,Extent,outputString native:lowestpositioninrasterstack,CRS_AUTHID,CRS authority identifier,outputString -native:lowestpositioninrasterstack,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:lowestpositioninrasterstack,EXTENT,Extent,outputString native:lowestpositioninrasterstack,HEIGHT_IN_PIXELS,Height in pixels,outputNumber +native:lowestpositioninrasterstack,OUTPUT,Output layer,outputRaster native:lowestpositioninrasterstack,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:lowestpositioninrasterstack,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:meancoordinates,OUTPUT,Mean coordinates,outputVector native:mergelines,OUTPUT,Merged,outputVector native:mergevectorlayers,OUTPUT,Merged,outputVector +native:meshcontours,OUTPUT_LINES,Exported contour lines,outputVector +native:meshcontours,OUTPUT_POLYGONS,Exported contour polygons,outputVector +native:meshexportcrosssection,OUTPUT,Exported data CSV file,outputFile +native:meshexporttimeseries,OUTPUT,Exported data CSV file,outputFile +native:meshrasterize,OUTPUT,Output raster layer,outputRaster native:minimumenclosingcircle,OUTPUT,Minimum enclosing circles,outputVector +native:modelerrastercalc,OUTPUT,Calculated,outputRaster +native:modelervirtualrastercalc,OUTPUT,Calculated,outputRaster +native:multidifference,OUTPUT,Difference,outputVector +native:multiintersection,OUTPUT,Intersection,outputVector native:multiparttosingleparts,OUTPUT,Single parts,outputVector -native:multiringconstantbuffer,OUTPUT,Multi,outputVector -native:nearestneighbouranalysis,OUTPUT_HTML_FILE,Nearest neighbour,outputHtml -native:nearestneighbouranalysis,OBSERVED_MD,Observed mean distance,outputNumber +native:multiringconstantbuffer,OUTPUT,Multi-ring buffer (constant distance),outputVector +native:multiunion,OUTPUT,Union,outputVector native:nearestneighbouranalysis,EXPECTED_MD,Expected mean distance,outputNumber native:nearestneighbouranalysis,NN_INDEX,Nearest neighbour index,outputNumber +native:nearestneighbouranalysis,OBSERVED_MD,Observed mean distance,outputNumber +native:nearestneighbouranalysis,OUTPUT_HTML_FILE,Nearest neighbour,outputHtml native:nearestneighbouranalysis,POINT_COUNT,Number of points,outputNumber -native:nearestneighbouranalysis,Z_SCORE,Z,outputNumber +native:nearestneighbouranalysis,Z_SCORE,Z-score,outputNumber native:offsetline,OUTPUT,Offset,outputVector native:orderbyexpression,OUTPUT,Ordered,outputVector native:orientedminimumboundingbox,OUTPUT,Bounding boxes,outputVector @@ -687,123 +873,144 @@ native:pixelstopoints,OUTPUT,Vector points,outputVector native:pixelstopolygons,OUTPUT,Vector polygons,outputVector native:pointonsurface,OUTPUT,Point,outputVector native:pointsalonglines,OUTPUT,Interpolated points,outputVector +native:pointstopath,NUM_PATHS,Number of paths,outputNumber +native:pointstopath,OUTPUT,Paths,outputVector +native:pointstopath,OUTPUT_TEXT_DIR,Directory for text output,outputFolder native:pointtolayer,OUTPUT,Point,outputVector native:poleofinaccessibility,OUTPUT,Point,outputVector native:polygonfromlayerextent,OUTPUT,Extent,outputVector -native:polygonize,OUTPUT,Polygons,outputVector native:polygonize,NUM_POLYGONS,Number of polygons,outputNumber +native:polygonize,OUTPUT,Polygons,outputVector native:polygonstolines,OUTPUT,Lines,outputVector -native:postgisexecutesql,NA,NA,NA -native:printlayoutmapextenttolayer,OUTPUT,Extent,outputVector -native:printlayoutmapextenttolayer,WIDTH,Map width,outputNumber native:printlayoutmapextenttolayer,HEIGHT,Map height,outputNumber -native:printlayoutmapextenttolayer,SCALE,Map scale,outputNumber +native:printlayoutmapextenttolayer,OUTPUT,Extent,outputVector native:printlayoutmapextenttolayer,ROTATION,Map rotation,outputNumber +native:printlayoutmapextenttolayer,SCALE,Map scale,outputNumber +native:printlayoutmapextenttolayer,WIDTH,Map width,outputNumber native:printlayouttoimage,OUTPUT,Image file,outputFile native:printlayouttopdf,OUTPUT,PDF file,outputFile native:projectpointcartesian,OUTPUT,Projected,outputVector native:promotetomulti,OUTPUT,Multiparts,outputVector -native:randomextract,OUTPUT,Extracted ,outputVector +native:randomextract,OUTPUT,Extracted (random),outputVector native:randompointsinextent,OUTPUT,Random points,outputVector +native:randompointsinpolygons,FEATURES_WITH_EMPTY_OR_NO_GEOMETRY,Number of features with empty or no geometry,outputNumber native:randompointsinpolygons,OUTPUT,Random points in polygons,outputVector native:randompointsinpolygons,OUTPUT_POINTS,Total number of points generated,outputNumber native:randompointsinpolygons,POINTS_MISSED,Number of missed points,outputNumber native:randompointsinpolygons,POLYGONS_WITH_MISSED_POINTS,Number of polygons with missed points,outputNumber -native:randompointsinpolygons,FEATURES_WITH_EMPTY_OR_NO_GEOMETRY,Number of features with empty or no geometry,outputNumber +native:randompointsonlines,FEATURES_WITH_EMPTY_OR_NO_GEOMETRY,Number of features with empty or no geometry,outputNumber +native:randompointsonlines,LINES_WITH_MISSED_POINTS,Number of features with missed points,outputNumber native:randompointsonlines,OUTPUT,Random points on lines,outputVector native:randompointsonlines,OUTPUT_POINTS,Total number of points generated,outputNumber native:randompointsonlines,POINTS_MISSED,Number of missed points,outputNumber -native:randompointsonlines,LINES_WITH_MISSED_POINTS,Number of features with missed points,outputNumber -native:randompointsonlines,FEATURES_WITH_EMPTY_OR_NO_GEOMETRY,Number of features with empty or no geometry,outputNumber -native:rasterbooleanand,OUTPUT,Output layer,outputRaster -native:rasterbooleanand,EXTENT,Extent,outputString native:rasterbooleanand,CRS_AUTHID,CRS authority identifier,outputString -native:rasterbooleanand,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:rasterbooleanand,EXTENT,Extent,outputString +native:rasterbooleanand,FALSE_PIXEL_COUNT,False pixel count,outputNumber native:rasterbooleanand,HEIGHT_IN_PIXELS,Height in pixels,outputNumber -native:rasterbooleanand,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:rasterbooleanand,NODATA_PIXEL_COUNT,NODATA pixel count,outputNumber +native:rasterbooleanand,OUTPUT,Output layer,outputRaster +native:rasterbooleanand,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:rasterbooleanand,TRUE_PIXEL_COUNT,True pixel count,outputNumber -native:rasterbooleanand,FALSE_PIXEL_COUNT,False pixel count,outputNumber +native:rasterbooleanand,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:rastercalc,OUTPUT,Calculated,outputRaster native:rasterize,OUTPUT,Output layer,outputRaster -native:rasterlayerstatistics,OUTPUT_HTML_FILE,Statistics,outputHtml -native:rasterlayerstatistics,MIN,Minimum value,outputNumber +native:rasterlayerproperties,BAND_COUNT,Number of bands in raster,outputNumber +native:rasterlayerproperties,CRS_AUTHID,CRS authority identifier,outputString +native:rasterlayerproperties,EXTENT,Extent,outputString +native:rasterlayerproperties,HAS_NODATA_VALUE,Band has a nodata value set,outputBoolean +native:rasterlayerproperties,HEIGHT_IN_PIXELS,Height in pixels,outputNumber +native:rasterlayerproperties,NODATA_VALUE,Band nodata value,outputNumber +native:rasterlayerproperties,PIXEL_HEIGHT,Pixel size (height) in map units,outputNumber +native:rasterlayerproperties,PIXEL_WIDTH,Pixel size (width) in map units,outputNumber +native:rasterlayerproperties,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:rasterlayerproperties,X_MAX,Maximum x-coordinate,outputNumber +native:rasterlayerproperties,X_MIN,Minimum x-coordinate,outputNumber +native:rasterlayerproperties,Y_MAX,Maximum y-coordinate,outputNumber +native:rasterlayerproperties,Y_MIN,Minimum y-coordinate,outputNumber native:rasterlayerstatistics,MAX,Maximum value,outputNumber -native:rasterlayerstatistics,RANGE,Range,outputNumber -native:rasterlayerstatistics,SUM,Sum,outputNumber native:rasterlayerstatistics,MEAN,Mean value,outputNumber +native:rasterlayerstatistics,MIN,Minimum value,outputNumber +native:rasterlayerstatistics,OUTPUT_HTML_FILE,Statistics,outputHtml +native:rasterlayerstatistics,RANGE,Range,outputNumber native:rasterlayerstatistics,STD_DEV,Standard deviation,outputNumber +native:rasterlayerstatistics,SUM,Sum,outputNumber native:rasterlayerstatistics,SUM_OF_SQUARES,Sum of the squares,outputNumber -native:rasterlayeruniquevaluesreport,OUTPUT_HTML_FILE,Unique values report,outputHtml -native:rasterlayeruniquevaluesreport,OUTPUT_TABLE,Unique values table,outputVector -native:rasterlayeruniquevaluesreport,EXTENT,Extent,outputString native:rasterlayeruniquevaluesreport,CRS_AUTHID,CRS authority identifier,outputString -native:rasterlayeruniquevaluesreport,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:rasterlayeruniquevaluesreport,EXTENT,Extent,outputString native:rasterlayeruniquevaluesreport,HEIGHT_IN_PIXELS,Height in pixels,outputNumber -native:rasterlayeruniquevaluesreport,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:rasterlayeruniquevaluesreport,NODATA_PIXEL_COUNT,NODATA pixel count,outputNumber -native:rasterlayerzonalstats,OUTPUT_TABLE,Statistics,outputVector -native:rasterlayerzonalstats,EXTENT,Extent,outputString +native:rasterlayeruniquevaluesreport,OUTPUT_HTML_FILE,Unique values report,outputHtml +native:rasterlayeruniquevaluesreport,OUTPUT_TABLE,Unique values table,outputVector +native:rasterlayeruniquevaluesreport,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:rasterlayeruniquevaluesreport,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:rasterlayerzonalstats,CRS_AUTHID,CRS authority identifier,outputString -native:rasterlayerzonalstats,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:rasterlayerzonalstats,EXTENT,Extent,outputString native:rasterlayerzonalstats,HEIGHT_IN_PIXELS,Height in pixels,outputNumber -native:rasterlayerzonalstats,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:rasterlayerzonalstats,NODATA_PIXEL_COUNT,NODATA pixel count,outputNumber -native:rasterlogicalor,OUTPUT,Output layer,outputRaster -native:rasterlogicalor,EXTENT,Extent,outputString +native:rasterlayerzonalstats,OUTPUT_TABLE,Statistics,outputVector +native:rasterlayerzonalstats,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber +native:rasterlayerzonalstats,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:rasterlogicalor,CRS_AUTHID,CRS authority identifier,outputString -native:rasterlogicalor,WIDTH_IN_PIXELS,Width in pixels,outputNumber +native:rasterlogicalor,EXTENT,Extent,outputString +native:rasterlogicalor,FALSE_PIXEL_COUNT,False pixel count,outputNumber native:rasterlogicalor,HEIGHT_IN_PIXELS,Height in pixels,outputNumber -native:rasterlogicalor,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:rasterlogicalor,NODATA_PIXEL_COUNT,NODATA pixel count,outputNumber +native:rasterlogicalor,OUTPUT,Output layer,outputRaster +native:rasterlogicalor,TOTAL_PIXEL_COUNT,Total pixel count,outputNumber native:rasterlogicalor,TRUE_PIXEL_COUNT,True pixel count,outputNumber -native:rasterlogicalor,FALSE_PIXEL_COUNT,False pixel count,outputNumber +native:rasterlogicalor,WIDTH_IN_PIXELS,Width in pixels,outputNumber native:rastersampling,OUTPUT,Sampled,outputVector +native:rastersurfacevolume,AREA,Area,outputNumber native:rastersurfacevolume,OUTPUT_HTML_FILE,Surface volume report,outputHtml native:rastersurfacevolume,OUTPUT_TABLE,Surface volume table,outputVector -native:rastersurfacevolume,VOLUME,Volume,outputNumber native:rastersurfacevolume,PIXEL_COUNT,Pixel count,outputNumber -native:rastersurfacevolume,AREA,Area,outputNumber +native:rastersurfacevolume,VOLUME,Volume,outputNumber native:reclassifybylayer,OUTPUT,Reclassified raster,outputRaster native:reclassifybytable,OUTPUT,Reclassified raster,outputRaster native:rectanglesovalsdiamonds,OUTPUT,Polygon,outputVector native:refactorfields,OUTPUT,Refactored,outputVector -native:removeduplicatesbyattribute,OUTPUT,Filtered ,outputVector -native:removeduplicatesbyattribute,DUPLICATES,Filtered ,outputVector -native:removeduplicatesbyattribute,RETAINED_COUNT,Count of retained records,outputNumber +native:removeduplicatesbyattribute,DUPLICATES,Filtered (duplicates),outputVector native:removeduplicatesbyattribute,DUPLICATE_COUNT,Count of discarded duplicate records,outputNumber +native:removeduplicatesbyattribute,OUTPUT,Filtered (no duplicates),outputVector +native:removeduplicatesbyattribute,RETAINED_COUNT,Count of retained records,outputNumber native:removeduplicatevertices,OUTPUT,Cleaned,outputVector -native:removenullgeometries,OUTPUT,Non null geometries,outputVector native:removenullgeometries,NULL_OUTPUT,Null geometries,outputVector +native:removenullgeometries,OUTPUT,Non null geometries,outputVector +native:renamelayer,OUTPUT,Layer,outputLayer native:renametablefield,OUTPUT,Renamed,outputVector native:repairshapefile,OUTPUT,Repaired layer,outputVector native:reprojectlayer,OUTPUT,Reprojected,outputVector native:rescaleraster,OUTPUT,Rescaled,outputRaster +native:retainfields,OUTPUT,Retained fields,outputVector native:reverselinedirection,OUTPUT,Reversed,outputVector native:rotatefeatures,OUTPUT,Rotated,outputVector +native:roundness,OUTPUT,Roundness,outputVector native:roundrastervalues,OUTPUT,Output raster,outputRaster native:ruggednessindex,OUTPUT,Ruggedness,outputRaster -native:savefeatures,OUTPUT,Saved features,outputFile native:savefeatures,FILE_PATH,File name and path,outputString native:savefeatures,LAYER_NAME,Layer name,outputString +native:savefeatures,OUTPUT,Saved features,outputFile +native:savelog,OUTPUT,Log file,outputHtml native:saveselectedfeatures,OUTPUT,Selected features,outputVector native:segmentizebymaxangle,OUTPUT,Segmentized,outputVector native:segmentizebymaxdistance,OUTPUT,Segmentized,outputVector -native:serviceareafromlayer,OUTPUT_LINES,Service area ,outputVector -native:serviceareafromlayer,OUTPUT,Service area ,outputVector -native:serviceareafrompoint,OUTPUT_LINES,Service area ,outputVector -native:serviceareafrompoint,OUTPUT,Service area ,outputVector +native:serviceareafromlayer,OUTPUT,Service area (boundary nodes),outputVector +native:serviceareafromlayer,OUTPUT_LINES,Service area (lines),outputVector +native:serviceareafrompoint,OUTPUT,Service area (boundary nodes),outputVector +native:serviceareafrompoint,OUTPUT_LINES,Service area (lines),outputVector native:setlayerencoding,OUTPUT,Output layer,outputVector native:setlayerstyle,OUTPUT,Styled,outputLayer native:setmfromraster,OUTPUT,Draped,outputVector native:setmvalue,OUTPUT,M Added,outputVector native:setzfromraster,OUTPUT,Draped,outputVector native:setzvalue,OUTPUT,Z Added,outputVector +native:shortestline,OUTPUT,Shortest lines,outputVector native:shortestpathlayertopoint,OUTPUT,Shortest path,outputVector native:shortestpathpointtolayer,OUTPUT,Shortest path,outputVector native:shortestpathpointtopoint,OUTPUT,Shortest path,outputVector native:shortestpathpointtopoint,TRAVEL_COST,Travel cost,outputNumber -native:shpencodinginfo,ENCODING,Shapefile Encoding,outputString native:shpencodinginfo,CPG_ENCODING,CPG Encoding,outputString +native:shpencodinginfo,ENCODING,Shapefile Encoding,outputString native:shpencodinginfo,LDID_ENCODING,LDID Encoding,outputString native:simplifygeometries,OUTPUT,Simplified,outputVector native:singlesidedbuffer,OUTPUT,Buffered,outputVector @@ -811,73 +1018,334 @@ native:slope,OUTPUT,Slope,outputRaster native:smoothgeometry,OUTPUT,Smoothed,outputVector native:snapgeometries,OUTPUT,Snapped geometry,outputVector native:snappointstogrid,OUTPUT,Snapped,outputVector -native:spatialiteexecutesql,NA,NA,NA -native:spatialiteexecutesqlregistered,NA,NA,NA native:splitfeaturesbycharacter,OUTPUT,Split,outputVector native:splitlinesbylength,OUTPUT,Split,outputVector native:splitvectorlayer,OUTPUT,Output directory,outputFolder native:splitvectorlayer,OUTPUT_LAYERS,Output layers,outputMultilayer native:splitwithlines,OUTPUT,Split,outputVector +native:stdbscanclustering,NUM_CLUSTERS,Number of clusters,outputNumber +native:stdbscanclustering,OUTPUT,Clusters,outputVector +native:stringconcatenation,CONCATENATION,Concatenation,outputString +native:stylefromproject,COLORRAMPS,Color ramp count,outputNumber +native:stylefromproject,LABELSETTINGS,Label settings count,outputNumber native:stylefromproject,OUTPUT,Output style database,outputFile native:stylefromproject,SYMBOLS,Symbol count,outputNumber -native:stylefromproject,COLORRAMPS,Color ramp count,outputNumber native:stylefromproject,TEXTFORMATS,Text format count,outputNumber -native:stylefromproject,LABELSETTINGS,Label settings count,outputNumber native:subdivide,OUTPUT,Subdivided,outputVector native:sumlinelengths,OUTPUT,Line length,outputVector native:swapxy,OUTPUT,Swapped,outputVector native:symmetricaldifference,OUTPUT,Symmetrical difference,outputVector native:taperedbuffer,OUTPUT,Buffered,outputVector -native:tinmeshcreation,OUTPUT_MESH,Output File,outputFile +native:tilesxyzdirectory,OUTPUT_DIRECTORY,Output directory,outputFolder +native:tilesxyzdirectory,OUTPUT_HTML,Output html (Leaflet),outputHtml +native:tilesxyzmbtiles,OUTPUT_FILE,Output,outputFile +native:tinmeshcreation,OUTPUT_MESH,Output file,outputFile native:transect,OUTPUT,Transect,outputVector +native:transferannotationsfrommain,OUTPUT,New annotation layer,outputLayer native:translategeometry,OUTPUT,Translated,outputVector native:truncatetable,OUTPUT,Truncated layer,outputVector native:union,OUTPUT,Union,outputVector +native:virtualrastercalc,OUTPUT,Calculated,outputRaster +native:voronoipolygons,OUTPUT,Voronoi polygons,outputVector native:wedgebuffers,OUTPUT,Buffers,outputVector -native:writevectortiles_mbtiles,OUTPUT,Destination MBTiles,outputFile +native:writevectortiles_mbtiles,OUTPUT,Destination MBTiles,outputVectorTile native:writevectortiles_xyz,OUTPUT_DIRECTORY,Output directory,outputFolder native:zonalhistogram,OUTPUT,Output zones,outputVector +native:zonalstatistics,INPUT_VECTOR,Zonal statistics,outputVector native:zonalstatisticsfb,OUTPUT,Zonal Statistics,outputVector +otb:BandMath,out,Output Image,outputRaster +otb:BandMathX,out,Output Image,outputRaster +otb:BandMathX,outcontext,Export context,outputFile +otb:BinaryMorphologicalOperation,out,Output Image,outputRaster +otb:BlockMatching,io.out,The output disparity map,outputRaster +otb:BlockMatching,io.outmask,The output mask corresponding to all criterions,outputRaster +otb:BundleToPerfectSensor,out,Output image,outputRaster +otb:ClassificationMapRegularization,io.out,Output regularized image,outputRaster +otb:ColorMapping,out,Output Image,outputRaster +otb:ComputeConfusionMatrix,out,Matrix output,outputFile +otb:ComputeImagesStatistics,out.xml,Output XML file,outputFile +otb:ComputeModulusAndPhase,modulus,Modulus,outputRaster +otb:ComputeModulusAndPhase,phase,Phase,outputRaster +otb:ComputeOGRLayersFeaturesStatistics,outstats,Output XML file,outputFile +otb:ConcatenateImages,out,Output Image,outputRaster +otb:ConcatenateVectorData,out,Concatenated output,outputVector +otb:ConnectedComponentSegmentation,out,Output Shape,outputVector +otb:ContrastEnhancement,out,Output Image,outputRaster +otb:Despeckle,out,Output Image,outputRaster +otb:DimensionalityReduction,method.pca.outeigenvalues,Output file containing eigenvalues (txt format),outputFile +otb:DimensionalityReduction,out,Output Image,outputRaster +otb:DimensionalityReduction,outinv, Inverse Output Image,outputRaster +otb:DimensionalityReduction,outmatrix,Transformation matrix output (text format),outputFile +otb:DisparityMapToElevationMap,io.out,Output elevation map,outputRaster +otb:DomainTransform,out,Output Image,outputRaster +otb:DynamicConvert,out,Output Image,outputRaster +otb:EdgeExtraction,out,Feature Output Image,outputRaster +otb:ExtractROI,out,Output Image,outputRaster +otb:FastNLMeans,out,Output Image,outputRaster +otb:FineRegistration,out,Output Image,outputRaster +otb:FineRegistration,wo,Output Warped Image,outputRaster +otb:FusionOfClassifications,out,The output classification image,outputRaster +otb:GeneratePlyFile,out,The output Ply file,outputFile +otb:GrayScaleMorphologicalOperation,out,Feature Output Image,outputRaster +otb:GridBasedImageResampling,io.out,Output Image,outputRaster +otb:HaralickTextureExtraction,out,Output Image,outputRaster +otb:HomologousPointsExtraction,out,Output file with tie points,outputFile +otb:HomologousPointsExtraction,outvector,Output vector file with tie points,outputFile +otb:HooverCompareSegmentation,outgt,Colored ground truth output,outputRaster +otb:HooverCompareSegmentation,outms,Colored machine segmentation output,outputRaster +otb:HyperspectralUnmixing,out,Output Image,outputRaster +otb:ImageClassifier,confmap,Confidence map,outputRaster +otb:ImageClassifier,out,Output Image,outputRaster +otb:ImageClassifier,probamap,Probability map,outputRaster +otb:ImageDimensionalityReduction,out,Output Image,outputRaster +otb:ImageEnvelope,out,Output Vector Data,outputVector +otb:ImageRegression,out,Output Image,outputRaster +otb:KmzExport,out,Output KMZ product,outputFile +otb:LSMSSegmentation,out,Output labeled Image,outputRaster +otb:LSMSSmallRegionsMerging,out,Output Image,outputRaster +otb:LSMSVectorization,out,Output GIS vector file,outputFile +otb:LargeScaleMeanShift,mode.raster.out,The output raster image,outputRaster +otb:LargeScaleMeanShift,mode.vector.out,Output GIS vector file,outputFile +otb:LineSegmentDetection,out,Output Detected lines,outputVector +otb:LocalRxDetection,out,Output Image,outputRaster +otb:LocalStatisticExtraction,out,Feature Output Image,outputRaster +otb:ManageNoData,out,Output Image,outputRaster +otb:MeanShiftSmoothing,fout,Spectral filtered output,outputRaster +otb:MeanShiftSmoothing,foutpos,Spatial filtered displacement output,outputRaster +otb:MorphologicalClassification,out,Output Image,outputRaster +otb:MorphologicalMultiScaleDecomposition,outconcave,Output Concave Image,outputRaster +otb:MorphologicalMultiScaleDecomposition,outconvex,Output Convex Image,outputRaster +otb:MorphologicalMultiScaleDecomposition,outleveling,Output Image,outputRaster +otb:MorphologicalProfilesAnalysis,out,Output Image,outputRaster +otb:Mosaic,out,Output image,outputRaster +otb:MultiImageSamplingRate,out,Output sampling rates,outputFile +otb:MultiResolutionPyramid,out,Output Image,outputRaster +otb:MultivariateAlterationDetector,out,Change Map,outputRaster +otb:OGRLayerClassifier,insvm,Input model filename,outputFile +otb:OSMDownloader,out,Output vector data,outputVector +otb:OrthoRectification,io.out,Output Image,outputRaster +otb:Pansharpening,out,Output image,outputRaster +otb:PantexTextureExtraction,out,Output Image,outputRaster +otb:PolygonClassStatistics,out,Output XML statistics file,outputFile +otb:Quicklook,out,Output Image,outputRaster +otb:RadiometricIndices,out,Output Image,outputRaster +otb:Rasterization,out,Output image,outputRaster +otb:ReadImageInfo,outgeom,Write the image metadata to a geom file,outputFile +otb:Rescale,out,Output Image,outputRaster +otb:ResetMargin,out,Output Image,outputRaster +otb:RigidTransformResample,out,Output image,outputRaster +otb:SARBurstExtraction,out,Output Image,outputRaster +otb:SARCalibration,out,Output Image,outputRaster +otb:SARConcatenateBursts,out,Output Image,outputRaster +otb:SARDeburst,out,Output Image,outputRaster +otb:SARDecompositions,out,Output Image,outputRaster +otb:SARPolarMatrixConvert,outc,Output Complex Image,outputRaster +otb:SARPolarMatrixConvert,outf,Output Real Image,outputRaster +otb:SARPolarSynth,out,Output Image,outputRaster +otb:SFSTextureExtraction,out,Feature Output Image,outputRaster +otb:SOMClassification,out,OutputImage,outputRaster +otb:SOMClassification,som,SOM Map,outputRaster +otb:SampleAugmentation,out,Output samples,outputFile +otb:SampleExtraction,out,Output samples,outputFile +otb:SampleSelection,out,Output vectors,outputFile +otb:SampleSelection,outrates,Output rates,outputFile +otb:Segmentation,mode.raster.out,Output labeled image,outputRaster +otb:Segmentation,mode.vector.out,Output vector file,outputFile +otb:SmallRegionsMerging,out,Output Image,outputRaster +otb:Smoothing,out,Output Image,outputRaster +otb:SpectralAngleClassification,measure,Output spectral angle values,outputRaster +otb:SpectralAngleClassification,out,Output classified image,outputRaster +otb:SplitImage,out,Output Image,outputRaster +otb:StereoFramework,output.out,Output DSM,outputRaster +otb:StereoRectificationGridGenerator,inverse.outleft,Left inverse deformation grid,outputRaster +otb:StereoRectificationGridGenerator,inverse.outright,Right inverse deformation grid,outputRaster +otb:StereoRectificationGridGenerator,io.outleft,Left output deformation grid,outputRaster +otb:StereoRectificationGridGenerator,io.outright,Right output deformation grid,outputRaster +otb:Superimpose,out,Output image,outputRaster +otb:Synthetize,out,Output Image,outputRaster +otb:TileFusion,out,Output Image,outputRaster +otb:TrainDimensionalityReduction,io.out,Output model,outputFile +otb:TrainImagesClassifier,io.confmatout,Output confusion matrix or contingency table,outputFile +otb:TrainImagesClassifier,io.out,Output model,outputFile +otb:TrainImagesRegression,io.out,Output model,outputFile +otb:TrainRegression,io.out,Output regression model,outputFile +otb:TrainVectorClassifier,io.confmatout,Output confusion matrix or contingency table,outputFile +otb:TrainVectorClassifier,io.out,Output model,outputFile +otb:TrainVectorRegression,io.out,Output model,outputFile +otb:VectorClassifier,out,Output vector data file,outputFile +otb:VectorDataExtractROI,io.out,Output Vector data,outputVector +otb:VectorDataReprojection,out.vd,Output vector data,outputFile +otb:VectorDataSetField,out,Output,outputVector +otb:VectorDataTransform,out,Output Vector data,outputVector +otb:VectorDimensionalityReduction,out,Output vector data file containing the reduced vector,outputFile +otb:VectorRegression,out,Output vector data file,outputFile +otb:VertexComponentAnalysis,outendm,Output Endmembers,outputRaster +otb:ZonalStatistics,out.raster.filename,File name for the raster image,outputRaster +otb:ZonalStatistics,out.vector.filename,Filename for the output vector data,outputVector +pcraster:Slope,OUTPUT,Slope layer,outputRaster +pcraster:abs,OUTPUT,Output absolute value layer,outputRaster +pcraster:accucapacityflux,OUTPUT,Output Material Flux Raster Layer,outputRaster +pcraster:accucapacityflux,OUTPUT2,Output State Raster Layer,outputRaster +pcraster:accuflux,OUTPUT,Result flux layer,outputRaster +pcraster:accufractionflux,OUTPUT,Output Material Flux Raster Layer,outputRaster +pcraster:accufractionflux,OUTPUT2,Output State Raster Layer,outputRaster +pcraster:accuthresholdflux,OUTPUT,Output Material Flux Raster Layer,outputRaster +pcraster:accuthresholdflux,OUTPUT2,Output State Raster Layer,outputRaster +pcraster:accutraveltimeflux,OUTPUT,Output Material Flux Raster Layer,outputRaster +pcraster:accutraveltimeflux,OUTPUT2,Output State Raster Layer,outputRaster +pcraster:accutraveltimefractionflux,OUTPUT,Output Material Flux Raster Layer,outputRaster +pcraster:accutraveltimefractionflux,OUTPUT2,Output State Raster Layer,outputRaster +pcraster:accutraveltimefractionflux,OUTPUT3,Output Removed Raster Layer,outputRaster +pcraster:accutriggerflux,OUTPUT,Output Material Flux Raster Layer,outputRaster +pcraster:accutriggerflux,OUTPUT2,Output State Raster Layer,outputRaster +pcraster:acos,OUTPUT,Output Inverse Cosine Layer,outputRaster +pcraster:areaarea,OUTPUT,Output area layer,outputRaster +pcraster:areaaverage,OUTPUT,Output area average layer,outputRaster +pcraster:areadiversity,OUTPUT,Output area diversity layer,outputRaster +pcraster:areamajority,OUTPUT,Output area majority layer,outputRaster +pcraster:areamaximum,OUTPUT,Output area maximum layer,outputRaster +pcraster:areaminimum,OUTPUT,Output area minimum layer,outputRaster +pcraster:areanormal,OUTPUT,Output area normal layer,outputRaster +pcraster:areaorder,OUTPUT,Output area order layer,outputRaster +pcraster:areatotal,OUTPUT,Output area total layer,outputRaster +pcraster:areauniform,OUTPUT,Output area uniform layer,outputRaster +pcraster:asin,OUTPUT,Output Inverse Sine Layer,outputRaster +pcraster:aspect,OUTPUT,Aspect layer,outputRaster +pcraster:atan,OUTPUT,Output Inverse Tangent Layer,outputRaster +pcraster:booleanoperators,OUTPUT,Output Boolean raster,outputRaster +pcraster:catchment,OUTPUT,Catchment layer,outputRaster +pcraster:catchmenttotal,OUTPUT,Result catchment total layer,outputRaster +pcraster:cellarea,OUTPUT,Output cellarea layer,outputRaster +pcraster:celllength,OUTPUT,Output celllength layer,outputRaster +pcraster:clump,OUTPUT,Clump layer,outputRaster +pcraster:col2map,OUTPUT,PCRaster layer,outputRaster +pcraster:comparisonoperators,OUTPUT,Output Boolean raster,outputRaster +pcraster:convertdatatype,OUTPUT,Output raster layer,outputRaster +pcraster:converttopcrasterformat,OUTPUT,PCRaster layer,outputRaster +pcraster:cos,OUTPUT,Output Cosine layer,outputRaster +pcraster:cover,OUTPUT,Output Raster Layer,outputRaster +pcraster:defined,OUTPUT,Output boolean layer,outputRaster +pcraster:downstream,OUTPUT,Downstream layer,outputRaster +pcraster:downstreamdist,OUTPUT,Downstream distance layer,outputRaster +pcraster:exp,OUTPUT,Output exp layer,outputRaster +pcraster:extentofview,OUTPUT,Output extent of view layer,outputRaster +pcraster:fac,OUTPUT,Output fac layer,outputRaster +pcraster:horizontan,OUTPUT,Output horizontan layer,outputRaster +pcraster:ifthen,OUTPUT,Output Raster,outputRaster +pcraster:ifthenelse,OUTPUT,Output Raster,outputRaster +pcraster:inversedistance,OUTPUT,Inverse Distance Interpolation output,outputRaster +pcraster:lddcreate,OUTPUT,Local Drain Direction Layer,outputRaster +pcraster:lddcreatedem,OUTPUT,Filled DEM,outputRaster +pcraster:ldddist,OUTPUT,Result distance layer,outputRaster +pcraster:lddmask,OUTPUT,Result lddmask layer,outputRaster +pcraster:lddrepair,OUTPUT,Output lddrepair layer,outputRaster +pcraster:ln,OUTPUT,Output ln layer,outputRaster +pcraster:log10,OUTPUT,Output log10 layer,outputRaster +pcraster:lookup,OUTPUT,Output Raster Layer,outputRaster +pcraster:lookuplinear,OUTPUT,Output Raster Layer,outputRaster +pcraster:lookuptablefromrat,OUTPUT,Output Lookup Table,outputFile +pcraster:map2col,OUTPUT,Output textfile with columns,outputFile +pcraster:maparea,OUTPUT,Output area layer,outputRaster +pcraster:mapmaximum,OUTPUT,Output maximum value layer,outputRaster +pcraster:mapminimum,OUTPUT,Output minimum value layer,outputRaster +pcraster:mapnormal,OUTPUT,Output map normal layer,outputRaster +pcraster:maptotal,OUTPUT,Output map total layer,outputRaster +pcraster:mapuniform,OUTPUT,Output uniform layer,outputRaster +pcraster:nodirection,OUTPUT,Output no direction raster,outputRaster +pcraster:normal,OUTPUT,Normal output layer,outputRaster +pcraster:order,OUTPUT,Output order layer,outputRaster +pcraster:path,OUTPUT,Result path layer,outputRaster +pcraster:pit,OUTPUT,Output pit raster layer,outputRaster +pcraster:plancurv,OUTPUT,Output planform curvature layer,outputRaster +pcraster:pred,OUTPUT,Output pred layer,outputRaster +pcraster:profcurv,OUTPUT,Output profile curvature layer,outputRaster +pcraster:resample,OUTPUT,Output resample raster layer,outputRaster +pcraster:rounddown,OUTPUT,Output rounddown layer,outputRaster +pcraster:roundoff,OUTPUT,Output roundoff layer,outputRaster +pcraster:roundup,OUTPUT,Output roundup layer,outputRaster +pcraster:sin,OUTPUT,Output Sine layer,outputRaster +pcraster:slopelength,OUTPUT,Result slope length layer,outputRaster +pcraster:spatial,OUTPUT,Output raster layer,outputRaster +pcraster:spread,OUTPUT,Output shortest accumulated friction path,outputRaster +pcraster:spreadldd,OUTPUT,Output spread ldd result,outputRaster +pcraster:spreadlddzone,OUTPUT,Output spread ldd zone result,outputRaster +pcraster:spreadmax,OUTPUT,Output spread max result,outputRaster +pcraster:spreadmaxzone,OUTPUT,Output spread max zone result,outputRaster +pcraster:spreadzone,OUTPUT,Output spread zone layer,outputRaster +pcraster:sqr,OUTPUT,Output Square layer,outputRaster +pcraster:sqrt,OUTPUT,Output sqrt layer,outputRaster +pcraster:streamorder,OUTPUT,Stream Order layer,outputRaster +pcraster:subcatchment,OUTPUT,(Sub)catchment layer,outputRaster +pcraster:succ,OUTPUT,Output succ layer,outputRaster +pcraster:tan,OUTPUT,Output Tangent layer,outputRaster +pcraster:transient,OUTPUT,Output Transient Raster Layer,outputRaster +pcraster:uniform,OUTPUT,Uniform layer,outputRaster +pcraster:uniqueid,OUTPUT,Output unique id raster,outputRaster +pcraster:upstream,OUTPUT,Upstream layer,outputRaster +pcraster:view,OUTPUT,Viewshed layer,outputRaster +pcraster:window4total,OUTPUT,Output window4total layer,outputRaster +pcraster:windowaverage,OUTPUT,Window Average Layer,outputRaster +pcraster:windowdiversity,OUTPUT,Window Diversity Layer,outputRaster +pcraster:windowhighpass,OUTPUT,Window High Pass Layer,outputRaster +pcraster:windowmajority,OUTPUT,Window Majority Layer,outputRaster +pcraster:windowmaximum,OUTPUT,Window Maximum Layer,outputRaster +pcraster:windowminimum,OUTPUT,Window Minimum Layer,outputRaster +pcraster:windowtotal,OUTPUT,Window Total Layer,outputRaster +pdal:assignprojection,OUTPUT,Output layer,outputPointCloud +pdal:boundary,OUTPUT,Boundary,outputVector +pdal:clip,OUTPUT,Clipped,outputPointCloud +pdal:convertformat,OUTPUT,Converted,outputPointCloud +pdal:createcopc,OUTPUT,Output directory,outputFolder +pdal:createcopc,OUTPUT_LAYERS,Output layers,outputMultilayer +pdal:density,OUTPUT,Density,outputRaster +pdal:exportraster,OUTPUT,Exported,outputRaster +pdal:exportrastertin,OUTPUT,Exported (using triangulation),outputRaster +pdal:exportvector,OUTPUT,Exported,outputVector +pdal:filter,OUTPUT,Filtered,outputPointCloud +pdal:info,OUTPUT,Layer information,outputHtml +pdal:merge,OUTPUT,Merged,outputPointCloud +pdal:reproject,OUTPUT,Reprojected,outputPointCloud +pdal:thinbydecimate,OUTPUT,Thinned (by decimation),outputPointCloud +pdal:thinbyradius,OUTPUT,Thinned (by radius),outputPointCloud +pdal:tile,OUTPUT,Output directory,outputFolder +pdal:virtualpointcloud,OUTPUT,Virtual point cloud,outputPointCloud qgis:advancedpythonfieldcalculator,OUTPUT,Calculated,outputVector qgis:barplot,OUTPUT,Bar plot,outputHtml -qgis:basicstatisticsforfields,OUTPUT_HTML_FILE,Statistics,outputHtml qgis:basicstatisticsforfields,COUNT,Count,outputNumber -qgis:basicstatisticsforfields,UNIQUE,Number of unique values,outputNumber -qgis:basicstatisticsforfields,EMPTY,Number of empty ,outputNumber -qgis:basicstatisticsforfields,FILLED,Number of non,outputNumber -qgis:basicstatisticsforfields,MIN,Minimum value,outputNumber +qgis:basicstatisticsforfields,CV,Coefficient of Variation,outputNumber +qgis:basicstatisticsforfields,EMPTY,Number of empty (null) values,outputNumber +qgis:basicstatisticsforfields,FILLED,Number of non-empty values,outputNumber +qgis:basicstatisticsforfields,FIRSTQUARTILE,First quartile,outputNumber +qgis:basicstatisticsforfields,IQR,Interquartile Range (IQR),outputNumber +qgis:basicstatisticsforfields,MAJORITY,Majority (most frequently occurring value),outputNumber qgis:basicstatisticsforfields,MAX,Maximum value,outputNumber -qgis:basicstatisticsforfields,MIN_LENGTH,Minimum length,outputNumber qgis:basicstatisticsforfields,MAX_LENGTH,Maximum length,outputNumber -qgis:basicstatisticsforfields,MEAN_LENGTH,Mean length,outputNumber -qgis:basicstatisticsforfields,CV,Coefficient of Variation,outputNumber -qgis:basicstatisticsforfields,SUM,Sum,outputNumber qgis:basicstatisticsforfields,MEAN,Mean value,outputNumber -qgis:basicstatisticsforfields,STD_DEV,Standard deviation,outputNumber -qgis:basicstatisticsforfields,RANGE,Range,outputNumber +qgis:basicstatisticsforfields,MEAN_LENGTH,Mean length,outputNumber qgis:basicstatisticsforfields,MEDIAN,Median,outputNumber -qgis:basicstatisticsforfields,MINORITY,Minority ,outputNumber -qgis:basicstatisticsforfields,MAJORITY,Majority ,outputNumber -qgis:basicstatisticsforfields,FIRSTQUARTILE,First quartile,outputNumber +qgis:basicstatisticsforfields,MIN,Minimum value,outputNumber +qgis:basicstatisticsforfields,MINORITY,Minority (rarest occurring value),outputNumber +qgis:basicstatisticsforfields,MIN_LENGTH,Minimum length,outputNumber +qgis:basicstatisticsforfields,OUTPUT_HTML_FILE,Statistics,outputHtml +qgis:basicstatisticsforfields,RANGE,Range,outputNumber +qgis:basicstatisticsforfields,STD_DEV,Standard deviation,outputNumber +qgis:basicstatisticsforfields,SUM,Sum,outputNumber qgis:basicstatisticsforfields,THIRDQUARTILE,Third quartile,outputNumber -qgis:basicstatisticsforfields,IQR,Interquartile Range ,outputNumber +qgis:basicstatisticsforfields,UNIQUE,Number of unique values,outputNumber qgis:boxplot,OUTPUT,Box plot,outputHtml -qgis:checkvalidity,VALID_OUTPUT,Valid output,outputVector -qgis:checkvalidity,VALID_COUNT,Count of valid features,outputNumber -qgis:checkvalidity,INVALID_OUTPUT,Invalid output,outputVector -qgis:checkvalidity,INVALID_COUNT,Count of invalid features,outputNumber -qgis:checkvalidity,ERROR_OUTPUT,Error output,outputVector qgis:checkvalidity,ERROR_COUNT,Count of errors,outputNumber +qgis:checkvalidity,ERROR_OUTPUT,Error output,outputVector +qgis:checkvalidity,INVALID_COUNT,Count of invalid features,outputNumber +qgis:checkvalidity,INVALID_OUTPUT,Invalid output,outputVector +qgis:checkvalidity,VALID_COUNT,Count of valid features,outputNumber +qgis:checkvalidity,VALID_OUTPUT,Valid output,outputVector +qgis:climbalongline,MAXELEVATION,Maximum elevation,outputNumber +qgis:climbalongline,MINELEVATION,Minimum elevation,outputNumber qgis:climbalongline,OUTPUT,Climb layer,outputVector qgis:climbalongline,TOTALCLIMB,Total climb,outputNumber qgis:climbalongline,TOTALDESCENT,Total descent,outputNumber -qgis:climbalongline,MINELEVATION,Minimum elevation,outputNumber -qgis:climbalongline,MAXELEVATION,Maximum elevation,outputNumber -qgis:concavehull,OUTPUT,Concave hull,outputVector qgis:convertgeometrytype,OUTPUT,Converted,outputVector qgis:definecurrentprojection,INPUT,Layer with projection,outputVector -qgis:delaunaytriangulation,OUTPUT,Delaunay triangulation,outputVector -qgis:deletecolumn,OUTPUT,Remaining fields,outputVector qgis:distancematrix,OUTPUT,Distance matrix,outputVector qgis:distancetonearesthublinetohub,OUTPUT,Hub distance,outputVector qgis:distancetonearesthubpoints,OUTPUT,Hub distance,outputVector @@ -888,11 +1356,6 @@ qgis:generatepointspixelcentroidsalongline,OUTPUT,Points along lines,outputVecto qgis:heatmapkerneldensityestimation,OUTPUT,Heatmap,outputRaster qgis:hypsometriccurves,OUTPUT_DIRECTORY,Hypsometric curves,outputFolder qgis:idwinterpolation,OUTPUT,Interpolated,outputRaster -qgis:importintopostgis,NA,NA,NA -qgis:importintospatialite,NA,NA,NA -qgis:joinbylocationsummary,OUTPUT,Joined layer,outputVector -qgis:keepnbiggestparts,OUTPUT,Parts,outputVector -qgis:knearestconcavehull,OUTPUT,Concave hull,outputVector qgis:linestopolygons,OUTPUT,Polygons,outputVector qgis:listuniquevalues,OUTPUT,Unique values,outputVector qgis:listuniquevalues,OUTPUT_HTML_FILE,HTML report,outputHtml @@ -901,741 +1364,1059 @@ qgis:listuniquevalues,UNIQUE_VALUES,Unique values,outputString qgis:meanandstandarddeviationplot,OUTPUT,Plot,outputHtml qgis:minimumboundinggeometry,OUTPUT,Bounding geometry,outputVector qgis:pointsdisplacement,OUTPUT,Displaced,outputVector -qgis:pointstopath,OUTPUT,Paths,outputVector -qgis:pointstopath,OUTPUT_TEXT_DIR,Directory for text output,outputFolder qgis:polarplot,OUTPUT,Polar plot,outputHtml -qgis:randomextractwithinsubsets,OUTPUT,Extracted ,outputVector +qgis:randomextractwithinsubsets,OUTPUT,Extracted (random stratified),outputVector qgis:randompointsalongline,OUTPUT,Random points,outputVector qgis:randompointsinlayerbounds,OUTPUT,Random points,outputVector qgis:randompointsinsidepolygons,OUTPUT,Random points,outputVector qgis:rastercalculator,OUTPUT,Output,outputRaster qgis:rasterlayerhistogram,OUTPUT,Histogram,outputHtml +qgis:rectanglesovalsdiamondsvariable,OUTPUT,Output,outputVector qgis:regularpoints,OUTPUT,Regular points,outputVector -qgis:relief,OUTPUT,Relief,outputRaster qgis:relief,FREQUENCY_DISTRIBUTION,Frequency distribution,outputFile +qgis:relief,OUTPUT,Relief,outputRaster qgis:scatter3dplot,OUTPUT,Histogram,outputHtml qgis:statisticsbycategories,OUTPUT,Statistics by category,outputVector qgis:texttofloat,OUTPUT,Float from text,outputVector -qgis:tilesxyzdirectory,OUTPUT_DIRECTORY,Output directory,outputFolder -qgis:tilesxyzdirectory,OUTPUT_HTML,Output html ,outputHtml -qgis:tilesxyzmbtiles,OUTPUT_FILE,Output file ,outputFile qgis:tininterpolation,OUTPUT,Interpolated,outputRaster qgis:tininterpolation,TRIANGULATION,Triangulation,outputVector qgis:topologicalcoloring,OUTPUT,Colored,outputVector +qgis:variabledistancebuffer,OUTPUT,Buffer,outputVector qgis:vectorlayerhistogram,OUTPUT,Histogram,outputHtml qgis:vectorlayerscatterplot,OUTPUT,Scatterplot,outputHtml -qgis:voronoipolygons,OUTPUT,Voronoi polygons,outputVector -saga:accumulatedcost,ACCUMULATED,Accumulated Cost,outputRaster -saga:accumulatedcost,ALLOCATION,Allocation,outputRaster -saga:accumulatedcostanisotropic,ACCCOST,Accumulated Cost,outputRaster -saga:accumulatedcostisotropic,ACCCOST,Accumulated Cost,outputRaster -saga:accumulatedcostisotropic,CLOSESTPT,Closest Point,outputRaster -saga:accumulationfunctions,FLUX,Flux,outputRaster -saga:accumulationfunctions,STATE_OUT,State t ,outputRaster -saga:addcoordinatestopoints,OUTPUT,Points with coordinates,outputVector -saga:addindicatorfieldsforcategories,OUT_SHAPES,Output shapes with field,outputVector -saga:addpointattributestopolygons,OUTPUT,Result,outputVector -saga:addpolygonattributestopoints,OUTPUT,Result,outputVector -saga:addrastervaluestofeatures,RESULT,Result,outputVector -saga:addrastervaluestopoints,RESULT,Result,outputVector -saga:aggregate,NA,NA,NA -saga:aggregatepointobservations,AGGREGATED,Aggregated,outputVector -saga:aggregationindex,RESULT,Result,outputVector -saga:analyticalhierarchyprocess,OUTPUT,Output Grid,outputRaster -saga:analyticalhillshading,SHADE,Analytical Hillshading,outputRaster -saga:angmap,E,Angle,outputRaster -saga:angmap,F,CL dipdir,outputRaster -saga:angmap,G,CL dip,outputRaster -saga:angulardistanceweighted,TARGET_OUT_GRID,Target Grid,outputRaster -saga:artificialneuralnetworkclassificationopencv,CLASSES,Classification,outputRaster -saga:aspectslopegrid,ASPECT_SLOPE,Aspect,outputRaster -saga:automatedcloudcoverassessment,CLOUD,Cloud Cover,outputRaster -saga:averagewithmask1,RESULT,AWM1 Grid,outputRaster -saga:averagewithmask2,RESULT,AWM2 Grid,outputRaster -saga:averagewiththereshold1,RESULT,AWT Grid,outputRaster -saga:averagewiththereshold2,RESULT,AWT Grid,outputRaster -saga:averagewiththereshold3,RESULT,AWT Grid,outputRaster -saga:basicterrainanalysis,SHADE,Analytical Hillshading,outputRaster -saga:basicterrainanalysis,SLOPE,Slope,outputRaster -saga:basicterrainanalysis,ASPECT,Aspect,outputRaster -saga:basicterrainanalysis,HCURV,Plan Curvature,outputRaster -saga:basicterrainanalysis,VCURV,Profile Curvature,outputRaster -saga:basicterrainanalysis,CONVERGENCE,Convergence Index,outputRaster -saga:basicterrainanalysis,SINKS,Closed Depressions,outputRaster -saga:basicterrainanalysis,FLOW,Total Catchment Area,outputRaster -saga:basicterrainanalysis,WETNESS,Topographic Wetness Index,outputRaster -saga:basicterrainanalysis,LSFACTOR,LS,outputRaster -saga:basicterrainanalysis,CHANNELS,Channel Network,outputVector -saga:basicterrainanalysis,BASINS,Drainage Basins,outputVector -saga:basicterrainanalysis,CHNL_BASE,Channel Network Base Level,outputRaster -saga:basicterrainanalysis,CHNL_DIST,Channel Network Distance,outputRaster -saga:basicterrainanalysis,VALL_DEPTH,Valley Depth,outputRaster -saga:basicterrainanalysis,RSP,Relative Slope Position,outputRaster -saga:binaryerosionreconstruction,OUTPUT_GRID,Output Grid,outputRaster -saga:bioclimaticvariables,BIO_01,Annual Mean Temperature,outputRaster -saga:bioclimaticvariables,BIO_02,Mean Diurnal Range,outputRaster -saga:bioclimaticvariables,BIO_03,Isothermality,outputRaster -saga:bioclimaticvariables,BIO_04,Temperature Seasonality,outputRaster -saga:bioclimaticvariables,BIO_05,Maximum Temperature of Warmest Month,outputRaster -saga:bioclimaticvariables,BIO_06,Minimum Temperature of Coldest Month,outputRaster -saga:bioclimaticvariables,BIO_07,Temperature Annual Range,outputRaster -saga:bioclimaticvariables,BIO_08,Mean Temperature of Wettest Quarter,outputRaster -saga:bioclimaticvariables,BIO_09,Mean Temperature of Driest Quarter,outputRaster -saga:bioclimaticvariables,BIO_10,Mean Temperature of Warmest Quarter,outputRaster -saga:bioclimaticvariables,BIO_11,Mean Temperature of Coldest Quarter,outputRaster -saga:bioclimaticvariables,BIO_12,Annual Precipitation,outputRaster -saga:bioclimaticvariables,BIO_13,Precipitation of Wettest Month,outputRaster -saga:bioclimaticvariables,BIO_14,Precipitation of Driest Month,outputRaster -saga:bioclimaticvariables,BIO_15,Precipitation Seasonality,outputRaster -saga:bioclimaticvariables,BIO_16,Precipitation of Wettest Quarter,outputRaster -saga:bioclimaticvariables,BIO_17,Precipitation of Driest Quarter,outputRaster -saga:bioclimaticvariables,BIO_18,Precipitation of Warmest Quarter,outputRaster -saga:bioclimaticvariables,BIO_19,Precipitation of Coldest Quarter,outputRaster -saga:boostingclassificationopencv,CLASSES,Classification,outputRaster -saga:bsplineapproximation,TARGET_OUT_GRID,Grid,outputRaster -saga:burnstreamnetworkintodem,BURN,Processed DEM,outputRaster -saga:catchmentarea,FLOW,Catchment Area,outputRaster -saga:catchmentareaflowtracing,FLOW,Flow Accumulation,outputRaster -saga:catchmentareaflowtracing,VAL_MEAN,Mean over Catchment,outputRaster -saga:catchmentareaflowtracing,ACCU_TOTAL,Accumulated Material,outputRaster -saga:catchmentareaflowtracing,ACCU_LEFT,Accumulated Material from left side,outputRaster -saga:catchmentareaflowtracing,ACCU_RIGHT,Accumulated Material from right side,outputRaster -saga:catchmentarearecursive,FLOW,Catchment Area,outputRaster -saga:catchmentarearecursive,VAL_MEAN,Mean over Catchment,outputRaster -saga:catchmentarearecursive,ACCU_TOTAL,Accumulated Material,outputRaster -saga:catchmentarearecursive,ACCU_LEFT,Accumulated Material from left side,outputRaster -saga:catchmentarearecursive,ACCU_RIGHT,Accumulated Material from right side,outputRaster -saga:catchmentarearecursive,FLOW_LENGTH,Flow Path Length,outputRaster -saga:catchmentarearecursive,WEIGHT_LOSS,Loss through Negative Weights,outputRaster -saga:categoricalcoincidence,CATEGORIES,Number of Categories,outputRaster -saga:categoricalcoincidence,COINCIDENCE,Coincidence,outputRaster -saga:categoricalcoincidence,MAJ_COUNT,Dominance of Majority,outputRaster -saga:categoricalcoincidence,MAJ_VALUE,Value of Majority,outputRaster -saga:cellbalance,BALANCE,Cell Balance,outputRaster -saga:changedatastorage,OUTPUT,Converted Grid,outputRaster -saga:changedateformat,OUTPUT,Output,outputVector -saga:changedetection,CHANGE,Changes,outputRaster -saga:changedetection,CHANGES,Changes,outputVector -saga:changetimeformat,OUTPUT,Output,outputVector -saga:channelnetwork,CHNLNTWRK,Channel Network,outputRaster -saga:channelnetwork,CHNLROUTE,Channel Direction,outputRaster -saga:channelnetwork,SHAPES,Channel Network,outputVector -saga:channelnetworkanddrainagebasins,DIRECTION,Flow Direction,outputRaster -saga:channelnetworkanddrainagebasins,CONNECTION,Flow Connectivity,outputRaster -saga:channelnetworkanddrainagebasins,ORDER,Strahler Order,outputRaster -saga:channelnetworkanddrainagebasins,BASIN,Drainage Basins,outputRaster -saga:channelnetworkanddrainagebasins,SEGMENTS,Channels,outputVector -saga:channelnetworkanddrainagebasins,BASINS,Drainage Basins,outputVector -saga:channelnetworkanddrainagebasins,NODES,Junctions,outputVector -saga:clippointswithpolygons,CLIPS,Clipped Points,outputVector -saga:cliprasterwithpolygon,OUTPUT,Clipped,outputRaster -saga:closegaps,RESULT,Changed Grid,outputRaster -saga:closegapswithspline,CLOSED,Closed Gaps Grid,outputRaster -saga:closegapswithstepwiseresampling,RESULT,Result,outputRaster -saga:closeonecellgaps,RESULT,Changed Grid,outputRaster -saga:clusteranalysis,RESULT,Result,outputVector -saga:clusteranalysis,STATISTICS,Statistics,outputVector -saga:clusteranalysisshapes,RESULT,Result,outputVector -saga:clusteranalysisshapes,STATISTICS,Result,outputVector -saga:concentration,CONC,Concentration,outputRaster -saga:confusionmatrixpolygonsgrid,CONFUSION,Confusion Matrix,outputVector -saga:confusionmatrixpolygonsgrid,CLASSES,Class Values,outputVector -saga:confusionmatrixpolygonsgrid,SUMMARY,Summary,outputVector -saga:confusionmatrixtwogrids,COMBINED,Combined Classes,outputRaster -saga:confusionmatrixtwogrids,CONFUSION,Confusion Matrix,outputVector -saga:confusionmatrixtwogrids,CLASSES,Class Values,outputVector -saga:confusionmatrixtwogrids,SUMMARY,Summary,outputVector -saga:connectivityanalysis,FILTERED_MASK,Filtered Image,outputRaster -saga:connectivityanalysis,SYMBOLIC_IMAGE,Symbolic Image,outputRaster -saga:connectivityanalysis,OUTLINES,Outlines,outputVector -saga:constantgrid,OUT_GRID,Target Grid,outputRaster -saga:contourlines,CONTOUR,Contour Lines,outputVector -saga:convergenceindex,RESULT,Convergence Index,outputRaster -saga:convergenceindexsearchradius,CONVERGENCE,Convergence Index,outputRaster -saga:convertdatastoragetype,OUTPUT,Converted Grid,outputRaster -saga:convertlinestopoints,POINTS,Points,outputVector -saga:convertlinestopolygons,POLYGONS,Polygons,outputVector -saga:convertmultipointstopoints,POINTS,Points,outputVector -saga:convertpointstolines,LINES,Lines,outputVector -saga:convertpolygonlineverticestopoints,POINTS,Points,outputVector -saga:convertpolygonstolines,LINES,Lines,outputVector -saga:convexhull,HULLS,Convex Hull,outputVector -saga:convexhull,BOXES,Minimum Bounding Box,outputVector -saga:covereddistance,RESULT,Covered Distance,outputRaster -saga:createlinesgraticule,GRATICULE_LINE,Lines Graticule,outputVector -saga:createpointgrid,POINTS,Point Grid,outputVector -saga:createpolygonsgraticule,GRATICULE_RECT,Rectangle Graticule,outputVector -saga:croptodata,OUTPUT,Cropped,outputRaster -saga:crossclassificationandtabulation,RESULTGRID,Cross,outputRaster -saga:crossclassificationandtabulation,RESULTTABLE,Cross,outputVector -saga:crossprofiles,PROFILES,Cross Profiles,outputVector -saga:curvatureclassification,CLASS,Curvature Classification,outputRaster -saga:cutvectorlayer,CUT,Result,outputVector -saga:decisiontreeclassificationopencv,CLASSES,Classification,outputRaster -saga:destriping,RESULT3,Destriped Grid,outputRaster -saga:destriping,RESULT1,Low,outputRaster -saga:destriping,RESULT2,Low,outputRaster -saga:destripingwithmask,RESULT3,Destriped Grid,outputRaster -saga:destripingwithmask,RESULT1,Low,outputRaster -saga:destripingwithmask,RESULT2,Low,outputRaster -saga:difference,RESULT,Difference,outputVector -saga:diffusepollutionrisk,DELIVERY,Delivery Index,outputRaster -saga:diffusepollutionrisk,RISK_POINT,Locational Risk,outputRaster -saga:diffusepollutionrisk,RISK_DIFFUSE,Diffuse Pollution Risk,outputRaster -saga:diffusivehillslopeevolutionadi,MODEL,Modelled Elevation,outputRaster -saga:diffusivehillslopeevolutionadi,DIFF,Elevation Difference,outputRaster -saga:diffusivehillslopeevolutionftcs,MODEL,Modelled Elevation,outputRaster -saga:diffusivehillslopeevolutionftcs,DIFF,Elevation Difference,outputRaster -saga:directionalaverage,RESULT,Output Grid,outputRaster -saga:directionalstatisticsforrasterlayer,MEAN,Arithmetic Mean,outputRaster -saga:directionalstatisticsforrasterlayer,DIFMEAN,Difference from Arithmetic Mean,outputRaster -saga:directionalstatisticsforrasterlayer,MIN,Minimum,outputRaster -saga:directionalstatisticsforrasterlayer,MAX,Maximum,outputRaster -saga:directionalstatisticsforrasterlayer,RANGE,Range,outputRaster -saga:directionalstatisticsforrasterlayer,VAR,Variance,outputRaster -saga:directionalstatisticsforrasterlayer,STDDEV,Standard Deviation,outputRaster -saga:directionalstatisticsforrasterlayer,STDDEVLO,Mean less Standard Deviation,outputRaster -saga:directionalstatisticsforrasterlayer,STDDEVHI,Mean plus Standard Deviation,outputRaster -saga:directionalstatisticsforrasterlayer,DEVMEAN,Deviation from Arithmetic Mean,outputRaster -saga:directionalstatisticsforrasterlayer,PERCENT,Percentile,outputRaster -saga:directionalstatisticsforrasterlayer,POINTS_OUT,Directional Statistics for Points,outputVector -saga:distancevigra,OUTPUT,Distance,outputRaster -saga:diurnalanisotropicheating,DAH,Diurnal Anisotropic Heating,outputRaster -saga:diversityofcategories,COUNT,Number of Categories,outputRaster -saga:diversityofcategories,DIVERSITY,Diversity,outputRaster -saga:diversityofcategories,SIZE_MEAN,Average Size,outputRaster -saga:diversityofcategories,SIZE_SKEW,Skewness,outputRaster -saga:diversityofcategories,CONNECTIVITY,Connectivity,outputRaster -saga:downslopedistancegradient,GRADIENT,Gradient,outputRaster -saga:downslopedistancegradient,DIFFERENCE,Gradient Difference,outputRaster -saga:dtmfilterslopebased,GROUND,Bare Earth,outputRaster -saga:dtmfilterslopebased,NONGROUND,Removed Objects,outputRaster -saga:earthsorbitalparameters,NA,NA,NA -saga:edgecontamination,CONTAMINATION,Edge Contamination,outputRaster -saga:edgedetectionvigra,OUTPUT,Edges,outputRaster -saga:effectiveairflowheights,AFH,Effective Air Flow Heights,outputRaster -saga:enhancedvegetationindex,EVI,Enhanced Vegetation Index,outputRaster -saga:enumeratetablefield,OUTPUT,Output,outputVector -saga:fastregiongrowingalgorithm,RESULT,Segmente,outputRaster -saga:fastregiongrowingalgorithm,MEAN,Mean,outputRaster -saga:fastrepresentativeness,RESULT,Output,outputRaster -saga:fastrepresentativeness,RESULT_LOD,Output Lod,outputRaster -saga:fastrepresentativeness,SEEDS,Output Seeds,outputRaster -saga:featureextents,EXTENTS,Extents,outputVector -saga:fieldstatistics,STATISTICS,Statistics,outputVector -saga:fillgapsinrecords,NOGAPS,Table without Gaps,outputVector -saga:fillsinks,RESULT,Filled DEM,outputRaster -saga:fillsinksqmofesp,FILLED,DEM Without Sinks,outputRaster -saga:fillsinksqmofesp,SINKS,Sinks,outputRaster -saga:fillsinkswangliu,FILLED,Filled DEM,outputRaster -saga:fillsinkswangliu,FDIR,Flow Directions,outputRaster -saga:fillsinkswangliu,WSHED,Watershed Basins,outputRaster -saga:fillsinksxxlwangliu,FILLED,Filled DEM,outputRaster -saga:findfieldofextremevalue,OUTPUT,Output,outputVector -saga:fireriskanalysis,DANGER,Danger,outputRaster -saga:fireriskanalysis,COMPPROB,Compound Probability,outputRaster -saga:fireriskanalysis,PRIORITY,Priority Index,outputRaster -saga:fitnpointsinpolygon,POINTS,Points,outputVector -saga:fixeddistancebuffer,BUFFER,Buffer,outputVector -saga:flatdetection,NOFLATS,No Flats,outputRaster -saga:flatdetection,FLATS,Flat Areas,outputRaster -saga:flattenpolygonlayer,OUTPUT,Output,outputVector -saga:flowaccumulationqmofesp,FLOW,Contributing Area,outputRaster -saga:flowpathlength,LENGTH,Flow Path Length,outputRaster -saga:flowwidthandspecificcatchmentarea,WIDTH,Flow Width,outputRaster -saga:flowwidthandspecificcatchmentarea,SCA,Specific Catchment Area ,outputRaster -saga:fourierfiltervigra,OUTPUT,Output,outputRaster -saga:fouriertransformationopencv,REAL,Fourier Transformation ,outputRaster -saga:fouriertransformationopencv,IMAG,Fourier Transformation ,outputRaster -saga:fouriertransforminversevigra,OUTPUT,Output,outputRaster -saga:fouriertransformrealvigra,OUTPUT,Output,outputRaster -saga:fouriertransformvigra,REAL,Real,outputRaster -saga:fouriertransformvigra,IMAG,Imaginary,outputRaster -saga:fragmentationalternative,DENSITY,Density ,outputRaster -saga:fragmentationalternative,CONNECTIVITY,Connectivity ,outputRaster -saga:fragmentationalternative,FRAGMENTATION,Fragmentation,outputRaster -saga:fragmentationalternative,FRAGSTATS,Summary,outputVector -saga:fragmentationclassesfromdensityandconnectivity,FRAGMENTATION,Fragmentation,outputRaster -saga:fragmentationstandard,DENSITY,Density ,outputRaster -saga:fragmentationstandard,CONNECTIVITY,Connectivity ,outputRaster -saga:fragmentationstandard,FRAGMENTATION,Fragmentation,outputRaster -saga:fragmentationstandard,FRAGSTATS,Summary,outputVector -saga:function,RESULT,Function,outputRaster -saga:functionfit,NA,NA,NA -saga:fuzzify,OUTPUT,Fuzzified Grid,outputRaster -saga:fuzzyintersectionand,AND,Intersection,outputRaster -saga:fuzzylandformelementclassification,PLAIN,Plain,outputRaster -saga:fuzzylandformelementclassification,PIT,Pit,outputRaster -saga:fuzzylandformelementclassification,PEAK,Peak,outputRaster -saga:fuzzylandformelementclassification,RIDGE,Ridge,outputRaster -saga:fuzzylandformelementclassification,CHANNEL,Channel,outputRaster -saga:fuzzylandformelementclassification,SADDLE,Saddle,outputRaster -saga:fuzzylandformelementclassification,BSLOPE,Back Slope,outputRaster -saga:fuzzylandformelementclassification,FSLOPE,Foot Slope,outputRaster -saga:fuzzylandformelementclassification,SSLOPE,Shoulder Slope,outputRaster -saga:fuzzylandformelementclassification,HOLLOW,Hollow,outputRaster -saga:fuzzylandformelementclassification,FHOLLOW,Foot Hollow,outputRaster -saga:fuzzylandformelementclassification,SHOLLOW,Shoulder Hollow,outputRaster -saga:fuzzylandformelementclassification,SPUR,Spur,outputRaster -saga:fuzzylandformelementclassification,FSPUR,Foot Spur,outputRaster -saga:fuzzylandformelementclassification,SSPUR,Shoulder Spur,outputRaster -saga:fuzzylandformelementclassification,FORM,Landform,outputRaster -saga:fuzzylandformelementclassification,MEM,Maximum Membership,outputRaster -saga:fuzzylandformelementclassification,ENTROPY,Entropy,outputRaster -saga:fuzzylandformelementclassification,CI,Confusion Index,outputRaster -saga:fuzzyunionor,OR,Union,outputRaster -saga:gaussianfilter,RESULT,Filtered Grid,outputRaster -saga:generateshapes,OUTPUT,Output,outputVector -saga:geodesicmorphologicalreconstruction,OBJECT_GRID,Object Grid,outputRaster -saga:geodesicmorphologicalreconstruction,DIFFERENCE_GRID,Difference Input ,outputRaster -saga:geographiccoordinategrids,LON,Longitude,outputRaster -saga:geographiccoordinategrids,LAT,Latitude,outputRaster -saga:geometricfigures,RESULT,Result,outputRaster -saga:globalmoransiforrasterlayer,RESULT,Result,outputVector -saga:gradientvectorfromcartesiantopolarcoordinates,DIR,Direction,outputRaster -saga:gradientvectorfromcartesiantopolarcoordinates,LEN,Length,outputRaster -saga:gradientvectorfrompolartocartesiancoordinates,DX,X Component,outputRaster -saga:gradientvectorfrompolartocartesiancoordinates,DY,Y Component,outputRaster -saga:gradientvectorsfromdirectionalcomponents,VECTORS,Gradient Vectors,outputVector -saga:gradientvectorsfromdirectionandlength,VECTORS,Gradient Vectors,outputVector -saga:gradientvectorsfromsurface,VECTORS,Gradient Vectors,outputVector -saga:gridcombination,NA,NA,NA -saga:gridstatisticsforpoints,RESULT,Statistics,outputVector -saga:gwrformultiplepredictorlayers,REGRESSION,Regression,outputRaster -saga:gwrformultiplepredictorlayers,QUALITY,Coefficient of Determination,outputRaster -saga:gwrformultiplepredictorlayers,RESIDUALS,Residuals,outputVector -saga:gwrformultiplepredictors,REGRESSION,Regression,outputVector -saga:gwrformultiplepredictorsgriddedmodeloutput,REGRESSION,Regression,outputVector -saga:gwrformultiplepredictorsgriddedmodeloutput,SLOPES,Slopes,outputRaster -saga:gwrformultiplepredictorsgriddedmodeloutput,TARGET_INTERCEPT,Intercept,outputRaster -saga:gwrformultiplepredictorsgriddedmodeloutput,TARGET_QUALITY,Quality,outputRaster -saga:gwrforsinglepredictorgriddedmodeloutput,TARGET_OUT_GRID,Target Grid,outputRaster -saga:gwrforsinglepredictorgriddedmodeloutput,INTERCEPT,Intercept,outputRaster -saga:gwrforsinglepredictorgriddedmodeloutput,SLOPE,Slope,outputRaster -saga:gwrforsinglepredictorgriddedmodeloutput,QUALITY,Quality,outputRaster -saga:gwrforsinglepredictorlayer,RESIDUALS,Residuals,outputVector -saga:gwrforsinglepredictorlayer,REGRESSION,Regression,outputRaster -saga:gwrforsinglepredictorlayer,QUALITY,Coefficient of Determination,outputRaster -saga:gwrforsinglepredictorlayer,INTERCEPT,Intercept,outputRaster -saga:gwrforsinglepredictorlayer,SLOPE,Slope,outputRaster -saga:histogramsurface,HIST,Histogram,outputRaster -saga:hypsometry,TABLE,Hypsometry,outputVector -saga:imcorrfeaturetracking,CORRPOINTS,Correlated Points,outputVector -saga:imcorrfeaturetracking,CORRLINES,Displacement Vector,outputVector -saga:interpolatecubicspline,TARGET_OUT_GRID,Grid,outputRaster -saga:intersect,RESULT,Intersect,outputVector -saga:inversedistanceweightedinterpolation,TARGET_OUT_GRID,Grid,outputRaster -saga:invertdatanodata,OUTPUT,Result,outputRaster -saga:invertgrid,INVERSE,Inverse Grid,outputRaster -saga:isodataclusteringforgrids,CLUSTER,Clusters,outputRaster -saga:kerneldensityestimation,TARGET_OUT_GRID,Kernel,outputRaster -saga:kmeansclusteringforgrids,CLUSTER,Clusters,outputRaster -saga:kmeansclusteringforgrids,STATISTICS,Statistics,outputVector -saga:knearestneighboursclassificationopencv,CLASSES,Classification,outputRaster -saga:lakeflood,OUTDEPTH,Lake,outputRaster -saga:lakeflood,OUTLEVEL,Surface,outputRaster -saga:landsurfacetemperature,LST,Land Surface Temperature ,outputRaster -saga:landusescenariogenerator,SCENARIO,Land Use Scenario,outputVector -saga:laplacianfilter,RESULT,Filtered Grid,outputRaster -saga:layerofextremevalue,RESULT,Result,outputRaster -saga:leastcostpaths,POINTS,Profile ,outputVector -saga:leastcostpaths,LINE,Profile ,outputVector -saga:linedissolve,DISSOLVED,Dissolved Lines,outputVector -saga:linepolygonintersection,INTERSECT,Intersection,outputVector -saga:lineproperties,OUTPUT,Lines with Property Attributes,outputVector -saga:linesimplification,OUTPUT,Simplified Lines,outputVector -saga:linesmoothing,LINES_OUT,Smoothed Lines,outputVector -saga:localminimaandmaxima,MINIMA,Minima,outputVector -saga:localminimaandmaxima,MAXIMA,Maxima,outputVector -saga:lsfactor,LS,LS Factor,outputRaster -saga:lsfactorfieldbased,STATISTICS,Field Statistics,outputVector -saga:lsfactorfieldbased,UPSLOPE_AREA,Upslope Length Factor,outputRaster -saga:lsfactorfieldbased,UPSLOPE_LENGTH,Effective Flow Length,outputRaster -saga:lsfactorfieldbased,UPSLOPE_SLOPE,Upslope Slope,outputRaster -saga:lsfactorfieldbased,LS_FACTOR,LS Factor,outputRaster -saga:lsfactorfieldbased,BALANCE,Sediment Balance,outputRaster -saga:majorityfilter,RESULT,Filtered Grid,outputRaster -saga:massbalanceindex,MBI,Mass Balance Index,outputRaster -saga:maximumentropypresenceprediction,PREDICTION,Presence Prediction,outputRaster -saga:maximumentropypresenceprediction,PROBABILITY,Presence Probability,outputRaster -saga:maximumflowpathlength,DISTANCE,Flow Path Length,outputRaster -saga:mergevectorlayers,MERGED,Merged Layer,outputVector -saga:meshdenoise,OUTPUT,Denoised Grid,outputRaster -saga:metricconversions,CONV,Converted Grid,outputRaster -saga:minimumdistanceanalysis,TABLE,Minimum Distance Analysis,outputVector -saga:mirrorgrid,MIRROR,Mirror Grid,outputRaster -saga:modifiedquadraticshepardinterpolation,TARGET_OUT_GRID,Grid,outputRaster -saga:monthlyglobalbylatitude,SOLARRAD,Solar Radiation,outputVector -saga:morphologicalfilter,RESULT,Filtered Grid,outputRaster -saga:morphologicalfilteropencv,OUTPUT,Output,outputRaster -saga:morphologicalfiltervigra,OUTPUT,Output,outputRaster -saga:morphometricfeatures,FEATURES,Morphometric Features,outputRaster -saga:morphometricfeatures,ELEVATION,Generalized Surface,outputRaster -saga:morphometricfeatures,SLOPE,Slope,outputRaster -saga:morphometricfeatures,ASPECT,Aspect,outputRaster -saga:morphometricfeatures,PROFC,Profile Curvature,outputRaster -saga:morphometricfeatures,PLANC,Plan Curvature,outputRaster -saga:morphometricfeatures,LONGC,Longitudinal Curvature,outputRaster -saga:morphometricfeatures,CROSC,Cross,outputRaster -saga:morphometricfeatures,MAXIC,Maximum Curvature,outputRaster -saga:morphometricfeatures,MINIC,Minimum Curvature,outputRaster -saga:morphometricprotectionindex,PROTECTION,Protection Index,outputRaster -saga:mosaicrasterlayers,TARGET_OUT_GRID,Grid,outputRaster -saga:multibandvariation,MEAN,Mean Distance,outputRaster -saga:multibandvariation,STDDEV,Standard Deviation,outputRaster -saga:multibandvariation,DIFF,Distance,outputRaster -saga:multidirectionleefilter,RESULT,Filtered Grid,outputRaster -saga:multidirectionleefilter,STDDEV,Minimum Standard Deviation,outputRaster -saga:multidirectionleefilter,DIR,Direction of Minimum Standard Deviation,outputRaster -saga:multilevelbsplineinterpolation,TARGET_OUT_GRID,Grid,outputRaster -saga:multilevelbsplineinterpolationforcategories,TARGET_CATEGORIES,Categories,outputRaster -saga:multilevelbsplineinterpolationforcategories,TARGET_PROPABILITY,Probability,outputRaster -saga:multilevelbsplineinterpolationfromraster,TARGET_OUT_GRID,Grid,outputRaster -saga:multiplelinearregressionanalysis,NA,NA,NA -saga:multiplelinearregressionanalysisshapes,RESULTS,Results,outputVector -saga:multipleregressionanalysisgridandpredictorgrids,REGRESSION,Regression,outputRaster -saga:multipleregressionanalysisgridandpredictorgrids,RESIDUALS,Residuals,outputRaster -saga:multipleregressionanalysispointsandpredictorgrids,INFO_COEFF,Details,outputVector -saga:multipleregressionanalysispointsandpredictorgrids,INFO_MODEL,Details,outputVector -saga:multipleregressionanalysispointsandpredictorgrids,INFO_STEPS,Details,outputVector -saga:multipleregressionanalysispointsandpredictorgrids,RESIDUALS,Residuals,outputVector -saga:multipleregressionanalysispointsandpredictorgrids,REGRESSION,Regression,outputRaster -saga:multipleregressionanalysispointsandpredictorgrids,REGRESCORR,Regression with Residual Correction,outputRaster -saga:multipleregressionanalysispointsraster,INFO_COEFF,Details,outputVector -saga:multipleregressionanalysispointsraster,INFO_MODEL,Details,outputVector -saga:multipleregressionanalysispointsraster,INFO_STEPS,Details,outputVector -saga:multipleregressionanalysispointsraster,RESIDUALS,Residuals,outputVector -saga:multipleregressionanalysispointsraster,REGRESSION,Regression,outputRaster -saga:multipleregressionanalysisrasterraster,REGRESSION,Regression,outputRaster -saga:multipleregressionanalysisrasterraster,RESIDUALS,Residuals,outputRaster -saga:multipleregressionanalysisrasterraster,INFO_COEFF,Details,outputVector -saga:multipleregressionanalysisrasterraster,INFO_MODEL,Details,outputVector -saga:multipleregressionanalysisrasterraster,INFO_STEPS,Details,outputVector -saga:multiresolutionindexofvalleybottomflatnessmrvbf,MRVBF,MRVBF,outputRaster -saga:multiresolutionindexofvalleybottomflatnessmrvbf,MRRTF,MRRTF,outputRaster -saga:naturalneighbour,TARGET_OUT_GRID,Grid,outputRaster -saga:nearestneighbour,TARGET_OUT_GRID,Grid,outputRaster -saga:normalbayesclassificationopencv,PROBABILITY,Probability,outputRaster -saga:normalbayesclassificationopencv,CLASSES,Classification,outputRaster -saga:orderedweightedaveraging,OUTPUT,Output Grid,outputRaster -saga:ordinarykriging,PREDICTION,Prediction,outputRaster -saga:ordinarykriging,VARIANCE,Quality Measure,outputRaster -saga:overlandflowdistancetochannelnetwork,DISTANCE,Overland Flow Distance,outputRaster -saga:overlandflowdistancetochannelnetwork,DISTVERT,Vertical Overland Flow Distance,outputRaster -saga:overlandflowdistancetochannelnetwork,DISTHORZ,Horizontal Overland Flow Distance,outputRaster -saga:overlandflowkinematicwaved8,FLOW,Runoff,outputRaster -saga:overlandflowkinematicwaved8,GAUGES_FLOW,Flow at Gauges,outputVector -saga:paramemeltonruggednessnumber,AREA,Catchment Area,outputRaster -saga:paramemeltonruggednessnumber,ZMAX,Maximum Height,outputRaster -saga:paramemeltonruggednessnumber,MRN,Melton Ruggedness Number,outputRaster -saga:patching,COMPLETED,Completed Grid,outputRaster -saga:patternanalysis,RELATIVE,Relative Richness,outputRaster -saga:patternanalysis,DIVERSITY,Diversity,outputRaster -saga:patternanalysis,DOMINANCE,Dominance,outputRaster -saga:patternanalysis,FRAGMENTATION,Fragmentation,outputRaster -saga:patternanalysis,NDC,Number of Different Classes,outputRaster -saga:patternanalysis,CVN,Center Versus Neighbours,outputRaster -saga:petafterhargreavesgrid,PET,Potential Evapotranspiration,outputRaster -saga:petafterhargreavestable,NA,NA,NA -saga:pointdistances,DISTANCES,Distances,outputVector -saga:pointsfilter,FILTER,Filtered Points,outputVector -saga:pointstatisticsforpolygons,STATISTICS,Statistics,outputVector -saga:pointsthinning,THINNED,Thinned Points,outputVector -saga:polartocartesiancoordinates,CARTES,Cartesian Coordinates,outputVector -saga:polygoncentroids,CENTROIDS,Centroids,outputVector -saga:polygonclipping,S_OUTPUT,Output features,outputVector -saga:polygondissolveallpolygons,DISSOLVED,Dissolved,outputVector -saga:polygondissolvebyattribute,DISSOLVED,Dissolved,outputVector -saga:polygonidentity,RESULT,Identity,outputVector -saga:polygonlineintersection,INTERSECT,Intersection,outputVector -saga:polygonpartstoseparatepolygons,PARTS,Polygon Parts,outputVector -saga:polygonproperties,OUTPUT,Polygons with Property Attributes,outputVector -saga:polygonselfintersection,INTERSECT,Intersection,outputVector -saga:polygonshapeindices,INDEX,Shape Index,outputVector -saga:polygonstoedgesandnodes,EDGES,Edges,outputVector -saga:polygonstoedgesandnodes,NODES,Nodes,outputVector -saga:polygonunion,RESULT,Union,outputVector -saga:polygonupdate,RESULT,Updated polygons,outputVector -saga:polynomialregression,TARGET_OUT_GRID,Grid,outputRaster -saga:polynomialregression,RESIDUALS,Residuals,outputVector -saga:principlecomponentsanalysis,PCA,Principle Components,outputVector -saga:profilefrompointstable,RESULT,Result,outputVector -saga:profilesfromlines,PROFILE,Profiles,outputVector -saga:profilesfromlines,PROFILES,Profiles,outputVector -saga:proximityraster,DISTANCE,Distance,outputRaster -saga:proximityraster,DIRECTION,Direction,outputRaster -saga:proximityraster,ALLOCATION,Allocation,outputRaster -saga:quadtreestructuretopolygons,POLYGONS,Polygons,outputVector -saga:quadtreestructuretopolygons,LINES,Lines,outputVector -saga:quadtreestructuretopolygons,POINTS,Duplicated Points,outputVector -saga:radiusofvarianceraster,RESULT,Variance Radius,outputRaster -saga:randomfield,OUT_GRID,Random Field,outputRaster -saga:randomforestclassificationopencv,CLASSES,Classification,outputRaster -saga:randomforestpresencepredictionvigra,PREDICTION,Presence Prediction,outputRaster -saga:randomforestpresencepredictionvigra,PROBABILITY,Presence Probability,outputRaster -saga:randomterraingeneration,TARGET_GRID,Grid,outputRaster -saga:rankfilter,RESULT,Filtered Grid,outputRaster -saga:rasterbuffer,BUFFER,Buffer Grid,outputRaster -saga:rastercalculator,RESULT,Calculated,outputRaster -saga:rastercellindex,INDEX,Sorted Grid,outputRaster -saga:rasterdifference,C,Difference ,outputRaster -saga:rasterdivision,C,Quotient,outputRaster -saga:rasterize,GRID,Rasterized,outputRaster -saga:rastermasking,MASKED,Masked Grid,outputRaster -saga:rasternormalisation,OUTPUT,Normalised Grid,outputRaster -saga:rasterorientation,RESULT,Changed Grid,outputRaster -saga:rasterproduct,RESULT,Product,outputRaster -saga:rasterproximitybuffer,DISTANCE,Distance Grid,outputRaster -saga:rasterproximitybuffer,ALLOC,Allocation Grid,outputRaster -saga:rasterproximitybuffer,BUFFER,Buffer Grid,outputRaster -saga:rasterskeletonization,RESULT,Skeleton,outputRaster -saga:rasterskeletonization,VECTOR,Skeleton,outputVector -saga:rasterssum,RESULT,Sum,outputRaster -saga:rasterstandardisation,OUTPUT,Standardised Grid,outputRaster -saga:rasterstatisticsforpolygons,RESULT,Statistics,outputVector -saga:rastervaluestopoints,SHAPES,Shapes,outputVector -saga:rastervaluestopointsrandomly,POINTS,Points,outputVector -saga:rastervolume,NA,NA,NA -saga:realsurfacearea,AREA,Surface Area,outputRaster -saga:reclassifyvalues,RESULT,Reclassified Grid,outputRaster -saga:reclassifyvaluesrange,RESULT,Reclassified Grid,outputRaster -saga:reclassifyvaluessimple,GRID_OUT,Changed Grid,outputRaster -saga:reclassifyvaluessingle,RESULT,Reclassified Grid,outputRaster -saga:reclassifyvaluestable,RESULT,Reclassified Grid,outputRaster -saga:regressionanalysis,REGRESSION,Regression,outputRaster -saga:regressionanalysis,RESIDUAL,Residuals,outputVector -saga:regressionanalysispointsandpredictorgrid,REGRESSION,Regression,outputRaster -saga:regressionanalysispointsandpredictorgrid,RESIDUAL,Residuals,outputVector -saga:regressionkriging,REGRESSION,Regression,outputRaster -saga:regressionkriging,PREDICTION,Prediction,outputRaster -saga:regressionkriging,RESIDUALS,Residuals,outputRaster -saga:regressionkriging,VARIANCE,Quality Measure,outputRaster -saga:regressionkriging,INFO_COEFF,Regression,outputVector -saga:regressionkriging,INFO_MODEL,Regression,outputVector -saga:regressionkriging,INFO_STEPS,Regression,outputVector -saga:relativeheightsandslopepositions,HO,Slope Height,outputRaster -saga:relativeheightsandslopepositions,HU,Valley Depth,outputRaster -saga:relativeheightsandslopepositions,NH,Normalized Height,outputRaster -saga:relativeheightsandslopepositions,SH,Standardized Height,outputRaster -saga:relativeheightsandslopepositions,MS,Mid,outputRaster -saga:removeduplicatepoints,RESULT,Result,outputVector -saga:removesmallpixelclumpstonodata,OUTPUT,Filtered Grid,outputRaster -saga:representativeness,RESULT,Representativeness,outputRaster -saga:resampling,OUTPUT,Grid,outputRaster -saga:resamplingfilter,LOPASS,Low Pass Filter,outputRaster -saga:resamplingfilter,HIPASS,High Pass Filter,outputRaster -saga:residualanalysis,MEAN,Mean Value,outputRaster -saga:residualanalysis,DIFF,Difference from Mean Value,outputRaster -saga:residualanalysis,STDDEV,Standard Deviation,outputRaster -saga:residualanalysis,RANGE,Value Range,outputRaster -saga:residualanalysis,MIN,Minimum Value,outputRaster -saga:residualanalysis,MAX,Maximum Value,outputRaster -saga:residualanalysis,DEVMEAN,Deviation from Mean Value,outputRaster -saga:residualanalysis,PERCENT,Percentile,outputRaster -saga:rgbcomposite,RGB,Output RGB,outputRaster -saga:riverbasin,OUTPUT2,Grad,outputRaster -saga:riverbasin,OUTPUT3,Direc,outputRaster -saga:riverbasin,OUTPUT4,HGGrad,outputRaster -saga:riverbasin,OUTPUT5,RivSpeed,outputRaster -saga:riverbasin,OUTPUT6,Coordinates,outputRaster -saga:riverbasin,OUTPUT7,BasinShare,outputRaster -saga:riverbasin,OUTPUT8,statWUse,outputRaster -saga:riverbasin,OUTPUT9,NumInFlowCells,outputRaster -saga:rivergridgeneration,OUTPUT,HG Raster,outputRaster -saga:runningaverage,OUTPUT,Output,outputVector -saga:sagawetnessindex,AREA,Catchment area,outputRaster -saga:sagawetnessindex,SLOPE,Catchment slope,outputRaster -saga:sagawetnessindex,AREA_MOD,Modified catchment area,outputRaster -saga:sagawetnessindex,TWI,Topographic Wetness Index,outputRaster -saga:seededregiongrowing,SEGMENTS,Segments,outputRaster -saga:seededregiongrowing,SIMILARITY,Similarity,outputRaster -saga:seedgeneration,SEED_GRID,Seeds Grid,outputRaster -saga:seedgeneration,VARIANCE,Variance,outputRaster -saga:seedgeneration,SEED_POINTS,Seeds Points,outputVector -saga:separatepointsbydirection,OUTPUT,Point direction,outputVector -saga:sharedpolygonedges,EDGES,Edges,outputVector -saga:shrinkandexpand,RESULT,Result Grid,outputRaster -saga:sievingclasses,OUTPUT,Sieved Classes,outputRaster -saga:simplefilter,RESULT,Filtered Grid,outputRaster -saga:simplefilterwithinshapes,RESULT,Filtered Grid,outputRaster -saga:simplekriging,PREDICTION,Prediction,outputRaster -saga:simplekriging,VARIANCE,Quality Measure,outputRaster -saga:simpleregiongrowing,SEGMENTS,Segments,outputRaster -saga:simpleregiongrowing,SIMILARITY,Similarity,outputRaster -saga:simpleregiongrowing,TABLE,Seeds,outputVector -saga:simulation,TIME,Time,outputRaster -saga:simulation,FLAME,Flame Length,outputRaster -saga:simulation,INTENSITY,Intensity,outputRaster -saga:singlevaluedecompositionopencv,OUTPUT,Output,outputRaster -saga:sinkdrainageroutedetection,SINKROUTE,Sink Route,outputRaster -saga:sinkremoval,DEM_PREPROC,Preprocessed DEM,outputRaster -saga:skyviewfactor,VISIBLE,Visible Sky,outputRaster -saga:skyviewfactor,SVF,Sky View Factor,outputRaster -saga:skyviewfactor,SIMPLE,Sky View Factor ,outputRaster -saga:skyviewfactor,TERRAIN,Terrain View Factor,outputRaster -saga:skyviewfactor,DISTANCE,Terrain View Factor,outputRaster -saga:slopeaspectcurvature,SLOPE,Slope,outputRaster -saga:slopeaspectcurvature,ASPECT,Aspect,outputRaster -saga:slopeaspectcurvature,C_GENE,General Curvature,outputRaster -saga:slopeaspectcurvature,C_PLAN,Plan Curvature,outputRaster -saga:slopeaspectcurvature,C_PROF,Profile Curvature,outputRaster -saga:slopeaspectcurvature,C_TANG,Tangential Curvature,outputRaster -saga:slopeaspectcurvature,C_LONG,Longitudinal Curvature,outputRaster -saga:slopeaspectcurvature,C_CROS,Cross,outputRaster -saga:slopeaspectcurvature,C_MINI,Minimal Curvature,outputRaster -saga:slopeaspectcurvature,C_MAXI,Maximal Curvature,outputRaster -saga:slopeaspectcurvature,C_TOTA,Total Curvature,outputRaster -saga:slopeaspectcurvature,C_ROTO,Flow,outputRaster -saga:slopelength,LENGTH,Slope Length,outputRaster -saga:slopelimitedflowaccumulation,FLOW,Flow Accumulation,outputRaster -saga:smoothingvigra,OUTPUT,Output,outputRaster -saga:snappointstogrid,OUTPUT,Result,outputVector -saga:snappointstogrid,MOVES,Moves,outputVector -saga:snappointstolines,OUTPUT,Result,outputVector -saga:snappointstolines,MOVES,Moves,outputVector -saga:snappointstopoints,OUTPUT,Result,outputVector -saga:snappointstopoints,MOVES,Moves,outputVector -saga:soiltextureclassification,TEXTURE,Soil Texture,outputRaster -saga:soiltextureclassification,SUM,Sum,outputRaster -saga:spatialpointpatternanalysis,CENTRE,Mean Centre,outputVector -saga:spatialpointpatternanalysis,STDDIST,Standard Distance,outputVector -saga:spatialpointpatternanalysis,BBOX,Bounding Box,outputVector -saga:splitlinesatpoints,INTERSECT,Intersection,outputVector -saga:splitlineswithlines,INTERSECT,Intersection,outputVector -saga:splitrgbbands,R,Output R band layer,outputRaster -saga:splitrgbbands,G,Output G band layer,outputRaster -saga:splitrgbbands,B,Output B band layer,outputRaster -saga:splitshapeslayerrandomly,A,Group A,outputVector -saga:splitshapeslayerrandomly,B,Group B,outputVector -saga:statisticsforrasters,MEAN,Arithmetic Mean,outputRaster -saga:statisticsforrasters,MIN,Minimum,outputRaster -saga:statisticsforrasters,MAX,Maximum,outputRaster -saga:statisticsforrasters,VAR,Variance,outputRaster -saga:statisticsforrasters,SUM,Sum,outputRaster -saga:statisticsforrasters,RANGE,Range,outputRaster -saga:statisticsforrasters,PCTL,Percentile,outputRaster -saga:statisticsforrasters,STDDEV,Standard Deviation,outputRaster -saga:statisticsforrasters,STDDEVLO,Mean less Standard Deviation,outputRaster -saga:statisticsforrasters,STDDEVHI,Mean plus Standard Deviation,outputRaster -saga:strahlerorder,STRAHLER,Strahler Order,outputRaster -saga:streampowerindex,SPI,Stream Power Index,outputRaster -saga:successiveflowrouting,FLOW,Flow,outputRaster -saga:supervisedclassification,CLASS_INFO,Class Information,outputVector -saga:supervisedclassification,CLASSES,Classification,outputRaster -saga:supervisedclassification,QUALITY,Quality,outputRaster -saga:supervisedclassificationforgrids,CLASSES,Classification,outputRaster -saga:supervisedclassificationforgrids,QUALITY,Quality,outputRaster -saga:supervisedclassificationforshapes,CLASSES,Classification,outputVector -saga:supportvectormachineclassificationopencv,CLASSES,Classification,outputRaster -saga:surfaceandgradient,SURF,Surface,outputRaster -saga:surfaceandgradient,GRAD,Gradient,outputRaster -saga:surfacegradientandconcentration,SURF,Surface,outputRaster -saga:surfacegradientandconcentration,GRAD,Gradient,outputRaster -saga:surfacegradientandconcentration,CONC,Concentration,outputRaster -saga:surfacespecificpoints,RESULT,Result,outputRaster -saga:svmclassification,CLASSES,Classification,outputRaster -saga:symmetricaldifference,RESULT,Symmetrical Difference,outputVector -saga:tasseledcaptransformation,BRIGHTNESS,Brightness,outputRaster -saga:tasseledcaptransformation,GREENNESS,Greenness,outputRaster -saga:tasseledcaptransformation,WETNESS,Wetness,outputRaster -saga:tcilow,TCILOW,TCI Low,outputRaster -saga:terrainmapview,SHADE,Shade,outputRaster -saga:terrainmapview,OPENNESS,Openness,outputRaster -saga:terrainmapview,SLOPE,Slope,outputRaster -saga:terrainmapview,CONTOURS,Contours,outputVector -saga:terrainruggednessindextri,TRI,Terrain Ruggedness Index ,outputRaster -saga:terrainsurfaceclassificationiwahashiandpike,LANDFORMS,Landforms,outputRaster -saga:terrainsurfaceconvexity,CONVEXITY,Convexity,outputRaster -saga:terrainsurfacetexture,TEXTURE,Texture,outputRaster -saga:thiessenpolygons,POLYGONS,Polygons,outputVector -saga:thinplatespline,TARGET_OUT_GRID,Grid,outputRaster -saga:thinplatesplinetin,TARGET_OUT_GRID,Grid,outputRaster -saga:thresholdrasterbuffer,BUFFER,Buffer Grid,outputRaster -saga:topofatmospherereflectance,RF_MSS01,Reflectance Band 1,outputRaster -saga:topofatmospherereflectance,RF_MSS02,Reflectance Band 2,outputRaster -saga:topofatmospherereflectance,RF_MSS03,Reflectance Band 3,outputRaster -saga:topofatmospherereflectance,RF_MSS04,Reflectance Band 4,outputRaster -saga:topofatmospherereflectance,RF_ETM01,Reflectance Band 1,outputRaster -saga:topofatmospherereflectance,RF_ETM02,Reflectance Band 2,outputRaster -saga:topofatmospherereflectance,RF_ETM03,Reflectance Band 3,outputRaster -saga:topofatmospherereflectance,RF_ETM04,Reflectance Band 4,outputRaster -saga:topofatmospherereflectance,RF_ETM05,Reflectance Band 5,outputRaster -saga:topofatmospherereflectance,RF_ETM07,Reflectance Band 7,outputRaster -saga:topofatmospherereflectance,RF_OLI01,Reflectance Band 1,outputRaster -saga:topofatmospherereflectance,RF_OLI02,Reflectance Band 2,outputRaster -saga:topofatmospherereflectance,RF_OLI03,Reflectance Band 3,outputRaster -saga:topofatmospherereflectance,RF_OLI04,Reflectance Band 4,outputRaster -saga:topofatmospherereflectance,RF_OLI05,Reflectance Band 5,outputRaster -saga:topofatmospherereflectance,RF_OLI06,Reflectance Band 6,outputRaster -saga:topofatmospherereflectance,RF_OLI07,Reflectance Band 7,outputRaster -saga:topofatmospherereflectance,RF_OLI09,Reflectance Band 9,outputRaster -saga:topofatmospherereflectance,RF__TM06,Reflectance Band 6,outputRaster -saga:topofatmospherereflectance,RF_ETM61,Reflectance Band 61,outputRaster -saga:topofatmospherereflectance,RF_ETM62,Reflectance Band 62,outputRaster -saga:topofatmospherereflectance,RF_OLI10,Reflectance Band 10,outputRaster -saga:topofatmospherereflectance,RF_OLI11,Reflectance Band 11,outputRaster -saga:topofatmospherereflectance,RF_PAN08,Reflectance Band 8,outputRaster -saga:topographiccorrection,CORRECTED,Corrected Image,outputRaster -saga:topographicopenness,POS,Positive Openness,outputRaster -saga:topographicopenness,NEG,Negative Openness,outputRaster -saga:topographicpositionindextpi,TPI,Topographic Position Index,outputRaster -saga:topographicwetnessindextwi,TWI,Topographic Wetness Index,outputRaster -saga:tpibasedlandformclassification,LANDFORMS,Landforms,outputRaster -saga:transectthroughpolygonshapefile,TRANSECT_RESULT,Result table,outputVector -saga:transformvectorlayer,OUT,Transformed,outputVector -saga:transposerasterlayers,TRANSPOSED,Transposed Grid,outputRaster -saga:triangulation,TARGET_OUT_GRID,Grid,outputRaster -saga:universalkriging,PREDICTION,Prediction,outputRaster -saga:universalkriging,VARIANCE,Quality Measure,outputRaster -saga:upslopeanddownslopecurvature,C_LOCAL,Local Curvature,outputRaster -saga:upslopeanddownslopecurvature,C_UP,Upslope Curvature,outputRaster -saga:upslopeanddownslopecurvature,C_UP_LOCAL,Local Upslope Curvature,outputRaster -saga:upslopeanddownslopecurvature,C_DOWN,Downslope Curvature,outputRaster -saga:upslopeanddownslopecurvature,C_DOWN_LOCAL,Local Downslope Curvature,outputRaster -saga:upslopearea,AREA,Upslope Area,outputRaster -saga:userdefinedfilter,RESULT,Filtered Grid,outputRaster -saga:valleyandridgedetectiontophatapproach,VALLEY,Valley Depth,outputRaster -saga:valleyandridgedetectiontophatapproach,HILL,Hill Height,outputRaster -saga:valleyandridgedetectiontophatapproach,VALLEY_IDX,Valley Index,outputRaster -saga:valleyandridgedetectiontophatapproach,HILL_IDX,Hill Index,outputRaster -saga:valleyandridgedetectiontophatapproach,SLOPE_IDX,Hillslope Index,outputRaster -saga:valleydepth,VALLEY_DEPTH,Valley Depth,outputRaster -saga:valleydepth,RIDGE_LEVEL,Ridge Level,outputRaster -saga:variabledistancebuffer,BUFFER,Buffer,outputVector -saga:variogramcloud,RESULT,Variogram Cloud,outputVector -saga:variogramsurface,COUNT,Number of Pairs,outputRaster -saga:variogramsurface,VARIANCE,Variogram Surface,outputRaster -saga:variogramsurface,COVARIANCE,Covariance Surface,outputRaster -saga:vectorisinggridclasses,POLYGONS,Vectorized,outputVector -saga:vectorruggednessmeasurevrm,VRM,Vector Terrain Ruggedness ,outputRaster -saga:vegetationindexdistancebased,PVI0,Perpendicular Vegetation Index ,outputRaster -saga:vegetationindexdistancebased,PVI1,Perpendicular Vegetation Index ,outputRaster -saga:vegetationindexdistancebased,PVI2,Perpendicular Vegetation Index ,outputRaster -saga:vegetationindexdistancebased,PVI3,Perpendicular Vegetation Index ,outputRaster -saga:vegetationindexdistancebased,TSAVI,Transformed Soil Adjusted Vegetation Index ,outputRaster -saga:vegetationindexdistancebased,ATSAVI,Transformed Soil Adjusted Vegetation Index ,outputRaster -saga:vegetationindexslopebased,DVI,Difference Vegetation Index,outputRaster -saga:vegetationindexslopebased,NDVI,Normalized Difference Vegetation Index,outputRaster -saga:vegetationindexslopebased,RVI,Ratio Vegetation Index,outputRaster -saga:vegetationindexslopebased,NRVI,Normalized Ratio Vegetation Index,outputRaster -saga:vegetationindexslopebased,TVI,Transformed Vegetation Index,outputRaster -saga:vegetationindexslopebased,CTVI,Corrected Transformed Vegetation Index,outputRaster -saga:vegetationindexslopebased,TTVI,Thiam,outputRaster -saga:vegetationindexslopebased,SAVI,Soil Adjusted Vegetation Index,outputRaster -saga:verticaldistancetochannelnetwork,DISTANCE,Vertical Distance to Channel Network,outputRaster -saga:verticaldistancetochannelnetwork,BASELEVEL,Channel Network Base Level,outputRaster -saga:warpingshapes,OUTPUT,Output,outputVector -saga:waterretentioncapacity,OUTPUT,Final Parameters,outputVector -saga:waterretentioncapacity,RETENTION,Water Retention Capacity,outputRaster -saga:watershedbasins,BASINS,Watershed Basins,outputRaster -saga:watershedsegmentation,SEGMENTS,Segments,outputRaster -saga:watershedsegmentation,SEEDS,Seed Points,outputVector -saga:watershedsegmentation,BORDERS,Borders,outputRaster -saga:watershedsegmentationvigra,OUTPUT,Segmentation,outputRaster -saga:windeffect,EFFECT,Wind Effect,outputRaster -saga:windeffect,LUV,Windward Effect,outputRaster -saga:windeffect,LEE,Leeward Effect,outputRaster -saga:windexpositionindex,EXPOSITION,Wind Exposition,outputRaster -saga:zonalmultipleregressionanalysispointsandpredictorgrids,RESIDUALS,Residuals,outputVector -saga:zonalmultipleregressionanalysispointsandpredictorgrids,REGRESSION,Regression,outputRaster -saga:zonalrasterstatistics,OUTTAB,Zonal Statistics,outputVector +qneat3:OdMatrixFromLayersAsLines,OUTPUT,Output OD Matrix,outputVector +qneat3:OdMatrixFromLayersAsTable,OUTPUT,Output OD Matrix,outputVector +qneat3:OdMatrixFromPointsAsCsv,OUTPUT,Output OD Matrix,outputFile +qneat3:OdMatrixFromPointsAsLines,OUTPUT,Output OD Matrix,outputVector +qneat3:OdMatrixFromPointsAsTable,OUTPUT,Output OD Matrix,outputVector +qneat3:isoareaascontoursfromlayer,OUTPUT_CONTOURS,Output Contours,outputVector +qneat3:isoareaascontoursfromlayer,OUTPUT_INTERPOLATION,Output Interpolation,outputRaster +qneat3:isoareaascontoursfrompoint,OUTPUT_CONTOURS,Output Contours,outputVector +qneat3:isoareaascontoursfrompoint,OUTPUT_INTERPOLATION,Output Interpolation,outputRaster +qneat3:isoareaasinterpolationfromlayer,OUTPUT,Output Interpolation,outputRaster +qneat3:isoareaasinterpolationfrompoint,OUTPUT,Output Interpolation,outputRaster +qneat3:isoareaaspointcloudfromlayer,OUTPUT,Output Pointcloud,outputVector +qneat3:isoareaaspointcloudfrompoint,OUTPUT,Output Pointcloud,outputVector +qneat3:isoareaaspolygonsfromlayer,OUTPUT_INTERPOLATION,Output Interpolation,outputRaster +qneat3:isoareaaspolygonsfromlayer,OUTPUT_POLYGONS,Output Polygon,outputVector +qneat3:isoareaaspolygonsfrompoint,OUTPUT_INTERPOLATION,Output Interpolation,outputRaster +qneat3:isoareaaspolygonsfrompoint,OUTPUT_POLYGONS,Output Polygon,outputVector +qneat3:shortestpathpointtopoint,OUTPUT,Shortest Path Layer,outputVector +sagang:01:asimplelittersystem,TABLE,Results,outputVector +sagang:02:carboncyclesimulationforterrestrialbiomass,TABLE,Results,outputVector +sagang:03:spatiallydistributedsimulationofsoilnitrogendynamics,NSTORE,Soil Nitrogen,outputRaster +sagang:3dpointsselection,COPY,Copy Selection,outputVector +sagang:accumulatedcost,ACCUMULATED,Accumulated Cost,outputRaster +sagang:accumulatedcost,ALLOCATION,Allocation,outputRaster +sagang:accumulationfunctions,FLUX,Flux,outputRaster +sagang:accumulationfunctions,STATE_OUT,State t + 1,outputRaster +sagang:addcoordinatestopoints,OUTPUT,Output,outputVector +sagang:addrastervaluestofeatures,RESULT,Result,outputVector +sagang:addrastervaluestopoints,RESULT,Result,outputVector +sagang:aggregatepointobservations,AGGREGATED,Aggregated,outputVector +sagang:aggregationindex,RESULT,Result,outputVector +sagang:airpressureadjustment,P_ADJ,Adjusted Air Pressure,outputRaster +sagang:analyticalhierarchyprocess,OUTPUT,Output Grid,outputRaster +sagang:analyticalhillshading,SHADE,Analytical Hillshading,outputRaster +sagang:angmap,E,Angle,outputRaster +sagang:angmap,F,CL dipdir,outputRaster +sagang:angmap,G,CL dip,outputRaster +sagang:angulardistanceweighted,CV_RESIDUALS,Cross Validation Residuals,outputVector +sagang:angulardistanceweighted,CV_SUMMARY,Cross Validation Summary,outputVector +sagang:angulardistanceweighted,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:annualcourseofdailyinsolation,SOLARRAD,Solar Radiation,outputVector +sagang:automatedcloudcoverassessment,CLOUD,Cloud Cover,outputRaster +sagang:averagewithmask1,RESULT,AWM1 Grid,outputRaster +sagang:averagewithmask2,RESULT,AWM2 Grid,outputRaster +sagang:averagewiththereshold1,RESULT,AWT Grid,outputRaster +sagang:averagewiththereshold2,RESULT,AWT Grid,outputRaster +sagang:averagewiththereshold3,RESULT,AWT Grid,outputRaster +sagang:basicterrainanalysis,ASPECT,Aspect,outputRaster +sagang:basicterrainanalysis,BASINS,Drainage Basins,outputVector +sagang:basicterrainanalysis,CHANNELS,Channel Network,outputVector +sagang:basicterrainanalysis,CHNL_BASE,Channel Network Base Level,outputRaster +sagang:basicterrainanalysis,CHNL_DIST,Channel Network Distance,outputRaster +sagang:basicterrainanalysis,CONVERGENCE,Convergence Index,outputRaster +sagang:basicterrainanalysis,FLOW,Total Catchment Area,outputRaster +sagang:basicterrainanalysis,HCURV,Plan Curvature,outputRaster +sagang:basicterrainanalysis,LSFACTOR,LS-Factor,outputRaster +sagang:basicterrainanalysis,RSP,Relative Slope Position,outputRaster +sagang:basicterrainanalysis,SHADE,Analytical Hillshading,outputRaster +sagang:basicterrainanalysis,SINKS,Closed Depressions,outputRaster +sagang:basicterrainanalysis,SLOPE,Slope,outputRaster +sagang:basicterrainanalysis,VALL_DEPTH,Valley Depth,outputRaster +sagang:basicterrainanalysis,VCURV,Profile Curvature,outputRaster +sagang:basicterrainanalysis,WETNESS,Topographic Wetness Index,outputRaster +sagang:binaryerosionreconstruction,OUTPUT_GRID,Output Grid,outputRaster +sagang:bioclimaticvariables,BIO_01,Annual Mean Temperature,outputRaster +sagang:bioclimaticvariables,BIO_02,Mean Diurnal Range,outputRaster +sagang:bioclimaticvariables,BIO_03,Isothermality,outputRaster +sagang:bioclimaticvariables,BIO_04,Temperature Seasonality,outputRaster +sagang:bioclimaticvariables,BIO_05,Maximum Temperature of Warmest Month,outputRaster +sagang:bioclimaticvariables,BIO_06,Minimum Temperature of Coldest Month,outputRaster +sagang:bioclimaticvariables,BIO_07,Temperature Annual Range,outputRaster +sagang:bioclimaticvariables,BIO_08,Mean Temperature of Wettest Quarter,outputRaster +sagang:bioclimaticvariables,BIO_09,Mean Temperature of Driest Quarter,outputRaster +sagang:bioclimaticvariables,BIO_10,Mean Temperature of Warmest Quarter,outputRaster +sagang:bioclimaticvariables,BIO_11,Mean Temperature of Coldest Quarter,outputRaster +sagang:bioclimaticvariables,BIO_12,Annual Precipitation,outputRaster +sagang:bioclimaticvariables,BIO_13,Precipitation of Wettest Month,outputRaster +sagang:bioclimaticvariables,BIO_14,Precipitation of Driest Month,outputRaster +sagang:bioclimaticvariables,BIO_15,Precipitation Seasonality,outputRaster +sagang:bioclimaticvariables,BIO_16,Precipitation of Wettest Quarter,outputRaster +sagang:bioclimaticvariables,BIO_17,Precipitation of Driest Quarter,outputRaster +sagang:bioclimaticvariables,BIO_18,Precipitation of Warmest Quarter,outputRaster +sagang:bioclimaticvariables,BIO_19,Precipitation of Coldest Quarter,outputRaster +sagang:breachdepressions,NOSINKS,Preprocessed,outputRaster +sagang:bsplineapproximation,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:burnstreamnetworkintodem,BURN,Processed DEM,outputRaster +sagang:catchmentarea,ACCU_LEFT,Accumulated Material (Left Side),outputRaster +sagang:catchmentarea,ACCU_RIGHT,Accumulated Material (Right Side),outputRaster +sagang:catchmentarea,ACCU_TOTAL,Accumulated Material,outputRaster +sagang:catchmentarea,FLOW,Flow Accumulation,outputRaster +sagang:catchmentarea,FLOW_LENGTH,Flow Path Length,outputRaster +sagang:catchmentarea,VAL_MEAN,Mean over Catchment,outputRaster +sagang:catchmentarea,WEIGHT_LOSS,Loss through Negative Weights,outputRaster +sagang:catchmentareaflowtracing,ACCU_LEFT,Accumulated Material (Left Side),outputRaster +sagang:catchmentareaflowtracing,ACCU_RIGHT,Accumulated Material (Right Side),outputRaster +sagang:catchmentareaflowtracing,ACCU_TOTAL,Accumulated Material,outputRaster +sagang:catchmentareaflowtracing,FLOW,Flow Accumulation,outputRaster +sagang:catchmentareaflowtracing,VAL_MEAN,Mean over Catchment,outputRaster +sagang:catchmentarearecursive,ACCU_LEFT,Accumulated Material (Left Side),outputRaster +sagang:catchmentarearecursive,ACCU_RIGHT,Accumulated Material (Right Side),outputRaster +sagang:catchmentarearecursive,ACCU_TOTAL,Accumulated Material,outputRaster +sagang:catchmentarearecursive,FLOW,Flow Accumulation,outputRaster +sagang:catchmentarearecursive,FLOW_LENGTH,Flow Path Length,outputRaster +sagang:catchmentarearecursive,VAL_MEAN,Mean over Catchment,outputRaster +sagang:catchmentarearecursive,WEIGHT_LOSS,Loss through Negative Weights,outputRaster +sagang:categoricalcoincidence,CATEGORIES,Number of Categories,outputRaster +sagang:categoricalcoincidence,COINCIDENCE,Coincidence,outputRaster +sagang:categoricalcoincidence,MAJ_COUNT,Dominance of Majority,outputRaster +sagang:categoricalcoincidence,MAJ_VALUE,Value of Majority,outputRaster +sagang:cellbalance,BALANCE,Cell Balance,outputRaster +sagang:changeagridsnodatavalue,OUTPUT,Changed Grid,outputRaster +sagang:changeagridsnodatavaluebulkprocessing,OUTPUT,Changed Grids,outputRaster +sagang:changedatastorage,OUTPUT,Converted Grid,outputRaster +sagang:changegridvaluesfloodfill,GRID_OUT,Changed Grid,outputRaster +sagang:changelongitudinalrangeforgrids,OUTPUT,Output,outputRaster +sagang:channelnetwork,CHNLNTWRK,Channel Network,outputRaster +sagang:channelnetwork,CHNLROUTE,Channel Direction,outputRaster +sagang:channelnetwork,SHAPES,Channel Network,outputVector +sagang:channelnetworkanddrainagebasins,BASIN,Drainage Basins,outputRaster +sagang:channelnetworkanddrainagebasins,BASINS,Drainage Basins,outputVector +sagang:channelnetworkanddrainagebasins,CONNECTION,Flow Connectivity,outputRaster +sagang:channelnetworkanddrainagebasins,DIRECTION,Flow Direction,outputRaster +sagang:channelnetworkanddrainagebasins,NODES,Junctions,outputVector +sagang:channelnetworkanddrainagebasins,ORDER,Strahler Order,outputRaster +sagang:channelnetworkanddrainagebasins,SEGMENTS,Channels,outputVector +sagang:cliffmetrics,CLIFF_TOE,Cliff Toe Points,outputVector +sagang:cliffmetrics,CLIFF_TOP,Cliff Top Points,outputVector +sagang:cliffmetrics,COAST,Coastline,outputVector +sagang:cliffmetrics,COAST_CURVATURE,Coastline Curvature,outputVector +sagang:cliffmetrics,COAST_POINT,Coast Points,outputVector +sagang:cliffmetrics,INVALID_NORMALS,Invalid Coastline-Normal Profiles,outputVector +sagang:cliffmetrics,NORMALS,Coastline-Normal Profiles,outputVector +sagang:cliffmetrics,PROFILES,Profile Data,outputVector +sagang:cliffmetrics,RASTER_COAST,Coastline,outputRaster +sagang:cliffmetrics,RASTER_NORMAL,Normals,outputRaster +sagang:cliffmetrics,SEDIMENT_TOP,Sediment Top Elevation,outputRaster +sagang:climateclassification,CLASSES,Climate Classification,outputRaster +sagang:clipgrids,CLIPPED,Clipped Grids,outputRaster +sagang:clippointswithpolygons,CLIPS,Clipped Points,outputVector +sagang:cliprasterwithpolygon,OUTPUT,Output,outputRaster +sagang:closegaps,RESULT,Changed Grid,outputRaster +sagang:closegapswithspline,CLOSED,Closed Gaps Grid,outputRaster +sagang:closegapswithstepwiseresampling,RESULT,Result,outputRaster +sagang:closeonecellgaps,RESULT,Changed Grid,outputRaster +sagang:clouddetection,CLOUDS,Clouds,outputRaster +sagang:cloudoverlap,BLOCKS,Number of Cloud Blocks,outputRaster +sagang:cloudoverlap,COVER,Total Cloud Cover,outputRaster +sagang:coldairflow,AIR,Cold Air Height,outputRaster +sagang:coldairflow,VELOCITY,Velocity,outputRaster +sagang:colournormalizedbroveysharpening,B_SHARP,Blue,outputRaster +sagang:colournormalizedbroveysharpening,G_SHARP,Green,outputRaster +sagang:colournormalizedbroveysharpening,R_SHARP,Red,outputRaster +sagang:colournormalizedbroveysharpening,SHARPEN,Sharpened Channels,outputRaster +sagang:colournormalizedspectralsharpening,SHARPEN,Sharpened Channels,outputRaster +sagang:combineclasses,OUTPUT,Output,outputRaster +sagang:concentration,CONC,Concentration,outputRaster +sagang:confusionmatrixpolygonsgrid,CLASSES,Class Values,outputVector +sagang:confusionmatrixpolygonsgrid,CONFUSION,Confusion Matrix,outputVector +sagang:confusionmatrixpolygonsgrid,SUMMARY,Summary,outputVector +sagang:confusionmatrixtwogrids,CLASSES,Class Values,outputVector +sagang:confusionmatrixtwogrids,COMBINED,Combined Classes,outputRaster +sagang:confusionmatrixtwogrids,CONFUSION,Confusion Matrix,outputVector +sagang:confusionmatrixtwogrids,SUMMARY,Summary,outputVector +sagang:connectivityanalysis,FILTERED_MASK,Filtered Image,outputRaster +sagang:connectivityanalysis,OUTLINES,Outlines,outputVector +sagang:connectivityanalysis,SYMBOLIC_IMAGE,Symbolic Image,outputRaster +sagang:constantgrid,OUT_GRID,Target Grid,outputRaster +sagang:contourlines,CONTOUR,Contour,outputVector +sagang:contourlines,POLYGONS,Polygons,outputVector +sagang:contourlinesfrompoints,CONTOUR,Contour Lines,outputVector +sagang:convergenceindex,RESULT,Convergence Index,outputRaster +sagang:convergenceindexsearchradius,CONVERGENCE,Convergence Index,outputRaster +sagang:convertlinestopoints,POINTS,Points,outputVector +sagang:convertlinestopolygons,POLYGONS,Polygons,outputVector +sagang:convertmultipointstopoints,POINTS,Points,outputVector +sagang:convertpointstolines,LINES,Lines,outputVector +sagang:convertpolygonlineverticestopoints,POINTS,Points,outputVector +sagang:convertpolygonstolines,LINES,Lines,outputVector +sagang:converttabletopoints,POINTS,Points,outputVector +sagang:convertvertextype2d3d,OUTPUT,Output,outputVector +sagang:convexhull,BOXES,Minimum Bounding Box,outputVector +sagang:convexhull,HULLS,Convex Hull,outputVector +sagang:conwaysgameoflife,LIFE,Life,outputRaster +sagang:coordinateconversiongrids,TARGET_X,Projected X Coordinates,outputRaster +sagang:coordinateconversiongrids,TARGET_Y,Projected Y Coordinates,outputRaster +sagang:coordinatetransformationgrid,GRID,Target,outputRaster +sagang:coordinatetransformationgrid,OUT_X,X Coordinates,outputRaster +sagang:coordinatetransformationgrid,OUT_Y,Y Coordinates,outputRaster +sagang:coordinatetransformationgridlist,GRIDS,Target,outputRaster +sagang:coordinatetransformationgridlist,OUT_X,X Coordinates,outputRaster +sagang:coordinatetransformationgridlist,OUT_Y,Y Coordinates,outputRaster +sagang:coordinatetransformationshapeslist,TARGET,Target,outputVector +sagang:copygrid,COPY,Copy,outputRaster +sagang:copyselectiontonewshapeslayer,OUTPUT,Output,outputVector +sagang:copyshapes,COPY,Copy,outputVector +sagang:copyshapesfromregion,CUT,Copy,outputVector +sagang:coverageofcategories,COVERAGES,Coverages,outputRaster +sagang:covereddistance,RESULT,Covered Distance,outputRaster +sagang:creategraticule,GRATICULE_LINE,Graticule,outputVector +sagang:creategraticule,GRATICULE_RECT,Graticule,outputVector +sagang:createpointgrid,POINTS,Points,outputVector +sagang:createrandompoints,POINTS,Points,outputVector +sagang:createrastercataloguefromfiles,CATALOGUE,Raster Catalogue,outputVector +sagang:createrastercataloguesfromdirectory,CATALOGUES,Raster Catalogues,outputVector +sagang:createrastercataloguesfromdirectory,CATALOGUE_GCS,Raster Catalogue,outputVector +sagang:createrastercataloguesfromdirectory,CATALOGUE_UKN,Raster Catalogue (unknown CRS),outputVector +sagang:createtileshapefromvirtualpointcloud,TILE_SHP,Tileshape,outputVector +sagang:croptodata,OUTPUT,Cropped Grids,outputRaster +sagang:crossclassificationandtabulation,RESULTGRID,Cross-Classification Grid,outputRaster +sagang:crossclassificationandtabulation,RESULTTABLE,Cross-Tabulation Table,outputVector +sagang:crossprofiles,PROFILES,Cross Profiles,outputVector +sagang:curvatureclassification,CLASSES,Curvature Classification,outputRaster +sagang:dailyinsolationoverlatitude,SOLARRAD,Solar Radiation,outputVector +sagang:dailytohourlyevapotranspiration,HOURS,Hourly Data,outputVector +sagang:decisiontree,CLASSES,Decision Tree,outputRaster +sagang:definegeoreferenceforgrids,REFERENCED,Referenced Grids,outputRaster +sagang:destriping,RESULT1,Low-pass 1,outputRaster +sagang:destriping,RESULT2,Low-pass 2,outputRaster +sagang:destriping,RESULT3,Destriped Grid,outputRaster +sagang:destriping,STRIPES,Stripes,outputRaster +sagang:destripingwithmask,RESULT1,Low-pass 1,outputRaster +sagang:destripingwithmask,RESULT2,Low-pass 2,outputRaster +sagang:destripingwithmask,RESULT3,Destriped Grid,outputRaster +sagang:destripingwithmask,STRIPES,Stripes,outputRaster +sagang:difference,RESULT,Difference,outputVector +sagang:diffusepollutionrisk,DELIVERY,Delivery Index,outputRaster +sagang:diffusepollutionrisk,RISK_DIFFUSE,Diffuse Pollution Risk,outputRaster +sagang:diffusepollutionrisk,RISK_POINT,Locational Risk,outputRaster +sagang:diffusivehillslopeevolutionadi,DIFF,Elevation Difference,outputRaster +sagang:diffusivehillslopeevolutionadi,MODEL,Modelled Elevation,outputRaster +sagang:diffusivehillslopeevolutionftcs,DIFF,Elevation Difference,outputRaster +sagang:diffusivehillslopeevolutionftcs,MODEL,Modelled Elevation,outputRaster +sagang:directgeoreferencingofairbornephotographs,EXTENT,Extent,outputVector +sagang:directgeoreferencingofairbornephotographs,OUTPUT,Referenced Grids,outputRaster +sagang:directionalaverage,RESULT,Output Grid,outputRaster +sagang:directionalgridstatistics,MEAN,Arithmetic Mean,outputRaster +sagang:directionalstatisticsforrasterlayer,DEVMEAN,Deviation from Arithmetic Mean,outputRaster +sagang:directionalstatisticsforrasterlayer,DIFMEAN,Difference from Arithmetic Mean,outputRaster +sagang:directionalstatisticsforrasterlayer,MAX,Maximum,outputRaster +sagang:directionalstatisticsforrasterlayer,MEAN,Arithmetic Mean,outputRaster +sagang:directionalstatisticsforrasterlayer,MIN,Minimum,outputRaster +sagang:directionalstatisticsforrasterlayer,PERCENT,Percentile,outputRaster +sagang:directionalstatisticsforrasterlayer,POINTS_OUT,Directional Statistics for Points,outputVector +sagang:directionalstatisticsforrasterlayer,RANGE,Range,outputRaster +sagang:directionalstatisticsforrasterlayer,STDDEV,Standard Deviation,outputRaster +sagang:directionalstatisticsforrasterlayer,STDDEVHI,Mean plus Standard Deviation,outputRaster +sagang:directionalstatisticsforrasterlayer,STDDEVLO,Mean less Standard Deviation,outputRaster +sagang:directionalstatisticsforrasterlayer,VAR,Variance,outputRaster +sagang:diurnalanisotropicheat,DAH,Diurnal Anisotropic Heating,outputRaster +sagang:diversityofcategories,CONNECTEDAVG,Averaged Connectivity,outputRaster +sagang:diversityofcategories,CONNECTIVITY,Connectivity,outputRaster +sagang:diversityofcategories,COUNT,Number of Categories,outputRaster +sagang:diversityofcategories,DIVERSITY,Diversity,outputRaster +sagang:downslopedistancegradient,DIFFERENCE,Gradient Difference,outputRaster +sagang:downslopedistancegradient,GRADIENT,Gradient,outputRaster +sagang:dtmfilterslopebased,GROUND,Bare Earth,outputRaster +sagang:dtmfilterslopebased,NONGROUND,Removed Objects,outputRaster +sagang:earthsorbitalparameters,ORBPAR,Earth's Orbital Parameters,outputVector +sagang:edgecontamination,CONTAMINATION,Edge Contamination,outputRaster +sagang:effectiveairflowheights,AFH,Effective Air Flow Heights,outputRaster +sagang:enhancedvegetationindex,EVI,Enhanced Vegetation Index,outputRaster +sagang:evapotranspirationgrid,ET,Potential Evapotranspiration,outputRaster +sagang:evapotranspirationtable,RESULT,Evapotranspiration,outputVector +sagang:fastrepresentativeness,RESULT,Output,outputRaster +sagang:fastrepresentativeness,RESULT_LOD,Output Lod,outputRaster +sagang:fastrepresentativeness,SEEDS,Output Seeds,outputRaster +sagang:featureextents,EXTENTS,Extents,outputVector +sagang:fillsinksplanchondarboux2001,RESULT,Filled DEM,outputRaster +sagang:fillsinksqmofesp,FILLED,DEM without Sinks,outputRaster +sagang:fillsinksqmofesp,SINKS,Sinks,outputRaster +sagang:fillsinkswangliu,FDIR,Flow Directions,outputRaster +sagang:fillsinkswangliu,FILLED,Filled DEM,outputRaster +sagang:fillsinkswangliu,WSHED,Watershed Basins,outputRaster +sagang:fillsinksxxlwangliu,FILLED,Filled DEM,outputRaster +sagang:fireriskanalysis,COMPPROB,Compound Probability,outputRaster +sagang:fireriskanalysis,DANGER,Danger,outputRaster +sagang:fireriskanalysis,PRIORITY,Priority Index,outputRaster +sagang:flatdetection,FLATS,Flat Areas,outputRaster +sagang:flatdetection,NOFLATS,No Flats,outputRaster +sagang:flattenpolygonlayer,OUTPUT,Output,outputVector +sagang:flowaccumulationonestep,SCA,Specific Catchment Area,outputRaster +sagang:flowaccumulationonestep,TCA,Flow Accumulation,outputRaster +sagang:flowaccumulationparallelizable,FLOW,Flow Accumulation,outputRaster +sagang:flowaccumulationqmofesp,FLOW,Contributing Area,outputRaster +sagang:flowbetweenfields,FLOW,Flow table,outputVector +sagang:flowbetweenfields,UPAREA,Uparea,outputRaster +sagang:flowpathlength,LENGTH,Flow Path Length,outputRaster +sagang:flowwidthandspecificcatchmentarea,SCA,Specific Catchment Area (SCA),outputRaster +sagang:flowwidthandspecificcatchmentarea,WIDTH,Flow Width,outputRaster +sagang:focalmechanismbeachballplots,PLOTS,Focal Mechanism Beachballs,outputVector +sagang:focalpcaonagrid,BASE,Base Topographies,outputRaster +sagang:focalpcaonagrid,EIGEN,Eigen Vectors,outputVector +sagang:focalpcaonagrid,PCA,Principal Components,outputRaster +sagang:focalstatistics,DEVMEAN,Deviation from Mean Value,outputRaster +sagang:focalstatistics,DIFF,Difference from Mean Value,outputRaster +sagang:focalstatistics,MAJORITY,Majority,outputRaster +sagang:focalstatistics,MAX,Maximum Value,outputRaster +sagang:focalstatistics,MEAN,Mean Value,outputRaster +sagang:focalstatistics,MEDIAN,Median,outputRaster +sagang:focalstatistics,MIN,Minimum Value,outputRaster +sagang:focalstatistics,MINORITY,Minority,outputRaster +sagang:focalstatistics,PERCENT,Percentile,outputRaster +sagang:focalstatistics,RANGE,Value Range,outputRaster +sagang:focalstatistics,STDDEV,Standard Deviation,outputRaster +sagang:focalstatistics,SUM,Sum,outputRaster +sagang:focalstatistics,VARIANCE,Variance,outputRaster +sagang:fractalbrowniannoise,OUT_GRID,Fractal Brownian Noise,outputRaster +sagang:fragmentationalternative,CONNECTIVITY,Connectivity [Percent],outputRaster +sagang:fragmentationalternative,DENSITY,Density [Percent],outputRaster +sagang:fragmentationalternative,FRAGMENTATION,Fragmentation,outputRaster +sagang:fragmentationalternative,FRAGSTATS,Summary,outputVector +sagang:fragmentationclassesfromdensityandconnectivity,FRAGMENTATION,Fragmentation,outputRaster +sagang:fragmentationstandard,CONNECTIVITY,Connectivity [Percent],outputRaster +sagang:fragmentationstandard,DENSITY,Density [Percent],outputRaster +sagang:fragmentationstandard,FRAGMENTATION,Fragmentation,outputRaster +sagang:fragmentationstandard,FRAGSTATS,Summary,outputVector +sagang:frostchangefrequency,DT_MAX,Maximum Temperature Span,outputRaster +sagang:frostchangefrequency,DT_MEAN,Mean Temperature Span,outputRaster +sagang:frostchangefrequency,DT_STDV,Standard Deviation of Temperature Span,outputRaster +sagang:frostchangefrequency,FREQUENCY,Frost Change Frequency,outputRaster +sagang:frostchangefrequency,TMIN_MEAN,Mean Minimum Temperature,outputRaster +sagang:frostchangefrequency,TMIN_MIN,Minimum Temperature,outputRaster +sagang:functionplotter,FUNCTION,Function,outputRaster +sagang:fuzzify,OUTPUT,Fuzzified Grid,outputRaster +sagang:fuzzyintersectionand,AND,Intersection,outputRaster +sagang:fuzzylandformelementclassification,BSLOPE,Back Slope,outputRaster +sagang:fuzzylandformelementclassification,CHANNEL,Channel,outputRaster +sagang:fuzzylandformelementclassification,CI,Confusion Index,outputRaster +sagang:fuzzylandformelementclassification,ENTROPY,Entropy,outputRaster +sagang:fuzzylandformelementclassification,FHOLLOW,Foot Hollow,outputRaster +sagang:fuzzylandformelementclassification,FORM,Landform,outputRaster +sagang:fuzzylandformelementclassification,FSLOPE,Foot Slope,outputRaster +sagang:fuzzylandformelementclassification,FSPUR,Foot Spur,outputRaster +sagang:fuzzylandformelementclassification,HOLLOW,Hollow,outputRaster +sagang:fuzzylandformelementclassification,MEM,Maximum Membership,outputRaster +sagang:fuzzylandformelementclassification,PEAK,Peak,outputRaster +sagang:fuzzylandformelementclassification,PIT,Pit,outputRaster +sagang:fuzzylandformelementclassification,PLAIN,Plain,outputRaster +sagang:fuzzylandformelementclassification,RIDGE,Ridge,outputRaster +sagang:fuzzylandformelementclassification,SADDLE,Saddle,outputRaster +sagang:fuzzylandformelementclassification,SHOLLOW,Shoulder Hollow,outputRaster +sagang:fuzzylandformelementclassification,SPUR,Spur,outputRaster +sagang:fuzzylandformelementclassification,SSLOPE,Shoulder Slope,outputRaster +sagang:fuzzylandformelementclassification,SSPUR,Shoulder Spur,outputRaster +sagang:fuzzyunionor,OR,Union,outputRaster +sagang:gaussianfilter,RESULT,Filtered Grid,outputRaster +sagang:gdalformats,FORMATS,GDAL Formats,outputVector +sagang:generateshapes,OUTPUT,Output,outputVector +sagang:geocoding,LOCATIONS,Locations,outputVector +sagang:geodesicmorphologicalreconstruction,DIFFERENCE_GRID,Difference Input - Reconstruction,outputRaster +sagang:geodesicmorphologicalreconstruction,OBJECT_GRID,Object Grid,outputRaster +sagang:geographiccoordinategrids,LAT,Latitude,outputRaster +sagang:geographiccoordinategrids,LON,Longitude,outputRaster +sagang:geographicdistances,LOXODROME,Loxodrome,outputVector +sagang:geographicdistances,ORTHODROME,Great Elliptic,outputVector +sagang:geographicdistancespairofcoordinates,DISTANCES,Geographic Distances,outputVector +sagang:geometricfigures,RESULT,Result,outputRaster +sagang:geomorphons,GEOMORPHONS,Geomorphons,outputRaster +sagang:georeferencewithcoordinategrids,OUTPUT,Grids,outputRaster +sagang:getgridfromvirtualpointcloud,GRID_OUT,Grid,outputRaster +sagang:globalmoransiforrasterlayer,RESULT,Result,outputVector +sagang:gradientvectorfromcartesiantopolarcoordinates,DIR,Direction,outputRaster +sagang:gradientvectorfromcartesiantopolarcoordinates,LEN,Length,outputRaster +sagang:gradientvectorfrompolartocartesiancoordinates,DX,X Component,outputRaster +sagang:gradientvectorfrompolartocartesiancoordinates,DY,Y Component,outputRaster +sagang:gradientvectorsfromdirectionalcomponents,VECTORS,Gradient Vectors,outputVector +sagang:gradientvectorsfromdirectionandlength,VECTORS,Gradient Vectors,outputVector +sagang:gradientvectorsfromsurface,VECTORS,Gradient Vectors,outputVector +sagang:gravitationalprocesspathmodel,DEPOSITION,Deposition,outputRaster +sagang:gravitationalprocesspathmodel,MAX_VELOCITY,Maximum Velocity,outputRaster +sagang:gravitationalprocesspathmodel,PROCESS_AREA,Process Area,outputRaster +sagang:gravitationalprocesspathmodel,STOP_POSITIONS,Stopping Positions,outputRaster +sagang:gridcalculator,RESULT,Result,outputRaster +sagang:gridcellareacoveredbypolygons,AREA,Area of Coverage,outputRaster +sagang:gridclassesareaforpolygons,RESULT,Result,outputVector +sagang:gridnormalization,OUTPUT,Normalized Grid,outputRaster +sagang:gridsfromclassifiedgridandtable,GRIDS,Grids,outputRaster +sagang:gridstandardization,OUTPUT,Standardized Grid,outputRaster +sagang:gridstatisticsforpoints,RESULT,Statistics,outputVector +sagang:gridsystemextent,EXTENT,Extent,outputVector +sagang:gridvaluesandpolygonattributestopoints,POINTS,Points Table,outputVector +sagang:growingdegreedays,FIRST,First Growing Degree Day,outputRaster +sagang:growingdegreedays,LAST,Last Growing Degree Day,outputRaster +sagang:growingdegreedays,NGDD,Number of Days above Base Temperature,outputRaster +sagang:growingdegreedays,TARGET,Degree Sum Target Day,outputRaster +sagang:growingdegreedays,TSUM,Growing Degree Days,outputRaster +sagang:gwrforgriddownscaling,MODEL,Regression Parameters,outputRaster +sagang:gwrforgriddownscaling,QUALITY,Coefficient of Determination,outputRaster +sagang:gwrforgriddownscaling,REGRESSION,Regression,outputRaster +sagang:gwrforgriddownscaling,REG_RESCORR,Regression with Residual Correction,outputRaster +sagang:gwrforgriddownscaling,RESIDUALS,Residuals,outputRaster +sagang:gwrformultiplepredictorlayers,MODEL,Regression Parameters,outputRaster +sagang:gwrformultiplepredictorlayers,QUALITY,Coefficient of Determination,outputRaster +sagang:gwrformultiplepredictorlayers,REGRESSION,Regression,outputRaster +sagang:gwrformultiplepredictorlayers,RESIDUALS,Residuals,outputVector +sagang:gwrforsinglepredictorgriddedmodeloutput,INTERCEPT,Intercept,outputRaster +sagang:gwrforsinglepredictorgriddedmodeloutput,QUALITY,Quality,outputRaster +sagang:gwrforsinglepredictorgriddedmodeloutput,SLOPE,Slope,outputRaster +sagang:gwrforsinglepredictorgriddedmodeloutput,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:gwrforsinglepredictorlayer,INTERCEPT,Intercept,outputRaster +sagang:gwrforsinglepredictorlayer,QUALITY,Coefficient of Determination,outputRaster +sagang:gwrforsinglepredictorlayer,REGRESSION,Regression,outputRaster +sagang:gwrforsinglepredictorlayer,RESIDUALS,Residuals,outputVector +sagang:gwrforsinglepredictorlayer,SLOPE,Slope,outputRaster +sagang:histogrammatching,MATCHED,Adjusted Grid,outputRaster +sagang:hodgepodgemachine,GRID,Hodgepodge,outputRaster +sagang:hypsometry,TABLE,Hypsometry,outputVector +sagang:ihssharpening,B_SHARP,Blue,outputRaster +sagang:ihssharpening,G_SHARP,Green,outputRaster +sagang:ihssharpening,R_SHARP,Red,outputRaster +sagang:ihssharpening,SHARPEN,Sharpened Channels,outputRaster +sagang:imcorrfeaturetracking,CORRLINES,Displacement Vector,outputVector +sagang:imcorrfeaturetracking,CORRPOINTS,Correlated Points,outputVector +sagang:importbuildingsketchesfromcitygml,BUILDINGS,Buildings,outputVector +sagang:importclipandresamplegrids,GRIDS,Grids,outputRaster +sagang:importcrugrids,GRIDS,Grids,outputRaster +sagang:importdxffiles,SHAPES,Shapes,outputVector +sagang:importdxffiles,TABLES,Tables,outputVector +sagang:importerdaslangis,GRIDS,Grids,outputRaster +sagang:importfromvirtualrastervrt,GRIDS,Grids,outputRaster +sagang:importgpx,SHAPES,GPX Import,outputVector +sagang:importgridsfromkml,GRIDS,Grids,outputRaster +sagang:importgstatshapes,SHAPES,Shapes,outputVector +sagang:importlandsatscene,BANDS,Bands,outputRaster +sagang:importlandsatscene,BAND_INFO,Band Info,outputVector +sagang:importnetcdf,GRIDS,Grids,outputRaster +sagang:importraster,GRIDS,Grids,outputRaster +sagang:importsentinel2scene,BANDS,Bands,outputRaster +sagang:importshapes,SHAPES,Shapes,outputVector +sagang:importshapesfromxyz,POINTS,Points,outputVector +sagang:importsimplefeaturesfromwellknowntext,SHAPES,WKT Import,outputVector +sagang:importsurferblankingfiles,SHAPES,Shapes,outputVector +sagang:importsurferblankingfiles,TABLE,Look up table (Points),outputVector +sagang:importtexttable,TABLE,Table,outputVector +sagang:importtexttables,TABLES,Tables,outputVector +sagang:importtexttablewithnumbersonly,TABLES,Tables,outputVector +sagang:importusgssrtmgrid,GRIDS,Grids,outputRaster +sagang:importwaspterrainmapfile,SHAPES,Contour Lines,outputVector +sagang:importwrfgeogridbinaryformat,GRIDS,Grids,outputRaster +sagang:interpolatecubicspline,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:intersect,RESULT,Intersect,outputVector +sagang:inversedistanceweightedinterpolation,CV_RESIDUALS,Cross Validation Residuals,outputVector +sagang:inversedistanceweightedinterpolation,CV_SUMMARY,Cross Validation Summary,outputVector +sagang:inversedistanceweightedinterpolation,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:inverseprincipalcomponentsrotation,GRIDS,Grids,outputRaster +sagang:invertdatanodata,OUTPUT,Result,outputRaster +sagang:invertgrid,INVERSE,Inverse Grid,outputRaster +sagang:isochronesvariablespeed,SPEED,Speed (m/s),outputRaster +sagang:isochronesvariablespeed,TIME,Time Out(h),outputRaster +sagang:isodataclusteringforgrids,CLUSTER,Clusters,outputRaster +sagang:isodataclusteringforgrids,STATISTICS,Statistics,outputVector +sagang:kerneldensityestimation,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:kmeansclusteringforgrids,CLUSTER,Clusters,outputRaster +sagang:kmeansclusteringforgrids,STATISTICS,Statistics,outputVector +sagang:lakeflood,OUTDEPTH,Lake,outputRaster +sagang:lakeflood,OUTLEVEL,Surface,outputRaster +sagang:landcoverscenariooffset,LANDCOVER,Land Cover,outputRaster +sagang:landflowversion10build351b,OUTPUT,Fluss-Speicher ausgeben,outputRaster +sagang:landflowversion10build351b,OUTPUT2,Oberflaechenabfluss-Speicher ausgeben,outputRaster +sagang:landflowversion10build351b,OUTPUT3,Grundwasserabfluss-Speicher ausgeben,outputRaster +sagang:landflowversion10build351b,OUTPUT4,Wasserflussvolumen,outputRaster +sagang:landflowversion10build351b,OUTPUT5,SumRunoffDrainage,outputRaster +sagang:landflowversion10build351b,OUTPUT6,DynWUse,outputRaster +sagang:landsatimportwithoptions,BANDS,Bands,outputRaster +sagang:landsurfacetemperature,LST,Land Surface Temperature,outputRaster +sagang:landsurfacetemperaturelapserates,LST,Land Surface Temperature,outputRaster +sagang:landusescenariogenerator,SCENARIO,Land Use Scenario,outputVector +sagang:laplacianfilter,RESULT,Filtered Grid,outputRaster +sagang:lapseratebasedtemperaturedownscaling,HIRES_T,Temperature,outputRaster +sagang:lapseratebasedtemperaturedownscaling,LORES_SLT,Temperature at Sea Level,outputRaster +sagang:lapseratebasedtemperaturedownscalingbulkprocessing,HIRES_T,Temperature,outputRaster +sagang:largestcirclesinpolygons,CIRCLES,Circles,outputVector +sagang:latitudelongitudegraticule,COORDS,Frame Coordinates,outputVector +sagang:latitudelongitudegraticule,GRATICULE,Graticule,outputVector +sagang:layerofextremevalue,RESULT,Result,outputRaster +sagang:leastcostpaths,LINE,Profile Lines,outputVector +sagang:leastcostpaths,POINTS,Profile Points,outputVector +sagang:linecrossings,CROSSINGS,Crossings,outputVector +sagang:linepolygonintersection,DIFFERENCE,Difference,outputVector +sagang:linepolygonintersection,INTERSECT,Intersection,outputVector +sagang:lineproperties,OUTPUT,Lines with Property Attributes,outputVector +sagang:linesimplification,OUTPUT,Simplified Lines,outputVector +sagang:linesmoothing,LINES_OUT,Smoothed Lines,outputVector +sagang:localclimatezoneclassification,LCZC,LCZC,outputRaster +sagang:localclimatezoneclassification,LCZC_FILTERED,LCZC (Filtered),outputRaster +sagang:localminimaandmaxima,MAXIMA,Maxima,outputVector +sagang:localminimaandmaxima,MINIMA,Minima,outputVector +sagang:localstatisticalmeasures,CONTRAST,Contrast,outputRaster +sagang:localstatisticalmeasures,ENERGY,Energy,outputRaster +sagang:localstatisticalmeasures,ENTROPY,Entropy,outputRaster +sagang:localstatisticalmeasures,VARIANCE,Variance,outputRaster +sagang:longitudinalgridstatistics,STATS,Latitudinal Statistics,outputVector +sagang:lsfactor,LS,LS Factor,outputRaster +sagang:lsfactorfieldbased,BALANCE,Sediment Balance,outputRaster +sagang:lsfactorfieldbased,LS_FACTOR,LS Factor,outputRaster +sagang:lsfactorfieldbased,STATISTICS,Field Statistics,outputVector +sagang:lsfactorfieldbased,UPSLOPE_AREA,Upslope Length Factor,outputRaster +sagang:lsfactorfieldbased,UPSLOPE_LENGTH,Effective Flow Length,outputRaster +sagang:lsfactorfieldbased,UPSLOPE_SLOPE,Upslope Slope,outputRaster +sagang:lsfactoronestep,LS_FACTOR,LS Factor,outputRaster +sagang:majorityminorityfilter,RESULT,Filtered Grid,outputRaster +sagang:massbalanceindex,MBI,Mass Balance Index,outputRaster +sagang:maximumentropyclassifcation,CLASSES,Classes,outputRaster +sagang:maximumentropyclassifcation,CLASSES_LUT,Look-up Table,outputVector +sagang:maximumentropyclassifcation,PROB,Probability,outputRaster +sagang:maximumentropyclassifcation,PROBS,Probabilities,outputRaster +sagang:maximumentropypresenceprediction,PREDICTION,Presence Prediction,outputRaster +sagang:maximumentropypresenceprediction,PROBABILITY,Presence Probability,outputRaster +sagang:maximumflowpathlength,DISTANCE,Flow Path Length,outputRaster +sagang:meltonruggednessnumber,AREA,Catchment Area,outputRaster +sagang:meltonruggednessnumber,MRN,Melton Ruggedness Number,outputRaster +sagang:meltonruggednessnumber,ZMAX,Maximum Height,outputRaster +sagang:mergetables,MERGED,Merged Table,outputVector +sagang:mergevectorlayers,MERGED,Merged Layer,outputVector +sagang:meridionalgridstatistics,STATS,Meridional Statistics,outputVector +sagang:meshdenoise,OUTPUT,Denoised Grid,outputRaster +sagang:metricconversions,CONV,Converted Grid,outputRaster +sagang:minimumdistanceanalysis,TABLE,Minimum Distance Analysis,outputVector +sagang:mirrorgrid,MIRROR,Mirror Grid,outputRaster +sagang:mmfsagasoilerosionmodel,Gc,Available Clay,outputRaster +sagang:mmfsagasoilerosionmodel,Gs,Available Sand,outputRaster +sagang:mmfsagasoilerosionmodel,Gz,Available Silt,outputRaster +sagang:mmfsagasoilerosionmodel,IF,Interflow,outputRaster +sagang:mmfsagasoilerosionmodel,KE,Total Kinetic Energy,outputRaster +sagang:mmfsagasoilerosionmodel,Q,Mean runoff,outputRaster +sagang:mmfsagasoilerosionmodel,Rc,Soil moisture storage capacity,outputRaster +sagang:mmfsagasoilerosionmodel,Rf,Effective Rainfall,outputRaster +sagang:mmfsagasoilerosionmodel,SL,Mean soil loss,outputRaster +sagang:mmfsagasoilerosionmodel,SLc,Sediment Balance Clay,outputRaster +sagang:mmfsagasoilerosionmodel,SLs,Sediment Balance Sand,outputRaster +sagang:mmfsagasoilerosionmodel,SLz,Sediment Balance Silt,outputRaster +sagang:mmfsagasoilerosionmodel,TCONDc,Transport Condition Clay,outputRaster +sagang:mmfsagasoilerosionmodel,TCONDs,Transport Condition Sand,outputRaster +sagang:mmfsagasoilerosionmodel,TCONDz,Transport Condition Silt,outputRaster +sagang:mmfsagasoilerosionmodel,TCc,Transport Capacity Clay,outputRaster +sagang:mmfsagasoilerosionmodel,TCs,Transport Capacity Sand,outputRaster +sagang:mmfsagasoilerosionmodel,TCz,Transport Capacity Silt,outputRaster +sagang:mmfsagasoilerosionmodel,W_up,Upslope Flow Width,outputRaster +sagang:modifedquadraticshepard,CV_RESIDUALS,Cross Validation Residuals,outputVector +sagang:modifedquadraticshepard,CV_SUMMARY,Cross Validation Summary,outputVector +sagang:modifedquadraticshepard,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:monthlyglobalbylatitude,SOLARRAD,Solar Radiation,outputVector +sagang:morphologicalfilter,RESULT,Filtered Grid,outputRaster +sagang:morphometricfeatures,ASPECT,Aspect,outputRaster +sagang:morphometricfeatures,CROSC,Cross-Sectional Curvature,outputRaster +sagang:morphometricfeatures,ELEVATION,Generalized Surface,outputRaster +sagang:morphometricfeatures,FEATURES,Morphometric Features,outputRaster +sagang:morphometricfeatures,LONGC,Longitudinal Curvature,outputRaster +sagang:morphometricfeatures,MAXIC,Maximum Curvature,outputRaster +sagang:morphometricfeatures,MINIC,Minimum Curvature,outputRaster +sagang:morphometricfeatures,PLANC,Plan Curvature,outputRaster +sagang:morphometricfeatures,PROFC,Profile Curvature,outputRaster +sagang:morphometricfeatures,SLOPE,Slope,outputRaster +sagang:morphometricprotectionindex,PROTECTION,Protection Index,outputRaster +sagang:mosaicking,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:multibandvariation,DIFF,Distance,outputRaster +sagang:multibandvariation,MEAN,Mean Distance,outputRaster +sagang:multibandvariation,STDDEV,Standard Deviation,outputRaster +sagang:multidirectionleefilter,DIR,Direction of Minimum Standard Deviation,outputRaster +sagang:multidirectionleefilter,RESULT,Filtered Grid,outputRaster +sagang:multidirectionleefilter,STDDEV,Minimum Standard Deviation,outputRaster +sagang:multilevelbspline,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:multilevelbsplineforcategories,CATEGORIES,Categories,outputRaster +sagang:multilevelbsplineforcategories,PROPABILITY,Propability,outputRaster +sagang:multilevelbsplinefromgridpoints,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:multiplelinearregressionanalysis,INFO_COEFF,Details: Coefficients,outputVector +sagang:multiplelinearregressionanalysis,INFO_MODEL,Details: Model,outputVector +sagang:multiplelinearregressionanalysis,INFO_STEPS,Details: Steps,outputVector +sagang:multiplelinearregressionanalysis,RESULTS,Results,outputVector +sagang:multiplelinearregressionanalysisshapes,INFO_COEFF,Details: Coefficients,outputVector +sagang:multiplelinearregressionanalysisshapes,INFO_MODEL,Details: Model,outputVector +sagang:multiplelinearregressionanalysisshapes,INFO_STEPS,Details: Steps,outputVector +sagang:multiplelinearregressionanalysisshapes,RESULTS,Results,outputVector +sagang:multipleregressionanalysisgridandpredictorgrids,INFO_COEFF,Details: Coefficients,outputVector +sagang:multipleregressionanalysisgridandpredictorgrids,INFO_MODEL,Details: Model,outputVector +sagang:multipleregressionanalysisgridandpredictorgrids,INFO_STEPS,Details: Steps,outputVector +sagang:multipleregressionanalysisgridandpredictorgrids,REGRESSION,Regression,outputRaster +sagang:multipleregressionanalysisgridandpredictorgrids,RESIDUALS,Residuals,outputRaster +sagang:multipleregressionanalysispointsandpredictorgrids,INFO_COEFF,Details: Coefficients,outputVector +sagang:multipleregressionanalysispointsandpredictorgrids,INFO_MODEL,Details: Model,outputVector +sagang:multipleregressionanalysispointsandpredictorgrids,INFO_STEPS,Details: Steps,outputVector +sagang:multipleregressionanalysispointsandpredictorgrids,REGRESCORR,Regression with Residual Correction,outputRaster +sagang:multipleregressionanalysispointsandpredictorgrids,REGRESSION,Regression,outputRaster +sagang:multipleregressionanalysispointsandpredictorgrids,RESIDUALS,Residuals,outputVector +sagang:multiresolutionindexofvalleybottomflatnessmrvbf,MRRTF,MRRTF,outputRaster +sagang:multiresolutionindexofvalleybottomflatnessmrvbf,MRVBF,MRVBF,outputRaster +sagang:multiscaletopographicpositionindextpi,TPI,Topographic Position Index,outputRaster +sagang:naturalneighbour,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:nearestneighbour,CV_RESIDUALS,Cross Validation Residuals,outputVector +sagang:nearestneighbour,CV_SUMMARY,Cross Validation Summary,outputVector +sagang:nearestneighbour,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:notchfilterforgrids,FILTERED_GRID,Notch,outputRaster +sagang:notchfilterforgrids,HIPASS_LOWER,Highpass Lower,outputRaster +sagang:notchfilterforgrids,LOWPASS_UPPER,Lowpass Upper,outputRaster +sagang:objectbasedimagesegmentation,OBJECTS,Segments,outputVector +sagang:ordinarykriging,CV_RESIDUALS,Cross Validation Residuals,outputVector +sagang:ordinarykriging,CV_SUMMARY,Cross Validation Summary,outputVector +sagang:ordinarykriging,PREDICTION,Prediction,outputRaster +sagang:ordinarykriging,VARIANCE,Prediction Error,outputRaster +sagang:overlandflow,FLOW,Flow [mm],outputRaster +sagang:overlandflow,INFILTRAT,Infiltration [mm],outputRaster +sagang:overlandflow,INTERCEPT,Interception [mm],outputRaster +sagang:overlandflow,PONDING,Ponding [mm],outputRaster +sagang:overlandflow,VELOCITY,Velocity [m/s],outputRaster +sagang:overlandflowdistancetochannelnetwork,DISTANCE,Overland Flow Distance,outputRaster +sagang:overlandflowdistancetochannelnetwork,DISTHORZ,Horizontal Overland Flow Distance,outputRaster +sagang:overlandflowdistancetochannelnetwork,DISTVERT,Vertical Overland Flow Distance,outputRaster +sagang:overlandflowdistancetochannelnetwork,PASSES,Fields Visited,outputRaster +sagang:overlandflowdistancetochannelnetwork,SDR,Sediment Yield Delivery Ratio,outputRaster +sagang:overlandflowdistancetochannelnetwork,TIME,Flow Travel Time,outputRaster +sagang:overlandflowkinematicwave,FLOW,Runoff,outputRaster +sagang:overlandflowkinematicwave,GAUGES_FLOW,Flow at Gauges,outputVector +sagang:patching,COMPLETED,Patched Grid,outputRaster +sagang:patternanalysis,CVN,Center vs. Neighbours,outputRaster +sagang:patternanalysis,DIVERSITY,Diversity,outputRaster +sagang:patternanalysis,DOMINANCE,Dominance,outputRaster +sagang:patternanalysis,FRAGMENTATION,Fragmentation,outputRaster +sagang:patternanalysis,NDC,Number of Classes,outputRaster +sagang:patternanalysis,RELATIVE,Relative Richness,outputRaster +sagang:phenipsgridsannual,BTSUM_FILIAL_1,"State, 1. Filial Generation",outputRaster +sagang:phenipsgridsannual,BTSUM_FILIAL_2,"State, 2. Filial Generation",outputRaster +sagang:phenipsgridsannual,BTSUM_FILIAL_3,"State, 3. Filial Generation",outputRaster +sagang:phenipsgridsannual,BTSUM_SISTER_1,"State, 1. Sister Generation",outputRaster +sagang:phenipsgridsannual,BTSUM_SISTER_2,"State, 2. Sister Generation",outputRaster +sagang:phenipsgridsannual,BTSUM_SISTER_3,"State, 3. Sister Generation",outputRaster +sagang:phenipsgridsannual,GENERATIONS,Potential Number of Generations,outputRaster +sagang:phenipsgridsannual,ONSET,Onset Day of Infestation,outputRaster +sagang:phenipsgridsannual,ONSET_FILIAL_1,"Onset Day, 1. Filial Generation",outputRaster +sagang:phenipsgridsannual,ONSET_FILIAL_2,"Onset Day, 2. Filial Generation",outputRaster +sagang:phenipsgridsannual,ONSET_FILIAL_3,"Onset Day, 3. Filial Generation",outputRaster +sagang:phenipsgridsannual,ONSET_SISTER_1,"Onset Day, 1. Sister Generation",outputRaster +sagang:phenipsgridsannual,ONSET_SISTER_2,"Onset Day, 2. Sister Generation",outputRaster +sagang:phenipsgridsannual,ONSET_SISTER_3,"Onset Day, 3. Sister Generation",outputRaster +sagang:phenipsgridsdays,ATSUM_EFF,Air Temperature Sum,outputRaster +sagang:phenipsgridsdays,BTSUM_FILIAL_1,"State, 1. Filial Generation",outputRaster +sagang:phenipsgridsdays,BTSUM_FILIAL_2,"State, 2. Filial Generation",outputRaster +sagang:phenipsgridsdays,BTSUM_FILIAL_3,"State, 3. Filial Generation",outputRaster +sagang:phenipsgridsdays,BTSUM_SISTER_1,"State, 1. Sister Generation",outputRaster +sagang:phenipsgridsdays,BTSUM_SISTER_2,"State, 2. Sister Generation",outputRaster +sagang:phenipsgridsdays,BTSUM_SISTER_3,"State, 3. Sister Generation",outputRaster +sagang:phenipsgridsdays,GENERATIONS,Potential Number of Generations,outputRaster +sagang:phenipsgridsdays,ONSET,Onset Day of Infestation,outputRaster +sagang:phenipsgridsdays,ONSET_FILIAL_1,"Onset Day, 1. Filial Generation",outputRaster +sagang:phenipsgridsdays,ONSET_FILIAL_2,"Onset Day, 2. Filial Generation",outputRaster +sagang:phenipsgridsdays,ONSET_FILIAL_3,"Onset Day, 3. Filial Generation",outputRaster +sagang:phenipsgridsdays,ONSET_SISTER_1,"Onset Day, 1. Sister Generation",outputRaster +sagang:phenipsgridsdays,ONSET_SISTER_2,"Onset Day, 2. Sister Generation",outputRaster +sagang:phenipsgridsdays,ONSET_SISTER_3,"Onset Day, 3. Sister Generation",outputRaster +sagang:phenipsgridsdays,RISK,Risk,outputRaster +sagang:phenipstable,PHENOLOGY,Phenology,outputVector +sagang:phenipstable,SUMMARY,Summary,outputVector +sagang:pointsfilter,FILTER,Filtered Points,outputVector +sagang:pointsthinning,THINNED,Thinned Points,outputVector +sagang:pointtolinedistances,DISTANCES,Distances,outputVector +sagang:pointtolinedistances,RESULT,Result,outputVector +sagang:pointtopointdistances,DISTANCES,Distances,outputVector +sagang:pointtopointdistances,LINES,Distances as Lines,outputVector +sagang:polartocartesiancoordinates,CARTES,Cartesion Coordinates,outputVector +sagang:polygoncategoriestogrid,CATEGORY,Category,outputRaster +sagang:polygoncategoriestogrid,CLASSES,Classification,outputVector +sagang:polygoncategoriestogrid,COVERAGE,Coverage,outputRaster +sagang:polygoncentroids,CENTROIDS,Centroids,outputVector +sagang:polygonclipping,M_OUTPUT,Output Features,outputVector +sagang:polygonclipping,S_OUTPUT,Output Features,outputVector +sagang:polygongeneralization,GENERALIZED,Shape Indices,outputVector +sagang:polygonidentity,RESULT,Identity,outputVector +sagang:polygonlineintersection,INTERSECT,Intersection,outputVector +sagang:polygonpartstoseparatepolygons,PARTS,Polygon Parts,outputVector +sagang:polygonselfintersection,INTERSECT,Intersection,outputVector +sagang:polygonshapeindices,DMAX,Maximum Diameter,outputVector +sagang:polygonshapeindices,INDEX,Shape Indices,outputVector +sagang:polygonstoedgesandnodes,EDGES,Edges,outputVector +sagang:polygonstoedgesandnodes,NODES,Nodes,outputVector +sagang:polygonstogrid,COVERAGE,Coverage,outputRaster +sagang:polygonstogrid,GRID,Grid,outputRaster +sagang:polygonunion,RESULT,Union,outputVector +sagang:polygonupdate,RESULT,Update,outputVector +sagang:polynomialregression,RESIDUALS,Residuals,outputVector +sagang:polynomialregression,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:populatepolygonswithpoints,POINTS,Points,outputVector +sagang:potentialincomingsolarradiation,GRD_DIFFUS,Diffuse Insolation,outputRaster +sagang:potentialincomingsolarradiation,GRD_DIRECT,Direct Insolation,outputRaster +sagang:potentialincomingsolarradiation,GRD_DURATION,Duration of Insolation,outputRaster +sagang:potentialincomingsolarradiation,GRD_FLAT,Compare to Flat Terrain,outputRaster +sagang:potentialincomingsolarradiation,GRD_RATIO,Direct to Diffuse Ratio,outputRaster +sagang:potentialincomingsolarradiation,GRD_SUNRISE,Sunrise,outputRaster +sagang:potentialincomingsolarradiation,GRD_SUNSET,Sunset,outputRaster +sagang:potentialincomingsolarradiation,GRD_TOTAL,Total Insolation,outputRaster +sagang:principalcomponentanalysis,EIGEN,Eigen Vectors,outputVector +sagang:principalcomponentanalysis,PCA,Principal Components,outputRaster +sagang:principalcomponentbasedimagesharpening,SHARPEN,Sharpened Channels,outputRaster +sagang:profilefrompoints,RESULT,Result,outputVector +sagang:profilesfromlines,PROFILE,Profiles,outputVector +sagang:profilesfromlines,PROFILES,Profiles,outputVector +sagang:proximityraster,ALLOCATION,Allocation,outputRaster +sagang:proximityraster,DIRECTION,Direction,outputRaster +sagang:proximityraster,DISTANCE,Distance,outputRaster +sagang:quadtreestructuretopolygons,LINES,Lines,outputVector +sagang:quadtreestructuretopolygons,POINTS,Duplicated Points,outputVector +sagang:quadtreestructuretopolygons,POLYGONS,Polygons,outputVector +sagang:quasidynamicflowaccumulation,FLOW,Flow Through,outputRaster +sagang:quasidynamicflowaccumulation,FLOW_ACC,Flow Accumulation,outputRaster +sagang:quasidynamicflowaccumulation,TIME_CONC,Flow Concentration,outputRaster +sagang:quasidynamicflowaccumulation,TIME_MEAN,Flow Travel Time,outputRaster +sagang:quasidynamicflowaccumulation,VELOCITY,Flow Velocity,outputRaster +sagang:radiusofvarianceraster,RESULT,Radius,outputRaster +sagang:randomfield,OUT_GRID,Random Field,outputRaster +sagang:randomterrain,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:rankfilter,RESULT,Filtered Grid,outputRaster +sagang:raosqdiversityindex,INDEX,Rao's Q,outputRaster +sagang:raosqdiversityindexclassic,COUNT,Number of Categories,outputRaster +sagang:raosqdiversityindexclassic,INDEX,Rao's Q,outputRaster +sagang:rasterbuffer,BUFFER,Buffer,outputRaster +sagang:rastercellindex,INDEX,Index,outputRaster +sagang:rasterdifference,C,Difference (A - B),outputRaster +sagang:rasterdivision,C,Quotient,outputRaster +sagang:rasterize,COUNT,Number of Values,outputRaster +sagang:rasterize,GRID,Grid,outputRaster +sagang:rastermasking,GRIDS_MASKED,Masked Grids,outputRaster +sagang:rastermasking,MASKED,Masked Grid,outputRaster +sagang:rasterproduct,RESULT,Product,outputRaster +sagang:rasterproximitybuffer,ALLOC,Allocation Grid,outputRaster +sagang:rasterproximitybuffer,BUFFER,Buffer Grid,outputRaster +sagang:rasterproximitybuffer,DISTANCE,Distance Grid,outputRaster +sagang:rasterskeletonization,RESULT,Skeleton,outputRaster +sagang:rasterskeletonization,VECTOR,Skeleton,outputVector +sagang:rasterssum,RESULT,Sum,outputRaster +sagang:rasterstatisticsforpolygons,RESULT,Statistics,outputVector +sagang:rastervaluestopoints,SHAPES,Shapes,outputVector +sagang:rastervaluestopointsrandomly,POINTS,Points,outputVector +sagang:realsurfacearea,AREA,Surface Area,outputRaster +sagang:regressionanalysispointsandpredictorgrid,REGRESSION,Regression,outputRaster +sagang:regressionanalysispointsandpredictorgrid,RESIDUAL,Residuals,outputVector +sagang:regressionkriging,INFO_COEFF,Regression: Coefficients,outputVector +sagang:regressionkriging,INFO_MODEL,Regression: Model,outputVector +sagang:regressionkriging,INFO_STEPS,Regression: Steps,outputVector +sagang:regressionkriging,PREDICTION,Prediction,outputRaster +sagang:regressionkriging,REGRESSION,Regression,outputRaster +sagang:regressionkriging,RESIDUALS,Residuals,outputRaster +sagang:regressionkriging,VARIANCE,Prediction Error,outputRaster +sagang:relativeheightsandslopepositions,HO,Slope Height,outputRaster +sagang:relativeheightsandslopepositions,HU,Valley Depth,outputRaster +sagang:relativeheightsandslopepositions,MS,Mid-Slope Positon,outputRaster +sagang:relativeheightsandslopepositions,NH,Normalized Height,outputRaster +sagang:relativeheightsandslopepositions,SH,Standardized Height,outputRaster +sagang:reliefsegmentation,OBJECTS,Objects,outputVector +sagang:removeboundarypolygons,RESULT,Result,outputVector +sagang:removeduplicatepoints,RESULT,Result,outputVector +sagang:removesmallpixelclumpstonodata,OUTPUT,Filtered Grid,outputRaster +sagang:representativenessgrid,RESULT,Representativeness,outputRaster +sagang:resampling,OUTPUT,Resampled Grids,outputRaster +sagang:resamplingfilter,HIPASS,High Pass Filter,outputRaster +sagang:resamplingfilter,LOPASS,Low Pass Filter,outputRaster +sagang:riverbasin,OUTPUT2,Grad,outputRaster +sagang:riverbasin,OUTPUT3,Direc,outputRaster +sagang:riverbasin,OUTPUT4,HGGrad,outputRaster +sagang:riverbasin,OUTPUT5,RivSpeed,outputRaster +sagang:riverbasin,OUTPUT6,Coordinates,outputRaster +sagang:riverbasin,OUTPUT7,BasinShare,outputRaster +sagang:riverbasin,OUTPUT8,statWUse,outputRaster +sagang:riverbasin,OUTPUT9,NumInFlowCells,outputRaster +sagang:rivergridgeneration,OUTPUT,HG Raster,outputRaster +sagang:safetyfactor,G,FS values,outputRaster +sagang:safetyfactor,H,FS classes,outputRaster +sagang:sagawetnessindex,AREA,Catchment Area,outputRaster +sagang:sagawetnessindex,AREA_MOD,Modified Catchment Area,outputRaster +sagang:sagawetnessindex,SLOPE,Catchment Slope,outputRaster +sagang:sagawetnessindex,TWI,Topographic Wetness Index,outputRaster +sagang:salem,DIFFERENCE,Difference,outputRaster +sagang:salem,REGOLITH,Regolith Thickness,outputRaster +sagang:salem,SURFACE,Surface Elevation,outputRaster +sagang:savegridstatisticstotable,STATS,Statistics for Grids,outputVector +sagang:seededregiongrowing,SEGMENTS,Segments,outputRaster +sagang:seededregiongrowing,SIMILARITY,Similarity,outputRaster +sagang:seededregiongrowing,TABLE,Seeds,outputVector +sagang:seedgeneration,SEED_GRID,Seeds Grid,outputRaster +sagang:seedgeneration,SEED_POINTS,Seed Points,outputVector +sagang:seedgeneration,VARIANCE,Variance,outputRaster +sagang:selectgridfromlist,GRID,Grid,outputRaster +sagang:selectshapesfromlist,SHAPES,Shapes,outputVector +sagang:separatepointsbydirection,OUTPUT,Ouput,outputVector +sagang:setcoordinatereferencesystem,GRIDS_OUT,Grids,outputRaster +sagang:setcoordinatereferencesystem,SHAPES_OUT,Shapes,outputVector +sagang:shalstab,G,CR values,outputRaster +sagang:shalstab,H,CR classes,outputRaster +sagang:shannonindex,COUNT,Number of Categories,outputRaster +sagang:shannonindex,EVENNESS,Evenness,outputRaster +sagang:shannonindex,INDEX,Shannon Index,outputRaster +sagang:shapesbuffer,BUFFER,Buffer,outputVector +sagang:sharedpolygonedges,EDGES,Edges,outputVector +sagang:shrinkandexpand,RESULT,Result Grid,outputRaster +sagang:sieveandclump,FILTERED,Sieve and Clump,outputRaster +sagang:sieveclasses,OUTPUT,Sieved Classes,outputRaster +sagang:simplefilter,RESULT,Filtered Grid,outputRaster +sagang:simplefilterformultiplegrids,FILTERED,Filtered Grids,outputRaster +sagang:simplefilterrestrictedtopolygons,RESULT,Filtered Grid,outputRaster +sagang:simplekriging,CV_RESIDUALS,Cross Validation Residuals,outputVector +sagang:simplekriging,CV_SUMMARY,Cross Validation Summary,outputVector +sagang:simplekriging,PREDICTION,Prediction,outputRaster +sagang:simplekriging,VARIANCE,Prediction Error,outputRaster +sagang:simpsonindex,COUNT,Number of Categories,outputRaster +sagang:simpsonindex,INDEX,Simpson Index,outputRaster +sagang:simulation,FLAME,Flame Length,outputRaster +sagang:simulation,INTENSITY,Intensity,outputRaster +sagang:simulation,TIME,Time,outputRaster +sagang:sinkdrainageroutedetection,SINKROUTE,Sink Route,outputRaster +sagang:sinkremoval,DEM_PREPROC,Preprocessed DEM,outputRaster +sagang:skyviewfactor,DISTANCE,Average View Distance,outputRaster +sagang:skyviewfactor,SIMPLE,Sky View Factor (Simplified),outputRaster +sagang:skyviewfactor,SVF,Sky View Factor,outputRaster +sagang:skyviewfactor,TERRAIN,Terrain View Factor,outputRaster +sagang:skyviewfactor,VISIBLE,Visible Sky,outputRaster +sagang:slopeaspectcurvature,ASPECT,Aspect,outputRaster +sagang:slopeaspectcurvature,C_CROS,Cross-Sectional Curvature,outputRaster +sagang:slopeaspectcurvature,C_GENE,General Curvature,outputRaster +sagang:slopeaspectcurvature,C_LONG,Longitudinal Curvature,outputRaster +sagang:slopeaspectcurvature,C_MAXI,Maximal Curvature,outputRaster +sagang:slopeaspectcurvature,C_MINI,Minimal Curvature,outputRaster +sagang:slopeaspectcurvature,C_PLAN,Plan Curvature,outputRaster +sagang:slopeaspectcurvature,C_PROF,Profile Curvature,outputRaster +sagang:slopeaspectcurvature,C_ROTO,Flow Line Curvature,outputRaster +sagang:slopeaspectcurvature,C_TANG,Tangential Curvature,outputRaster +sagang:slopeaspectcurvature,C_TOTA,Total Curvature,outputRaster +sagang:slopeaspectcurvature,SLOPE,Slope,outputRaster +sagang:slopelength,LENGTH,Slope Length,outputRaster +sagang:slopelimitedflowaccumulation,FLOW,Flow Accumulation,outputRaster +sagang:snappointstogrid,MOVES,Moves,outputVector +sagang:snappointstogrid,OUTPUT,Result,outputVector +sagang:snappointstolines,MOVES,Moves,outputVector +sagang:snappointstolines,OUTPUT,Result,outputVector +sagang:snappointstopoints,MOVES,Moves,outputVector +sagang:snappointstopoints,OUTPUT,Result,outputVector +sagang:snappointstopolygons,MOVES,Moves,outputVector +sagang:snappointstopolygons,OUTPUT,Result,outputVector +sagang:snowcover,DAYS,Snow Cover Days,outputRaster +sagang:snowcover,MAXIMUM,Maximum,outputRaster +sagang:snowcover,MEAN,Average,outputRaster +sagang:snowcover,QUANTILE,Quantile,outputRaster +sagang:soilwaterbalancedays,SNOW,Snow Depth,outputRaster +sagang:soilwaterbalancedays,SW_0,Soil Water (Upper Layer),outputRaster +sagang:soilwaterbalancedays,SW_1,Soil Water (Lower Layer),outputRaster +sagang:spatialpointpatternanalysis,BBOX,Bounding Box,outputVector +sagang:spatialpointpatternanalysis,CENTRE,Mean Centre,outputVector +sagang:spatialpointpatternanalysis,STDDIST,Standard Distance,outputVector +sagang:splitlinesatpoints,INTERSECT,Intersection,outputVector +sagang:splitlineswithlines,INTERSECT,Intersection,outputVector +sagang:splitrgbbands,B,Output B band layer,outputRaster +sagang:splitrgbbands,G,Output G band layer,outputRaster +sagang:splitrgbbands,R,Output R band layer,outputRaster +sagang:splitshapeslayer,CUTS,Tiles,outputVector +sagang:splitshapeslayer,EXTENT,Extent,outputVector +sagang:splitshapeslayercompletely,LIST,Output,outputVector +sagang:splitshapeslayerrandomly,A,Group A,outputVector +sagang:splitshapeslayerrandomly,B,Group B,outputVector +sagang:splittableshapesbyattribute,CUTS,Cuts,outputVector +sagang:statisticsforrasters,MAX,Maximum,outputRaster +sagang:statisticsforrasters,MEAN,Arithmetic Mean,outputRaster +sagang:statisticsforrasters,MIN,Minimum,outputRaster +sagang:statisticsforrasters,PCTL,Percentile,outputRaster +sagang:statisticsforrasters,RANGE,Range,outputRaster +sagang:statisticsforrasters,STDDEV,Standard Deviation,outputRaster +sagang:statisticsforrasters,STDDEVHI,Mean plus Standard Deviation,outputRaster +sagang:statisticsforrasters,STDDEVLO,Mean less Standard Deviation,outputRaster +sagang:statisticsforrasters,SUM,Sum,outputRaster +sagang:statisticsforrasters,SUM2,Sum2,outputRaster +sagang:statisticsforrasters,VAR,Variance,outputRaster +sagang:strahlerorder,STRAHLER,Strahler Order,outputRaster +sagang:streampowerindex,SPI,Stream Power Index,outputRaster +sagang:successiveflowrouting,FLOW,Flow,outputRaster +sagang:summitextraction,SUMMITS,Summits,outputVector +sagang:sunriseandsunset,LENGTH,Day Length,outputRaster +sagang:sunriseandsunset,SUNRISE,Sunrise,outputRaster +sagang:sunriseandsunset,SUNSET,Sunset,outputRaster +sagang:superpixelsegmentation,POLYGONS,Segments,outputVector +sagang:superpixelsegmentation,SUPERPIXELS,Superpixels,outputRaster +sagang:supervisedclassificationforgrids,CLASSES,Classification,outputRaster +sagang:supervisedclassificationforgrids,CLASSES_LUT,Look-up Table,outputVector +sagang:supervisedclassificationforgrids,QUALITY,Quality,outputRaster +sagang:surfaceandgradient,GRAD,Gradient,outputRaster +sagang:surfaceandgradient,SURF,Surface,outputRaster +sagang:surfacegradientandconcentration,CONC,Concentration,outputRaster +sagang:surfacegradientandconcentration,GRAD,Gradient,outputRaster +sagang:surfacegradientandconcentration,SURF,Surface,outputRaster +sagang:surfacespecificpoints,RESULT,Result,outputRaster +sagang:svmclassification,CLASSES,Classification,outputRaster +sagang:svmclassification,CLASSES_LUT,Look-up Table,outputVector +sagang:symmetricaldifference,RESULT,Symmetrical Difference,outputVector +sagang:tasseledcaptransformation,BRIGHTNESS,Brightness,outputRaster +sagang:tasseledcaptransformation,GREENNESS,Greenness,outputRaster +sagang:tasseledcaptransformation,WETNESS,Wetness,outputRaster +sagang:tcilow,TCILOW,TCI Low,outputRaster +sagang:temperaturelapserates,LAPSE,Temperature Lapse Rate at Extreme,outputRaster +sagang:temperaturelapserates,TEXTREME,Daily Extreme Temperature,outputRaster +sagang:temperaturelapserates,TIME,Hour of Daily Extreme Temperature,outputRaster +sagang:terrainclustering,CLUSTER,Clusters,outputRaster +sagang:terrainruggednessindextri,TRI,Terrain Ruggedness Index (TRI),outputRaster +sagang:terrainsurfaceclassificationiwahashiandpike,LANDFORMS,Landforms,outputRaster +sagang:terrainsurfaceconvexity,CONVEXITY,Convexity,outputRaster +sagang:terrainsurfacetexture,TEXTURE,Texture,outputRaster +sagang:texturalfeatures,ASM,Angular Second Moment,outputRaster +sagang:texturalfeatures,CONTRAST,Contrast,outputRaster +sagang:texturalfeatures,CORRELATION,Correlation,outputRaster +sagang:texturalfeatures,DIF_ENTROPY,Difference Entropy,outputRaster +sagang:texturalfeatures,DIF_VARIANCE,Difference Variance,outputRaster +sagang:texturalfeatures,ENTROPY,Entropy,outputRaster +sagang:texturalfeatures,IDM,Inverse Diff Moment,outputRaster +sagang:texturalfeatures,MOC_1,Measure of Correlation-1,outputRaster +sagang:texturalfeatures,MOC_2,Measure of Correlation-2,outputRaster +sagang:texturalfeatures,SUM_AVERAGE,Sum Average,outputRaster +sagang:texturalfeatures,SUM_ENTROPY,Sum Entropy,outputRaster +sagang:texturalfeatures,SUM_VARIANCE,Sum Variance,outputRaster +sagang:texturalfeatures,VARIANCE,Variance,outputRaster +sagang:thermicbeltclassification,ATB,Thermal Belts,outputRaster +sagang:thiessenpolygons,POLYGONS,Polygons,outputVector +sagang:thinplatespline,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:thinplatesplinetin,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:thresholdrasterbuffer,BUFFER,Buffer Grid,outputRaster +sagang:tiling,TILES,Tiles,outputRaster +sagang:tissotsindicatrix,TARGET,Indicatrix,outputVector +sagang:tobia,E,TOBIA classes,outputRaster +sagang:tobia,F,TOBIA index,outputRaster +sagang:topmodel,MOIST,Soil Moisture Deficit,outputRaster +sagang:topmodel,TABLE,Simulation Output,outputVector +sagang:topofatmospherereflectance,PANBAND,Panchromatic,outputRaster +sagang:topofatmospherereflectance,SPECTRAL,Spectral,outputRaster +sagang:topofatmospherereflectance,THERMAL,Thermal,outputRaster +sagang:topographiccorrection,CORRECTED,Corrected Image,outputRaster +sagang:topographicopenness,NEG,Negative Openness,outputRaster +sagang:topographicopenness,POS,Positive Openness,outputRaster +sagang:topographicpositionindextpi,TPI,Topographic Position Index,outputRaster +sagang:topographicwetnessindexonestep,TWI,Topographic Wetness Index,outputRaster +sagang:topographicwetnessindextwi,TWI,Topographic Wetness Index,outputRaster +sagang:tpibasedlandformclassification,LANDFORMS,Landforms,outputRaster +sagang:transectthroughpolygonshapefile,TRANSECT_RESULT,Result table,outputVector +sagang:transformvectorlayer,TRANSFORM,Transformed Shapes,outputVector +sagang:transposerasterlayers,TRANSPOSED,Transposed Grids,outputRaster +sagang:traveltimecalculation,TRAVELTIME_MINUTES,Travel Time,outputRaster +sagang:treegrowthseason,FIRST,First Growing Day,outputRaster +sagang:treegrowthseason,LAST,Last Growing Day,outputRaster +sagang:treegrowthseason,LGS,Length,outputRaster +sagang:treegrowthseason,SMP,Precipitation Sum,outputRaster +sagang:treegrowthseason,SMT,Mean Temperature,outputRaster +sagang:treegrowthseason,TLH,Tree Line Height,outputRaster +sagang:trendanalysis,TREND,Table (with Trend),outputVector +sagang:trendanalysisshapes,TREND,Table (with Trend),outputVector +sagang:triangulation,TARGET_OUT_GRID,Target Grid,outputRaster +sagang:uniquevaluestatisticsforgrids,MAJORITY,Majority,outputRaster +sagang:uniquevaluestatisticsforgrids,MINORITY,Minority,outputRaster +sagang:uniquevaluestatisticsforgrids,NUNIQUES,Number of Unique Values,outputRaster +sagang:universalimagequalityindex,CONTRAST,Contrast,outputRaster +sagang:universalimagequalityindex,CORRELATION,Correlation,outputRaster +sagang:universalimagequalityindex,LUMINANCE,Luminance,outputRaster +sagang:universalimagequalityindex,QUALITY,Universal Image Quality Index,outputRaster +sagang:universalkriging,CV_RESIDUALS,Cross Validation Residuals,outputVector +sagang:universalkriging,CV_SUMMARY,Cross Validation Summary,outputVector +sagang:universalkriging,PREDICTION,Prediction,outputRaster +sagang:universalkriging,VARIANCE,Prediction Error,outputRaster +sagang:upslopeanddownslopecurvature,C_DOWN,Downslope Curvature,outputRaster +sagang:upslopeanddownslopecurvature,C_DOWN_LOCAL,Local Downslope Curvature,outputRaster +sagang:upslopeanddownslopecurvature,C_LOCAL,Local Curvature,outputRaster +sagang:upslopeanddownslopecurvature,C_UP,Upslope Curvature,outputRaster +sagang:upslopeanddownslopecurvature,C_UP_LOCAL,Local Upslope Curvature,outputRaster +sagang:upslopearea,AREA,Upslope Area,outputRaster +sagang:upslopeheightslopeaspect,ASPECT,Aspect,outputRaster +sagang:upslopeheightslopeaspect,HEIGHT,Upslope Height,outputRaster +sagang:upslopeheightslopeaspect,SLOPE,Slope,outputRaster +sagang:utmprojectiongrid,GRID,Target,outputRaster +sagang:utmprojectiongrid,OUT_X,X Coordinates,outputRaster +sagang:utmprojectiongrid,OUT_Y,Y Coordinates,outputRaster +sagang:utmprojectiongridlist,GRIDS,Target,outputRaster +sagang:utmprojectiongridlist,OUT_X,X Coordinates,outputRaster +sagang:utmprojectiongridlist,OUT_Y,Y Coordinates,outputRaster +sagang:utmprojectionshapeslist,TARGET,Target,outputVector +sagang:valleyandridgedetectiontophatapproach,HILL,Hill Height,outputRaster +sagang:valleyandridgedetectiontophatapproach,HILL_IDX,Hill Index,outputRaster +sagang:valleyandridgedetectiontophatapproach,SLOPE_IDX,Hillslope Index,outputRaster +sagang:valleyandridgedetectiontophatapproach,VALLEY,Valley Depth,outputRaster +sagang:valleyandridgedetectiontophatapproach,VALLEY_IDX,Valley Index,outputRaster +sagang:valleydepth,RIDGE_LEVEL,Ridge Level,outputRaster +sagang:valleydepth,VALLEY_DEPTH,Valley Depth,outputRaster +sagang:variogram,RESULT,Sample Variogram,outputVector +sagang:variogramcloud,RESULT,Variogram Cloud,outputVector +sagang:variogramdialog,VARIOGRAM,Variogram,outputVector +sagang:vectorisinggridclasses,POLYGONS,Polygons,outputVector +sagang:vectorruggednessmeasurevrm,VRM,Vector Terrain Ruggedness (VRM),outputRaster +sagang:vegetationindexdistancebased,ATSAVI,"Transformed Soil Adjusted Vegetation Index (Baret and Guyot, 1991)",outputRaster +sagang:vegetationindexdistancebased,PVI0,"Perpendicular Vegetation Index (Richardson and Wiegand, 1977)",outputRaster +sagang:vegetationindexdistancebased,PVI1,"Perpendicular Vegetation Index (Perry and Lautenschlager, 1984)",outputRaster +sagang:vegetationindexdistancebased,PVI2,Perpendicular Vegetation Index (Walther and Shabaani),outputRaster +sagang:vegetationindexdistancebased,PVI3,"Perpendicular Vegetation Index (Qi, et al., 1994)",outputRaster +sagang:vegetationindexdistancebased,TSAVI,Transformed Soil Adjusted Vegetation Index (Baret et al. 1989),outputRaster +sagang:vegetationindexslopebased,CTVI,Corrected Transformed Vegetation Index,outputRaster +sagang:vegetationindexslopebased,DVI,Difference Vegetation Index,outputRaster +sagang:vegetationindexslopebased,NDVI,Normalized Difference Vegetation Index,outputRaster +sagang:vegetationindexslopebased,NRVI,Normalized Ratio Vegetation Index,outputRaster +sagang:vegetationindexslopebased,RVI,Ratio Vegetation Index,outputRaster +sagang:vegetationindexslopebased,SAVI,Soil Adjusted Vegetation Index,outputRaster +sagang:vegetationindexslopebased,TTVI,Thiam's Transformed Vegetation Index,outputRaster +sagang:vegetationindexslopebased,TVI,Transformed Vegetation Index,outputRaster +sagang:verticaldistancetochannelnetwork,BASELEVEL,Channel Network Base Level,outputRaster +sagang:verticaldistancetochannelnetwork,DISTANCE,Vertical Distance to Channel Network,outputRaster +sagang:visibilitypoints,VISIBILITY,Visibility,outputRaster +sagang:warpingshapes,OUTPUT,Output,outputVector +sagang:waterretentioncapacity,OUTPUT,Final Parameters,outputVector +sagang:waterretentioncapacity,RETENTION,Water Retention Capacity,outputRaster +sagang:watershedbasins,BASINS,Watershed Basins,outputRaster +sagang:watershedbasinsextended,BASINS,Basins,outputRaster +sagang:watershedbasinsextended,HEADS,River Heads,outputVector +sagang:watershedbasinsextended,MOUTHS,River Mouths,outputVector +sagang:watershedbasinsextended,SUBBASINS,Subbasins,outputRaster +sagang:watershedbasinsextended,V_BASINS,Basins,outputVector +sagang:watershedbasinsextended,V_SUBBASINS,Subbasins,outputVector +sagang:wator,GRID,Wa-Tor,outputRaster +sagang:wator,TABLE,Cycles,outputVector +sagang:wedgefail,F,Failures,outputRaster +sagang:wetness,F,WI values,outputRaster +sagang:wetness,G,WI classes,outputRaster +sagang:windeffectcorrection,B_GRID,Calibrated Scaling Factor,outputRaster +sagang:windeffectcorrection,WINDCORR,Corrected Wind Effect,outputRaster +sagang:windeffectwindwardleewardindex,AFH,Effective Air Flow Heights,outputRaster +sagang:windeffectwindwardleewardindex,EFFECT,Wind Effect,outputRaster +sagang:windexpositionindex,EXPOSITION,Wind Exposition,outputRaster +sagang:windshelterindex,SHELTER,Wind Shelter Index,outputRaster +sagang:womblingedgedetection,EDGE_LINES,Edge Segments,outputVector +sagang:womblingedgedetection,EDGE_POINTS,Edge Points,outputVector +sagang:womblingedgedetection,GRADIENTS,Gradients,outputRaster +sagang:womblingformultiplefeaturesedgedetection,EDGE_CELLS,Edges,outputRaster +sagang:womblingformultiplefeaturesedgedetection,OUTPUT,Output,outputRaster +sagang:worldfilefromflightandcamerasettings,EXTENT,Extent,outputVector +sagang:zonalmultipleregressionanalysispointsandpredictorgrids,REGRESSION,Regression,outputRaster +sagang:zonalmultipleregressionanalysispointsandpredictorgrids,RESIDUALS,Residuals,outputVector +sagang:zonalrasterstatistics,OUTTAB,Zonal Statistics,outputVector +visibility:createviewpoints,OUTPUT,Output layer,outputVector +visibility:intervisibility,OUTPUT,Output layer,outputVector +visibility:viewshed,OUTPUT,Output file,outputRaster +visibility:visibilityindex,OUTPUT,Output file,outputRaster diff --git a/tests/testthat/test-compat-terra.R b/tests/testthat/test-compat-terra.R index 0584f8d3..6ca2ff3f 100644 --- a/tests/testthat/test-compat-terra.R +++ b/tests/testthat/test-compat-terra.R @@ -1,4 +1,4 @@ -test_that("terra argument coercers work", { +test_that("terra argument coercers work for rasters", { skip_if_not_installed("terra") obj <- terra::rast(vals = 1:64800) @@ -14,21 +14,43 @@ test_that("terra argument coercers work", { expect_s3_class(tmp_file, "qgis_tempfile_arg") unlink(tmp_file) - # also check rasters with embedded files - obj <- terra::rast(system.file("longlake/longlake.tif", package = "qgisprocess")) + tmp_file <- expect_match( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "raster")), + "\\.tif$" + ) + expect_s3_class(tmp_file, "qgis_tempfile_arg") + unlink(tmp_file) +}) + +test_that("terra argument coercers work for SpatRaster referring to a file", { + skip_if_not_installed("terra") - # behaviour changed in a terra update + obj <- terra::rast(system.file("longlake/longlake.tif", package = "qgisprocess")) sources <- terra::sources(obj) expect_identical( as_qgis_argument(obj, qgis_argument_spec(qgis_type = "layer")), if (is.character(sources)) sources else sources$source ) + expect_identical( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "raster")), + if (is.character(sources)) sources else sources$source + ) + expect_warning( as_qgis_argument(obj, qgis_argument_spec(qgis_type = "multilayer")), "extract the bands" ) + # check effect of resetting CRS + obj2 <- obj + terra::crs(obj2) <- NA + res <- expect_message( + as_qgis_argument(obj2, qgis_argument_spec(qgis_type = "raster")), + "Rewriting.*since its CRS has been set to another value" + ) + expect_s3_class(res, "qgis_tempfile_arg") + # check behaviour in case of band selection or reordering obj1 <- obj$longlake_2 res <- expect_message( @@ -45,7 +67,224 @@ test_that("terra argument coercers work", { expect_s3_class(res, "qgis_tempfile_arg") }) -test_that("terra result coercers work", { + + + + +test_that("terra argument coercers work for locally created SpatVector", { + skip_if_not_installed("terra") + + obj <- terra::vect( + x = c("POINT (7e5 7e5)", "POINT (6e5 6.5e5)"), + crs = "EPSG:3812" + ) + expect_error( + as_qgis_argument(obj), + "Can't convert 'SpatVector' object" + ) + + tmp_file <- expect_match( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "layer")), + "\\.gpkg$" + ) + expect_s3_class(tmp_file, "qgis_tempfile_arg") + unlink(tmp_file) + + tmp_file <- expect_match( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "vector")), + "\\.gpkg$" + ) + expect_s3_class(tmp_file, "qgis_tempfile_arg") + unlink(tmp_file) + + expect_error( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "point")), + "exactly one row and the geometry must be a point" + ) + + expect_match( + as_qgis_argument(obj[1, ], qgis_argument_spec(qgis_type = "point")), + "^[\\de\\+]+,[\\de\\+]+\\[\\w+:\\d+\\]$", + perl = TRUE + ) + + terra::crs(obj) <- NA + expect_match( + as_qgis_argument(obj[1, ], qgis_argument_spec(qgis_type = "point")), + "^[\\de\\+]+,[\\de\\+]+$", + perl = TRUE + ) +}) + + +test_that("terra argument coercers work for SpatVector referring to a file", { + skip_if_not_installed("terra") + + tmp_file <- qgis_tmp_vector() + expect_match(tmp_file, "\\.gpkg$") + withr::local_file(tmp_file) + + suppressWarnings({ + # terra gives warning on this file: 'Z coordinates ignored' + obj <- terra::vect(system.file("longlake/longlake.gpkg", package = "qgisprocess")) + }) + terra::writeVector(obj, tmp_file) + obj <- terra::vect(tmp_file) + sources <- terra::sources(obj) + expect_identical( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "layer")), + if (is.character(sources)) sources else sources$source + ) + + expect_identical( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "vector")), + if (is.character(sources)) sources else sources$source + ) + + expect_error( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "point")), + "exactly one row and the geometry must be a point" + ) + + # check effect of resetting CRS + obj2 <- obj + terra::crs(obj2) <- NA + res <- expect_message( + as_qgis_argument(obj2, qgis_argument_spec(qgis_type = "vector")), + "Rewriting.*since its CRS has been set to another value" + ) + expect_s3_class(res, "qgis_tempfile_arg") + + # check effect of changed attribute names + obj2 <- obj + names(obj2) <- paste(names(obj), "new", sep = "_") + res <- expect_message( + as_qgis_argument(obj2, qgis_argument_spec(qgis_type = "vector")), + "Rewriting.*since its attribute names" + ) + expect_s3_class(res, "qgis_tempfile_arg") + +}) + +test_that("terra argument coercers work for a SpatVector referring to a layer in a multi-layer file", { + skip_if_not_installed("terra") + + tmp_file <- qgis_tmp_vector() + expect_match(tmp_file, "\\.gpkg$") + withr::local_file(tmp_file) + + suppressWarnings({ + # terra gives warning on this file: 'Z coordinates ignored' + obj <- terra::vect(system.file("longlake/longlake.gpkg", package = "qgisprocess")) + }) + terra::writeVector(obj, tmp_file) + obj <- terra::vect(tmp_file) + + tmp_file2 <- qgis_tmp_vector() + expect_match(tmp_file2, "\\.gpkg$") + withr::local_file(tmp_file2) + terra::writeVector(obj, tmp_file2) + terra::writeVector( + obj, + tmp_file, + layer = "layer2", + insert = TRUE, + overwrite = TRUE + ) + expect_length(terra::vector_layers(tmp_file), 2) + obj <- terra::vect(tmp_file, layer = "layer2") + expect_match( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "vector")), + "\\|layername=" + ) +}) + + + + + +test_that("terra argument coercers work for SpatVectorProxy", { + skip_if_not_installed("terra") + + tmp_file <- qgis_tmp_vector() + expect_match(tmp_file, "\\.gpkg$") + withr::local_file(tmp_file) + + suppressWarnings({ + # terra gives warning on this file: 'Z coordinates ignored' + obj <- terra::vect(system.file("longlake/longlake.gpkg", package = "qgisprocess")) + }) + terra::writeVector(obj, tmp_file) + obj <- terra::vect(tmp_file, proxy = TRUE) + sources <- terra::sources(obj) + expect_identical( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "layer")), + if (is.character(sources)) sources else sources$source + ) + + expect_identical( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "vector")), + if (is.character(sources)) sources else sources$source + ) + + expect_error( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "point")), + "exactly one row and the geometry must be a point" + ) + + # check behaviour for qgis_type = "point" + tmp_file <- qgis_tmp_vector() + withr::local_file(tmp_file) + terra::writeVector( + terra::vect( + x = "POINT (7e5 7e5)", + crs = "EPSG:3812" + ), + tmp_file + ) + obj <- terra::vect(tmp_file, proxy = TRUE) + expect_match( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "point")), + "^[\\de\\+]+,[\\de\\+]+\\[\\w+:\\d+\\]$", + perl = TRUE + ) +}) + +test_that("terra argument coercers work for a SpatVectorProxy referring to a layer in a multi-layer file", { + skip_if_not_installed("terra") + + tmp_file <- qgis_tmp_vector() + expect_match(tmp_file, "\\.gpkg$") + withr::local_file(tmp_file) + + suppressWarnings({ + # terra gives warning on this file: 'Z coordinates ignored' + obj <- terra::vect(system.file("longlake/longlake.gpkg", package = "qgisprocess")) + }) + terra::writeVector(obj, tmp_file) + obj <- terra::vect(tmp_file) + + tmp_file2 <- qgis_tmp_vector() + expect_match(tmp_file2, "\\.gpkg$") + withr::local_file(tmp_file2) + terra::writeVector(obj, tmp_file2) + terra::writeVector( + obj, + tmp_file, + layer = "layer2", + insert = TRUE, + overwrite = TRUE + ) + obj <- terra::vect(tmp_file, layer = "layer2", proxy = TRUE) + expect_match( + as_qgis_argument(obj, qgis_argument_spec(qgis_type = "vector")), + "\\|layername=" + ) +}) + + + +test_that("terra result coercers to SpatRaster work", { skip_if_not_installed("terra") expect_s4_class( @@ -84,11 +323,99 @@ test_that("terra result coercers work", { ) }) -test_that("terra argument coercer for extent works", { + + + + +test_that("terra result coercers to SpatVector work", { + skip_if_not_installed("terra") + + tmp_file <- qgis_tmp_vector() + expect_match(tmp_file, "\\.gpkg$") + withr::local_file(tmp_file) + + suppressWarnings({ + # terra gives warning on this file: 'Z coordinates ignored' + obj <- terra::vect(system.file("longlake/longlake.gpkg", package = "qgisprocess")) + }) + terra::writeVector(obj, tmp_file) + + expect_s4_class( + qgis_as_terra(structure(tmp_file, class = "qgis_outputVector")), + "SpatVector" + ) + + expect_s4_class( + qgis_as_terra( + structure(tmp_file, class = "qgis_outputVector"), + proxy = TRUE + ), + "SpatVectorProxy" + ) + + expect_s4_class( + qgis_as_terra(structure(tmp_file, class = "qgis_outputLayer")), + "SpatVector" + ) + + expect_s4_class( + qgis_as_terra( + structure( + list(OUTPUT = structure(tmp_file, class = "qgis_outputVector")), + class = "qgis_result" + ) + ), + "SpatVector" + ) + + expect_s4_class( + qgis_as_terra( + structure( + list(OUTPUT = structure(tmp_file, class = "qgis_outputVector")), + class = "qgis_result" + ), + proxy = TRUE + ), + "SpatVectorProxy" + ) + + # check acceptance of QGIS |layername= format + terra::writeVector( + obj, + tmp_file, + layer = "layer2", + insert = TRUE, + overwrite = TRUE + ) + expect_length(terra::vector_layers(tmp_file), 2) + expect_s4_class( + qgis_as_terra( + structure( + list(OUTPUT = structure( + paste0(tmp_file, "|layername=layer2"), + class = "qgis_outputVector") + ), + class = "qgis_result" + ) + ), + "SpatVector" + ) +}) + + + + + +test_that("terra argument coercer for SpatExtent works", { skip_if_not_installed("terra") obj <- terra::rast(system.file("longlake/longlake.tif", package = "qgisprocess")) + expect_error( + as_qgis_argument(terra::ext(obj)), + "Can't convert" + ) + bbox_representation <- expect_match( as_qgis_argument(terra::ext(obj), qgis_argument_spec(qgis_type = "extent")), "409891\\.446955431,411732\\.936955431,5083288\\.89932423,5084852\\.61932423"