control-invariants-0.1.0.0: Invariants and contract monitoring

Safe HaskellNone
LanguageHaskell2010

Control.Precondition

Contents

Documentation

fromJust' :: Pre => Maybe a -> a Source #

fromRight' :: Pre => Either a b -> b Source #

fromLeft' :: Pre => Either a b -> a Source #

nonEmpty' :: Pre => [a] -> NonEmpty a Source #

(!) :: (Pre, Ixed m) => m -> Index m -> IxValue m Source #

byPred :: (Show x, Pre) => String -> (x -> Bool) -> x -> a -> a Source #

byEq :: (Eq x, Show x, Pre) => String -> x -> x -> a -> a Source #

byOrd :: (Ord x, Show x, Pre) => String -> Ordering -> x -> x -> a -> a Source #

byRel :: (Show a, Pre) => String -> (a -> a -> Bool) -> a -> a -> x -> x Source #

byRel' :: (Show a, Pre) => String -> (a -> a -> Bool) -> String -> a -> a -> x -> x Source #

type Pre = ?loc :: CallStack Source #

provided :: Pre => Bool -> a -> a Source #

provided' :: CallStack -> Bool -> a -> a Source #

providedM :: Pre => Bool -> m a -> m a Source #

module Data.Maybe

data Loc :: * #

Instances

Eq Loc 

Methods

(==) :: Loc -> Loc -> Bool #

(/=) :: Loc -> Loc -> Bool #

Data Loc 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Loc -> c Loc #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Loc #

toConstr :: Loc -> Constr #

dataTypeOf :: Loc -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Loc) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Loc) #

gmapT :: (forall b. Data b => b -> b) -> Loc -> Loc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Loc -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Loc -> r #

gmapQ :: (forall d. Data d => d -> u) -> Loc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Loc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Loc -> m Loc #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Loc -> m Loc #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Loc -> m Loc #

Ord Loc 

Methods

compare :: Loc -> Loc -> Ordering #

(<) :: Loc -> Loc -> Bool #

(<=) :: Loc -> Loc -> Bool #

(>) :: Loc -> Loc -> Bool #

(>=) :: Loc -> Loc -> Bool #

max :: Loc -> Loc -> Loc #

min :: Loc -> Loc -> Loc #

Show Loc 

Methods

showsPrec :: Int -> Loc -> ShowS #

show :: Loc -> String #

showList :: [Loc] -> ShowS #

Generic Loc 

Associated Types

type Rep Loc :: * -> * #

Methods

from :: Loc -> Rep Loc x #

to :: Rep Loc x -> Loc #

type Rep Loc 

Orphan instances

Lift Loc Source # 

Methods

lift :: Loc -> Q Exp #