| Safe Haskell | Safe-Inferred |
|---|---|
| Language | Haskell2010 |
Typst.Types
Documentation
Constructors
class FromVal a where Source #
Instances
| FromVal Rational Source # | |
| FromVal Text Source # | |
| FromVal RE Source # | |
| FromVal Counter Source # | |
| FromVal Direction Source # | |
| FromVal Function Source # | |
| FromVal Length Source # | |
| FromVal Selector Source # | |
| FromVal Val Source # | |
| FromVal String Source # | |
| FromVal Integer Source # | |
| FromVal Bool Source # | |
| FromVal Double Source # | |
| FromVal Int Source # | |
| FromVal (Seq Content) Source # | |
| FromVal a => FromVal (Vector a) Source # | |
| FromVal a => FromVal (Maybe a) Source # | |
class Multipliable a where Source #
Instances
| Multipliable Val Source # | |
Defined in Typst.Types | |
Constructors
Constructors
| Symbol | |
Fields
| |
Constructors
| Txt !Text | |
| Lab !Text | |
| Elt | |
Fields
| |
Constructors
| Arguments | |
Fields
| |
getNamedArg :: (MonadFail m, MonadPlus m, FromVal a) => Identifier -> Arguments -> m a Source #
Constructors
| FunctionScope | |
| BlockScope |
data FlowDirective Source #
Constructors
| FlowNormal | |
| FlowBreak | |
| FlowContinue | |
| FlowReturn Bool |
Instances
| Show FlowDirective Source # | |
Defined in Typst.Types Methods showsPrec :: Int -> FlowDirective -> ShowS # show :: FlowDirective -> String # showList :: [FlowDirective] -> ShowS # | |
| Eq FlowDirective Source # | |
Defined in Typst.Types Methods (==) :: FlowDirective -> FlowDirective -> Bool # (/=) :: FlowDirective -> FlowDirective -> Bool # | |
| Ord FlowDirective Source # | |
Defined in Typst.Types Methods compare :: FlowDirective -> FlowDirective -> Ordering # (<) :: FlowDirective -> FlowDirective -> Bool # (<=) :: FlowDirective -> FlowDirective -> Bool # (>) :: FlowDirective -> FlowDirective -> Bool # (>=) :: FlowDirective -> FlowDirective -> Bool # max :: FlowDirective -> FlowDirective -> FlowDirective # min :: FlowDirective -> FlowDirective -> FlowDirective # | |
Constructors
| EvalState | |
Fields
| |
emptyEvalState :: EvalState m Source #
Constructors
| CounterCustom !Text | |
| CounterLabel !Text | |
| CounterSelector !Selector | |
| CounterPage |
Constructors
| HorizStart | |
| HorizEnd | |
| HorizLeft | |
| HorizCenter | |
| HorizRight |
Constructors
| VertTop | |
| VertHorizon | |
| VertBottom |
Constructors
| RGB Rational Rational Rational Rational | |
| CMYK Rational Rational Rational Rational | |
| Luma Rational |
Instances
| Show Direction Source # | |
| Eq Direction Source # | |
| Ord Direction Source # | |
| FromVal Direction Source # | |
newtype Identifier Source #
Constructors
| Identifier Text |
Instances
lookupIdentifier :: Monad m => Identifier -> MP m Val Source #
Instances
| MonadFail Attempt Source # | |
Defined in Typst.Types | |
| Applicative Attempt Source # | |
| Functor Attempt Source # | |
| Monad Attempt Source # | |
| Show a => Show (Attempt a) Source # | |
| Eq a => Eq (Attempt a) Source # | |
| Ord a => Ord (Attempt a) Source # | |