twiml-0.1.0.0: TwiML library for Haskell

Safe HaskellNone

Text.XML.Twiml.Verbs.Gather

Contents

Synopsis

<Gather>

This example

module Example where

import Control.Lens
import Text.XML.Twiml

example
  = respond
  . (gather <&> timeout     .~ 10
            <&> finishOnKey .~ KStar
      $ say "Please enter your pin number and then press star."
      $ end)
  $ end

produces the following TwiML response:

<?xml version="1.0" encoding="UTF-8"?>
<Response>
  <Gather timeout="10" finishOnKey="*">
    <Say>Please enter your pin number and then press star.</Say>
  </Gather>
</Response>

data Gather p Source

Instances

:/~ p Gather' => Twiml p (Gather p) 
Twiml p t => HasFinishOnKey (t -> Gather p) 
Twiml p t => HasTimeout (t -> Gather p) 
Twiml p t => HasMethod (t -> Gather p) 
HasAction (t -> Gather p) 

Constructors

gather :: (Twiml Gather' n, Twiml p t, p :/~ Gather') => n -> t -> Gather pSource

Attributes

Lenses