twiml-0.1.0.0: TwiML library for Haskell

Safe HaskellNone

Text.XML.Twiml.Verbs.Reject

Contents

Synopsis

<Reject>

This example

module Example where

import Control.Lens
import Text.XML.Twiml

example
  = respond
  . (reject <&> reason .~ Busy)
  $ end

produces the following TwiML response:

<?xml version="1.0" encoding="UTF-8"?>
<Response>
  <Reject reason="busy" />
</Response>

data Reject p Source

Instances

:/~ p Gather' => Twiml p (Reject p) 

Constructors

Attributes

Lenses