Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data Interval a where
- IntervArbitrary :: Int -> Int -> Interval 'Arbitrary
- IntervInfiniteArbitrary :: Interval 'Arbitrary
- IntervHoled :: Int64 -> Int64 -> Bool -> Interval 'Standard
- IntervInfinite :: Interval 'Standard
- data Bound
- approxVec :: forall n. Vec n (Interval 'Arbitrary) -> Approximation (Vec n (Interval 'Standard))
- data Offsets
- = Offsets (Set Int64)
- | SetOfIntegers
- type UnionNF n a = NonEmpty (Vec n a)
- vecLength :: UnionNF n a -> Natural n
- unfCompare :: forall a b n. (Container a, Container b, MemberTyp a ~ Int64, MemberTyp b ~ Int64, CompTyp a ~ SInt64, CompTyp b ~ SInt64) => UnionNF n a -> UnionNF n b -> Ordering
- optimise :: UnionNF n (Interval 'Standard) -> UnionNF n (Interval 'Standard)
- maximas :: [Vec n (Interval 'Standard)] -> [Vec n (Interval 'Standard)]
- data Approximation a
- lowerBound :: Approximation a -> a
- upperBound :: Approximation a -> a
- fromExact :: Approximation a -> a
- data Multiplicity a
- class Peelable a where
Documentation
data Interval a where Source #
Interval data structure assumes the following: 1. The first num. param. is less than the second; 2. For holed intervals, first num. param. <= 0 <= second num. param.;
IntervArbitrary :: Int -> Int -> Interval 'Arbitrary | |
IntervInfiniteArbitrary :: Interval 'Arbitrary | |
IntervHoled :: Int64 -> Int64 -> Bool -> Interval 'Standard | |
IntervInfinite :: Interval 'Standard |
Instances
Eq (Interval a) Source # | |
Show (Interval 'Standard) Source # | |
PartialOrd (Interval 'Standard) Source # | |
Defined in Camfort.Specification.Stencils.Model (<=) :: Interval 'Standard -> Interval 'Standard -> Bool Source # (>=) :: Interval 'Standard -> Interval 'Standard -> Bool Source # (==) :: Interval 'Standard -> Interval 'Standard -> Bool Source # (/=) :: Interval 'Standard -> Interval 'Standard -> Bool Source # (<) :: Interval 'Standard -> Interval 'Standard -> Bool Source # (>) :: Interval 'Standard -> Interval 'Standard -> Bool Source # compare :: Interval 'Standard -> Interval 'Standard -> Maybe Ordering Source # | |
BoundedJoinSemiLattice (Interval 'Standard) Source # | |
Defined in Camfort.Specification.Stencils.Model | |
BoundedMeetSemiLattice (Interval 'Standard) Source # | |
Defined in Camfort.Specification.Stencils.Model | |
Lattice (Interval 'Standard) Source # | |
approxVec :: forall n. Vec n (Interval 'Arbitrary) -> Approximation (Vec n (Interval 'Standard)) Source #
Instances
Eq Offsets Source # | |
Ord Offsets Source # | |
Defined in Camfort.Specification.Stencils.Model | |
PartialOrd Offsets Source # | |
Defined in Camfort.Specification.Stencils.Model | |
BoundedJoinSemiLattice Offsets Source # | |
Defined in Camfort.Specification.Stencils.Model | |
BoundedMeetSemiLattice Offsets Source # | |
Defined in Camfort.Specification.Stencils.Model | |
Lattice Offsets Source # | |
unfCompare :: forall a b n. (Container a, Container b, MemberTyp a ~ Int64, MemberTyp b ~ Int64, CompTyp a ~ SInt64, CompTyp b ~ SInt64) => UnionNF n a -> UnionNF n b -> Ordering Source #
data Approximation a Source #
Instances
lowerBound :: Approximation a -> a Source #
upperBound :: Approximation a -> a Source #
fromExact :: Approximation a -> a Source #
data Multiplicity a Source #
Instances
class Peelable a where Source #
Instances
Peelable (Multiplicity a) Source # | |
Defined in Camfort.Specification.Stencils.Model type CoreTyp (Multiplicity a) Source # peel :: Multiplicity a -> CoreTyp (Multiplicity a) Source # |
Orphan instances
PartialOrd a => PartialOrd (Vec n a) Source # | |
BoundedMeetSemiLattice a => Lattice (UnionNF n a) Source # | |