Copyright | Copyright (C) 2008-2018 John MacFarlane |
---|---|
License | GNU GPL, version 2 or above |
Maintainer | John MacFarlane <jgm@berkeley.edu> |
Stability | alpha |
Portability | portable |
Safe Haskell | None |
Language | Haskell2010 |
Text.Pandoc.Highlighting
Description
Exports functions for syntax highlighting.
Synopsis
- highlightingStyles :: [(String, Style)]
- languages :: [String]
- languagesByExtension :: String -> [String]
- highlight :: SyntaxMap -> (FormatOptions -> [SourceLine] -> a) -> Attr -> String -> Either String a
- formatLaTeXInline :: FormatOptions -> [SourceLine] -> Text
- formatLaTeXBlock :: FormatOptions -> [SourceLine] -> Text
- styleToLaTeX :: Style -> Text
- formatHtmlInline :: FormatOptions -> [SourceLine] -> Html
- formatHtmlBlock :: FormatOptions -> [SourceLine] -> Html
- styleToCss :: Style -> String
- pygments :: Style
- espresso :: Style
- zenburn :: Style
- tango :: Style
- kate :: Style
- monochrome :: Style
- haddock :: Style
- data Style
- fromListingsLanguage :: String -> Maybe String
- toListingsLanguage :: String -> Maybe String
Documentation
highlightingStyles :: [(String, Style)] Source #
languagesByExtension :: String -> [String] Source #
formatLaTeXInline :: FormatOptions -> [SourceLine] -> Text #
formatLaTeXBlock :: FormatOptions -> [SourceLine] -> Text #
styleToLaTeX :: Style -> Text #
formatHtmlInline :: FormatOptions -> [SourceLine] -> Html #
formatHtmlBlock :: FormatOptions -> [SourceLine] -> Html #
styleToCss :: Style -> String #
monochrome :: Style #
Instances
Eq Style | |
Data Style | |
Defined in Skylighting.Types Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Style -> c Style # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Style # dataTypeOf :: Style -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Style) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Style) # gmapT :: (forall b. Data b => b -> b) -> Style -> Style # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Style -> r # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Style -> r # gmapQ :: (forall d. Data d => d -> u) -> Style -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Style -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Style -> m Style # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Style -> m Style # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Style -> m Style # | |
Ord Style | |
Read Style | |
Show Style | |
Generic Style | |
ToJSON Style | |
Defined in Skylighting.Types | |
FromJSON Style | |
Binary Style | |
type Rep Style | |
Defined in Skylighting.Types type Rep Style = D1 (MetaData "Style" "Skylighting.Types" "skylighting-core-0.7.5-7O4J2t9prfgEMaKhc9owom" False) (C1 (MetaCons "Style" PrefixI True) ((S1 (MetaSel (Just "tokenStyles") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Map TokenType TokenStyle)) :*: S1 (MetaSel (Just "defaultColor") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Color))) :*: (S1 (MetaSel (Just "backgroundColor") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Color)) :*: (S1 (MetaSel (Just "lineNumberColor") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Color)) :*: S1 (MetaSel (Just "lineNumberBackgroundColor") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Color)))))) |