typst-0.3.2.1: Parsing and evaluating typst syntax.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Typst.Types

Documentation

data RE #

Instances

Instances details
Show RE # 
Instance details

Defined in Typst.Regex

Methods

showsPrec :: Int -> RE -> ShowS

show :: RE -> String

showList :: [RE] -> ShowS

Eq RE # 
Instance details

Defined in Typst.Regex

Methods

(==) :: RE -> RE -> Bool

(/=) :: RE -> RE -> Bool

Ord RE # 
Instance details

Defined in Typst.Regex

Methods

compare :: RE -> RE -> Ordering

(<) :: RE -> RE -> Bool

(<=) :: RE -> RE -> Bool

(>) :: RE -> RE -> Bool

(>=) :: RE -> RE -> Bool

max :: RE -> RE -> RE

min :: RE -> RE -> RE

FromVal RE # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m RE #

data Val #

Instances

Instances details
FromJSON Val # 
Instance details

Defined in Typst.Types

Show Val # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Val -> ShowS

show :: Val -> String

showList :: [Val] -> ShowS

Eq Val # 
Instance details

Defined in Typst.Types

Methods

(==) :: Val -> Val -> Bool

(/=) :: Val -> Val -> Bool

Ord Val # 
Instance details

Defined in Typst.Types

Methods

compare :: Val -> Val -> Ordering

(<) :: Val -> Val -> Bool

(<=) :: Val -> Val -> Bool

(>) :: Val -> Val -> Bool

(>=) :: Val -> Val -> Bool

max :: Val -> Val -> Val

min :: Val -> Val -> Val

FromValue Val # 
Instance details

Defined in Typst.Types

Compare Val # 
Instance details

Defined in Typst.Types

Methods

comp :: Val -> Val -> Maybe Ordering #

FromVal Val # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Val #

Multipliable Val # 
Instance details

Defined in Typst.Types

Methods

maybeTimes :: Val -> Val -> Maybe Val #

maybeDividedBy :: Val -> Val -> Maybe Val #

Negatable Val # 
Instance details

Defined in Typst.Types

Methods

maybeNegate :: Val -> Maybe Val #

Summable Val # 
Instance details

Defined in Typst.Types

Methods

maybePlus :: Val -> Val -> Maybe Val #

maybeMinus :: Val -> Val -> Maybe Val #

data ValType #

Instances

Instances details
Show ValType # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> ValType -> ShowS

show :: ValType -> String

showList :: [ValType] -> ShowS

Eq ValType # 
Instance details

Defined in Typst.Types

Methods

(==) :: ValType -> ValType -> Bool

(/=) :: ValType -> ValType -> Bool

hasType :: ValType -> Val -> Bool #

class FromVal a where #

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m a #

Instances

Instances details
FromVal Rational # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Rational #

FromVal Text # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Text #

FromVal RE # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m RE #

FromVal Counter # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Counter #

FromVal Direction # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Direction #

FromVal Function # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Function #

FromVal Length # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Length #

FromVal Selector # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Selector #

FromVal Val # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Val #

FromVal String # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m String #

FromVal Integer # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Integer #

FromVal Bool # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Bool #

FromVal Double # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Double #

FromVal Int # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Int #

FromVal (Seq Content) # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m (Seq Content) #

FromVal a => FromVal (Vector a) # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m (Vector a) #

FromVal a => FromVal (Maybe a) # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m (Maybe a) #

class Negatable a where #

Methods

maybeNegate :: a -> Maybe a #

Instances

Instances details
Negatable Val # 
Instance details

Defined in Typst.Types

Methods

maybeNegate :: Val -> Maybe Val #

class Negatable a => Summable a where #

Minimal complete definition

maybePlus

Methods

maybePlus :: a -> a -> Maybe a #

maybeMinus :: a -> a -> Maybe a #

Instances

Instances details
Summable Val # 
Instance details

Defined in Typst.Types

Methods

maybePlus :: Val -> Val -> Maybe Val #

maybeMinus :: Val -> Val -> Maybe Val #

class Multipliable a where #

Methods

maybeTimes :: a -> a -> Maybe a #

maybeDividedBy :: a -> a -> Maybe a #

Instances

Instances details
Multipliable Val # 
Instance details

Defined in Typst.Types

Methods

maybeTimes :: Val -> Val -> Maybe Val #

maybeDividedBy :: Val -> Val -> Maybe Val #

data Selector #

Instances

Instances details
Show Selector # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Selector -> ShowS

show :: Selector -> String

showList :: [Selector] -> ShowS

Eq Selector # 
Instance details

Defined in Typst.Types

Methods

(==) :: Selector -> Selector -> Bool

