twiml-0.2.0.0: TwiML library for Haskell

Copyright(C) 2014-15 Mark Andrus Roberts
LicenseBSD-style (see the file LICENSE)
MaintainerMark Andrus Roberts <markandrusroberts@gmail.com>
Stabilityprovisional
Safe HaskellNone
LanguageHaskell98

Text.XML.Twiml.Verbs.Record

Description

The example in this file assumes

{-# LANGUAGE RebindableSyntax #-}
{-# LANGUAGE RecordWildCards #-}

import Prelude
import Text.XML.Twiml
import qualified Text.XML.Twiml.Syntax as Twiml

For more information, refer to Twilio's TwiML Reference for <Record>.

Synopsis

Documentation

record :: IsTwimlLike f Record => RecordAttributes -> TwimlLike f Record () Source

Example:

example :: VoiceTwiml
example =
  response $ do
    say "Please leave a message at the beep. Press the star key when finished." def
    record $ def & action      .~ parseURL "http://foo.edu/handleRecording.php"
                 & method      .~ Just GET
                 & maxLength   .~ Just 20
                 & finishOnKey .~ Just KStar
    say "I did not receive a recording" def
    end
  where Twiml.Syntax{..} = def
>>> show example
<?xml version="1.0" encoding="UTF-8"?>
<Response>
  <Say>Please leave a message at the beep. Press the star key when finished.</Say>
  <Record action="http://foo.edu/handleRecording.php" method="GET" finishOnKey="*" maxLength="20" />
  <Say>I did not receive a recording</Say>
</Response>

data RecordF i a Source

Instances