• Stars
    star
    130
  • Rank 267,497 (Top 6 %)
  • Language
    C++
  • License
    Other
  • Created over 5 years ago
  • Updated over 1 year ago

Reviews

There are no reviews yet. Be the first to send feedback to the community and the maintainers!

Repository Details

isoband: An R package to generate contour lines and polygons.

isoband

CRAN status R-CMD-check Codecov test coverage

Generate contour lines (isolines) and contour polygons (isobands) from regularly spaced grids containing elevation data. Package originally written by Claus Wilke and donated to r-lib in 2022.

Installation

Install the latest official release from CRAN via:

install.packages("isoband")

Install the current development from github via:

# install.packages("pak")
pak::pak("r-lib/isoband")

Examples

The two main workhorses of the package are the functions isolines() and isobands(), respectively. They return a list of isolines/isobands for each isolevel specified. Each isoline/isoband consists of vectors of x and y coordinates, as well as a vector of ids specifying which sets of coordinates should be connected. This format can be handed directly to grid.polyline()/grid.path() for drawing. However, we can also convert the output to spatial features and draw with ggplot2 (see below).

library(isoband)

m <- matrix(c(0, 0, 0, 0, 0,
              0, 1, 2, 1, 0,
              0, 1, 2, 0, 0,
              0, 1, 0, 1, 0,
              0, 0, 0, 0, 0), 5, 5, byrow = TRUE)

isolines(1:ncol(m), 1:nrow(m), m, 0.5)
#> $`0.5`
#> $`0.5`$x
#>  [1] 4.00 3.50 3.00 2.50 2.00 1.50 1.50 1.50 2.00 3.00 4.00 4.50 4.00 3.75 4.00
#> [16] 4.50 4.00
#> 
#> $`0.5`$y
#>  [1] 4.50 4.00 3.75 4.00 4.50 4.00 3.00 2.00 1.50 1.25 1.50 2.00 2.50 3.00 3.50
#> [16] 4.00 4.50
#> 
#> $`0.5`$id
#>  [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1
#> 
#> 
#> attr(,"class")
#> [1] "isolines" "iso"

isobands(1:ncol(m), 1:nrow(m), m, 0.5, 1.5)
#> $`0.5:1.5`
#> $`0.5:1.5`$x
#>  [1] 2.50 2.00 1.50 1.50 1.50 2.00 3.00 4.00 4.50 4.00 3.75 4.00 4.50 4.00 3.50
#> [16] 3.00 3.00 3.25 3.50 3.00 2.50 2.50
#> 
#> $`0.5:1.5`$y
#>  [1] 4.00 4.50 4.00 3.00 2.00 1.50 1.25 1.50 2.00 2.50 3.00 3.50 4.00 4.50 4.00
#> [16] 3.75 3.25 3.00 2.00 1.75 2.00 3.00
#> 
#> $`0.5:1.5`$id
#>  [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 2 2 2 2 2 2
#> 
#> 
#> attr(,"class")
#> [1] "isobands" "iso"

The function plot_iso() is a convenience function for debugging and testing.

plot_iso(m, 0.5, 1.5)

The isolining and isobanding algorithms have no problem with larger datasets. Let’s calculate isolines and isobands for the volcano dataset, convert to sf, and plot with ggplot2.

library(ggplot2)
suppressWarnings(library(sf))
#> Linking to GEOS 3.10.2, GDAL 3.4.2, PROJ 8.2.1; sf_use_s2() is TRUE

m <- volcano
b <- isobands((1:ncol(m))/(ncol(m)+1), (nrow(m):1)/(nrow(m)+1), m, 10*(9:19), 10*(10:20))
l <- isolines((1:ncol(m))/(ncol(m)+1), (nrow(m):1)/(nrow(m)+1), m, 10*(10:19))

bands <- iso_to_sfg(b)
data_bands <- st_sf(
  level = 1:length(bands),
  geometry = st_sfc(bands)
)
lines <- iso_to_sfg(l)
data_lines <- st_sf(
  level = 2:(length(lines)+1),
  geometry = st_sfc(lines)
)

ggplot() +
  geom_sf(data = data_bands, aes(fill = level), color = NA, alpha = 0.7) +
  geom_sf(data = data_lines, color = "black") +
  scale_fill_viridis_c(guide = "none") +
  coord_sf(expand = FALSE)

More Repositories

1

devtools

Tools to make an R developer's life easier
R
2,350
star
2

lintr

Static Code Analysis for R
R
1,149
star
3

httr

httr: a friendly http package for R
R
978
star
4

actions

GitHub Actions for the R community
JavaScript
898
star
5

testthat

An R πŸ“¦ to make testing πŸ˜€
R
860
star
6

usethis

Set up commonly used πŸ“¦ components
R
809
star
7

pkgdown

Generate static html documentation for an R package
R
692
star
8

styler

Non-invasive pretty printing of R code
R
674
star
9

pak

A fresh approach to package installation
C
605
star
10

cli

Tools for making beautiful & useful command line interfaces
R
597
star
11

roxygen2

Generate R package documentation from inline R comments
R
574
star
12

rig

The R Installation Manager
Rust
503
star
13

rlang

Low-level API for programming with R
R
475
star
14

progress

Progress bar in your R terminal
R
450
star
15

R6

Encapsulated object-oriented programming for R
R
398
star
16

here

A simpler way to find your files
R
394
star
17

scales

Tools for ggplot2 scales
R
379
star
18

fs

Provide cross platform file operations based on libuv.
C
356
star
19

covr

Test coverage reports for R
R
327
star
20

rex

