| Safe Haskell | None |
|---|
Text.XML.Twiml.Types
Contents
- type Natural = Int
- data URL
- parseURL :: String -> Maybe URL
- data Method
- data Key
- data Digit
- data SayAttributes = SayAttributes {}
- defaultSayAttributes :: SayAttributes
- data Voice
- data Lang
- data LangAlice
- data PlayAttributes = PlayAttributes {}
- defaultPlayAttributes :: PlayAttributes
- data GatherAttributes = GatherAttributes {}
- defaultGatherAttributes :: GatherAttributes
- data Gather'
- data RecordAttributes = RecordAttributes {}
- defaultRecordAttributes :: RecordAttributes
- data SmsAttributes = SmsAttributes {}
- defaultSmsAttributes :: SmsAttributes
- data DialAttributes = DialAttributes {}
- defaultDialAttributes :: DialAttributes
- data DialNoun
- data NumberAttributes = NumberAttributes {
- numberSendDigits :: Maybe [Digit]
- numberURL :: Maybe URL
- numberMethod :: Maybe Method
- defaultNumberAttributes :: NumberAttributes
- data SipAttributes = SipAttributes {}
- defaultSipAttributes :: SipAttributes
- data Transport
- data ClientAttributes = ClientAttributes {}
- defaultClientAttributes :: ClientAttributes
- data ConferenceAttributes = ConferenceAttributes {}
- defaultConferenceAttributes :: ConferenceAttributes
- data ConferenceBeep
- data QueueAttributes = QueueAttributes {}
- defaultQueueAttributes :: QueueAttributes
- data EnqueueAttributes = EnqueueAttributes {}
- defaultEnqueueAttributes :: EnqueueAttributes
- data RedirectAttributes = RedirectAttributes {}
- defaultRedirectAttributes :: RedirectAttributes
- data RejectAttributes = RejectAttributes {}
- defaultRejectAttributes :: RejectAttributes
- data Reason
- data PauseAttributes = PauseAttributes {}
- defaultPauseAttributes :: PauseAttributes
- class HasLoop t where
- class HasAction t where
- class HasMethod t where
- class HasTimeout t where
- class HasFinishOnKey t where
- finishOnKey :: Lens t t (Maybe Key) Key
- type Lens s t a b = forall f. Functor f => (a -> f b) -> s -> f t
- type Lens' s a = Lens s s a a
- lens :: (s -> a) -> (s -> b -> t) -> Lens s t a b
- (^.) :: s -> Getting a s a -> a
- over :: Profunctor p => Setting p s t a b -> p a b -> s -> t
- to' :: (s -> a) -> IndexPreservingGetter s a
- newtype Fix f = Fix {}
- class Functor (Base t) => Foldable t where
- type family Base t :: * -> *
- class TypeEq x y No => x :/~ y
- data Yes
- data No
Documentation
The ‘digits’ attribute lets you play DTMF tones during a call. See https://www.twilio.com/docs/api/twiml/play#attributes-digits.
<Say>
data SayAttributes Source
Voices supported by <Say>. See
https://www.twilio.com/docs/api/twiml/say#attributes-voice.
Languages spoken by voices Man and Woman. See
https://www.twilio.com/docs/api/twiml/say#attributes-manwoman.
Languages spoken by Alice. See
https://www.twilio.com/docs/api/twiml/say#attributes-alice.
Constructors
| DaDK | Danish, Denmark |
| DeDE | German, Germany |
| EnAU | English, Australia |
| EnCA | English, Canada |
| EnGB | English, UK |
| EnIN | English, India |
| EnUS | English, United States |
| CaES | Catalan, Spain |
| EsES | Spanish, Spain |
| EsMX | Spanish, Mexico |
| FiFI | Finnish, Finland |
| FrCA | French, Canada |
| FrFR | French, France |
| ItIT | Italian, Italy |
| JaJP | Japanese, Japan |
| KoKR | Korean, Korea |
| NbNO | Norwegian, Norway |
| NlNL | Dutch, Netherlands |
| PlPL | Polish-Poland |
| PtBR | Portuguese, Brazil |
| PtPT | Portuguese, Portugal |
| RuRU | Russian, Russia |
| SvSE | Swedish, Sweden |
| ZhCN | Chinese (Mandarin) |
| ZhHK | Chinese (Cantonese) |
| ZhTW | Chinese (Taiwanese Mandarin) |
<Play>
data PlayAttributes Source
Constructors
| PlayAttributes | |
<Gather>
data GatherAttributes Source
Constructors
| GatherAttributes | |
Fields | |
<Record>
data RecordAttributes Source
Constructors
| RecordAttributes | |
Fields | |
<Sms>
data SmsAttributes Source
<Dial>
data DialAttributes Source
Constructors
| DialAttributes | |
Fields
| |
<Number>
data NumberAttributes Source
Constructors
| NumberAttributes | |
Fields
| |
<Sip>
data SipAttributes Source
Constructors
| SipAttributes | |
Fields
| |
<Client>
data ClientAttributes Source
Constructors
| ClientAttributes | |
<Conference>
data ConferenceAttributes Source
Constructors
| ConferenceAttributes | |
data ConferenceBeep Source
Instances
<Queue>
data QueueAttributes Source
Constructors
| QueueAttributes | |
<Enqueue>
data EnqueueAttributes Source
Constructors
| EnqueueAttributes | |
Fields | |
<Redirect>
data RedirectAttributes Source
Constructors
| RedirectAttributes | |
Fields | |
<Reject>
data RejectAttributes Source
Constructors
| RejectAttributes | |
Fields | |
The reason attribute takes the values "rejected" and "busy." This tells Twilio what message to play when rejecting a call. Selecting "busy" will play a busy signal to the caller, while selecting "rejected" will play a standard not-in-service response. See https://www.twilio.com/docs/api/twiml/reject#attributes-reason.
<Pause>
data PauseAttributes Source
Constructors
| PauseAttributes | |
Fields | |
Lens Classes
class HasTimeout t whereSource
Instances
| HasTimeout (Record p) | |
| HasTimeout (Dial p) | |
| Twiml p t => HasTimeout (t -> Gather p) |
class HasFinishOnKey t whereSource
Instances
| HasFinishOnKey (Record p) | |
| Twiml p t => HasFinishOnKey (t -> Gather p) |
Internal
Lens
The following section extracts a number of definitions required to get lenses, as defined in the lens package, working, without relying on the lens package itself. Rather than use the following functions, consider installing lens. See https://hackage.haskell.org/package/lens.
Fix & Foldable
The following definitions were extracted from the recursion-schemes package. See https://hackage.haskell.org/package/recursion-schemes.
Type Inequality
The following defines :/~ to mean inequality at the type level.
Borrowed from HList. See http://okmij.org/ftp/Haskell/typeEQ.html.