Safe Haskell | Safe |
---|---|
Language | Haskell2010 |
Synopsis
- mkInlineParser :: (Monad m, IsInline a) => [BracketedSpec a] -> [FormattingSpec a] -> [InlineParser m a] -> [InlineParser m Attributes] -> ReferenceMap -> [Tok] -> m (Either ParseError a)
- defaultInlineParser :: (Monad m, IsInline a) => InlineParser m a
- data IPState m
- type InlineParser m = ParsecT [Tok] (IPState m) (StateT Enders m)
- getReferenceMap :: Monad m => InlineParser m ReferenceMap
- data FormattingSpec il = FormattingSpec {
- formattingDelimChar :: !Char
- formattingIntraWord :: !Bool
- formattingIgnorePunctuation :: !Bool
- formattingSingleMatch :: Maybe (il -> il)
- formattingDoubleMatch :: Maybe (il -> il)
- formattingWhenUnmatched :: !Char
- defaultFormattingSpecs :: IsInline il => [FormattingSpec il]
- data BracketedSpec il = BracketedSpec {
- bracketedName :: !Text
- bracketedNests :: !Bool
- bracketedPrefix :: Maybe Char
- bracketedSuffixEnd :: Maybe Char
- bracketedSuffix :: ReferenceMap -> Text -> Parsec [Tok] () (il -> il)
- defaultBracketedSpecs :: IsInline il => [BracketedSpec il]
- imageSpec :: IsInline il => BracketedSpec il
- linkSpec :: IsInline il => BracketedSpec il
- pLinkLabel :: Monad m => ParsecT [Tok] s m Text
- pLinkDestination :: Monad m => ParsecT [Tok] s m [Tok]
- pLinkTitle :: Monad m => ParsecT [Tok] s m [Tok]
- pEscaped :: Monad m => ParsecT [Tok] s m Tok
- processEmphasis :: IsInline a => [Chunk a] -> [Chunk a]
- processBrackets :: IsInline a => [BracketedSpec a] -> ReferenceMap -> [Chunk a] -> [Chunk a]
- pBacktickSpan :: Monad m => Tok -> InlineParser m (Either [Tok] [Tok])
- normalizeCodeSpan :: Text -> Text
- withAttributes :: (IsInline a, Monad m) => InlineParser m a -> InlineParser m a
Documentation
mkInlineParser :: (Monad m, IsInline a) => [BracketedSpec a] -> [FormattingSpec a] -> [InlineParser m a] -> [InlineParser m Attributes] -> ReferenceMap -> [Tok] -> m (Either ParseError a) Source #
defaultInlineParser :: (Monad m, IsInline a) => InlineParser m a Source #
type InlineParser m = ParsecT [Tok] (IPState m) (StateT Enders m) Source #
Specifies delimiters for formatting, e.g. strong emphasis.
getReferenceMap :: Monad m => InlineParser m ReferenceMap Source #
data FormattingSpec il Source #
FormattingSpec | |
|
Instances
Show (FormattingSpec il) Source # | |
Defined in Commonmark.Inlines showsPrec :: Int -> FormattingSpec il -> ShowS # show :: FormattingSpec il -> String # showList :: [FormattingSpec il] -> ShowS # |
defaultFormattingSpecs :: IsInline il => [FormattingSpec il] Source #
data BracketedSpec il Source #
BracketedSpec | |
|
Instances
Show (BracketedSpec il) Source # | |
Defined in Commonmark.Inlines showsPrec :: Int -> BracketedSpec il -> ShowS # show :: BracketedSpec il -> String # showList :: [BracketedSpec il] -> ShowS # |
defaultBracketedSpecs :: IsInline il => [BracketedSpec il] Source #
imageSpec :: IsInline il => BracketedSpec il Source #
linkSpec :: IsInline il => BracketedSpec il Source #
processEmphasis :: IsInline a => [Chunk a] -> [Chunk a] Source #
processBrackets :: IsInline a => [BracketedSpec a] -> ReferenceMap -> [Chunk a] -> [Chunk a] Source #
pBacktickSpan :: Monad m => Tok -> InlineParser m (Either [Tok] [Tok]) Source #
normalizeCodeSpan :: Text -> Text Source #
withAttributes :: (IsInline a, Monad m) => InlineParser m a -> InlineParser m a Source #