ghc-9.13: The GHC API
Safe HaskellNone
LanguageGHC2021

Language.Haskell.Syntax.ImpExp.IsBoot

Synopsis

Documentation

data IsBootInterface Source #

Indicates whether a module name is referring to a boot interface (hs-boot file) or regular module (hs file). We need to treat boot modules specially when building compilation graphs, since they break cycles. Regular source files and signature files are treated equivalently.

Constructors

NotBoot 
IsBoot 

Instances

Instances details
NFData IsBootInterface Source # 
Instance details

Defined in Language.Haskell.Syntax.ImpExp.IsBoot

Methods

rnf :: IsBootInterface -> () Source #

Binary IsBootInterface Source # 
Instance details

Defined in GHC.Utils.Binary

Eq IsBootInterface Source # 
Instance details

Defined in Language.Haskell.Syntax.ImpExp.IsBoot

Ord IsBootInterface Source # 
Instance details

Defined in Language.Haskell.Syntax.ImpExp.IsBoot

Data IsBootInterface Source # 
Instance details

Defined in Language.Haskell.Syntax.ImpExp.IsBoot

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IsBootInterface -> c IsBootInterface #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IsBootInterface #

toConstr :: IsBootInterface -> Constr #

dataTypeOf :: IsBootInterface -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IsBootInterface) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IsBootInterface) #

gmapT :: (forall b. Data b => b -> b) -> IsBootInterface -> IsBootInterface #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IsBootInterface -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IsBootInterface -> r #

gmapQ :: (forall d. Data d => d -> u) -> IsBootInterface -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IsBootInterface -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IsBootInterface -> m IsBootInterface #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IsBootInterface -> m IsBootInterface #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IsBootInterface -> m IsBootInterface #

Show IsBootInterface Source # 
Instance details

Defined in Language.Haskell.Syntax.ImpExp.IsBoot