twilio-0.2.0.1: Twilio REST API library for Haskell

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

Twilio.Message.Feedback

Contents

Description

 

Synopsis

Resource

data Feedback Source #

Constructors

Feedback 

Fields

Instances

Eq Feedback Source # 
Data Feedback Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Feedback -> c Feedback #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Feedback #

toConstr :: Feedback -> Constr #

dataTypeOf :: Feedback -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Feedback) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Feedback) #

gmapT :: (forall b. Data b => b -> b) -> Feedback -> Feedback #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Feedback -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Feedback -> r #

gmapQ :: (forall d. Data d => d -> u) -> Feedback -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Feedback -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Feedback -> m Feedback #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Feedback -> m Feedback #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Feedback -> m Feedback #

Ord Feedback Source # 
Read Feedback Source # 
Show Feedback Source # 
Generic Feedback Source # 

Associated Types

type Rep Feedback :: * -> * #

Methods

from :: Feedback -> Rep Feedback x #

to :: Rep Feedback x -> Feedback #

type Rep Feedback Source # 
type Rep Feedback = D1 * (MetaData "Feedback" "Twilio.Message.Feedback" "twilio-0.2.0.1-Cwy6vZAHYb886DlZ9eauoR" False) (C1 * (MetaCons "Feedback" PrefixI True) (S1 * (MetaSel (Just Symbol "outcome") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Outcome)))

Types

data Outcome Source #

Constructors

Unconfirmed 
Confirmed 

Instances

Bounded Outcome Source # 
Enum Outcome Source # 
Eq Outcome Source # 

Methods

(==) :: Outcome -> Outcome -> Bool #

(/=) :: Outcome -> Outcome -> Bool #

Data Outcome Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Outcome -> c Outcome #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Outcome #

toConstr :: Outcome -> Constr #

dataTypeOf :: Outcome -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Outcome) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Outcome) #

gmapT :: (forall b. Data b => b -> b) -> Outcome -> Outcome #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Outcome -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Outcome -> r #

gmapQ :: (forall d. Data d => d -> u) -> Outcome -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Outcome -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Outcome -> m Outcome #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Outcome -> m Outcome #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Outcome -> m Outcome #

Ord Outcome Source # 
Read Outcome Source # 
Show Outcome Source # 
Generic Outcome Source # 

Associated Types

type Rep Outcome :: * -> * #

Methods

from :: Outcome -> Rep Outcome x #

to :: Rep Outcome x -> Outcome #

ToJSON Outcome Source # 
FromJSON Outcome Source # 
type Rep Outcome Source # 
type Rep Outcome = D1 * (MetaData "Outcome" "Twilio.Message.Feedback" "twilio-0.2.0.1-Cwy6vZAHYb886DlZ9eauoR" False) ((:+:) * (C1 * (MetaCons "Unconfirmed" PrefixI False) (U1 *)) (C1 * (MetaCons "Confirmed" PrefixI False) (U1 *)))