(/=) :: Selector -> Selector -> Bool

Ord Selector # 
Instance details

Defined in Typst.Types

Methods

compare :: Selector -> Selector -> Ordering

(<) :: Selector -> Selector -> Bool

(<=) :: Selector -> Selector -> Bool

(>) :: Selector -> Selector -> Bool

(>=) :: Selector -> Selector -> Bool

max :: Selector -> Selector -> Selector

min :: Selector -> Selector -> Selector

FromVal Selector # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Selector #

data Symbol #

Constructors

Symbol 

Fields

Instances

Instances details
Show Symbol # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Symbol -> ShowS

show :: Symbol -> String

showList :: [Symbol] -> ShowS

Eq Symbol # 
Instance details

Defined in Typst.Types

Methods

(==) :: Symbol -> Symbol -> Bool

(/=) :: Symbol -> Symbol -> Bool

data Content #

Constructors

Txt !Text 
Lab !Text 
Elt 

Fields

Instances

Instances details
IsString Content # 
Instance details

Defined in Typst.Types

Methods

fromString :: String -> Content

Show Content # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Content -> ShowS

show :: Content -> String

showList :: [Content] -> ShowS

Eq Content # 
Instance details

Defined in Typst.Types

Methods

(==) :: Content -> Content -> Bool

(/=) :: Content -> Content -> Bool

Ord Content # 
Instance details

Defined in Typst.Types

Methods

compare :: Content -> Content -> Ordering

(<) :: Content -> Content -> Bool

(<=) :: Content -> Content -> Bool

(>) :: Content -> Content -> Bool

(>=) :: Content -> Content -> Bool

max :: Content -> Content -> Content

min :: Content -> Content -> Content

FromVal (Seq Content) # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m (Seq Content) #

newtype Function #

Constructors

Function (forall m. Monad m => Arguments -> MP m Val) 

Instances

Instances details
Show Function # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Function -> ShowS

show :: Function -> String

showList :: [Function] -> ShowS

Eq Function # 
Instance details

Defined in Typst.Types

Methods

(==) :: Function -> Function -> Bool

(/=) :: Function -> Function -> Bool

FromVal Function # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Function #

data Arguments #

Constructors

Arguments 

Instances

Instances details
Monoid Arguments # 
Instance details

Defined in Typst.Types

Semigroup Arguments # 
Instance details

Defined in Typst.Types

Methods

(<>) :: Arguments -> Arguments -> Arguments #

sconcat :: NonEmpty Arguments -> Arguments

stimes :: Integral b => b -> Arguments -> Arguments

Show Arguments # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Arguments -> ShowS

show :: Arguments -> String

showList :: [Arguments] -> ShowS

Eq Arguments # 
Instance details

Defined in Typst.Types

Methods

(==) :: Arguments -> Arguments -> Bool

(/=) :: Arguments -> Arguments -> Bool

getPositionalArg :: (MonadFail m, MonadPlus m, FromVal a) => Int -> Arguments -> m a #

getNamedArg :: (MonadFail m, MonadPlus m, FromVal a) => Identifier -> Arguments -> m a #

class Compare a where #

Methods

comp :: a -> a -> Maybe Ordering #

Instances

Instances details
Compare Val # 
Instance details

Defined in Typst.Types

Methods

comp :: Val -> Val -> Maybe Ordering #

type MP m = ParsecT [Markup] (EvalState m) m #

data Scope #

Constructors

FunctionScope 
BlockScope 

Instances

Instances details
Show Scope # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Scope -> ShowS

show :: Scope -> String

showList :: [Scope] -> ShowS

Eq Scope # 
Instance details

Defined in Typst.Types

Methods

(==) :: Scope -> Scope -> Bool

(/=) :: Scope -> Scope -> Bool

Ord Scope # 
Instance details

Defined in Typst.Types

Methods

compare :: Scope -> Scope -> Ordering

(<) :: Scope -> Scope -> Bool

(<=) :: Scope -> Scope -> Bool

(>) :: Scope -> Scope -> Bool

(>=) :: Scope -> Scope -> Bool

max :: Scope -> Scope -> Scope

min :: Scope -> Scope -> Scope

data FlowDirective #

Instances

Instances details
Show FlowDirective # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> FlowDirective -> ShowS

show :: FlowDirective -> String

showList :: [FlowDirective] -> ShowS

Eq FlowDirective # 
Instance details

Defined in Typst.Types

Ord FlowDirective # 
Instance details

Defined in Typst.Types

data Operations m #

Constructors

Operations 

Fields

data XdgDirectory #

Instances

Instances details
Bounded XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Enum XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Read XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

readsPrec :: Int -> ReadS XdgDirectory

readList :: ReadS [XdgDirectory]

