brittany-0.12.0.0: Haskell source code formatter

Safe HaskellNone
LanguageHaskell2010

Language.Haskell.Brittany.Internal.Config.Types

Documentation

data ExactPrintFallbackMode Source #

Instances
Data ExactPrintFallbackMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: ExactPrintFallbackMode -> Constr #

dataTypeOf :: ExactPrintFallbackMode -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ExactPrintFallbackMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Generic ExactPrintFallbackMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Associated Types

type Rep ExactPrintFallbackMode :: Type -> Type #

ToJSON ExactPrintFallbackMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON ExactPrintFallbackMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

type Rep ExactPrintFallbackMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

type Rep ExactPrintFallbackMode = D1 (MetaData "ExactPrintFallbackMode" "Language.Haskell.Brittany.Internal.Config.Types" "brittany-0.12.0.0-Ae6A1ZKrLwuFcYNLsC0ym4" False) (C1 (MetaCons "ExactPrintFallbackModeNever" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "ExactPrintFallbackModeInline" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ExactPrintFallbackModeRisky" PrefixI False) (U1 :: Type -> Type)))

data CPPMode Source #

Instances
Data CPPMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CPPMode -> Constr #

dataTypeOf :: CPPMode -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CPPMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Generic CPPMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Associated Types

type Rep CPPMode :: Type -> Type #

Methods

from :: CPPMode -> Rep CPPMode x #

to :: Rep CPPMode x -> CPPMode #

ToJSON CPPMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON CPPMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

type Rep CPPMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

type Rep CPPMode = D1 (MetaData "CPPMode" "Language.Haskell.Brittany.Internal.Config.Types" "brittany-0.12.0.0-Ae6A1ZKrLwuFcYNLsC0ym4" False) (C1 (MetaCons "CPPModeAbort" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "CPPModeWarn" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CPPModeNowarn" PrefixI False) (U1 :: Type -> Type)))

data ColumnAlignMode Source #

Constructors

ColumnAlignModeDisabled

Make no column alignments whatsoever

ColumnAlignModeUnanimously

Make column alignments only if it does not cause overflow for any of the affected lines.

ColumnAlignModeMajority Float

If at least (ratio::Float) of the aligned elements have sufficient space for the alignment, act like ColumnAlignModeAnimously; otherwise act like ColumnAlignModeDisabled.

ColumnAlignModeAnimouslyScale Int

Scale back columns to some degree if their sum leads to overflow. This is done in a linear fashion. The Int specifies additional columns to be added to column maximum for scaling calculation purposes.

ColumnAlignModeAnimously

Decide on a case-by-case basis if alignment would cause overflow. If it does, cancel all alignments for this (nested) column description. ColumnAlignModeAnimouslySome -- potentially to implement

ColumnAlignModeAlways

Always respect column alignments, even if it makes stuff overflow.

Instances
Data ColumnAlignMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: ColumnAlignMode -> Constr #

dataTypeOf :: ColumnAlignMode -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ColumnAlignMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Generic ColumnAlignMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Associated Types

type Rep ColumnAlignMode :: Type -> Type #

ToJSON ColumnAlignMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON ColumnAlignMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

type Rep ColumnAlignMode Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

type Rep ColumnAlignMode = D1 (MetaData "ColumnAlignMode" "Language.Haskell.Brittany.Internal.Config.Types" "brittany-0.12.0.0-Ae6A1ZKrLwuFcYNLsC0ym4" False) ((C1 (MetaCons "ColumnAlignModeDisabled" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "ColumnAlignModeUnanimously" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ColumnAlignModeMajority" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Float)))) :+: (C1 (MetaCons "ColumnAlignModeAnimouslyScale" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)) :+: (C1 (MetaCons "ColumnAlignModeAnimously" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ColumnAlignModeAlways" PrefixI False) (U1 :: Type -> Type))))

data AltChooser Source #

Instances
Data AltChooser Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: AltChooser -> Constr #

dataTypeOf :: AltChooser -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AltChooser Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Generic AltChooser Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Associated Types

type Rep AltChooser :: Type -> Type #

ToJSON AltChooser Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON AltChooser Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

type Rep AltChooser Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

type Rep AltChooser = D1 (MetaData "AltChooser" "Language.Haskell.Brittany.Internal.Config.Types" "brittany-0.12.0.0-Ae6A1ZKrLwuFcYNLsC0ym4" False) (C1 (MetaCons "AltChooserSimpleQuick" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "AltChooserShallowBest" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "AltChooserBoundedSearch" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int))))

data IndentPolicy Source #

Instances
Eq IndentPolicy Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Data IndentPolicy Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: IndentPolicy -> Constr #

dataTypeOf :: IndentPolicy -> DataType #

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

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

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

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

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

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

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

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

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

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

Show IndentPolicy Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Generic IndentPolicy Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Associated Types

type Rep IndentPolicy :: Type -> Type #

ToJSON IndentPolicy Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON IndentPolicy Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

type Rep IndentPolicy Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

type Rep IndentPolicy = D1 (MetaData "IndentPolicy" "Language.Haskell.Brittany.Internal.Config.Types" "brittany-0.12.0.0-Ae6A1ZKrLwuFcYNLsC0ym4" False) (C1 (MetaCons "IndentPolicyLeft" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "IndentPolicyFree" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "IndentPolicyMultiple" PrefixI False) (U1 :: Type -> Type)))

