twiml-0.2.1.0: TwiML library for Haskell

Copyright(C) 2018 Mark Andrus Roberts
LicenseBSD-style (see the file LICENSE)
MaintainerMark Andrus Roberts <markandrusroberts@gmail.com>
Stabilityprovisional
Safe HaskellNone
LanguageHaskell98

Text.XML.Twiml.Verbs.Hangup

Description

The example in this file assumes

{-# LANGUAGE RebindableSyntax #-}
{-# LANGUAGE RecordWildCards #-}

import Prelude
import Data.Default
import Text.XML.Twiml
import qualified Text.XML.Twiml.Syntax as Twiml

For more information, refer to Twilio's TwiML Reference for <Hangup>.

Synopsis

Documentation

hangup :: IsTwimlLike f Hangup => TwimlLike f Hangup a Source #

Hangup a call. Example:

>>> :{
let example :: VoiceTwiml
    example =
      voiceResponse $ do
        hangup
        end
      where Twiml.Syntax{..} = def
:}
>>> putStr $ show example
<?xml version="1.0" encoding="UTF-8"?>
<Response>
  <Hangup />
</Response>

data HangupF (i :: [Type]) a Source #

Instances

Functor (HangupF i) Source # 

Methods

fmap :: (a -> b) -> HangupF i a -> HangupF i b #

(<$) :: a -> HangupF i b -> HangupF i a #

Functor1 [Type] HangupF Source # 

Methods

fmap1 :: (a -> b) -> f i a -> f i b Source #

Show a => Show (HangupF i a) Source # 

Methods

showsPrec :: Int -> HangupF i a -> ShowS #

show :: HangupF i a -> String #

showList :: [HangupF i a] -> ShowS #

ToXML (HangupF i a) Source # 

Methods

toXML :: HangupF i a -> [Element] Source #