shapes-0.1.0.0: physics engine and other tools for 2D shapes

Safe HaskellNone
LanguageHaskell2010

Physics.Contact.ConvexHull

Description

Convex polygons and their vertices and edges. Functions and types for treating convex polygons as support functions (axis -> extent along an axis).

Documentation

data Extent f Source #

Constructors

Extent 

Instances

Functor Extent Source # 

Methods

fmap :: (a -> b) -> Extent a -> Extent b #

(<$) :: a -> Extent b -> Extent a #

Eq f => Eq (Extent f) Source # 

Methods

(==) :: Extent f -> Extent f -> Bool #

(/=) :: Extent f -> Extent f -> Bool #

Show f => Show (Extent f) Source # 

Methods

showsPrec :: Int -> Extent f -> ShowS #

show :: Extent f -> String #

showList :: [Extent f] -> ShowS #

Generic (Extent f) Source # 

Associated Types

type Rep (Extent f) :: * -> * #

Methods

from :: Extent f -> Rep (Extent f) x #

to :: Rep (Extent f) x -> Extent f #

NFData f => NFData (Extent f) Source # 

Methods

rnf :: Extent f -> () #

type Rep (Extent f) Source # 
type Rep (Extent f) = D1 * (MetaData "Extent" "Physics.Contact.ConvexHull" "shapes-0.1.0.0-E6UUiYRpOc15rGTlEn6KOE" False) (C1 * (MetaCons "Extent" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_extentMin") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * f)) ((:*:) * (S1 * (MetaSel (Just Symbol "_extentMax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * f)) (S1 * (MetaSel (Just Symbol "_extentProjection") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (SP Double Double))))))

extentMin :: forall f. Lens' (Extent f) f Source #

extentMax :: forall f. Lens' (Extent f) f Source #

type Vertices = [P2] Source #

data ConvexHull Source #

Instances

ixedMap :: Ix i => (Array i e -> i -> x) -> Array i e -> Array i x Source #