Safe Haskell | None |
---|---|
Language | Haskell98 |
This module contains various functions that add/update in the CG monad.
- pushConsBind :: CG a -> CG a
- addC :: SubC -> String -> CG ()
- addPost :: CGEnv -> SpecType -> CG SpecType
- addW :: WfC -> CG ()
- addWarning :: Error -> CG ()
- addIdA :: Var -> Annot SpecType -> CG ()
- boundRecVar :: SrcSpan -> AnnInfo (Annot a) -> Bool
- addLocA :: Maybe Var -> SrcSpan -> Annot SpecType -> CG ()
- updateLocA :: Maybe SrcSpan -> SpecType -> CG ()
- addA :: Outputable a => SrcSpan -> Maybe a -> b -> AnnInfo b -> AnnInfo b
- lookupNewType :: TyCon -> CG (Maybe SpecType)
Documentation
pushConsBind :: CG a -> CG a Source #
addWarning :: Error -> CG () Source #
Add a warning
addIdA :: Var -> Annot SpecType -> CG () Source #
Add Identifier Annotations, used for annotation binders (i.e. at binder sites)
addLocA :: Maybe Var -> SrcSpan -> Annot SpecType -> CG () Source #
Used for annotating reads (i.e. at Var x sites)