commonmark-0.2.1.1: Pure Haskell commonmark parser.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Commonmark.Types

Synopsis

Documentation

newtype Format #

Constructors

Format Text 

Instances

Instances details
Eq Format # 
Instance details

Defined in Commonmark.Types

Methods

(==) :: Format -> Format -> Bool #

(/=) :: Format -> Format -> Bool #

Data Format # 
Instance details

Defined in Commonmark.Types

Methods

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

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

toConstr :: Format -> Constr #

dataTypeOf :: Format -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Format # 
Instance details

Defined in Commonmark.Types

data ListSpacing #

Constructors

TightList 
LooseList 

Instances

Instances details
Eq ListSpacing # 
Instance details

Defined in Commonmark.Types

Data ListSpacing # 
Instance details

Defined in Commonmark.Types

Methods

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

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

toConstr :: ListSpacing -> Constr #

dataTypeOf :: ListSpacing -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ListSpacing # 
Instance details

Defined in Commonmark.Types

Show ListSpacing # 
Instance details

Defined in Commonmark.Types

data ListType #

Instances

Instances details
Eq ListType # 
Instance details

Defined in Commonmark.Types

Data ListType # 
Instance details

Defined in Commonmark.Types

Methods

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

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

toConstr :: ListType -> Constr #

dataTypeOf :: ListType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ListType # 
Instance details

Defined in Commonmark.Types

Show ListType # 
Instance details

Defined in Commonmark.Types

data DelimiterType #

Constructors

Period 
OneParen 
TwoParens 

Instances

Instances details
Eq DelimiterType # 
Instance details

Defined in Commonmark.Types

Data DelimiterType # 
Instance details

Defined in Commonmark.Types

Methods

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

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

toConstr :: DelimiterType -> Constr #

dataTypeOf :: DelimiterType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DelimiterType # 
Instance details

Defined in Commonmark.Types

Show DelimiterType # 
Instance details

Defined in Commonmark.Types

data EnumeratorType #

Instances

Instances details
Eq EnumeratorType # 
Instance details

Defined in Commonmark.Types

Data EnumeratorType # 
Instance details

Defined in Commonmark.Types

Methods

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

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

toConstr :: EnumeratorType -> Constr #

dataTypeOf :: EnumeratorType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EnumeratorType # 
Instance details

Defined in Commonmark.Types

Show EnumeratorType # 
Instance details

Defined in Commonmark.Types

class (Monoid a, Show a, Rangeable a, HasAttributes a) => IsInline a where #

Methods

lineBreak :: a #

softBreak :: a #

str :: Text -> a #

entity :: Text -> a #

escapedChar :: Char -> a #

emph :: a -> a #

strong :: a -> a #

link #

Arguments

:: Text

Destination

-> Text

Title

-> a

Link description

-> a 

image #

Arguments

:: Text

Source

-> Text

Title

-> a

Description

-> a 

code :: Text -> a #

rawInline :: Format -> Text -> a #

Instances

Instances details
(IsInline a, Semigroup a) => IsInline (WithSourceMap a) # 
Instance details

Defined in Commonmark.SourceMap

Rangeable (Html a) => IsInline (Html a) # 
Instance details

Defined in Commonmark.Html

Methods

lineBreak :: Html a #

softBreak :: Html a #

str :: Text -> Html a #

entity :: Text -> Html a #

escapedChar :: Char -> Html a #

emph :: Html a -> Html a #

strong :: Html a -> Html a #

link :: Text -> Text -> Html a -> Html a #

image :: Text -> Text -> Html a -> Html a #

code :: Text -> Html a #

rawInline :: Format -> Text -> Html a #

class (Monoid b, Show b, Rangeable b, IsInline il, HasAttributes b) => IsBlock il b | b -> il where #

Methods

paragraph :: il -> b #

plain :: il -> b #

thematicBreak :: b #

blockQuote :: b -> b #

codeBlock :: Text -> Text -> b #

heading #

Arguments

:: Int

Level

-> il

text

-> b 

rawBlock :: Format -> Text -> b #

referenceLinkDefinition #

Arguments

:: Text

Label

-> (Text, Text)

Destination, title

-> b 

list :: ListType -> ListSpacing -> [b] -> b #

newtype SourceRange #

Constructors

SourceRange 

Instances

Instances details
Eq SourceRange # 
Instance details

Defined in Commonmark.Types

Data SourceRange # 
Instance details

Defined in Commonmark.Types

Methods

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

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

toConstr :: SourceRange -> Constr #

dataTypeOf :: SourceRange -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SourceRange # 
Instance details

Defined in Commonmark.Types

Show SourceRange # 
Instance details

Defined in Commonmark.Types

Semigroup SourceRange # 
Instance details

Defined in Commonmark.Types

Monoid SourceRange # 
Instance details

Defined in Commonmark.Types

Rangeable (Html SourceRange) # 
Instance details

Defined in Commonmark.Html

data SourcePos #

The abstract data type SourcePos represents source positions. It contains the name of the source (i.e. file name), a line number and a column number. SourcePos is an instance of the Show, Eq and Ord class.

Instances

Instances details
Eq SourcePos 
Instance details

Defined in Text.Parsec.Pos

Data SourcePos 
Instance details

Defined in Text.Parsec.Pos

Methods

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

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

toConstr :: SourcePos -> Constr #

dataTypeOf :: SourcePos -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SourcePos 
Instance details

Defined in Text.Parsec.Pos

Show SourcePos 
Instance details

Defined in Text.Parsec.Pos

class Rangeable a where #

Methods

ranged :: SourceRange -> a -> a #

Instances

Instances details
(Rangeable a, Monoid a, Show a) => Rangeable (WithSourceMap a) # 
Instance details

Defined in Commonmark.SourceMap

Rangeable (Html ()) # 
Instance details

Defined in Commonmark.Html

Methods

ranged :: SourceRange -> Html () -> Html () #

Rangeable (Html SourceRange) # 
Instance details

Defined in Commonmark.Html

type Attribute = (Text, Text) #

class HasAttributes a where #

Methods

addAttributes :: Attributes -> a -> a #

Instances

Instances details
HasAttributes (WithSourceMap a) # 
Instance details

Defined in Commonmark.SourceMap

HasAttributes (Html a) # 
Instance details

Defined in Commonmark.Html

Methods

addAttributes :: Attributes -> Html a -> Html a #

class ToPlainText a where #

Methods

toPlainText :: a -> Text #

Instances

Instances details
ToPlainText a => ToPlainText (WithSourceMap a) # 
Instance details

Defined in Commonmark.SourceMap

ToPlainText (Html a) # 
Instance details

Defined in Commonmark.Html

Methods

toPlainText :: Html a -> Text #