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

GHC.Types.FieldLabel

Synopsis

Documentation

type FieldLabelEnv = DFastStringEnv FieldLabel Source #

A map from labels to all the auxiliary information

data FieldLabel Source #

Fields in an algebraic record type; see Note [FieldLabel].

Constructors

FieldLabel 

Fields

Instances

Instances details
Data FieldLabel Source # 
Instance details

Defined in GHC.Types.FieldLabel

Methods

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

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

toConstr :: FieldLabel -> Constr #

dataTypeOf :: FieldLabel -> DataType #

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

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

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

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

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

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

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

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

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

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

NFData FieldLabel Source # 
Instance details

Defined in GHC.Types.FieldLabel

Methods

rnf :: FieldLabel -> () #

HasOccName FieldLabel Source # 
Instance details

Defined in GHC.Types.FieldLabel

Binary Name => Binary FieldLabel Source #

We need the Binary Name constraint here even though there is an instance defined in GHC.Types.Name, because the we have a SOURCE import, so the instance is not in scope. And the instance cannot be added to Name.hs-boot because GHC.Utils.Binary itself depends on GHC.Types.Name.

Instance details

Defined in GHC.Types.FieldLabel

Outputable FieldLabel Source # 
Instance details

Defined in GHC.Types.FieldLabel

Methods

ppr :: FieldLabel -> SDoc Source #

Eq FieldLabel Source # 
Instance details

Defined in GHC.Types.FieldLabel

fieldSelectorOccName :: FieldLabelString -> OccName -> DuplicateRecordFields -> FieldSelectors -> OccName Source #

Record selector OccNames are built from the underlying field name and the name of the first data constructor of the type, to support duplicate record field names. See Note [Why selector names include data constructors].

fieldLabelPrintableName :: FieldLabel -> Name Source #

Undo the name mangling described in Note [FieldLabel] to produce a Name that has the user-visible OccName (but the selector's unique). This should be used only when generating output, when we want to show the label, but may need to qualify it with a module prefix.

data DuplicateRecordFields Source #

Flag to indicate whether the DuplicateRecordFields extension is enabled.

Constructors

DuplicateRecordFields

Fields may be duplicated in a single module

NoDuplicateRecordFields

Fields must be unique within a module (the default)

Instances

Instances details
Data DuplicateRecordFields Source # 
Instance details

Defined in GHC.Types.FieldLabel

Methods

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

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

toConstr :: DuplicateRecordFields -> Constr #

dataTypeOf :: DuplicateRecordFields -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DuplicateRecordFields Source # 
Instance details

Defined in GHC.Types.FieldLabel

NFData DuplicateRecordFields Source # 
Instance details

Defined in GHC.Types.FieldLabel

Methods

rnf :: DuplicateRecordFields -> () #

Binary DuplicateRecordFields Source # 
Instance details

Defined in GHC.Types.FieldLabel

Outputable DuplicateRecordFields Source # 
Instance details

Defined in GHC.Types.FieldLabel

Eq DuplicateRecordFields Source # 
Instance details

Defined in GHC.Types.FieldLabel

data FieldSelectors Source #

Flag to indicate whether the FieldSelectors extension is enabled.

Constructors

FieldSelectors

Selector functions are available (the default)

NoFieldSelectors

Selector functions are not available

Instances

Instances details
Data FieldSelectors Source # 
Instance details

Defined in GHC.Types.FieldLabel

Methods

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

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

toConstr :: FieldSelectors -> Constr #

dataTypeOf :: FieldSelectors -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FieldSelectors Source # 
Instance details

Defined in GHC.Types.FieldLabel

NFData FieldSelectors Source # 
Instance details

Defined in GHC.Types.FieldLabel

Methods

rnf :: FieldSelectors -> () #

Binary FieldSelectors Source # 
Instance details

Defined in GHC.Types.FieldLabel

Outputable FieldSelectors Source # 
Instance details

Defined in GHC.Types.FieldLabel

Eq FieldSelectors Source # 
Instance details

Defined in GHC.Types.FieldLabel

Orphan instances