twiml-0.1.0.0: TwiML library for Haskell

Safe HaskellNone

Text.XML.Twiml.Verbs.Sms

Contents

Synopsis

<Sms>

This example

module Example where

import Control.Lens
import Text.XML.Twiml

example
  = respond
  . (sms "The king stay the king." <&> to   .~ "+14105551234"
                                   <&> from .~ "+14105556789")
  $ end

produces the following TwiML response:

<?xml version="1.0" encoding="UTF-8"?>
<Response>
  <Sms from="+14105551234" to="+14105556789">The king stay the king.</Sms>
</Response>

data Sms p Source

Instances

:/~ p Gather' => Twiml p (Sms p) 
HasMethod (Sms p) 
HasAction (Sms p) 

Constructors

sms :: (Twiml p t, p :/~ Gather') => String -> t -> Sms pSource

sms' :: (Twiml p t, p :/~ Gather') => SmsAttributes -> String -> t -> Sms pSource

Attributes

Lenses