FieldTrip-0.2.1: Functional 3DSource codeContentsIndex
Graphics.FieldTrip.Geometry2
Stabilityexperimental
Maintainerconal@conal.net, andygill@ku.edu
Contents
Text
Geometry2 filters
Description
2D geometry
Synopsis
data Geometry2
renderer2 :: Renderer -> Geometry2
renderWith2 :: GContext -> Geometry2 -> IO ()
render2 :: Geometry2 -> IO ()
ubox2 :: Geometry2
box2 :: (Real s, Floating s, MatrixComponent s) => s -> s -> Geometry2
approx2 :: (ErrorBound -> Geometry2) -> Geometry2
udisk :: Geometry2
polygon :: VertexComponent s => [Vertex2 s] -> Geometry2
regularPolygon :: Int -> Geometry2
diskWedge :: R -> Geometry2
regularPolygonWedge :: forall s. (Ord s, Floating s, VertexComponent s) => s -> Int -> Geometry2
utext :: String -> Geometry2
utextWidth :: String -> Double
utextBaseline :: Double
type Filter2 = Geometry2 -> Geometry2
move2 :: (MatrixComponent s, Real s, Floating s) => s -> s -> Filter2
move2Y :: (MatrixComponent s, Real s, Floating s) => s -> Filter2
andFlip2 :: Filter2
Documentation
data Geometry2 Source
2D geometry In the Monoid instance, mempty is completely invisible (aka transparent or empty), and a mappend b places a on top of b.
show/hide Instances
renderer2 :: Renderer -> Geometry2Source
Make a geometry from a rendering action. The action must leave graphics state as it found it.
renderWith2 :: GContext -> Geometry2 -> IO ()Source
Render the geometry, given a graphics context. Leaves graphics state unchanged.
render2 :: Geometry2 -> IO ()Source
Render the geometry with default graphics context. See also renderWith2.
ubox2 :: Geometry2Source
Box2 of unit width and height. See also 'box2.
box2 :: (Real s, Floating s, MatrixComponent s) => s -> s -> Geometry2Source
Box2 of given width and height. See also 'ubox2.
approx2 :: (ErrorBound -> Geometry2) -> Geometry2Source
Approximate one geometry by another, given an error bound
udisk :: Geometry2Source
The unit disk, approximated as regular n-gons
polygon :: VertexComponent s => [Vertex2 s] -> Geometry2Source
A polygon
regularPolygon :: Int -> Geometry2Source
Regular polygon
diskWedge :: R -> Geometry2Source
Portion of a disk
regularPolygonWedge :: forall s. (Ord s, Floating s, VertexComponent s) => s -> Int -> Geometry2Source
Regular polygon wedge. Oops! only works for frac <= 1/2, since otherwise the polygon is non-convex.
Text
utext :: String -> Geometry2Source
The passed string of text centered at the origin with height 1.0
utextWidth :: String -> DoubleSource
The width of the geometry of utext of that string.
utextBaseline :: DoubleSource
The height of the baseline of geometry created by utext. This can be used for underlining, for example.
Geometry2 filters
type Filter2 = Geometry2 -> Geometry2Source
Geometry2 filter
move2 :: (MatrixComponent s, Real s, Floating s) => s -> s -> Filter2Source
Simplified interface to translate2
move2Y :: (MatrixComponent s, Real s, Floating s) => s -> Filter2Source
Specializations of move2
andFlip2 :: Filter2Source
A geometry plus its a rotated-by-pi version.
Produced by Haddock version 2.3.0