hypertidy / silicate

A general form for complex data
https://hypertidy.github.io/silicate/
53 stars 4 forks source link

generic TODO/explore list #26

Open mdsumner opened 7 years ago

mdsumner commented 7 years ago

This uses very similar idioms: https://github.com/cran/RArcInfo

It's designed for .e00 format which is natively "arc-node" topology, i.e. the same as the underlying structures in the maps package, and pretty much what polygons in D3 uses. There's also code to read .adf coverages (but that might be raster data or TINs, or either).

mdsumner commented 6 years ago

ggplot2 retrieving creation flow

https://gist.github.com/hrbrmstr/8bb810fb33646717ff4a1091a8c9fe91

https://twitter.com/JennyBryan/status/755417584359632896

https://twitter.com/hrbrmstr/status/755424521079914496

mdsumner commented 6 years ago

https://github.com/davidcanino/mangrovetdslib

mdsumner commented 6 years ago

tidygraph solves the unique naming problem for vertices:

library(scgraph) library(scsf) g <- as_tbl_graph(scgraph::sc_as_igraph( PRIMITIVE(minimal_mesh))) g %>% mutate(name = 1:14) g %>% mutate(name = 1:14) %>% plot()

mdsumner commented 6 years ago

https://github.com/paultpearson/TDAmapper/

http://blog.revolutionanalytics.com/2014/01/topological-data-analysis-with-r.html

mdsumner commented 6 years ago

ESRI's terminology

Interesting stuff here, the terminology is terribly confusing but might give some clues about what happened

https://gis.stackexchange.com/questions/747/what-is-arcgis-for-desktop-and-geodatabase-equivalent-to-regions-of-arcinfo-wo

https://gis.stackexchange.com/questions/249581/how-is-the-arc-coverage-regions-data-format-represented-in-shapefiles-and-geod

mdsumner commented 6 years ago

Boundary adventures

This is a good one:

https://gis.stackexchange.com/questions/258184/four-states-each-of-six-pairs-of-which-have-a-common-boundary

Merge logic with this: https://rpubs.com/cyclemumner/neighbours02

mdsumner commented 6 years ago

sc_arc question:

https://gis.stackexchange.com/questions/236903/converting-polygon-to-lines-without-duplicate-edges?rq=1

mdsumner commented 6 years ago

And https://twitter.com/ikashnitsky/status/940291293896478720

mdsumner commented 6 years ago

Hone in on topology problems, unclear if gibble / silicate really helps more here apart from giving clear entity identities, but a good area to explore:

http://rpubs.com/cyclemumner/344125

mdsumner commented 6 years ago

This is a good one, you could probably shoe-horn a solution with sf but it's very much suited to labelled segments that can be re-traced by label into paths.

https://stat.ethz.ch/pipermail/r-sig-geo/2018-January/026309.html

mdsumner commented 6 years ago

spdep

https://stat.ethz.ch/pipermail/r-sig-geo/2017-June/025756.html

Try the skimr approach, a good partnership with the spdep extractions.

ropenscilabs/skimr#88

See ideas here: https://twitter.com/jakub_nowosad/status/872263367599194117

mdsumner commented 6 years ago

Support gifti https://CRAN.R-project.org/package=gifti

mdsumner commented 6 years ago

http://s2geometry.io/

mdsumner commented 6 years ago

much mesh sorcery here https://github.com/Lin20?tab=repositories

mdsumner commented 6 years ago

Myriahedral: https://medium.com/@vis.gl/unfolding-the-earth-myriahedral-projections-in-webgl-6b2bcfd00a30

mdsumner commented 6 years ago

https://eev.ee/blog/2018/03/20/conundrum/

mpadge commented 6 years ago

