hgeometry-0.9.0.0: Geometric Algorithms, Data structures, and Data types.

Safe HaskellNone
LanguageHaskell2010

Data.Geometry.Interval.Util

Synopsis

Documentation

newtype L r Source #

Open on left endpoint; so Closed before open

Constructors

L 

Fields

Instances
Eq r => Eq (L r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

Methods

(==) :: L r -> L r -> Bool #

(/=) :: L r -> L r -> Bool #

Ord r => Ord (L r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

Methods

compare :: L r -> L r -> Ordering #

(<) :: L r -> L r -> Bool #

(<=) :: L r -> L r -> Bool #

(>) :: L r -> L r -> Bool #

(>=) :: L r -> L r -> Bool #

max :: L r -> L r -> L r #

min :: L r -> L r -> L r #

Show r => Show (L r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

Methods

showsPrec :: Int -> L r -> ShowS #

show :: L r -> String #

showList :: [L r] -> ShowS #

Generic (L r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

Associated Types

type Rep (L r) :: Type -> Type #

Methods

from :: L r -> Rep (L r) x #

to :: Rep (L r) x -> L r #

NFData r => NFData (L r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

Methods

rnf :: L r -> () #

type Rep (L r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

type Rep (L r) = D1 (MetaData "L" "Data.Geometry.Interval.Util" "hgeometry-0.9.0.0-inplace" True) (C1 (MetaCons "L" PrefixI True) (S1 (MetaSel (Just "_unL") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (EndPoint r))))

unL :: forall r r. Iso (L r) (L r) (EndPoint r) (EndPoint r) Source #

newtype R r Source #

Order on right endpoint; so Open before Closed

Constructors

R 

Fields

Instances
Eq r => Eq (R r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

Methods

(==) :: R r -> R r -> Bool #

(/=) :: R r -> R r -> Bool #

Ord r => Ord (R r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

Methods

compare :: R r -> R r -> Ordering #

(<) :: R r -> R r -> Bool #

(<=) :: R r -> R r -> Bool #

(>) :: R r -> R r -> Bool #

(>=) :: R r -> R r -> Bool #

max :: R r -> R r -> R r #

min :: R r -> R r -> R r #

Show r => Show (R r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

Methods

showsPrec :: Int -> R r -> ShowS #

show :: R r -> String #

showList :: [R r] -> ShowS #

Generic (R r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

Associated Types

type Rep (R r) :: Type -> Type #

Methods

from :: R r -> Rep (R r) x #

to :: Rep (R r) x -> R r #

NFData r => NFData (R r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

Methods

rnf :: R r -> () #

type Rep (R r) Source # 
Instance details

Defined in Data.Geometry.Interval.Util

type Rep (R r) = D1 (MetaData "R" "Data.Geometry.Interval.Util" "hgeometry-0.9.0.0-inplace" True) (C1 (MetaCons "R" PrefixI True) (S1 (MetaSel (Just "_unR") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (EndPoint r))))

unR :: forall r r. Iso (R r) (R r) (EndPoint r) (EndPoint r) Source #