front-0.0.0.2: A reactive frontend web framework

Safe HaskellNone
LanguageHaskell2010

Text.Blaze.Front

Contents

Description

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
Synopsis

Important types.

type Markup e = MarkupM e () Source #

Simplification of the MarkupM datatype.

data Tag Source #

Type for an HTML tag. This can be seen as an internal string type used by BlazeMarkup.

Instances
IsString Tag Source # 
Instance details

Defined in Text.Blaze.Front.Internal

Methods

fromString :: String -> Tag #

data Attribute ev Source #

Type for an attribute.

Instances
Semigroup (Attribute ev) Source # 
Instance details

Defined in Text.Blaze.Front.Internal

Methods

(<>) :: Attribute ev -> Attribute ev -> Attribute ev #

sconcat :: NonEmpty (Attribute ev) -> Attribute ev #

stimes :: Integral b => b -> Attribute ev -> Attribute ev #

Monoid (Attribute ev) Source # 
Instance details

Defined in Text.Blaze.Front.Internal

Methods

mempty :: Attribute ev #

mappend :: Attribute ev -> Attribute ev -> Attribute ev #

mconcat :: [Attribute ev] -> Attribute ev #

Creating attributes.

dataAttribute Source #

Arguments

:: Tag

Name of the attribute.

-> AttributeValue

Value for the attribute.

-> Attribute ev

Resulting HTML attribute.

From HTML 5 onwards, the user is able to specify custom data attributes.

An example:

<p data-foo="bar">Hello.</p>

We support this in BlazeMarkup using this funcion. The above fragment could be described using BlazeMarkup with:

p ! dataAttribute "foo" "bar" $ "Hello."

customAttribute Source #

Arguments

:: Tag

Name of the attribute

-> AttributeValue

Value for the attribute

-> Attribute ev

Resulting HTML attribtue

Create a custom attribute. This is not specified in the HTML spec, but some JavaScript libraries rely on it.

An example:

<select dojoType="select">foo</select>

Can be produced using:

select ! customAttribute "dojoType" "select" $ "foo"

Converting values to Markup.

class ToMarkup a where Source #

Class allowing us to use a single function for Markup values

Minimal complete definition

toMarkup

Methods

toMarkup :: a -> Markup ev Source #

Convert a value to Markup.

preEscapedToMarkup :: a -> Markup ev Source #

Convert a value to Markup without escaping

Instances
ToMarkup Bool Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Char Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Double Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Float Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Int Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Int32 Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Int64 Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Integer Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Word Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Word32 Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Word64 Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup String Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Text Source # 
Instance details

Defined in Text.Blaze.Front

ToMarkup Text Source # 
Instance details

Defined in Text.Blaze.Front

unsafeByteString Source #

Arguments

:: ByteString

Value to insert.

-> Markup ev

Resulting HTML fragment.

Insert a ChoiceString. This is an unsafe operation:

  • The ChoiceString could have the wrong encoding.
  • The ChoiceString might contain illegal HTML characters (no escaping is done).

unsafeLazyByteString Source #

Arguments

:: ByteString

Value to insert

-> Markup ev

Resulting HTML fragment

Insert a lazy ByteString. See unsafeByteString for reasons why this is an unsafe operation.

Creating tags.

textTag Source #

Arguments

:: Text

Text to create a tag from

-> Tag

Resulting tag

Create a Tag from some ChoiceString.

stringTag Source #

Arguments

:: String

String to create a tag from

-> Tag

Resulting tag

Create a Tag from a ChoiceString.

Converting values to attribute values.

class ToValue a where Source #

Class allowing us to use a single function for attribute values

Minimal complete definition

toValue

Methods

toValue :: a -> AttributeValue Source #

Convert a value to an attribute value

preEscapedToValue :: a -> AttributeValue Source #

Convert a value to an attribute value without escaping

Instances
ToValue Bool Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Char Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Double Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Float Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Int Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Int32 Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Int64 Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Integer Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Word Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Word32 Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Word64 Source # 
Instance details

Defined in Text.Blaze.Front

ToValue String Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Text Source # 
Instance details

Defined in Text.Blaze.Front

ToValue Text Source # 
Instance details

Defined in Text.Blaze.Front

ToValue AttributeValue Source # 
Instance details

Defined in Text.Blaze.Front

unsafeByteStringValue Source #

Arguments

:: ByteString

ByteString value

-> AttributeValue

Resulting attribute value

Create an attribute value from a ChoiceString. See unsafeByteString for reasons why this might not be a good idea.

unsafeLazyByteStringValue Source #

Arguments

:: ByteString

ByteString value

-> AttributeValue

Resulting attribute value

Create an attribute value from a lazy ByteString. See unsafeByteString for reasons why this might not be a good idea.

Setting attributes

(!) :: Attributable h ev => h -> Attribute ev -> h Source #

Apply an attribute to an element.

Example:

img ! src "foo.png"

Result:

<img src="foo.png" />

This can be used on nested elements as well.

Example:

p ! style "float: right" $ "Hello!"

Result:

<p style="float: right">Hello!</p>

(!?) :: Attributable h ev => h -> (Bool, Attribute ev) -> h Source #

Shorthand for setting an attribute depending on a conditional.

Example:

p !? (isBig, A.class "big") $ "Hello"

Gives the same result as:

(if isBig then p ! A.class "big" else p) "Hello"

Modifiying Markup trees

contents :: MarkupM ev a -> MarkupM ev' b Source #

Take only the text content of an HTML tree.

contents $ do
    p ! $ "Hello "
    p ! $ "Word!"

Result:

Hello World!