Friendly regular expressions for R.
R
323
star
21

crayon

πŸ–οΈ R package for colored terminal output β€” now superseded by cli
R
319
star
22

remotes

Install R packages from GitHub, GitLab, Bitbucket, git, svn repositories, URLs
R
313
star
23

memoise

Easy memoisation for R
R
312
star
24

lobstr

Understanding complex R objects with tools similar to str()
R
295
star
25

callr

Call R from R
R
282
star
26

waldo

Find differences between R objects
R
274
star
27

vctrs

Generic programming with typed R vectors
C
273
star
28

slider

Sliding Window Functions
R
272
star
29

zeallot

Variable assignment with zeal! (or multiple, unpacking, and destructuring assignment in R)
R
249
star
30

conflicted

An alternative conflict resolution strategy for R
R
242
star
31

bench

High Precision Timing of R Expressions
R
237
star
32

gmailr

Access the Gmail RESTful API from R.
R
231
star
33

processx

Execute and Control Subprocesses from R
C
227
star
34

asciicast

Turn R scripts into terminal screencasts
R
217
star
35

httr2

Make HTTP requests and process their responses. A modern reimagining of httr.
R
215
star
36

xml2

Bindings to libxml2
R
213
star
37

gh

Minimalistic GitHub API client in R
R
213
star
38

cpp11

cpp11 helps you to interact with R objects using C++ code.
C++
190
star
39

keyring

πŸ” Access the system credential store from R
R
187
star
40

vdiffr

Visual regression testing and graphical diffing with testthat
C++
178
star
41

svglite

A lightweight svg graphics device for R
C++
177
star
42

pillar

Format columns with colour
R
172
star
43

withr

Methods For Temporarily Modifying Global State
R
167
star
44

ragg

Graphic Devices Based on AGG
C++
167
star
45

hugodown

Make websites with hugo and RMarkdown
R
164
star
46

ymlthis

write YAML for R Markdown, bookdown, blogdown, and more
R
162
star
47

rprojroot

Finding files in project subdirectories
R
147
star
48

coro

Coroutines for R
R
146
star
49

debugme

Easy and efficient debugging for R packages
R
142
star
50

available

Check if a package name is available to use
R
141
star
51

archive

R bindings to libarchive, supporting a large variety of archive formats
C++
139
star
52

ellipsis

Tools for Working with ...
R
138
star
53

gert

Simple git client for R
C
135
star
54

later

Schedule an R function or formula to run after a specified period of time.
C++
134
star
55

itdepends

R
133
star
56

rray

Simple Arrays
R
130
star
57

fastmap

Fast map implementation for R
C++
128
star
58

prettyunits

Pretty, human readable formatting of quantities
JavaScript
125
star
59

desc

Manipulate DESCRIPTION files
R
121
star
60

tidyselect

A backend for functions taking tidyverse selections
R
120
star
61

gargle

Infrastructure for calling Google APIs from R, including auth
R
111
star
62

rcmdcheck

Run R CMD check from R and collect the results
R
109
star
63

evaluate

A version of eval for R that returns more information about what happened
R
106
star
64

prettycode

Syntax highlight R code in the terminal
R
99
star
65

sloop

S language OOP ⛡️
R
99
star
66

mockery

A mocking library for R.
R
98
star
67

revdepcheck

R package reverse dependency checking
R
95
star
68

clock

A Date-Time Library for R
R
94
star
69

pkgdepends

R Package Dependency Resolution
R
93
star
70

systemfonts

System Native Font Handling in R
C++
91
star
71

lifecycle

Manage the life cycle of your exported functions and arguments
R
91
star
72

gtable

The layout packages that powers ggplot2
R
84
star
73

commonmark

High Performance CommonMark and Github Markdown Rendering in R
C
83
star
74

askpass

Password Entry for R, Git, and SSH
R
82
star
75

rappdirs

Find OS-specific directories to store data, caches, and logs. A port of python's AppDirs
R
81
star
76

zip

Platform independent zip compression via miniz
C
81
star
77

tree-sitter-r

C
81
star
78

downlit

Syntax Highlighting and Automatic Linking
R
80
star
79

clisymbols

Unicode symbols for CLI applications, with fallbacks
R
75
star
80

sessioninfo

Print Session Information
R
72
star
81

ps

R package to query, list, manipulate system processes
C
71
star
82

pkgapi

Create a map of functions for an R package - WORK IN PROGRESS!
R
70
star
83

credentials

Tools for Managing SSH and Git Credentials
R
69
star
84

roxygen2md

Convert elements of roxygen documentation to markdown
R
68
star
85

sodium

R bindings to libsodium
R
66
star
86

backports

Reimplementations of Functions Introduced Since R-3.0.0
R
65
star
87

pkgbuild

Find tools needed to build R packages
R
65
star
88

cliapp

Rich Command Line Applications
R
61
star
89

webfakes

Fake web apps for HTTP testing R packages
C
60
star
90

generics

Common generic methods
R
58
star
91

diffviewer

HTML widget to visually compare files
JavaScript
56
star
92

liteq

Serverless R message queue using SQLite
R
56
star
93

pkgload

Simulate installing and loading a package
R
54
star
94

cachem

Key-value caches for R
R
53
star
95

carrier

Create standalone functions for remote execution
R
50
star
96

brio

Basic R Input Output
R
50
star
97

jose

Javascript Object Signing and Encryption for R
R
48
star
98

urlchecker

Run CRAN URL checks from older versions of R
R
45
star
99

pkgconfig

Private configuration for R packages
R
40
star
100

filelock

Cross platform file locking in R
R
39
star