Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- module Language.Haskell.Syntax
- module GHC.Hs.Binds
- module GHC.Hs.Decls
- module GHC.Hs.Expr
- module GHC.Hs.ImpExp
- module GHC.Hs.Lit
- module GHC.Hs.Pat
- module GHC.Hs.Type
- module GHC.Hs.Utils
- module GHC.Hs.Doc
- module GHC.Hs.Extension
- module GHC.Parser.Annotation
- data Fixity
- data HsModule = HsModule {}
- data AnnsModule = AnnsModule {}
- data HsParsedModule = HsParsedModule {}
Documentation
module Language.Haskell.Syntax
module GHC.Hs.Binds
module GHC.Hs.Decls
module GHC.Hs.Expr
module GHC.Hs.ImpExp
module GHC.Hs.Lit
module GHC.Hs.Pat
module GHC.Hs.Type
module GHC.Hs.Utils
module GHC.Hs.Doc
module GHC.Hs.Extension
module GHC.Parser.Annotation
Instances
Data Fixity Source # | |
Defined in GHC.Types.Fixity gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Fixity -> c Fixity Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Fixity Source # toConstr :: Fixity -> Constr Source # dataTypeOf :: Fixity -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Fixity) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Fixity) Source # gmapT :: (forall b. Data b => b -> b) -> Fixity -> Fixity Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Fixity -> r Source # gmapQ :: (forall d. Data d => d -> u) -> Fixity -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> Fixity -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Fixity -> m Fixity Source # | |
Binary Fixity Source # | |
Outputable Fixity Source # | |
Eq Fixity Source # | |
Haskell Module
All we actually declare here is the top-level structure for a module.
HsModule | |
|
Instances
Data HsModule Source # | |
Defined in GHC.Hs gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HsModule -> c HsModule Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HsModule Source # toConstr :: HsModule -> Constr Source # dataTypeOf :: HsModule -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HsModule) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HsModule) Source # gmapT :: (forall b. Data b => b -> b) -> HsModule -> HsModule Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HsModule -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HsModule -> r Source # gmapQ :: (forall d. Data d => d -> u) -> HsModule -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> HsModule -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> HsModule -> m HsModule Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HsModule -> m HsModule Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HsModule -> m HsModule Source # | |
Outputable HsModule Source # | |
data AnnsModule Source #
Instances
Data AnnsModule Source # | |
Defined in GHC.Hs gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AnnsModule -> c AnnsModule Source # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AnnsModule Source # toConstr :: AnnsModule -> Constr Source # dataTypeOf :: AnnsModule -> DataType Source # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AnnsModule) Source # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AnnsModule) Source # gmapT :: (forall b. Data b => b -> b) -> AnnsModule -> AnnsModule Source # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AnnsModule -> r Source # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AnnsModule -> r Source # gmapQ :: (forall d. Data d => d -> u) -> AnnsModule -> [u] Source # gmapQi :: Int -> (forall d. Data d => d -> u) -> AnnsModule -> u Source # gmapM :: Monad m => (forall d. Data d => d -> m d) -> AnnsModule -> m AnnsModule Source # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnsModule -> m AnnsModule Source # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AnnsModule -> m AnnsModule Source # | |
Eq AnnsModule Source # | |
Defined in GHC.Hs (==) :: AnnsModule -> AnnsModule -> Bool # (/=) :: AnnsModule -> AnnsModule -> Bool # |