Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
LText.Document
Documentation
Constructors
Document | |
Fields
|
data DocumentBody Source #
Constructors
RawText [Text] | |
Expression Expr |
Instances
Arbitrary DocumentBody Source # | |
Defined in LText.Document | |
Show DocumentBody Source # | |
Defined in LText.Document Methods showsPrec :: Int -> DocumentBody -> ShowS # show :: DocumentBody -> String # showList :: [DocumentBody] -> ShowS # | |
Eq DocumentBody Source # | |
Defined in LText.Document |
repackDocument :: [DocumentBody] -> [DocumentBody] Source #
parseDocument :: MonadParse m => Text -> m (Document, Maybe (Text, Text)) Source #
printDocument :: MonadPrettyPrint m => Maybe (Text, Text) -> Document -> m Text Source #
fromDocument :: Document -> Expr Source #
data PrintError Source #
Constructors
ConcatExprText Expr | |
NoExplicitDelimiters |
Instances
Exception PrintError Source # | |
Defined in LText.Document Methods toException :: PrintError -> SomeException # fromException :: SomeException -> Maybe PrintError # displayException :: PrintError -> String # | |
Generic PrintError Source # | |
Defined in LText.Document Associated Types type Rep PrintError :: Type -> Type # | |
Show PrintError Source # | |
Defined in LText.Document Methods showsPrec :: Int -> PrintError -> ShowS # show :: PrintError -> String # showList :: [PrintError] -> ShowS # | |
Eq PrintError Source # | |
Defined in LText.Document | |
type Rep PrintError Source # | |
Defined in LText.Document type Rep PrintError = D1 ('MetaData "PrintError" "LText.Document" "ltext-0.1.4-JDznKcg5WsGI6xkrdYowaU" 'False) (C1 ('MetaCons "ConcatExprText" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Expr)) :+: C1 ('MetaCons "NoExplicitDelimiters" 'PrefixI 'False) (U1 :: Type -> Type)) |
handlePrintError :: PrintError -> IO a Source #
toDocument :: MonadThrow m => Expr -> m Document Source #
hasConcatAbsLit :: Expr -> Bool Source #
data PrintabilityMode Source #
Constructors
InsideConcat | |
InsideExpr |