uniform-pandoc-0.1.5.2: handling of some pandoc stuff
Safe HaskellSafe-Inferred
LanguageHaskell2010

Uniform.Pandoc

Documentation

data ReaderOptions #

Instances

Instances details
FromJSON ReaderOptions 
Instance details

Defined in Text.Pandoc.Options

ToJSON ReaderOptions 
Instance details

Defined in Text.Pandoc.Options

Data ReaderOptions 
Instance details

Defined in Text.Pandoc.Options

Methods

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

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

toConstr :: ReaderOptions -> Constr #

dataTypeOf :: ReaderOptions -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic ReaderOptions 
Instance details

Defined in Text.Pandoc.Options

Associated Types

type Rep ReaderOptions :: Type -> Type #

Read ReaderOptions 
Instance details

Defined in Text.Pandoc.Options

Show ReaderOptions 
Instance details

Defined in Text.Pandoc.Options

Default ReaderOptions 
Instance details

Defined in Text.Pandoc.Options

Methods

def :: ReaderOptions #

HasSyntaxExtensions ReaderOptions 
Instance details

Defined in Text.Pandoc.Options

type Rep ReaderOptions 
Instance details

Defined in Text.Pandoc.Options

type Rep ReaderOptions = D1 ('MetaData "ReaderOptions" "Text.Pandoc.Options" "pandoc-3.1.2-BGlrxDJticy8E5uQ6uTrMU" 'False) (C1 ('MetaCons "ReaderOptions" 'PrefixI 'True) (((S1 ('MetaSel ('Just "readerExtensions") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Extensions) :*: S1 ('MetaSel ('Just "readerStandalone") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool)) :*: (S1 ('MetaSel ('Just "readerColumns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int) :*: S1 ('MetaSel ('Just "readerTabStop") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) :*: ((S1 ('MetaSel ('Just "readerIndentedCodeClasses") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Text]) :*: S1 ('MetaSel ('Just "readerAbbreviations") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Set Text))) :*: (S1 ('MetaSel ('Just "readerDefaultImageExtension") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "readerTrackChanges") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TrackChanges) :*: S1 ('MetaSel ('Just "readerStripComments") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))))