djot-0.1.1.3: Parser and renderer for djot light markup syntax.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Djot.AST

Synopsis

Documentation

data Inline Source #

Instances

Instances details
Data Inline Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: Inline -> Constr #

dataTypeOf :: Inline -> DataType #

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

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

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

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

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

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

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

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

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

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

Monoid Inlines Source # 
Instance details

Defined in Djot.AST

Semigroup Inlines Source # 
Instance details

Defined in Djot.AST

Generic Inline Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep Inline :: Type -> Type #

Methods

from :: Inline -> Rep Inline x #

to :: Rep Inline x -> Inline #

Show Inline Source # 
Instance details

Defined in Djot.AST

Eq Inline Source # 
Instance details

Defined in Djot.AST

Methods

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

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

Ord Inline Source # 
Instance details

Defined in Djot.AST

type Rep Inline Source # 
Instance details

Defined in Djot.AST

type Rep Inline = D1 ('MetaData "Inline" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'False) ((((C1 ('MetaCons "Str" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString)) :+: C1 ('MetaCons "Emph" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines))) :+: (C1 ('MetaCons "Strong" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines)) :+: (C1 ('MetaCons "Highlight" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines)) :+: C1 ('MetaCons "Insert" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines))))) :+: ((C1 ('MetaCons "Delete" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines)) :+: (C1 ('MetaCons "Superscript" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines)) :+: C1 ('MetaCons "Subscript" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines)))) :+: (C1 ('MetaCons "Verbatim" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString)) :+: (C1 ('MetaCons "Symbol" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString)) :+: C1 ('MetaCons "Math" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 MathStyle) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString)))))) :+: (((C1 ('MetaCons "Link" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Target)) :+: C1 ('MetaCons "Image" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Target))) :+: (C1 ('MetaCons "Span" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines)) :+: (C1 ('MetaCons "FootnoteReference" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString)) :+: C1 ('MetaCons "UrlLink" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString))))) :+: ((C1 ('MetaCons "EmailLink" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString)) :+: (C1 ('MetaCons "RawInline" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Format) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString)) :+: C1 ('MetaCons "NonBreakingSpace" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "Quoted" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 QuoteType) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines)) :+: (C1 ('MetaCons "SoftBreak" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "HardBreak" 'PrefixI 'False) (U1 :: Type -> Type))))))

newtype Many a Source #

Constructors

Many 

Fields

Instances

Instances details
Foldable Many Source # 
Instance details

Defined in Djot.AST

Methods

fold :: Monoid m => Many m -> m #

foldMap :: Monoid m => (a -> m) -> Many a -> m #

foldMap' :: Monoid m => (a -> m) -> Many a -> m #

foldr :: (a -> b -> b) -> b -> Many a -> b #

foldr' :: (a -> b -> b) -> b -> Many a -> b #

foldl :: (b -> a -> b) -> b -> Many a -> b #

foldl' :: (b -> a -> b) -> b -> Many a -> b #

foldr1 :: (a -> a -> a) -> Many a -> a #

foldl1 :: (a -> a -> a) -> Many a -> a #

toList :: Many a -> [a] #

null :: Many a -> Bool #

length :: Many a -> Int #

elem :: Eq a => a -> Many a -> Bool #

maximum :: Ord a => Many a -> a #

minimum :: Ord a => Many a -> a #

sum :: Num a => Many a -> a #

product :: Num a => Many a -> a #

Traversable Many Source # 
Instance details

Defined in Djot.AST

Methods

traverse :: Applicative f => (a -> f b) -> Many a -> f (Many b) #

sequenceA :: Applicative f => Many (f a) -> f (Many a) #

mapM :: Monad m => (a -> m b) -> Many a -> m (Many b) #

sequence :: Monad m => Many (m a) -> m (Many a) #

Functor Many Source # 
Instance details

Defined in Djot.AST

Methods

fmap :: (a -> b) -> Many a -> Many b #

(<$) :: a -> Many b -> Many a #

Monoid Blocks Source # 
Instance details

Defined in Djot.AST

Monoid Inlines Source # 
Instance details

Defined in Djot.AST

Semigroup Blocks Source # 
Instance details

