Copyright | (C) Frank Staals |
---|---|
License | see the LICENSE file |
Maintainer | Frank Staals |
Safe Haskell | None |
Language | Haskell2010 |
Helper types and functions for implementing Sweep line algorithms.
Synopsis
- newtype Tagged (s :: *) a = Tagged {
- unTag :: a
- tag :: proxy s -> a -> Tagged s a
- newtype Timed s t a = Timed {}
- compare_ :: forall s t k. (Ord k, Reifies s t) => Timed s t k -> Timed s t k -> Ordering
- coerceTo :: proxy s -> f (Timed s' t k) v -> f (Timed s t k) v
- unTagged :: f (Timed s t k) v -> f (Timed () t k) v
- runAt :: forall s0 t k r f v. Ord k => t -> f (Timed s0 t k) v -> (forall s. Reifies s t => f (Timed s t k) v -> r) -> r
- getTime :: Timed s Int Int
- constT :: proxy s -> Int -> Timed s Int Int
- test1 :: Int -> Bool
- test2M :: Reifies s Int => proxy s -> Map (Timed s Int Int) String
- query :: forall s v. Ord (Timed s Int Int) => Map (Timed s Int Int) v -> Maybe v
- test2 :: Int -> Maybe String
Documentation
newtype Tagged (s :: *) a Source #
Instances
Eq a => Eq (Tagged s a) Source # | |
Ord a => Ord (Tagged s a) Source # | |
Show a => Show (Tagged s a) Source # | |
Represent a computation that needs a particular time as input.
Instances
(Reifies s t, Ord k) => Eq (Timed s t k) Source # | |
(Reifies s t, Ord k) => Ord (Timed s t k) Source # | |
Defined in Algorithms.Geometry.Sweep |
compare_ :: forall s t k. (Ord k, Reifies s t) => Timed s t k -> Timed s t k -> Ordering Source #
Comparison function for timed values