manifolds-0.2.2.0: Coordinate-free hypersurfaces

Copyright(c) Justus Sagemüller 2016
LicenseGPL v3
Maintainer(@) sagemueller $ geo.uni-koeln.de
Stabilityexperimental
Portabilityportable
Safe HaskellNone
LanguageHaskell2010

Data.Manifold.Web

Description

 

Documentation

data PointsWeb :: * -> * -> * where Source

Instances

Functor (PointsWeb a) Source 
Foldable (PointsWeb a) Source 
Traversable (PointsWeb a) Source 
Foldable (PointsWeb x) (->) (->) Source 
Traversable (PointsWeb x) (PointsWeb x) (->) (->) Source 
Generic (PointsWeb a b) Source 
(NFData x, NFData (Needle' x), NFData y) => NFData (PointsWeb x y) Source 
type Rep (PointsWeb a b) Source 

fromWebNodes :: forall x y. WithField Manifold x => (Shade x -> Metric x) -> [(x, y)] -> PointsWeb x y Source

fromShadeTree :: forall x. WithField Manifold x => (Shade x -> Metric x) -> ShadeTree x -> PointsWeb x () Source

fromShaded Source

Arguments

:: WithField Manifold x 
=> (Shade x -> Metric x)

Local scalar-product generator. You can always use recipMetric . _shadeExpanse (but this may give distortions compared to an actual Riemannian metric).

-> (x `Shaded` y)

Source tree.

-> PointsWeb x y 

indexWeb :: WithField Manifold x => PointsWeb x y -> WebNodeId -> Option (x, y) Source

webEdges :: forall x y. WithField Manifold x => PointsWeb x y -> [((x, y), (x, y))] Source

localFocusWeb :: WithField Manifold x => PointsWeb x y -> PointsWeb x ((x, y), [(x, y)]) Source