twiml-0.1.0.0: TwiML library for Haskell

Safe HaskellNone

Text.XML.Twiml.Verbs.Record

Contents

Synopsis

<Record>

This example

module Example where

import Control.Lens
import Text.XML.Twiml

example
  = respond
  . (record <&> timeout    .~ 10
            <&> transcribe .~ True)
  $ end

produces the following TwiML response:

<?xml version="1.0" encoding="UTF-8"?>
<Response>
  <Record timeout="10" transcribe="true" />
</Response>

Constructors

record :: (Twiml p t, p :/~ Gather') => t -> Record pSource

Attributes

Lenses