ghc-lib-parser-9.6.2.20230523: The GHC API, decoupled from GHC versions
Safe HaskellSafe-Inferred
LanguageHaskell2010

GHC.Unit.Module.Warnings

Description

Warnings for a module

Synopsis

Documentation

data Warnings pass Source #

Warning information for a module

Constructors

NoWarnings

Nothing deprecated

WarnAll (WarningTxt pass)

Whole module deprecated

WarnSome [(OccName, WarningTxt pass)]

Some specific things deprecated

Instances

Instances details
Binary (Warnings GhcRn) Source # 
Instance details

Defined in GHC.Unit.Module.Warnings

Eq (IdP pass) => Eq (Warnings pass) Source # 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

(==) :: Warnings pass -> Warnings pass -> Bool #

(/=) :: Warnings pass -> Warnings pass -> Bool #

data WarningTxt pass Source #

Warning Text

reason/explanation from a WARNING or DEPRECATED pragma

Instances

Instances details
(Data pass, Data (IdP pass)) => Data (WarningTxt pass) Source # 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

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

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

toConstr :: WarningTxt pass -> Constr #

dataTypeOf :: WarningTxt pass -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic (WarningTxt pass) Source # 
Instance details

Defined in GHC.Unit.Module.Warnings

Associated Types

type Rep (WarningTxt pass) :: Type -> Type #

Methods

from :: WarningTxt pass -> Rep (WarningTxt pass) x #

to :: Rep (WarningTxt pass) x -> WarningTxt pass #

Binary (WarningTxt GhcRn) Source # 
Instance details

Defined in GHC.Unit.Module.Warnings

Outputable (WarningTxt pass) Source # 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

ppr :: WarningTxt pass -> SDoc Source #

Eq (IdP pass) => Eq (WarningTxt pass) Source # 
Instance details

Defined in GHC.Unit.Module.Warnings

Methods

(==) :: WarningTxt pass -> WarningTxt pass -> Bool #

(/=) :: WarningTxt pass -> WarningTxt pass -> Bool #

type Rep (WarningTxt pass) Source # 
Instance details

Defined in GHC.Unit.Module.Warnings

mkIfaceWarnCache :: Warnings p -> OccName -> Maybe (WarningTxt p) Source #

Constructs the cache for the mi_warn_fn field of a ModIface