Safe Haskell | None |
---|---|
Language | Haskell2010 |
- type CstGenQS = Map Var Type
- type CstGenQT a = forall m. GhcMonad m => a Id -> CstGenQS -> (m [(SrcSpan, Type)], CstGenQS)
- collectSpansTypes :: GhcMonad m => Bool -> TypecheckedModule -> (Int, Int) -> m [(SrcSpan, Type)]
- listifySpans :: Typeable a => TypecheckedSource -> (Int, Int) -> [Located a]
- listifyParsedSpans :: Typeable a => ParsedSource -> (Int, Int) -> [Located a]
- listifyRenamedSpans :: Typeable a => RenamedSource -> (Int, Int) -> [Located a]
- listifyStaged :: Typeable r => Stage -> (r -> Bool) -> GenericQ [r]
- cmp :: SrcSpan -> SrcSpan -> Ordering
- toTup :: DynFlags -> PprStyle -> (SrcSpan, Type) -> ((Int, Int, Int, Int), String)
- fourInts :: SrcSpan -> (Int, Int, Int, Int)
- fourIntsHE :: SrcSpan -> (Int, Int, Int, Int)
- typeSigInRangeHE :: Int -> Int -> Decl SrcSpanInfo -> Bool
- pretty :: DynFlags -> PprStyle -> Type -> String
- showName :: DynFlags -> PprStyle -> Name -> String
- showOccName :: DynFlags -> PprStyle -> OccName -> String
Documentation
type CstGenQT a = forall m. GhcMonad m => a Id -> CstGenQS -> (m [(SrcSpan, Type)], CstGenQS) Source #
Generic type to simplify SYB definition
collectSpansTypes :: GhcMonad m => Bool -> TypecheckedModule -> (Int, Int) -> m [(SrcSpan, Type)] Source #
listifySpans :: Typeable a => TypecheckedSource -> (Int, Int) -> [Located a] Source #
listifyParsedSpans :: Typeable a => ParsedSource -> (Int, Int) -> [Located a] Source #
listifyRenamedSpans :: Typeable a => RenamedSource -> (Int, Int) -> [Located a] Source #
typeSigInRangeHE :: Int -> Int -> Decl SrcSpanInfo -> Bool Source #