blaze -package:plotlyhs
Not on Stackage, so not searched.
None
Write some
Html as response
BlazeMarkup is a markup combinator library. It provides a way to embed
markup languages like HTML and SVG in Haskell in an efficient and
convenient way, with a light-weight syntax.
To use the library, one needs to import a set of combinators. For
example, you can use HTML 4 Strict from BlazeHtml package.
{-# LANGUAGE OverloadedStrings #-}
import Prelude hiding (head, id, div)
import Text.Blaze.Html4.Strict hiding (map)
import Text.Blaze.Html4.Strict.Attributes hiding (title)
To render the page later on, you need a so called Renderer. The
recommended renderer is an UTF-8 renderer which produces a lazy
bytestring.
import Text.Blaze.Renderer.Utf8 (renderMarkup)
Now, you can describe pages using the imported combinators.
page1 :: Markup
page1 = html $ do
head $ do
title "Introduction page."
link ! rel "stylesheet" ! type_ "text/css" ! href "screen.css"
body $ do
div ! id "header" $ "Syntax"
p "This is an example of BlazeMarkup syntax."
ul $ mapM_ (li . toMarkup . show) [1, 2, 3]
The resulting HTML can now be extracted using:
renderMarkup page1
An
HTML empty data type with
MimeRender instances for
blaze-html's
ToMarkup class and
Html datatype.
You should only need to import this module for its instances and the
HTML datatype:
>>> type Eg = Get '[HTML] a
Will then check that
a has a
ToMarkup instance, or is
Html.
HTML writing helpers using blaze-html.
A blazingly fast HTML combinator library for Haskell
A blazingly fast HTML combinator library for the Haskell programming
language. The Text.Blaze module is a good starting point, as well as
this tutorial:
http://jaspervdj.be/blaze/tutorial.html.
Efficient buffered output.
This library allows to efficiently serialize Haskell values to lazy
bytestrings with a large average chunk size. The large average chunk
size allows to make good use of cache prefetching in later processing
steps (e.g. compression) and reduces the system call overhead when
writing the resulting lazy bytestring to a file or sending it over the
network.
This library was inspired by the module Data.Binary.Builder provided
by the binary package. It was originally developed with the specific
needs of the blaze-html package in mind. Since then it has been
restructured to serve as a drop-in replacement for
Data.Binary.Builder, which it improves upon both in speed as well as
expressivity.
A blazingly fast markup combinator library for Haskell
Core modules of a blazingly fast markup combinator library for the
Haskell programming language. The Text.Blaze module is a good starting
point, as well as this tutorial:
http://jaspervdj.be/blaze/tutorial.html.
Fast rendering of common datatypes
A library for efficiently rendering Haskell datatypes to bytestrings.
Note: if you use GHCi or Template Haskell, please see the
README file for important details about building this
package, and other packages that depend on it:
https://github.com/swamp-agr/blaze-textual#readme
SVG combinator library
A blazingly fast SVG combinator library for the Haskell programming
language. The
Text.Blaze.SVG module is a good starting point.
Other documentation:
Not on Stackage, so not searched.
Convert streams of builders to streams of bytestrings. (deprecated)
Not on Stackage, so not searched.
Enumeratees for the incremental conversion of builders to bytestrings.
blaze-html backend for colonnade
This library provides a backend for using blaze-html with colonnade.
It generates standard HTML tables with `
table`, `
tbody`,
`
thead`, `
tr`, `
th`, and `
td`.
Not on Stackage, so not searched.
tiny library for encoding json
Blaze helper functions for bootstrap pages
Not on Stackage, so not searched.
Tool to convert HTML to BlazeHtml code.
Not on Stackage, so not searched.
Some contributions to add handy things to blaze html.
Not on Stackage, so not searched.
A hexpat backend for blaze-html.
Not on Stackage, so not searched.
A truncator for blaze-html
Not on Stackage, so not searched.
Blaze integration of the htmx library
Not on Stackage, so not searched.
create svg by Haskell
Not on Stackage, so not searched.
Fast rendering of common datatypes (deprecated)
Not on Stackage, so not searched.
...