Defined in Djot.AST

Semigroup Inlines Source # 
Instance details

Defined in Djot.AST

Data a => Data (Many a) Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: Many a -> Constr #

dataTypeOf :: Many a -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic (Many a) Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep (Many a) :: Type -> Type #

Methods

from :: Many a -> Rep (Many a) x #

to :: Rep (Many a) x -> Many a #

Show a => Show (Many a) Source # 
Instance details

Defined in Djot.AST

Methods

showsPrec :: Int -> Many a -> ShowS #

show :: Many a -> String #

showList :: [Many a] -> ShowS #

Eq a => Eq (Many a) Source # 
Instance details

Defined in Djot.AST

Methods

(==) :: Many a -> Many a -> Bool #

(/=) :: Many a -> Many a -> Bool #

Ord a => Ord (Many a) Source # 
Instance details

Defined in Djot.AST

Methods

compare :: Many a -> Many a -> Ordering #

(<) :: Many a -> Many a -> Bool #

(<=) :: Many a -> Many a -> Bool #

(>) :: Many a -> Many a -> Bool #

(>=) :: Many a -> Many a -> Bool #

max :: Many a -> Many a -> Many a #

min :: Many a -> Many a -> Many a #

type Rep (Many a) Source # 
Instance details

Defined in Djot.AST

