haskell-tools-backend-ghc-1.1.0.1: Creating the Haskell-Tools AST from GHC's representations

Safe HaskellNone
LanguageHaskell2010

Language.Haskell.Tools.BackendGHC.Decls

Description

Functions that convert the declarations of the GHC AST to corresponding elements in the Haskell-tools AST representation

Synopsis

Documentation

trfDeclsGroup :: forall n r. TransformName n r => HsGroup n -> Trf (AnnListG UDecl (Dom r) RangeStage) Source #

trfDecl :: forall n r. TransformName n r => Located (HsDecl n) -> Trf (Ann UDecl (Dom r) RangeStage) Source #

trfSig :: forall n r. TransformName n r => Sig n -> Trf (UDecl (Dom r) RangeStage) Source #

trfConDecl' :: forall n r. TransformName n r => ConDecl n -> Trf (UConDecl (Dom r) RangeStage) Source #

trfTypeEq :: forall n r. TransformName n r => Located (FamEqn n (HsTyPats n) (LHsType n)) -> Trf (Ann UTypeEqn (Dom r) RangeStage) Source #

trfFunDeps :: forall n r. TransformName n r => [Located (FunDep (Located (IdP n)))] -> Trf (AnnMaybeG UFunDeps (Dom r) RangeStage) Source #

trfFunDep' :: forall n r. TransformName n r => FunDep (Located (IdP n)) -> Trf (UFunDep (Dom r) RangeStage) Source #

createDeclHead :: forall n r. TransformName n r => Located (IdP n) -> LHsQTyVars n -> Trf (Ann UDeclHead (Dom r) RangeStage) Source #

addParenLocs :: SrcSpan -> Trf SrcSpan Source #

Get the parentheses directly before and after (for parenthesized application)

trfRuleBndr :: forall n r. TransformName n r => Located (RuleBndr n) -> Trf (Ann URuleVar (Dom r) RangeStage) Source #