readPrec :: ReadPrec XdgDirectory

readListPrec :: ReadPrec [XdgDirectory]

Show XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

showsPrec :: Int -> XdgDirectory -> ShowS

show :: XdgDirectory -> String

showList :: [XdgDirectory] -> ShowS

Eq XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

Methods

(==) :: XdgDirectory -> XdgDirectory -> Bool

(/=) :: XdgDirectory -> XdgDirectory -> Bool

Ord XdgDirectory 
Instance details

Defined in System.Directory.Internal.Common

data ShowRule #

Constructors

ShowRule Selector (forall m. Monad m => Content -> MP m (Seq Content)) 

Instances

Instances details
Show ShowRule # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> ShowRule -> ShowS

show :: ShowRule -> String

showList :: [ShowRule] -> ShowS

data Counter #

Instances

Instances details
Show Counter # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Counter -> ShowS

show :: Counter -> String

showList :: [Counter] -> ShowS

Eq Counter # 
Instance details

Defined in Typst.Types

Methods

(==) :: Counter -> Counter -> Bool

(/=) :: Counter -> Counter -> Bool

Ord Counter # 
Instance details

Defined in Typst.Types

Methods

compare :: Counter -> Counter -> Ordering

(<) :: Counter -> Counter -> Bool

(<=) :: Counter -> Counter -> Bool

(>) :: Counter -> Counter -> Bool

(>=) :: Counter -> Counter -> Bool

max :: Counter -> Counter -> Counter

min :: Counter -> Counter -> Counter

FromVal Counter # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Counter #

data LUnit #

Constructors

LEm 
LPt 
LIn 
LCm 
LMm 

Instances

Instances details
Show LUnit # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> LUnit -> ShowS

show :: LUnit -> String

showList :: [LUnit] -> ShowS

Eq LUnit # 
Instance details

Defined in Typst.Types

Methods

(==) :: LUnit -> LUnit -> Bool

(/=) :: LUnit -> LUnit -> Bool

data Length #

Constructors

LExact Double LUnit 
LRatio !Rational 
LSum Length Length 

Instances

Instances details
Monoid Length # 
Instance details

Defined in Typst.Types

Semigroup Length # 
Instance details

Defined in Typst.Types

Methods

(<>) :: Length -> Length -> Length #

sconcat :: NonEmpty Length -> Length

stimes :: Integral b => b -> Length -> Length

Show Length # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Length -> ShowS

show :: Length -> String

showList :: [Length] -> ShowS

Eq Length # 
Instance details

Defined in Typst.Types

Methods

(==) :: Length -> Length -> Bool

(/=) :: Length -> Length -> Bool

FromVal Length # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Length #

renderLength :: Bool -> Length -> Text #

data Horiz #

Instances

Instances details
Show Horiz # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Horiz -> ShowS

show :: Horiz -> String

showList :: [Horiz] -> ShowS

Eq Horiz # 
Instance details

Defined in Typst.Types

Methods

(==) :: Horiz -> Horiz -> Bool

(/=) :: Horiz -> Horiz -> Bool

Ord Horiz # 
Instance details

Defined in Typst.Types

Methods

compare :: Horiz -> Horiz -> Ordering

(<) :: Horiz -> Horiz -> Bool

(<=) :: Horiz -> Horiz -> Bool

(>) :: Horiz -> Horiz -> Bool

(>=) :: Horiz -> Horiz -> Bool

max :: Horiz -> Horiz -> Horiz

min :: Horiz -> Horiz -> Horiz

data Vert #

Instances

Instances details
Show Vert # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Vert -> ShowS

show :: Vert -> String

showList :: [Vert] -> ShowS

Eq Vert # 
Instance details

Defined in Typst.Types

Methods

(==) :: Vert -> Vert -> Bool

(/=) :: Vert -> Vert -> Bool

Ord Vert # 
Instance details

Defined in Typst.Types

Methods

compare :: Vert -> Vert -> Ordering

(<) :: Vert -> Vert -> Bool

(<=) :: Vert -> Vert -> Bool

(>) :: Vert -> Vert -> Bool

(>=) :: Vert -> Vert -> Bool

max :: Vert -> Vert -> Vert

min :: Vert -> Vert -> Vert

data Color #

Constructors

RGB Rational Rational Rational Rational 
CMYK Rational Rational Rational Rational 
Luma Rational 

Instances

Instances details
Show Color # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Color -> ShowS

show :: Color -> String

showList :: [Color] -> ShowS

Eq Color # 
Instance details

Defined in Typst.Types

Methods

(==) :: Color -> Color -> Bool

(/=) :: Color -> Color -> Bool

Ord Color # 
Instance details

