{-# LANGUAGE BangPatterns #-}
{-# LANGUAGE CPP #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE MagicHash #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE UnboxedTuples #-}
module Z.Data.Builder
(
Builder
, append
, buildBytes
, buildBytesWith
, buildBytesList
, buildBytesListWith
, buildAndRun
, buildAndRunWith
, bytes
, ensureN
, atMost
, writeN
, encodePrim
, encodePrimLE
, encodePrimBE
, stringModifiedUTF8, charModifiedUTF8, stringUTF8, charUTF8, string7, char7, string8, char8, text
, IFormat(..)
, defaultIFormat
, Padding(..)
, int
, intWith
, integer
, hex, heX
, FFormat(..)
, double
, doubleWith
, float
, floatWith
, scientific
, scientificWith
, paren, curly, square, angle, quotes, squotes, colon, comma, intercalateVec, intercalateList
) where
import Z.Data.Builder.Base
import Z.Data.Builder.Numeric