twiml-0.1.0.0: TwiML library for Haskell

Safe HaskellNone

Text.XML.Twiml.Verbs.Redirect

Contents

Synopsis

<Redirect>

This example

module Example where

import Control.Lens
import Data.Maybe (fromJust)
import Text.XML.Twiml

example
  = respond
  . (redirect (fromJust $ parseURL "http://pigeons.com/twiml.xml") <&> method .~ POST)
  $ end

produces the following TwiML response:

<?xml version="1.0" encoding="UTF-8"?>
<Response>
  <Redirect method="POST">http://pigeons.com/twiml.xml</Redirect>
</Response>

data Redirect p Source

Instances

Constructors

Attributes

Lenses