data CConfig f Source #

Constructors

Config 

Fields

Instances
CFunctor CConfig Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cMap :: (forall a. f a -> g a) -> CConfig f -> CConfig g #

CZipWith CConfig Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cZipWith :: (forall a. g a -> h a -> i a) -> CConfig g -> CConfig h -> CConfig i #

Data (CConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CConfig Option -> Constr #

dataTypeOf :: CConfig Option -> DataType #

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

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

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

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

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

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

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

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

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

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

Data (CConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CConfig Identity -> Constr #

dataTypeOf :: CConfig Identity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show (CConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Show (CConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Generic (CConfig f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Associated Types

type Rep (CConfig f) :: Type -> Type #

Methods

from :: CConfig f -> Rep (CConfig f) x #

to :: Rep (CConfig f) x -> CConfig f #

Semigroup (CConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Semigroup (CConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Monoid (CConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

ToJSON (CConfig Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

ToJSON (CConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CConfig Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

type Rep (CConfig f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

type Rep (CConfig f) = D1 (MetaData "CConfig" "Language.Haskell.Brittany.Internal.Config.Types" "brittany-0.12.0.0-Ae6A1ZKrLwuFcYNLsC0ym4" False) (C1 (MetaCons "Config" PrefixI True) (((S1 (MetaSel (Just "_conf_version") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Int))) :*: S1 (MetaSel (Just "_conf_debug") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (CDebugConfig f))) :*: (S1 (MetaSel (Just "_conf_layout") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (CLayoutConfig f)) :*: S1 (MetaSel (Just "_conf_errorHandling") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (CErrorHandlingConfig f)))) :*: ((S1 (MetaSel (Just "_conf_forward") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (CForwardOptions f)) :*: S1 (MetaSel (Just "_conf_preprocessor") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (CPreProcessorConfig f))) :*: (S1 (MetaSel (Just "_conf_roundtrip_exactprint_only") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: S1 (MetaSel (Just "_conf_obfuscate") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool)))))))

data CPreProcessorConfig f Source #

Instances
CFunctor CPreProcessorConfig Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cMap :: (forall a. f a -> g a) -> CPreProcessorConfig f -> CPreProcessorConfig g #

CZipWith CPreProcessorConfig Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cZipWith :: (forall a. g a -> h a -> i a) -> CPreProcessorConfig g -> CPreProcessorConfig h -> CPreProcessorConfig i #

Data (CPreProcessorConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CPreProcessorConfig Option -> Constr #

dataTypeOf :: CPreProcessorConfig Option -> DataType #

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

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

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

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

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

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

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

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

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

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

Data (CPreProcessorConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CPreProcessorConfig Identity -> Constr #

dataTypeOf :: CPreProcessorConfig Identity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show (CPreProcessorConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Show (CPreProcessorConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Generic (CPreProcessorConfig f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Associated Types

type Rep (CPreProcessorConfig f) :: Type -> Type #

Semigroup (CPreProcessorConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Semigroup (CPreProcessorConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Monoid (CPreProcessorConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

ToJSON (CPreProcessorConfig Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

ToJSON (CPreProcessorConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CPreProcessorConfig Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CPreProcessorConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

type Rep (CPreProcessorConfig f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

type Rep (CPreProcessorConfig f) = D1 (MetaData "CPreProcessorConfig" "Language.Haskell.Brittany.Internal.Config.Types" "brittany-0.12.0.0-Ae6A1ZKrLwuFcYNLsC0ym4" False) (C1 (MetaCons "PreProcessorConfig" PrefixI True) (S1 (MetaSel (Just "_ppconf_CPPMode") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last CPPMode))) :*: S1 (MetaSel (Just "_ppconf_hackAroundIncludes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool)))))

data CErrorHandlingConfig f Source #

Constructors

ErrorHandlingConfig 

Fields

Instances
CFunctor CErrorHandlingConfig Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cMap :: (forall a. f a -> g a) -> CErrorHandlingConfig f -> CErrorHandlingConfig g #

CZipWith CErrorHandlingConfig Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cZipWith :: (forall a. g a -> h a -> i a) -> CErrorHandlingConfig g -> CErrorHandlingConfig h -> CErrorHandlingConfig i #

Data (CErrorHandlingConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CErrorHandlingConfig Option -> Constr #

dataTypeOf :: CErrorHandlingConfig Option -> DataType #

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

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

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

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

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

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

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

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

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

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

Data (CErrorHandlingConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CErrorHandlingConfig Identity -> Constr #

dataTypeOf :: CErrorHandlingConfig Identity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show (CErrorHandlingConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Show (CErrorHandlingConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Generic (CErrorHandlingConfig f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Associated Types

type Rep (CErrorHandlingConfig f) :: Type -> Type #

Semigroup (CErrorHandlingConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Semigroup (CErrorHandlingConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Monoid (CErrorHandlingConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

ToJSON (CErrorHandlingConfig Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

ToJSON (CErrorHandlingConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CErrorHandlingConfig Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CErrorHandlingConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

type Rep (CErrorHandlingConfig f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

type Rep (CErrorHandlingConfig f) = D1 (MetaData "CErrorHandlingConfig" "Language.Haskell.Brittany.Internal.Config.Types" "brittany-0.12.0.0-Ae6A1ZKrLwuFcYNLsC0ym4" False) (C1 (MetaCons "ErrorHandlingConfig" PrefixI True) ((S1 (MetaSel (Just "_econf_produceOutputOnErrors") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: S1 (MetaSel (Just "_econf_Werror") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool)))) :*: (S1 (MetaSel (Just "_econf_ExactPrintFallback") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last ExactPrintFallbackMode))) :*: S1 (MetaSel (Just "_econf_omit_output_valid_check") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))))))

data CForwardOptions f Source #

Constructors

ForwardOptions 

Fields

Instances
CFunctor CForwardOptions Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cMap :: (forall a. f a -> g a) -> CForwardOptions f -> CForwardOptions g #

CZipWith CForwardOptions Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cZipWith :: (forall a. g a -> h a -> i a) -> CForwardOptions g -> CForwardOptions h -> CForwardOptions i #

Data (CForwardOptions Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CForwardOptions Option -> Constr #

dataTypeOf :: CForwardOptions Option -> DataType #

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

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

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

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

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

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

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

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

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

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

Data (CForwardOptions Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CForwardOptions Identity -> Constr #

dataTypeOf :: CForwardOptions Identity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show (CForwardOptions Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Show (CForwardOptions Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Generic (CForwardOptions f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Associated Types

type Rep (CForwardOptions f) :: Type -> Type #

Semigroup (CForwardOptions Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Semigroup (CForwardOptions Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Monoid (CForwardOptions Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

ToJSON (CForwardOptions Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

ToJSON (CForwardOptions Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CForwardOptions Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CForwardOptions Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

type Rep (CForwardOptions f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

type Rep (CForwardOptions f) = D1 (MetaData "CForwardOptions" "Language.Haskell.Brittany.Internal.Config.Types" "brittany-0.12.0.0-Ae6A1ZKrLwuFcYNLsC0ym4" False) (C1 (MetaCons "ForwardOptions" PrefixI True) (S1 (MetaSel (Just "_options_ghc") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f [String]))))

data CLayoutConfig f Source #

Constructors

LayoutConfig 

Fields

Instances
CFunctor CLayoutConfig Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cMap :: (forall a. f a -> g a) -> CLayoutConfig f -> CLayoutConfig g #

CZipWith CLayoutConfig Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cZipWith :: (forall a. g a -> h a -> i a) -> CLayoutConfig g -> CLayoutConfig h -> CLayoutConfig i #

Data (CLayoutConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CLayoutConfig Option -> Constr #

dataTypeOf :: CLayoutConfig Option -> DataType #

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

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

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

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

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

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

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

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

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

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

Data (CLayoutConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CLayoutConfig Identity -> Constr #

dataTypeOf :: CLayoutConfig Identity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show (CLayoutConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Show (CLayoutConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Generic (CLayoutConfig f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Associated Types

type Rep (CLayoutConfig f) :: Type -> Type #

Semigroup (CLayoutConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Semigroup (CLayoutConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Monoid (CLayoutConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

ToJSON (CLayoutConfig Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

ToJSON (CLayoutConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CLayoutConfig Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CLayoutConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

type Rep (CLayoutConfig f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

type Rep (CLayoutConfig f) = D1 (MetaData "CLayoutConfig" "Language.Haskell.Brittany.Internal.Config.Types" "brittany-0.12.0.0-Ae6A1ZKrLwuFcYNLsC0ym4" False) (C1 (MetaCons "LayoutConfig" PrefixI True) (((S1 (MetaSel (Just "_lconfig_cols") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Int))) :*: (S1 (MetaSel (Just "_lconfig_indentPolicy") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last IndentPolicy))) :*: S1 (MetaSel (Just "_lconfig_indentAmount") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Int))))) :*: ((S1 (MetaSel (Just "_lconfig_indentWhereSpecial") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: S1 (MetaSel (Just "_lconfig_indentListSpecial") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool)))) :*: (S1 (MetaSel (Just "_lconfig_importColumn") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Int))) :*: S1 (MetaSel (Just "_lconfig_importAsColumn") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Int)))))) :*: (((S1 (MetaSel (Just "_lconfig_altChooser") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last AltChooser))) :*: S1 (MetaSel (Just "_lconfig_columnAlignMode") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last ColumnAlignMode)))) :*: (S1 (MetaSel (Just "_lconfig_alignmentLimit") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Int))) :*: S1 (MetaSel (Just "_lconfig_alignmentBreakOnMultiline") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))))) :*: ((S1 (MetaSel (Just "_lconfig_hangingTypeSignature") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: S1 (MetaSel (Just "_lconfig_reformatModulePreamble") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool)))) :*: (S1 (MetaSel (Just "_lconfig_allowSingleLineExportList") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: S1 (MetaSel (Just "_lconfig_allowHangingQuasiQuotes") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))))))))

data CDebugConfig f Source #

Instances
CFunctor CDebugConfig Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cMap :: (forall a. f a -> g a) -> CDebugConfig f -> CDebugConfig g #

CZipWith CDebugConfig Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

cZipWith :: (forall a. g a -> h a -> i a) -> CDebugConfig g -> CDebugConfig h -> CDebugConfig i #

Data (CDebugConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CDebugConfig Option -> Constr #

dataTypeOf :: CDebugConfig Option -> DataType #

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

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

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

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

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

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

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

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

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

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

Data (CDebugConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Methods

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

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

toConstr :: CDebugConfig Identity -> Constr #

dataTypeOf :: CDebugConfig Identity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show (CDebugConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Show (CDebugConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Generic (CDebugConfig f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Associated Types

type Rep (CDebugConfig f) :: Type -> Type #

Methods

from :: CDebugConfig f -> Rep (CDebugConfig f) x #

to :: Rep (CDebugConfig f) x -> CDebugConfig f #

Semigroup (CDebugConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Semigroup (CDebugConfig Identity) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

Monoid (CDebugConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

ToJSON (CDebugConfig Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

ToJSON (CDebugConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CDebugConfig Maybe) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

FromJSON (CDebugConfig Option) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types.Instances

type Rep (CDebugConfig f) Source # 
Instance details

Defined in Language.Haskell.Brittany.Internal.Config.Types

type Rep (CDebugConfig f) = D1 (MetaData "CDebugConfig" "Language.Haskell.Brittany.Internal.Config.Types" "brittany-0.12.0.0-Ae6A1ZKrLwuFcYNLsC0ym4" False) (C1 (MetaCons "DebugConfig" PrefixI True) (((S1 (MetaSel (Just "_dconf_dump_config") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: (S1 (MetaSel (Just "_dconf_dump_annotations") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: S1 (MetaSel (Just "_dconf_dump_ast_unknown") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))))) :*: (S1 (MetaSel (Just "_dconf_dump_ast_full") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: (S1 (MetaSel (Just "_dconf_dump_bridoc_raw") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: S1 (MetaSel (Just "_dconf_dump_bridoc_simpl_alt") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool)))))) :*: ((S1 (MetaSel (Just "_dconf_dump_bridoc_simpl_floating") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: (S1 (MetaSel (Just "_dconf_dump_bridoc_simpl_par") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: S1 (MetaSel (Just "_dconf_dump_bridoc_simpl_columns") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))))) :*: (S1 (MetaSel (Just "_dconf_dump_bridoc_simpl_indent") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: (S1 (MetaSel (Just "_dconf_dump_bridoc_final") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))) :*: S1 (MetaSel (Just "_dconf_roundtrip_exactprint_only") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (f (Last Bool))))))))

cMap :: CFunctor c => (forall a. f a -> g a) -> c f -> c g #