liquidhaskell-0.8.0.2: Liquid Types for Haskell

Safe HaskellNone
LanguageHaskell98

Test.Target.Util

Documentation

type Depth = Int Source #

io :: MonadIO m => IO a -> m a Source #

myTrace :: Show a => String -> a -> a Source #

reft :: SpecType -> Reft Source #

data HList a where Source #

Constructors

Nil :: HList '[] 
(:::) :: a -> HList bs -> HList (a ': bs) 

Instances

AllHave * Show as => Show (HList as) Source # 

Methods

showsPrec :: Int -> HList as -> ShowS #

show :: HList as -> String #

showList :: [HList as] -> ShowS #

type family Map (f :: a -> b) (xs :: [a]) :: [b] where ... Source #

Equations

Map f '[] = '[] 
Map f (x ': xs) = f x ': Map f xs 

type family Constraints (cs :: [Constraint]) :: Constraint Source #

Instances

type Constraints ([] Constraint) Source # 
type Constraints ([] Constraint) = ()
type Constraints ((:) Constraint c cs) Source # 
type Constraints ((:) Constraint c cs) = (c, Constraints cs)

type AllHave c xs = Constraints (Map c xs) Source #

type family Args a where ... Source #

Equations

Args (a -> b) = a ': Args b 
Args a = '[] 

type family Res a where ... Source #

Equations

Res (a -> b) = Res b 
Res a = a 

makeDecl :: SEnv DataDecl -> Symbol -> Sort -> Command Source #

deconSort :: Sort -> ([Sort], Sort) Source #

splitEApp_maybe :: Expr -> Maybe (Symbol, [Expr]) Source #

fourth4 :: (t, t1, t2, t3) -> t3 Source #

runGhc :: [String] -> Ghc a -> IO a Source #