| Copyright | (C) 2018 Mark Andrus Roberts |
|---|---|
| License | BSD-style (see the file LICENSE) |
| Maintainer | Mark Andrus Roberts <markandrusroberts@gmail.com> |
| Stability | provisional |
| Safe Haskell | None |
| Language | Haskell98 |
Text.XML.Twiml.Verbs.End
Description
The example in this file assumes
{-# LANGUAGE RebindableSyntax #-}
{-# LANGUAGE RecordWildCards #-}
import Prelude
import Data.Default
import Text.XML.Twiml
import qualified Text.XML.Twiml.Syntax as Twiml
End is not actually a TwiML verb; it is used for terminating TwiML.
Documentation
end :: IsTwimlLike f End => TwimlLike f End a Source #
Terminate a TwiML response, or construct an empty TwiML response. Example:
>>>:{let example :: VoiceTwiml example = voiceResponse $ do end where Twiml.Syntax{..} = def :}
>>>putStr $ show example<?xml version="1.0" encoding="UTF-8"?> <Response />