| Safe Haskell | None |
|---|
Text.XML.Twiml.Verbs.Sms
Contents
- data Sms p
- sms :: (Twiml p t, p :/~ Gather') => String -> t -> Sms p
- sms' :: (Twiml p t, p :/~ Gather') => SmsAttributes -> String -> t -> Sms p
- data SmsAttributes = SmsAttributes {}
- defaultSmsAttributes :: SmsAttributes
- smsAttributes :: Lens' (Sms p) SmsAttributes
- to :: Lens (Sms p) (Sms p) (Maybe String) String
- from :: Lens (Sms p) (Sms p) (Maybe String) String
- statusCallback :: Lens (Sms p) (Sms p) (Maybe URL) URL
- action :: HasAction t => Lens t t (Maybe URL) URL
- method :: HasMethod t => Lens t t (Maybe Method) Method
<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>
Constructors
Attributes
data SmsAttributes Source
Lenses
smsAttributes :: Lens' (Sms p) SmsAttributesSource