liquidhaskell-0.8.0.2: Liquid Types for Haskell

Safe HaskellNone
LanguageHaskell98

Language.Haskell.Liquid.Bare.Env

Contents

Synopsis

Documentation

type BareM = WriterT [Warn] (ExceptT Error (StateT BareEnv IO)) Source #

Error-Reader-IO For Bare Transformation -----------------------------------

type InlnEnv = HashMap Symbol LMap Source #

withVArgs :: (Foldable t, PPrint a) => SourcePos -> SourcePos -> t a -> BareM b -> BareM b Source #

setREAlias :: Symbol -> RTAlias Symbol Expr -> BareM () Source #

setDataDecls :: [DataDecl] -> BareM () Source #

insertLogicEnv :: String -> LocSymbol -> [Symbol] -> Expr -> BareM () Source #

insertAxiom :: Var -> Maybe Symbol -> BareM () Source #

addDefs :: HashSet (Var, Symbol) -> BareM () Source #

Exact DataConstructor Functions

type DataConMap = HashMap (Symbol, Int) Symbol Source #

DataConMap stores the names of those ctor-fields that have been declared as SMT ADTs so we don't make up new names for them.

dataConMap :: [DataDecl] -> DataConMap Source #