wow, that last link provide some deep stuff to ponder :metal: Edit: Note the quote (me on my fave trope again): "it panics when intersecting everything results in two distinct but exactly coincident edges" - and so does silicate in current form. (That's no criticism!)

mdsumner commented 6 years ago

Yes, I have to park it a while but it's super interesting!

mdsumner commented 6 years ago

@jhollist a silicate form for profile data, this could be applied to Argo too , I would like to try a few things https://twitter.com/jhollist/status/977254736163491842?s=19

mdsumner commented 6 years ago

It's not even raining yet https://twitter.com/thomasp85/status/1014239835165548546?s=19

mdsumner commented 6 years ago

https://github.com/stla/cxhull

mdsumner commented 5 years ago

https://gist.github.com/mdsumner/6608756280d419aeebe3

mdsumner commented 5 years ago

Delft3d https://github.com/lutraconsulting/MDAL/issues/32#issuecomment-425344792

mdsumner commented 5 years ago

https://github.com/libigl/libigl-dev

mdsumner commented 5 years ago

inlabru has mesh classes https://github.com/fbachl/inlabru/blob/devel/R/mesh.R

It includes a globe texture image of the earth, but uses a 1-sphere to map the texture, it doesn't have independent texture coordinates so all data must be converted for adding to the scene:

   lat <- matrix(-asin(seq(-1, 1, len = n.smp)), n.smp, n.smp, 
        byrow = TRUE)
    long <- matrix(seq(-180, 180, len = n.smp) * pi/180, n.smp, 
        n.smp)
    x <- R * cos(lat) * cos(long)
    y <- R * cos(lat) * sin(long)
    z <- R * sin(lat)
    rgl::persp3d(x, y, z, col = "white", texture = system.file("misc/Lambert_ocean.png", 
        package = "inlabru"), specular = "black", axes = axes, 
        box = box, xlab = xlab, ylab = ylab, zlab = zlab, normal_x = x, 
        normal_y = y, normal_z = z)
mdsumner commented 5 years ago

Art taxi https://artlembo.com/2018/10/16/bigdataresults/

http://www.georeference.org/forum/t145302.1

mdsumner commented 5 years ago

spatgraphs format

This is a little weird, the edges list is mapped to vertices, and elements list which vertices this vertex joins to, if any.

library(silicate)
x <- SC(minimal_mesh)
edges <- vector("list", nrow(x$vertex))
for (i in seq_along(edges)) {
  edges[[i]] <- setdiff(c(match(x$edge$.vertex1[match(x$vertex$vertex_[i], x$edge$.vertex0)], x$vertex$vertex_), 
                          match(x$edge$.vertex0[match(x$vertex$vertex_[i], x$edge$.vertex1)], x$vertex$vertex_)), i)
}

v <- as.matrix(x$vertex[c("x_", "y_")])
g <- as.sg(edges)
plot(g, v)
mdsumner commented 5 years ago

Exotica zoo

http://osgeo-org.1560.x6.nabble.com/gdal-dev-SQL-script-for-creating-a-test-GeoPackage-td5202703.html

mdsumner commented 5 years ago

Pbufs for mesh https://gist.github.com/Jerdak/87ecbe4bcb0ba9e33b10

mdsumner commented 5 years ago

Post on TDA https://rviews.rstudio.com/2018/11/14/a-mathematician-s-perspective-on-topological-data-analysis-and-r/

mdsumner commented 5 years ago

Mesh stuff

http://www.wias-berlin.de/people/si/course/files/BernPlassmann-Chap6.pdf

http://citeseerx.ist.psu.edu/viewdoc/download?doi=10.1.1.118.4609&rep=rep1&type=pdf

mdsumner commented 5 years ago

Find culdesacs https://twitter.com/WeAreRLadies/status/1090022933538295808?s=19

mdsumner commented 5 years ago

Graph colouring https://github.com/saurfang/graphcoloring/blob/master/README.md

mdsumner commented 4 years ago

https://www.r-spatial.org//r/2019/09/26/spatial-networks.html graph conversion

mdsumner commented 4 years ago

https://github.com/hypertidy/silicate/issues/82 NetworkX

mdsumner commented 4 years ago

Rpolyhedra https://github.com/hypertidy/silicate/issues/112

mdsumner commented 4 years ago

legacy terminology https://github.com/hypertidy/silicate/issues/28

mdsumner commented 4 years ago

Dewey's s2 globe

https://gist.github.com/paleolimbot/2aada1def3e7ce6ece92d823a9c3c07a