type Rep (Many a) = D1 ('MetaData "Many" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'True) (C1 ('MetaCons "Many" 'PrefixI 'True) (S1 ('MetaSel ('Just "unMany") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Seq a))))

data MathStyle Source #

Constructors

DisplayMath 
InlineMath 

Instances

Instances details
Data MathStyle Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: MathStyle -> Constr #

dataTypeOf :: MathStyle -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic MathStyle Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep MathStyle :: Type -> Type #

Show MathStyle Source # 
Instance details

Defined in Djot.AST

Eq MathStyle Source # 
Instance details

Defined in Djot.AST

Ord MathStyle Source # 
Instance details

Defined in Djot.AST

type Rep MathStyle Source # 
Instance details

Defined in Djot.AST

type Rep MathStyle = D1 ('MetaData "MathStyle" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'False) (C1 ('MetaCons "DisplayMath" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InlineMath" 'PrefixI 'False) (U1 :: Type -> Type))

newtype Format Source #

Constructors

Format 

Fields

Instances

Instances details
Data Format Source # 
Instance details

Defined in Djot.AST

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 #

Generic Format Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep Format :: Type -> Type #

Methods

from :: Format -> Rep Format x #

to :: Rep Format x -> Format #

Show Format Source # 
Instance details

Defined in Djot.AST

Eq Format Source # 
Instance details

Defined in Djot.AST

Methods

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

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

Ord Format Source # 
Instance details

Defined in Djot.AST

type Rep Format Source # 
Instance details

Defined in Djot.AST

type Rep Format = D1 ('MetaData "Format" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'True) (C1 ('MetaCons "Format" 'PrefixI 'True) (S1 ('MetaSel ('Just "unFormat") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 ByteString)))

data Node a Source #

Constructors

Node Pos Attr a 

Instances

Instances details
Foldable Node Source # 
Instance details

Defined in Djot.AST

Methods

fold :: Monoid m => Node m -> m #

foldMap :: Monoid m => (a -> m) -> Node a -> m #

foldMap' :: Monoid m => (a -> m) -> Node a -> m #

foldr :: (a -> b -> b) -> b -> Node a -> b #

foldr' :: (a -> b -> b) -> b -> Node a -> b #

foldl :: (b -> a -> b) -> b -> Node a -> b #

foldl' :: (b -> a -> b) -> b -> Node a -> b #

foldr1 :: (a -> a -> a) -> Node a -> a #

foldl1 :: (a -> a -> a) -> Node a -> a #

toList :: Node a -> [a] #

null :: Node a -> Bool #

length :: Node a -> Int #

elem :: Eq a => a -> Node a -> Bool #

maximum :: Ord a => Node a -> a #

minimum :: Ord a => Node a -> a #

sum :: Num a => Node a -> a #

product :: Num a => Node a -> a #

Traversable Node Source # 
Instance details

Defined in Djot.AST

Methods

traverse :: Applicative f => (a -> f b) -> Node a -> f (Node b) #

sequenceA :: Applicative f => Node (f a) -> f (Node a) #

mapM :: Monad m => (a -> m b) -> Node a -> m (Node b) #

sequence :: Monad m => Node (m a) -> m (Node a) #

Functor Node Source # 
Instance details

Defined in Djot.AST

Methods

fmap :: (a -> b) -> Node a -> Node b #

(<$) :: a -> Node b -> Node a #

Monoid Blocks Source # 
Instance details

Defined in Djot.AST

Monoid Inlines Source # 
Instance details

Defined in Djot.AST

Semigroup Blocks Source # 
Instance details

Defined in Djot.AST

Semigroup Inlines Source # 
Instance details

Defined in Djot.AST

Data a => Data (Node a) Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: Node a -> Constr #

dataTypeOf :: Node a -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic (Node a) Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep (Node a) :: Type -> Type #

Methods

from :: Node a -> Rep (Node a) x #

to :: Rep (Node a) x -> Node a #

Show a => Show (Node a) Source # 
Instance details

Defined in Djot.AST

Methods

showsPrec :: Int -> Node a -> ShowS #

show :: Node a -> String #

showList :: [Node a] -> ShowS #

Eq a => Eq (Node a) Source # 
Instance details

Defined in Djot.AST

Methods

(==) :: Node a -> Node a -> Bool #

(/=) :: Node a -> Node a -> Bool #

Ord a => Ord (Node a) Source # 
Instance details

Defined in Djot.AST

Methods

compare :: Node a -> Node a -> Ordering #

(<) :: Node a -> Node a -> Bool #

(<=) :: Node a -> Node a -> Bool #

(>) :: Node a -> Node a -> Bool #

(>=) :: Node a -> Node a -> Bool #

max :: Node a -> Node a -> Node a #

min :: Node a -> Node a -> Node a #

type Rep (Node a) Source # 
Instance details

Defined in Djot.AST

data Pos Source #

Constructors

NoPos 
Pos Int Int Int Int 

Instances

Instances details
Data Pos Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: Pos -> Constr #

dataTypeOf :: Pos -> DataType #

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

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

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

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

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

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

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

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

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

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

Monoid Pos Source # 
Instance details

Defined in Djot.AST

Methods

mempty :: Pos #

mappend :: Pos -> Pos -> Pos #

mconcat :: [Pos] -> Pos #

Semigroup Pos Source # 
Instance details

Defined in Djot.AST

Methods

(<>) :: Pos -> Pos -> Pos #

sconcat :: NonEmpty Pos -> Pos #

stimes :: Integral b => b -> Pos -> Pos #

Generic Pos Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep Pos :: Type -> Type #

Methods

from :: Pos -> Rep Pos x #

to :: Rep Pos x -> Pos #

Show Pos Source # 
Instance details

Defined in Djot.AST

Methods

showsPrec :: Int -> Pos -> ShowS #

show :: Pos -> String #

showList :: [Pos] -> ShowS #

Eq Pos Source # 
Instance details

Defined in Djot.AST

Methods

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

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

Ord Pos Source # 
Instance details

Defined in Djot.AST

Methods

compare :: Pos -> Pos -> Ordering #

(<) :: Pos -> Pos -> Bool #

(<=) :: Pos -> Pos -> Bool #

(>) :: Pos -> Pos -> Bool #

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

max :: Pos -> Pos -> Pos #

min :: Pos -> Pos -> Pos #

type Rep Pos Source # 
Instance details

Defined in Djot.AST

addAttr :: Attr -> Node a -> Node a Source #

addPos :: Pos -> Node a -> Node a Source #

data Block Source #

Instances

Instances details
Data Block Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: Block -> Constr #

dataTypeOf :: Block -> DataType #

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

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

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

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

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

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

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

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

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

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

Monoid Blocks Source # 
Instance details

Defined in Djot.AST

Semigroup Blocks Source # 
Instance details

Defined in Djot.AST

Generic Block Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep Block :: Type -> Type #

Methods

from :: Block -> Rep Block x #

to :: Rep Block x -> Block #

Show Block Source # 
Instance details

Defined in Djot.AST

Methods

showsPrec :: Int -> Block -> ShowS #

show :: Block -> String #

showList :: [Block] -> ShowS #

Eq Block Source # 
Instance details

Defined in Djot.AST

Methods

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

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

Ord Block Source # 
Instance details

Defined in Djot.AST

Methods

compare :: Block -> Block -> Ordering #

(<) :: Block -> Block -> Bool #

(<=) :: Block -> Block -> Bool #

(>) :: Block -> Block -> Bool #

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

max :: Block -> Block -> Block #

min :: Block -> Block -> Block #

type Rep Block Source # 
Instance details

Defined in Djot.AST

type Rep Block = D1 ('MetaData "Block" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'False) (((C1 ('MetaCons "Para" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines)) :+: (C1 ('MetaCons "Section" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Blocks)) :+: C1 ('MetaCons "Heading" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Inlines)))) :+: (C1 ('MetaCons "BlockQuote" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Blocks)) :+: (C1 ('MetaCons "CodeBlock" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString)) :+: C1 ('MetaCons "Div" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Blocks))))) :+: ((C1 ('MetaCons "OrderedList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 OrderedListAttributes) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ListSpacing) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Blocks]))) :+: (C1 ('MetaCons "BulletList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ListSpacing) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [Blocks])) :+: C1 ('MetaCons "TaskList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ListSpacing) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [(TaskStatus, Blocks)])))) :+: ((C1 ('MetaCons "DefinitionList" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ListSpacing) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [(Inlines, Blocks)])) :+: C1 ('MetaCons "ThematicBreak" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Table" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 (Maybe Caption)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 [[Cell]])) :+: C1 ('MetaCons "RawBlock" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Format) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 ByteString))))))

data Doc Source #

Instances

Instances details
Data Doc Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: Doc -> Constr #

dataTypeOf :: Doc -> DataType #

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

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

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

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

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

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

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

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

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

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

Monoid Doc Source # 
Instance details

Defined in Djot.AST

Methods

mempty :: Doc #

mappend :: Doc -> Doc -> Doc #

mconcat :: [Doc] -> Doc #

Semigroup Doc Source # 
Instance details

Defined in Djot.AST

Methods

(<>) :: Doc -> Doc -> Doc #

sconcat :: NonEmpty Doc -> Doc #

stimes :: Integral b => b -> Doc -> Doc #

Generic Doc Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep Doc :: Type -> Type #

Methods

from :: Doc -> Rep Doc x #

to :: Rep Doc x -> Doc #

Show Doc Source # 
Instance details

Defined in Djot.AST

Methods

showsPrec :: Int -> Doc -> ShowS #

show :: Doc -> String #

showList :: [Doc] -> ShowS #

Eq Doc Source # 
Instance details

Defined in Djot.AST

Methods

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

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

Ord Doc Source # 
Instance details

Defined in Djot.AST

Methods

compare :: Doc -> Doc -> Ordering #

(<) :: Doc -> Doc -> Bool #

(<=) :: Doc -> Doc -> Bool #

(>) :: Doc -> Doc -> Bool #

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

max :: Doc -> Doc -> Doc #

min :: Doc -> Doc -> Doc #

type Rep Doc Source # 
Instance details

Defined in Djot.AST

newtype NoteMap Source #

A map from labels to contents.

Constructors

NoteMap 

Instances

Instances details
Data NoteMap Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: NoteMap -> Constr #

dataTypeOf :: NoteMap -> DataType #

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

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

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

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

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

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

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

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

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

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

Monoid NoteMap Source # 
Instance details

Defined in Djot.AST

Semigroup NoteMap Source # 
Instance details

Defined in Djot.AST

Generic NoteMap Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep NoteMap :: Type -> Type #

Methods

from :: NoteMap -> Rep NoteMap x #

to :: Rep NoteMap x -> NoteMap #

Show NoteMap Source # 
Instance details

Defined in Djot.AST

Eq NoteMap Source # 
Instance details

Defined in Djot.AST

Methods

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

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

Ord NoteMap Source # 
Instance details

Defined in Djot.AST

type Rep NoteMap Source # 
Instance details

Defined in Djot.AST

type Rep NoteMap = D1 ('MetaData "NoteMap" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'True) (C1 ('MetaCons "NoteMap" 'PrefixI 'True) (S1 ('MetaSel ('Just "unNoteMap") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map ByteString Blocks))))

newtype ReferenceMap Source #

Instances

Instances details
Data ReferenceMap Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: ReferenceMap -> Constr #

dataTypeOf :: ReferenceMap -> DataType #

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

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

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

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

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

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

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

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

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

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

Monoid ReferenceMap Source # 
Instance details

Defined in Djot.AST

Semigroup ReferenceMap Source # 
Instance details

Defined in Djot.AST

Generic ReferenceMap Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep ReferenceMap :: Type -> Type #

Show ReferenceMap Source # 
Instance details

Defined in Djot.AST

Eq ReferenceMap Source # 
Instance details

Defined in Djot.AST

Ord ReferenceMap Source # 
Instance details

Defined in Djot.AST

type Rep ReferenceMap Source # 
Instance details

Defined in Djot.AST

type Rep ReferenceMap = D1 ('MetaData "ReferenceMap" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'True) (C1 ('MetaCons "ReferenceMap" 'PrefixI 'True) (S1 ('MetaSel ('Just "unReferenceMap") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map ByteString (ByteString, Attr)))))

newtype Attr Source #

Constructors

Attr [(ByteString, ByteString)] 

Instances

Instances details
Data Attr Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: Attr -> Constr #

dataTypeOf :: Attr -> DataType #

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

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

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

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

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

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

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

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

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

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

Monoid Attr Source # 
Instance details

Defined in Djot.AST

Methods

mempty :: Attr #

mappend :: Attr -> Attr -> Attr #

mconcat :: [Attr] -> Attr #

Semigroup Attr Source # 
Instance details

Defined in Djot.AST

Methods

(<>) :: Attr -> Attr -> Attr #

sconcat :: NonEmpty Attr -> Attr #

stimes :: Integral b => b -> Attr -> Attr #

Generic Attr Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep Attr :: Type -> Type #

Methods

from :: Attr -> Rep Attr x #

to :: Rep Attr x -> Attr #

Show Attr Source # 
Instance details

Defined in Djot.AST

Methods

showsPrec :: Int -> Attr -> ShowS #

show :: Attr -> String #

showList :: [Attr] -> ShowS #

Eq Attr Source # 
Instance details

Defined in Djot.AST

Methods

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

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

Ord Attr Source # 
Instance details

Defined in Djot.AST

Methods

compare :: Attr -> Attr -> Ordering #

(<) :: Attr -> Attr -> Bool #

(<=) :: Attr -> Attr -> Bool #

(>) :: Attr -> Attr -> Bool #

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

max :: Attr -> Attr -> Attr #

min :: Attr -> Attr -> Attr #

type Rep Attr Source # 
Instance details

Defined in Djot.AST

type Rep Attr = D1 ('MetaData "Attr" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'True) (C1 ('MetaCons "Attr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(ByteString, ByteString)])))

data Target Source #

Instances

Instances details
Data Target Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: Target -> Constr #

dataTypeOf :: Target -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic Target Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep Target :: Type -> Type #

Methods

from :: Target -> Rep Target x #

to :: Rep Target x -> Target #

Show Target Source # 
Instance details

Defined in Djot.AST

Eq Target Source # 
Instance details

Defined in Djot.AST

Methods

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

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

Ord Target Source # 
Instance details

Defined in Djot.AST

type Rep Target Source # 
Instance details

Defined in Djot.AST

data TaskStatus Source #

Constructors

Complete 
Incomplete 

Instances

Instances details
Data TaskStatus Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: TaskStatus -> Constr #

dataTypeOf :: TaskStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic TaskStatus Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep TaskStatus :: Type -> Type #

Show TaskStatus Source # 
Instance details

Defined in Djot.AST

Eq TaskStatus Source # 
Instance details

Defined in Djot.AST

Ord TaskStatus Source # 
Instance details

Defined in Djot.AST

type Rep TaskStatus Source # 
Instance details

Defined in Djot.AST

type Rep TaskStatus = D1 ('MetaData "TaskStatus" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'False) (C1 ('MetaCons "Complete" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Incomplete" 'PrefixI 'False) (U1 :: Type -> Type))

data Align Source #

Instances

Instances details
Data Align Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: Align -> Constr #

dataTypeOf :: Align -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic Align Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep Align :: Type -> Type #

Methods

from :: Align -> Rep Align x #

to :: Rep Align x -> Align #

Show Align Source # 
Instance details

Defined in Djot.AST

Methods

showsPrec :: Int -> Align -> ShowS #

show :: Align -> String #

showList :: [Align] -> ShowS #

Eq Align Source # 
Instance details

Defined in Djot.AST

Methods

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

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

Ord Align Source # 
Instance details

Defined in Djot.AST

Methods

compare :: Align -> Align -> Ordering #

(<) :: Align -> Align -> Bool #

(<=) :: Align -> Align -> Bool #

(>) :: Align -> Align -> Bool #

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

max :: Align -> Align -> Align #

min :: Align -> Align -> Align #

type Rep Align Source # 
Instance details

Defined in Djot.AST

type Rep Align = D1 ('MetaData "Align" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'False) ((C1 ('MetaCons "AlignLeft" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AlignRight" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "AlignCenter" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AlignDefault" 'PrefixI 'False) (U1 :: Type -> Type)))

data Cell Source #

Constructors

Cell CellType Align Inlines 

Instances

Instances details
Data Cell Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: Cell -> Constr #

dataTypeOf :: Cell -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic Cell Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep Cell :: Type -> Type #

Methods

from :: Cell -> Rep Cell x #

to :: Rep Cell x -> Cell #

Show Cell Source # 
Instance details

Defined in Djot.AST

Methods

showsPrec :: Int -> Cell -> ShowS #

show :: Cell -> String #

showList :: [Cell] -> ShowS #

Eq Cell Source # 
Instance details

Defined in Djot.AST

Methods

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

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

Ord Cell Source # 
Instance details

Defined in Djot.AST

Methods

compare :: Cell -> Cell -> Ordering #

(<) :: Cell -> Cell -> Bool #

(<=) :: Cell -> Cell -> Bool #

(>) :: Cell -> Cell -> Bool #

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

max :: Cell -> Cell -> Cell #

min :: Cell -> Cell -> Cell #

type Rep Cell Source # 
Instance details

Defined in Djot.AST

data CellType Source #

Constructors

HeadCell 
BodyCell 

Instances

Instances details
Data CellType Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: CellType -> Constr #

dataTypeOf :: CellType -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic CellType Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep CellType :: Type -> Type #

Methods

from :: CellType -> Rep CellType x #

to :: Rep CellType x -> CellType #

Show CellType Source # 
Instance details

Defined in Djot.AST

Eq CellType Source # 
Instance details

Defined in Djot.AST

Ord CellType Source # 
Instance details

Defined in Djot.AST

type Rep CellType Source # 
Instance details

Defined in Djot.AST

type Rep CellType = D1 ('MetaData "CellType" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'False) (C1 ('MetaCons "HeadCell" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BodyCell" 'PrefixI 'False) (U1 :: Type -> Type))

newtype Caption Source #

Constructors

Caption Blocks 

Instances

Instances details
Data Caption Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: Caption -> Constr #

dataTypeOf :: Caption -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic Caption Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep Caption :: Type -> Type #

Methods

from :: Caption -> Rep Caption x #

to :: Rep Caption x -> Caption #

Show Caption Source # 
Instance details

Defined in Djot.AST

Eq Caption Source # 
Instance details

Defined in Djot.AST

Methods

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

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

Ord Caption Source # 
Instance details

Defined in Djot.AST

type Rep Caption Source # 
Instance details

Defined in Djot.AST

type Rep Caption = D1 ('MetaData "Caption" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'True) (C1 ('MetaCons "Caption" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Blocks)))

data ListSpacing Source #

Constructors

Tight 
Loose 

Instances

Instances details
Data ListSpacing Source # 
Instance details

Defined in Djot.AST

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 #

Generic ListSpacing Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep ListSpacing :: Type -> Type #

Show ListSpacing Source # 
Instance details

Defined in Djot.AST

Eq ListSpacing Source # 
Instance details

Defined in Djot.AST

Ord ListSpacing Source # 
Instance details

Defined in Djot.AST

type Rep ListSpacing Source # 
Instance details

Defined in Djot.AST

type Rep ListSpacing = D1 ('MetaData "ListSpacing" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'False) (C1 ('MetaCons "Tight" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Loose" 'PrefixI 'False) (U1 :: Type -> Type))

data OrderedListAttributes Source #

Instances

Instances details
Data OrderedListAttributes Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: OrderedListAttributes -> Constr #

dataTypeOf :: OrderedListAttributes -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic OrderedListAttributes Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep OrderedListAttributes :: Type -> Type #

Show OrderedListAttributes Source # 
Instance details

Defined in Djot.AST

Eq OrderedListAttributes Source # 
Instance details

Defined in Djot.AST

Ord OrderedListAttributes Source # 
Instance details

Defined in Djot.AST

type Rep OrderedListAttributes Source # 
Instance details

Defined in Djot.AST

type Rep OrderedListAttributes = D1 ('MetaData "OrderedListAttributes" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'False) (C1 ('MetaCons "OrderedListAttributes" 'PrefixI 'True) (S1 ('MetaSel ('Just "orderedListStyle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 OrderedListStyle) :*: (S1 ('MetaSel ('Just "orderedListDelim") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 OrderedListDelim) :*: S1 ('MetaSel ('Just "orderedListStart") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedStrict) (Rec0 Int))))

data OrderedListDelim Source #

Instances

Instances details
Data OrderedListDelim Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: OrderedListDelim -> Constr #

dataTypeOf :: OrderedListDelim -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic OrderedListDelim Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep OrderedListDelim :: Type -> Type #

Show OrderedListDelim Source # 
Instance details

Defined in Djot.AST

Eq OrderedListDelim Source # 
Instance details

Defined in Djot.AST

Ord OrderedListDelim Source # 
Instance details

Defined in Djot.AST

type Rep OrderedListDelim Source # 
Instance details

Defined in Djot.AST

type Rep OrderedListDelim = D1 ('MetaData "OrderedListDelim" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'False) (C1 ('MetaCons "RightPeriod" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RightParen" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LeftRightParen" 'PrefixI 'False) (U1 :: Type -> Type)))

data OrderedListStyle Source #

Instances

Instances details
Data OrderedListStyle Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: OrderedListStyle -> Constr #

dataTypeOf :: OrderedListStyle -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic OrderedListStyle Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep OrderedListStyle :: Type -> Type #

Show OrderedListStyle Source # 
Instance details

Defined in Djot.AST

Eq OrderedListStyle Source # 
Instance details

Defined in Djot.AST

Ord OrderedListStyle Source # 
Instance details

Defined in Djot.AST

type Rep OrderedListStyle Source # 
Instance details

Defined in Djot.AST

type Rep OrderedListStyle = D1 ('MetaData "OrderedListStyle" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'False) ((C1 ('MetaCons "Decimal" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LetterUpper" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "LetterLower" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "RomanUpper" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "RomanLower" 'PrefixI 'False) (U1 :: Type -> Type))))

data QuoteType Source #

Constructors

SingleQuotes 
DoubleQuotes 

Instances

Instances details
Data QuoteType Source # 
Instance details

Defined in Djot.AST

Methods

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

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

toConstr :: QuoteType -> Constr #

dataTypeOf :: QuoteType -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic QuoteType Source # 
Instance details

Defined in Djot.AST

Associated Types

type Rep QuoteType :: Type -> Type #

Show QuoteType Source # 
Instance details

Defined in Djot.AST

Eq QuoteType Source # 
Instance details

Defined in Djot.AST

Ord QuoteType Source # 
Instance details

Defined in Djot.AST

type Rep QuoteType Source # 
Instance details

Defined in Djot.AST

type Rep QuoteType = D1 ('MetaData "QuoteType" "Djot.AST" "djot-0.1.1.3-1y4lcqw4juKR1uN28jsLB" 'False) (C1 ('MetaCons "SingleQuotes" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DoubleQuotes" 'PrefixI 'False) (U1 :: Type -> Type))