twiml-0.1.0.0: TwiML library for Haskell

Safe HaskellNone

Text.XML.Twiml.Verbs.Dial

Contents

Synopsis

<Dial>

This example

module Example where

import Control.Lens
import Text.XML.Twiml

example
  = respond
  . (dial (Right "415-123-4567") <&> timeout .~ 10
                                 <&> record  .~ True)
  $ end

produces the following TwiML response:

<?xml version="1.0" encoding="UTF-8"?>
<Response>
  <Dial timeout="10" record="true">415-123-4567</Dial>
</Response>

data Dial p Source

Instances

Constructors

Attributes

Lenses

Dial Nouns

<Number>

<Sip>

<Client>

<Conference>

<Queue>