ghc-9.15: The GHC API
Safe HaskellNone
LanguageGHC2024

GHC.Hs.Basic

Description

Fixity

Synopsis

Documentation

data NamespaceSpecifier Source #

Optional namespace specifier for:

  • import/export items
  • fixity signatures
  • WARNING and DEPRECATED pragmas

Examples:

module M (data ..) where
       -- ↑ DataNamespaceSpecifier

import Data.Proxy as T (type ..)
                     -- ↑ TypeNamespaceSpecifier

{-# WARNING in "x-partial" data Head "don't use this pattern synonym" #-}
                         -- ↑ DataNamespaceSpecifier

{-# DEPRECATED type D "This type was deprecated" #-}
             -- ↑ TypeNamespaceSpecifier

infixr 6 data $
       -- ↑ DataNamespaceSpecifier

Instances

Instances details
Outputable NamespaceSpecifier Source # 
Instance details

Defined in GHC.Hs.Basic

Eq NamespaceSpecifier Source # 
Instance details

Defined in GHC.Hs.Basic

Data NamespaceSpecifier Source # 
Instance details

Defined in GHC.Hs.Basic

Methods

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

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

toConstr :: NamespaceSpecifier -> Constr Source #

dataTypeOf :: NamespaceSpecifier -> DataType Source #

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

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

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

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

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

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

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

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

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

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

overlappingNamespaceSpecifiers :: NamespaceSpecifier -> NamespaceSpecifier -> Bool Source #

Check if namespace specifiers overlap, i.e. if they are equal or if at least one of them doesn't specify a namespace

coveredByNamespaceSpecifier :: NamespaceSpecifier -> NameSpace -> Bool Source #

Check if namespace is covered by a namespace specifier: * NoNamespaceSpecifier covers both namespaces * TypeNamespaceSpecifier covers the type namespace only * DataNamespaceSpecifier covers the data namespace only

Orphan instances