Defined in Typst.Types

Methods

compare :: Color -> Color -> Ordering

(<) :: Color -> Color -> Bool

(<=) :: Color -> Color -> Bool

(>) :: Color -> Color -> Bool

(>=) :: Color -> Color -> Bool

max :: Color -> Color -> Color

min :: Color -> Color -> Color

data Direction #

Constructors

Ltr 
Rtl 
Ttb 
Btt 

Instances

Instances details
Show Direction # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Direction -> ShowS

show :: Direction -> String

showList :: [Direction] -> ShowS

Eq Direction # 
Instance details

Defined in Typst.Types

Methods

(==) :: Direction -> Direction -> Bool

(/=) :: Direction -> Direction -> Bool

Ord Direction # 
Instance details

Defined in Typst.Types

Methods

compare :: Direction -> Direction -> Ordering

(<) :: Direction -> Direction -> Bool

(<=) :: Direction -> Direction -> Bool

(>) :: Direction -> Direction -> Bool

(>=) :: Direction -> Direction -> Bool

max :: Direction -> Direction -> Direction

min :: Direction -> Direction -> Direction

FromVal Direction # 
Instance details

Defined in Typst.Types

Methods

fromVal :: (MonadPlus m, MonadFail m) => Val -> m Direction #

newtype Identifier #

Constructors

Identifier Text 

Instances

Instances details
Data Identifier # 
Instance details

Defined in Typst.Syntax

Methods

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

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

toConstr :: Identifier -> Constr

dataTypeOf :: Identifier -> DataType

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

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

gmapT :: (forall b. Data b => b -> b) -> Identifier -> Identifier

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

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

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

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

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

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

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

IsString Identifier # 
Instance details

Defined in Typst.Syntax

Methods

fromString :: String -> Identifier

Monoid Identifier # 
Instance details

Defined in Typst.Syntax

Semigroup Identifier # 
Instance details

Defined in Typst.Syntax

Methods

(<>) :: Identifier -> Identifier -> Identifier #

sconcat :: NonEmpty Identifier -> Identifier

stimes :: Integral b => b -> Identifier -> Identifier

Show Identifier # 
Instance details

Defined in Typst.Syntax

Methods

showsPrec :: Int -> Identifier -> ShowS

show :: Identifier -> String

showList :: [Identifier] -> ShowS

Eq Identifier # 
Instance details

Defined in Typst.Syntax

Methods

(==) :: Identifier -> Identifier -> Bool

(/=) :: Identifier -> Identifier -> Bool

Ord Identifier # 
Instance details

Defined in Typst.Syntax

lookupIdentifier :: Monad m => Identifier -> MP m Val #

joinVals :: MonadFail m => Val -> Val -> m Val #

prettyVal :: Val -> Doc #

repr :: Val -> Text #

data Attempt a #

Constructors

Success a 
Failure String 

Instances

Instances details
MonadFail Attempt # 
Instance details

Defined in Typst.Types

Methods

fail :: String -> Attempt a

Applicative Attempt # 
Instance details

Defined in Typst.Types

Methods

pure :: a -> Attempt a #

(<*>) :: Attempt (a -> b) -> Attempt a -> Attempt b

liftA2 :: (a -> b -> c) -> Attempt a -> Attempt b -> Attempt c

(*>) :: Attempt a -> Attempt b -> Attempt b

(<*) :: Attempt a -> Attempt b -> Attempt a

Functor Attempt # 
Instance details

Defined in Typst.Types

Methods

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

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

Monad Attempt # 
Instance details

Defined in Typst.Types

Methods

(>>=) :: Attempt a -> (a -> Attempt b) -> Attempt b

(>>) :: Attempt a -> Attempt b -> Attempt b

return :: a -> Attempt a #

Show a => Show (Attempt a) # 
Instance details

Defined in Typst.Types

Methods

showsPrec :: Int -> Attempt a -> ShowS

show :: Attempt a -> String

showList :: [Attempt a] -> ShowS

Eq a => Eq (Attempt a) # 
Instance details

Defined in Typst.Types

Methods

(==) :: Attempt a -> Attempt a -> Bool

(/=) :: Attempt a -> Attempt a -> Bool

Ord a => Ord (Attempt a) # 
Instance details

Defined in Typst.Types

Methods

compare :: Attempt a -> Attempt a -> Ordering

(<) :: Attempt a -> Attempt a -> Bool

(<=) :: Attempt a -> Attempt a -> Bool

(>) :: Attempt a -> Attempt a -> Bool

(>=) :: Attempt a -> Attempt a -> Bool

max :: Attempt a -> Attempt a -> Attempt a

min :: Attempt a -> Attempt a -> Attempt a