amazonka-lex-models-1.5.0: Amazon Lex Model Building Service SDK.

Copyright(c) 2013-2017 Brendan Hay
LicenseMozilla Public License, v. 2.0.
MaintainerBrendan Hay <brendan.g.hay+amazonka@gmail.com>
Stabilityauto-generated
Portabilitynon-portable (GHC extensions)
Safe HaskellNone
LanguageHaskell2010

Network.AWS.LexModels.Types

Contents

Description

 

Synopsis

Service Configuration

lexModels :: Service Source #

API version 2017-04-19 of the Amazon Lex Model Building Service SDK configuration.

Errors

_PreconditionFailedException :: AsError a => Getting (First ServiceError) a ServiceError Source #

The checksum of the resource that you are trying to change does not match the checksum in the request. Check the resource's checksum and try again.

_ConflictException :: AsError a => Getting (First ServiceError) a ServiceError Source #

There was a conflict processing the request. Try your request again.

_NotFoundException :: AsError a => Getting (First ServiceError) a ServiceError Source #

The resource specified in the request was not found. Check the resource and try again.

_InternalFailureException :: AsError a => Getting (First ServiceError) a ServiceError Source #

An internal Amazon Lex error occurred. Try your request again.

_BadRequestException :: AsError a => Getting (First ServiceError) a ServiceError Source #

The request is not well formed. For example, a value is invalid or a required field is missing. Check the field values, and try again.

_LimitExceededException :: AsError a => Getting (First ServiceError) a ServiceError Source #

The request exceeded a limit. Try your request again.

_ResourceInUseException :: AsError a => Getting (First ServiceError) a ServiceError Source #

The resource that you are attempting to delete is referred to by another resource. Use this information to remove references to the resource that you are trying to delete.

The body of the exception contains a JSON object that describes the resource.

{ "resourceType": BOT | BOTALIAS | BOTCHANNEL | INTENT,
"resourceReference": {
"name": string , "version": string } }

ChannelType

data ChannelType Source #

Constructors

Facebook 
Slack 
TwilioSms 

Instances

Bounded ChannelType Source # 
Enum ChannelType Source # 
Eq ChannelType Source # 
Data ChannelType Source # 

Methods

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

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

toConstr :: ChannelType -> Constr #

dataTypeOf :: ChannelType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ChannelType Source # 
Read ChannelType Source # 
Show ChannelType Source # 
Generic ChannelType Source # 

Associated Types

type Rep ChannelType :: * -> * #

Hashable ChannelType Source # 
FromJSON ChannelType Source # 
NFData ChannelType Source # 

Methods

rnf :: ChannelType -> () #

ToQuery ChannelType Source # 
ToHeader ChannelType Source # 
ToByteString ChannelType Source # 
FromText ChannelType Source # 
ToText ChannelType Source # 

Methods

toText :: ChannelType -> Text #

type Rep ChannelType Source # 
type Rep ChannelType = D1 (MetaData "ChannelType" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) ((:+:) (C1 (MetaCons "Facebook" PrefixI False) U1) ((:+:) (C1 (MetaCons "Slack" PrefixI False) U1) (C1 (MetaCons "TwilioSms" PrefixI False) U1)))

ContentType

data ContentType Source #

Constructors

PlainText 
Ssml 

Instances

Bounded ContentType Source # 
Enum ContentType Source # 
Eq ContentType Source # 
Data ContentType Source # 

Methods

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

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

toConstr :: ContentType -> Constr #

dataTypeOf :: ContentType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ContentType Source # 
Read ContentType Source # 
Show ContentType Source # 
Generic ContentType Source # 

Associated Types

type Rep ContentType :: * -> * #

Hashable ContentType Source # 
FromJSON ContentType Source # 
ToJSON ContentType Source # 
NFData ContentType Source # 

Methods

rnf :: ContentType -> () #

ToQuery ContentType Source # 
ToHeader ContentType Source # 
ToByteString ContentType Source # 
FromText ContentType Source # 
ToText ContentType Source # 

Methods

toText :: ContentType -> Text #

type Rep ContentType Source # 
type Rep ContentType = D1 (MetaData "ContentType" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) ((:+:) (C1 (MetaCons "PlainText" PrefixI False) U1) (C1 (MetaCons "Ssml" PrefixI False) U1))

ExportStatus

data ExportStatus Source #

Constructors

Failed 
InProgress 
Ready 

Instances

Bounded ExportStatus Source # 
Enum ExportStatus Source # 
Eq ExportStatus Source # 
Data ExportStatus Source # 

Methods

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

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

toConstr :: ExportStatus -> Constr #

dataTypeOf :: ExportStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ExportStatus Source # 
Read ExportStatus Source # 
Show ExportStatus Source # 
Generic ExportStatus Source # 

Associated Types

type Rep ExportStatus :: * -> * #

Hashable ExportStatus Source # 
FromJSON ExportStatus Source # 
NFData ExportStatus Source # 

Methods

rnf :: ExportStatus -> () #

ToQuery ExportStatus Source # 
ToHeader ExportStatus Source # 
ToByteString ExportStatus Source # 
FromText ExportStatus Source # 
ToText ExportStatus Source # 

Methods

toText :: ExportStatus -> Text #

type Rep ExportStatus Source # 
type Rep ExportStatus = D1 (MetaData "ExportStatus" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) ((:+:) (C1 (MetaCons "Failed" PrefixI False) U1) ((:+:) (C1 (MetaCons "InProgress" PrefixI False) U1) (C1 (MetaCons "Ready" PrefixI False) U1)))

ExportType

data ExportType Source #

Constructors

AlexaSkillsKit 

Instances

Bounded ExportType Source # 
Enum ExportType Source # 
Eq ExportType Source # 
Data ExportType Source # 

Methods

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

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

toConstr :: ExportType -> Constr #

dataTypeOf :: ExportType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ExportType Source # 
Read ExportType Source # 
Show ExportType Source # 
Generic ExportType Source # 

Associated Types

type Rep ExportType :: * -> * #

Hashable ExportType Source # 
FromJSON ExportType Source # 
ToJSON ExportType Source # 
NFData ExportType Source # 

Methods

rnf :: ExportType -> () #

ToQuery ExportType Source # 
ToHeader ExportType Source # 
ToByteString ExportType Source # 
FromText ExportType Source # 
ToText ExportType Source # 

Methods

toText :: ExportType -> Text #

type Rep ExportType Source # 
type Rep ExportType = D1 (MetaData "ExportType" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "AlexaSkillsKit" PrefixI False) U1)

FulfillmentActivityType

data FulfillmentActivityType Source #

Constructors

CodeHook 
ReturnIntent 

Instances

Bounded FulfillmentActivityType Source # 
Enum FulfillmentActivityType Source # 
Eq FulfillmentActivityType Source # 
Data FulfillmentActivityType Source # 

Methods

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

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

toConstr :: FulfillmentActivityType -> Constr #

dataTypeOf :: FulfillmentActivityType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord FulfillmentActivityType Source # 
Read FulfillmentActivityType Source # 
Show FulfillmentActivityType Source # 
Generic FulfillmentActivityType Source # 
Hashable FulfillmentActivityType Source # 
FromJSON FulfillmentActivityType Source # 
ToJSON FulfillmentActivityType Source # 
NFData FulfillmentActivityType Source # 

Methods

rnf :: FulfillmentActivityType -> () #

ToQuery FulfillmentActivityType Source # 
ToHeader FulfillmentActivityType Source # 
ToByteString FulfillmentActivityType Source # 
FromText FulfillmentActivityType Source # 
ToText FulfillmentActivityType Source # 
type Rep FulfillmentActivityType Source # 
type Rep FulfillmentActivityType = D1 (MetaData "FulfillmentActivityType" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) ((:+:) (C1 (MetaCons "CodeHook" PrefixI False) U1) (C1 (MetaCons "ReturnIntent" PrefixI False) U1))

LexStatus

data LexStatus Source #

Instances

Bounded LexStatus Source # 
Enum LexStatus Source # 
Eq LexStatus Source # 
Data LexStatus Source # 

Methods

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

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

toConstr :: LexStatus -> Constr #

dataTypeOf :: LexStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord LexStatus Source # 
Read LexStatus Source # 
Show LexStatus Source # 
Generic LexStatus Source # 

Associated Types

type Rep LexStatus :: * -> * #

Hashable LexStatus Source # 
FromJSON LexStatus Source # 
NFData LexStatus Source # 

Methods

rnf :: LexStatus -> () #

ToQuery LexStatus Source # 
ToHeader LexStatus Source # 
ToByteString LexStatus Source # 

Methods

toBS :: LexStatus -> ByteString #

FromText LexStatus Source # 
ToText LexStatus Source # 

Methods

toText :: LexStatus -> Text #

type Rep LexStatus Source # 
type Rep LexStatus = D1 (MetaData "LexStatus" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) ((:+:) ((:+:) (C1 (MetaCons "LSBuilding" PrefixI False) U1) (C1 (MetaCons "LSFailed" PrefixI False) U1)) ((:+:) (C1 (MetaCons "LSNotBuilt" PrefixI False) U1) (C1 (MetaCons "LSReady" PrefixI False) U1)))

Locale

data Locale Source #

Constructors

EnUs 

Instances

Bounded Locale Source # 
Enum Locale Source # 
Eq Locale Source # 

Methods

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

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

Data Locale Source # 

Methods

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

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

toConstr :: Locale -> Constr #

dataTypeOf :: Locale -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Locale Source # 
Read Locale Source # 
Show Locale Source # 
Generic Locale Source # 

Associated Types

type Rep Locale :: * -> * #

Methods

from :: Locale -> Rep Locale x #

to :: Rep Locale x -> Locale #

Hashable Locale Source # 

Methods

hashWithSalt :: Int -> Locale -> Int #

hash :: Locale -> Int #

FromJSON Locale Source # 
ToJSON Locale Source # 
NFData Locale Source # 

Methods

rnf :: Locale -> () #

ToQuery Locale Source # 
ToHeader Locale Source # 

Methods

toHeader :: HeaderName -> Locale -> [Header] #

ToByteString Locale Source # 

Methods

toBS :: Locale -> ByteString #

FromText Locale Source # 

Methods

parser :: Parser Locale #

ToText Locale Source # 

Methods

toText :: Locale -> Text #

type Rep Locale Source # 
type Rep Locale = D1 (MetaData "Locale" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "EnUs" PrefixI False) U1)

ProcessBehavior

data ProcessBehavior Source #

Constructors

Build 
Save 

Instances

Bounded ProcessBehavior Source # 
Enum ProcessBehavior Source # 
Eq ProcessBehavior Source # 
Data ProcessBehavior Source # 

Methods

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

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

toConstr :: ProcessBehavior -> Constr #

dataTypeOf :: ProcessBehavior -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ProcessBehavior Source # 
Read ProcessBehavior Source # 
Show ProcessBehavior Source # 
Generic ProcessBehavior Source # 
Hashable ProcessBehavior Source # 
ToJSON ProcessBehavior Source # 
NFData ProcessBehavior Source # 

Methods

rnf :: ProcessBehavior -> () #

ToQuery ProcessBehavior Source # 
ToHeader ProcessBehavior Source # 
ToByteString ProcessBehavior Source # 
FromText ProcessBehavior Source # 
ToText ProcessBehavior Source # 
type Rep ProcessBehavior Source # 
type Rep ProcessBehavior = D1 (MetaData "ProcessBehavior" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) ((:+:) (C1 (MetaCons "Build" PrefixI False) U1) (C1 (MetaCons "Save" PrefixI False) U1))

ResourceType

data ResourceType Source #

Constructors

Bot 

Instances

Bounded ResourceType Source # 
Enum ResourceType Source # 
Eq ResourceType Source # 
Data ResourceType Source # 

Methods

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

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

toConstr :: ResourceType -> Constr #

dataTypeOf :: ResourceType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ResourceType Source # 
Read ResourceType Source # 
Show ResourceType Source # 
Generic ResourceType Source # 

Associated Types

type Rep ResourceType :: * -> * #

Hashable ResourceType Source # 
FromJSON ResourceType Source # 
ToJSON ResourceType Source # 
NFData ResourceType Source # 

Methods

rnf :: ResourceType -> () #

ToQuery ResourceType Source # 
ToHeader ResourceType Source # 
ToByteString ResourceType Source # 
FromText ResourceType Source # 
ToText ResourceType Source # 

Methods

toText :: ResourceType -> Text #

type Rep ResourceType Source # 
type Rep ResourceType = D1 (MetaData "ResourceType" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "Bot" PrefixI False) U1)

SlotConstraint

data SlotConstraint Source #

Constructors

Optional 
Required 

Instances

Bounded SlotConstraint Source # 
Enum SlotConstraint Source # 
Eq SlotConstraint Source # 
Data SlotConstraint Source # 

Methods

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

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

toConstr :: SlotConstraint -> Constr #

dataTypeOf :: SlotConstraint -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SlotConstraint Source # 
Read SlotConstraint Source # 
Show SlotConstraint Source # 
Generic SlotConstraint Source # 

Associated Types

type Rep SlotConstraint :: * -> * #

Hashable SlotConstraint Source # 
FromJSON SlotConstraint Source # 
ToJSON SlotConstraint Source # 
NFData SlotConstraint Source # 

Methods

rnf :: SlotConstraint -> () #

ToQuery SlotConstraint Source # 
ToHeader SlotConstraint Source # 
ToByteString SlotConstraint Source # 
FromText SlotConstraint Source # 
ToText SlotConstraint Source # 
type Rep SlotConstraint Source # 
type Rep SlotConstraint = D1 (MetaData "SlotConstraint" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) ((:+:) (C1 (MetaCons "Optional" PrefixI False) U1) (C1 (MetaCons "Required" PrefixI False) U1))

SlotValueSelectionStrategy

data SlotValueSelectionStrategy Source #

Instances

Bounded SlotValueSelectionStrategy Source # 
Enum SlotValueSelectionStrategy Source # 
Eq SlotValueSelectionStrategy Source # 
Data SlotValueSelectionStrategy Source # 

Methods

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

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

toConstr :: SlotValueSelectionStrategy -> Constr #

dataTypeOf :: SlotValueSelectionStrategy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SlotValueSelectionStrategy Source # 
Read SlotValueSelectionStrategy Source # 
Show SlotValueSelectionStrategy Source # 
Generic SlotValueSelectionStrategy Source # 
Hashable SlotValueSelectionStrategy Source # 
FromJSON SlotValueSelectionStrategy Source # 
ToJSON SlotValueSelectionStrategy Source # 
NFData SlotValueSelectionStrategy Source # 
ToQuery SlotValueSelectionStrategy Source # 
ToHeader SlotValueSelectionStrategy Source # 
ToByteString SlotValueSelectionStrategy Source # 
FromText SlotValueSelectionStrategy Source # 
ToText SlotValueSelectionStrategy Source # 
type Rep SlotValueSelectionStrategy Source # 
type Rep SlotValueSelectionStrategy = D1 (MetaData "SlotValueSelectionStrategy" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) ((:+:) (C1 (MetaCons "OriginalValue" PrefixI False) U1) (C1 (MetaCons "TopResolution" PrefixI False) U1))

StatusType

data StatusType Source #

Constructors

Detected 
Missed 

Instances

Bounded StatusType Source # 
Enum StatusType Source # 
Eq StatusType Source # 
Data StatusType Source # 

Methods

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

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

toConstr :: StatusType -> Constr #

dataTypeOf :: StatusType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord StatusType Source # 
Read StatusType Source # 
Show StatusType Source # 
Generic StatusType Source # 

Associated Types

type Rep StatusType :: * -> * #

Hashable StatusType Source # 
ToJSON StatusType Source # 
NFData StatusType Source # 

Methods

rnf :: StatusType -> () #

ToQuery StatusType Source # 
ToHeader StatusType Source # 
ToByteString StatusType Source # 
FromText StatusType Source # 
ToText StatusType Source # 

Methods

toText :: StatusType -> Text #

type Rep StatusType Source # 
type Rep StatusType = D1 (MetaData "StatusType" "Network.AWS.LexModels.Types.Sum" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) ((:+:) (C1 (MetaCons "Detected" PrefixI False) U1) (C1 (MetaCons "Missed" PrefixI False) U1))

BotAliasMetadata

data BotAliasMetadata Source #

Provides information about a bot alias.

See: botAliasMetadata smart constructor.

Instances

Eq BotAliasMetadata Source # 
Data BotAliasMetadata Source # 

Methods

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

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

toConstr :: BotAliasMetadata -> Constr #

dataTypeOf :: BotAliasMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Read BotAliasMetadata Source # 
Show BotAliasMetadata Source # 
Generic BotAliasMetadata Source # 
Hashable BotAliasMetadata Source # 
FromJSON BotAliasMetadata Source # 
NFData BotAliasMetadata Source # 

Methods

rnf :: BotAliasMetadata -> () #

type Rep BotAliasMetadata Source # 
type Rep BotAliasMetadata = D1 (MetaData "BotAliasMetadata" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "BotAliasMetadata'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_bamChecksum") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_bamBotVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_bamBotName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_bamCreatedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))) (S1 (MetaSel (Just Symbol "_bamName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_bamLastUpdatedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))) (S1 (MetaSel (Just Symbol "_bamDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

botAliasMetadata :: BotAliasMetadata Source #

Creates a value of BotAliasMetadata with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • bamChecksum - Checksum of the bot alias.
  • bamBotVersion - The version of the Amazon Lex bot to which the alias points.
  • bamBotName - The name of the bot to which the alias points.
  • bamCreatedDate - The date that the bot alias was created.
  • bamName - The name of the bot alias.
  • bamLastUpdatedDate - The date that the bot alias was updated. When you create a resource, the creation date and last updated date are the same.
  • bamDescription - A description of the bot alias.

bamChecksum :: Lens' BotAliasMetadata (Maybe Text) Source #

Checksum of the bot alias.

bamBotVersion :: Lens' BotAliasMetadata (Maybe Text) Source #

The version of the Amazon Lex bot to which the alias points.

bamBotName :: Lens' BotAliasMetadata (Maybe Text) Source #

The name of the bot to which the alias points.

bamCreatedDate :: Lens' BotAliasMetadata (Maybe UTCTime) Source #

The date that the bot alias was created.

bamName :: Lens' BotAliasMetadata (Maybe Text) Source #

The name of the bot alias.

bamLastUpdatedDate :: Lens' BotAliasMetadata (Maybe UTCTime) Source #

The date that the bot alias was updated. When you create a resource, the creation date and last updated date are the same.

bamDescription :: Lens' BotAliasMetadata (Maybe Text) Source #

A description of the bot alias.

BotChannelAssociation

data BotChannelAssociation Source #

Represents an association between an Amazon Lex bot and an external messaging platform.

See: botChannelAssociation smart constructor.

Instances

Eq BotChannelAssociation Source # 
Data BotChannelAssociation Source # 

Methods

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

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

toConstr :: BotChannelAssociation -> Constr #

dataTypeOf :: BotChannelAssociation -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BotChannelAssociation Source # 
Generic BotChannelAssociation Source # 
Hashable BotChannelAssociation Source # 
FromJSON BotChannelAssociation Source # 
NFData BotChannelAssociation Source # 

Methods

rnf :: BotChannelAssociation -> () #

type Rep BotChannelAssociation Source # 

botChannelAssociation :: BotChannelAssociation Source #

Creates a value of BotChannelAssociation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • bcaBotAlias - An alias pointing to the specific version of the Amazon Lex bot to which this association is being made.
  • bcaBotName - The name of the Amazon Lex bot to which this association is being made.
  • bcaBotConfiguration - Provides information necessary to communicate with the messaging platform.
  • bcaCreatedDate - The date that the association between the Amazon Lex bot and the channel was created.
  • bcaName - The name of the association between the bot and the channel.
  • bcaType - Specifies the type of association by indicating the type of channel being established between the Amazon Lex bot and the external messaging platform.
  • bcaDescription - A text description of the association you are creating.

bcaBotAlias :: Lens' BotChannelAssociation (Maybe Text) Source #

An alias pointing to the specific version of the Amazon Lex bot to which this association is being made.

bcaBotName :: Lens' BotChannelAssociation (Maybe Text) Source #

The name of the Amazon Lex bot to which this association is being made.

bcaBotConfiguration :: Lens' BotChannelAssociation (Maybe (HashMap Text Text)) Source #

Provides information necessary to communicate with the messaging platform.

bcaCreatedDate :: Lens' BotChannelAssociation (Maybe UTCTime) Source #

The date that the association between the Amazon Lex bot and the channel was created.

bcaName :: Lens' BotChannelAssociation (Maybe Text) Source #

The name of the association between the bot and the channel.

bcaType :: Lens' BotChannelAssociation (Maybe ChannelType) Source #

Specifies the type of association by indicating the type of channel being established between the Amazon Lex bot and the external messaging platform.

bcaDescription :: Lens' BotChannelAssociation (Maybe Text) Source #

A text description of the association you are creating.

BotMetadata

data BotMetadata Source #

Provides information about a bot. .

See: botMetadata smart constructor.

Instances

Eq BotMetadata Source # 
Data BotMetadata Source # 

Methods

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

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

toConstr :: BotMetadata -> Constr #

dataTypeOf :: BotMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Read BotMetadata Source # 
Show BotMetadata Source # 
Generic BotMetadata Source # 

Associated Types

type Rep BotMetadata :: * -> * #

Hashable BotMetadata Source # 
FromJSON BotMetadata Source # 
NFData BotMetadata Source # 

Methods

rnf :: BotMetadata -> () #

type Rep BotMetadata Source # 
type Rep BotMetadata = D1 (MetaData "BotMetadata" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "BotMetadata'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_bmStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LexStatus))) ((:*:) (S1 (MetaSel (Just Symbol "_bmCreatedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))) (S1 (MetaSel (Just Symbol "_bmName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) (S1 (MetaSel (Just Symbol "_bmVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_bmLastUpdatedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))) (S1 (MetaSel (Just Symbol "_bmDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

botMetadata :: BotMetadata Source #

Creates a value of BotMetadata with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • bmStatus - The status of the bot.
  • bmCreatedDate - The date that the bot was created.
  • bmName - The name of the bot.
  • bmVersion - The version of the bot. For a new bot, the version is always > LATEST .
  • bmLastUpdatedDate - The date that the bot was updated. When you create a bot, the creation date and last updated date are the same.
  • bmDescription - A description of the bot.

bmStatus :: Lens' BotMetadata (Maybe LexStatus) Source #

The status of the bot.

bmCreatedDate :: Lens' BotMetadata (Maybe UTCTime) Source #

The date that the bot was created.

bmName :: Lens' BotMetadata (Maybe Text) Source #

The name of the bot.

bmVersion :: Lens' BotMetadata (Maybe Text) Source #

The version of the bot. For a new bot, the version is always > LATEST .

bmLastUpdatedDate :: Lens' BotMetadata (Maybe UTCTime) Source #

The date that the bot was updated. When you create a bot, the creation date and last updated date are the same.

bmDescription :: Lens' BotMetadata (Maybe Text) Source #

A description of the bot.

BuiltinIntentMetadata

data BuiltinIntentMetadata Source #

Provides metadata for a built-in intent.

See: builtinIntentMetadata smart constructor.

Instances

Eq BuiltinIntentMetadata Source # 
Data BuiltinIntentMetadata Source # 

Methods

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

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

toConstr :: BuiltinIntentMetadata -> Constr #

dataTypeOf :: BuiltinIntentMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Read BuiltinIntentMetadata Source # 
Show BuiltinIntentMetadata Source # 
Generic BuiltinIntentMetadata Source # 
Hashable BuiltinIntentMetadata Source # 
FromJSON BuiltinIntentMetadata Source # 
NFData BuiltinIntentMetadata Source # 

Methods

rnf :: BuiltinIntentMetadata -> () #

type Rep BuiltinIntentMetadata Source # 
type Rep BuiltinIntentMetadata = D1 (MetaData "BuiltinIntentMetadata" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "BuiltinIntentMetadata'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_bimSignature") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_bimSupportedLocales") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Locale])))))

builtinIntentMetadata :: BuiltinIntentMetadata Source #

Creates a value of BuiltinIntentMetadata with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bimSignature :: Lens' BuiltinIntentMetadata (Maybe Text) Source #

A unique identifier for the built-in intent. To find the signature for an intent, see Standard Built-in Intents in the Alexa Skills Kit .

bimSupportedLocales :: Lens' BuiltinIntentMetadata [Locale] Source #

A list of identifiers for the locales that the intent supports.

BuiltinIntentSlot

data BuiltinIntentSlot Source #

Provides information about a slot used in a built-in intent.

See: builtinIntentSlot smart constructor.

Instances

Eq BuiltinIntentSlot Source # 
Data BuiltinIntentSlot Source # 

Methods

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

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

toConstr :: BuiltinIntentSlot -> Constr #

dataTypeOf :: BuiltinIntentSlot -> DataType #

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

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

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

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

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

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

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

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

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

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

Read BuiltinIntentSlot Source # 
Show BuiltinIntentSlot Source # 
Generic BuiltinIntentSlot Source # 
Hashable BuiltinIntentSlot Source # 
FromJSON BuiltinIntentSlot Source # 
NFData BuiltinIntentSlot Source # 

Methods

rnf :: BuiltinIntentSlot -> () #

type Rep BuiltinIntentSlot Source # 
type Rep BuiltinIntentSlot = D1 (MetaData "BuiltinIntentSlot" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" True) (C1 (MetaCons "BuiltinIntentSlot'" PrefixI True) (S1 (MetaSel (Just Symbol "_bisName") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

builtinIntentSlot :: BuiltinIntentSlot Source #

Creates a value of BuiltinIntentSlot with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • bisName - A list of the slots defined for the intent.

bisName :: Lens' BuiltinIntentSlot (Maybe Text) Source #

A list of the slots defined for the intent.

BuiltinSlotTypeMetadata

data BuiltinSlotTypeMetadata Source #

Provides information about a built in slot type.

See: builtinSlotTypeMetadata smart constructor.

Instances

Eq BuiltinSlotTypeMetadata Source # 
Data BuiltinSlotTypeMetadata Source # 

Methods

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

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

toConstr :: BuiltinSlotTypeMetadata -> Constr #

dataTypeOf :: BuiltinSlotTypeMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Read BuiltinSlotTypeMetadata Source # 
Show BuiltinSlotTypeMetadata Source # 
Generic BuiltinSlotTypeMetadata Source # 
Hashable BuiltinSlotTypeMetadata Source # 
FromJSON BuiltinSlotTypeMetadata Source # 
NFData BuiltinSlotTypeMetadata Source # 

Methods

rnf :: BuiltinSlotTypeMetadata -> () #

type Rep BuiltinSlotTypeMetadata Source # 
type Rep BuiltinSlotTypeMetadata = D1 (MetaData "BuiltinSlotTypeMetadata" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "BuiltinSlotTypeMetadata'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_bstmSignature") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_bstmSupportedLocales") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Locale])))))

builtinSlotTypeMetadata :: BuiltinSlotTypeMetadata Source #

Creates a value of BuiltinSlotTypeMetadata with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bstmSignature :: Lens' BuiltinSlotTypeMetadata (Maybe Text) Source #

A unique identifier for the built-in slot type. To find the signature for a slot type, see Slot Type Reference in the Alexa Skills Kit .

bstmSupportedLocales :: Lens' BuiltinSlotTypeMetadata [Locale] Source #

A list of target locales for the slot.

CodeHook

data CodeHook Source #

Specifies a Lambda function that verifies requests to a bot or fulfills the user's request to a bot..

See: codeHook smart constructor.

Instances

Eq CodeHook Source # 
Data CodeHook Source # 

Methods

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

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

toConstr :: CodeHook -> Constr #

dataTypeOf :: CodeHook -> DataType #

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

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

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

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

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

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

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

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

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

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

Read CodeHook Source # 
Show CodeHook Source # 
Generic CodeHook Source # 

Associated Types

type Rep CodeHook :: * -> * #

Methods

from :: CodeHook -> Rep CodeHook x #

to :: Rep CodeHook x -> CodeHook #

Hashable CodeHook Source # 

Methods

hashWithSalt :: Int -> CodeHook -> Int #

hash :: CodeHook -> Int #

FromJSON CodeHook Source # 
ToJSON CodeHook Source # 
NFData CodeHook Source # 

Methods

rnf :: CodeHook -> () #

type Rep CodeHook Source # 
type Rep CodeHook = D1 (MetaData "CodeHook" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "CodeHook'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_chUri") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_chMessageVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

codeHook Source #

Creates a value of CodeHook with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • chUri - The Amazon Resource Name (ARN) of the Lambda function.
  • chMessageVersion - The version of the request-response that you want Amazon Lex to use to invoke your Lambda function. For more information, see 'using-lambda' .

chUri :: Lens' CodeHook Text Source #

The Amazon Resource Name (ARN) of the Lambda function.

chMessageVersion :: Lens' CodeHook Text Source #

The version of the request-response that you want Amazon Lex to use to invoke your Lambda function. For more information, see 'using-lambda' .

EnumerationValue

data EnumerationValue Source #

Each slot type can have a set of values. Each enumeration value represents a value the slot type can take.

For example, a pizza ordering bot could have a slot type that specifies the type of crust that the pizza should have. The slot type could include the values

  • thick
  • thin
  • stuffed

See: enumerationValue smart constructor.

Instances

Eq EnumerationValue Source # 
Data EnumerationValue Source # 

Methods

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

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

toConstr :: EnumerationValue -> Constr #

dataTypeOf :: EnumerationValue -> DataType #

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

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

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

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

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

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

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

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

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

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

Read EnumerationValue Source # 
Show EnumerationValue Source # 
Generic EnumerationValue Source # 
Hashable EnumerationValue Source # 
FromJSON EnumerationValue Source # 
ToJSON EnumerationValue Source # 
NFData EnumerationValue Source # 

Methods

rnf :: EnumerationValue -> () #

type Rep EnumerationValue Source # 
type Rep EnumerationValue = D1 (MetaData "EnumerationValue" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "EnumerationValue'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_evSynonyms") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) (S1 (MetaSel (Just Symbol "_evValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

enumerationValue Source #

Creates a value of EnumerationValue with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • evSynonyms - Additional values related to the slot type value.
  • evValue - The value of the slot type.

evSynonyms :: Lens' EnumerationValue [Text] Source #

Additional values related to the slot type value.

evValue :: Lens' EnumerationValue Text Source #

The value of the slot type.

FollowUpPrompt

data FollowUpPrompt Source #

A prompt for additional activity after an intent is fulfilled. For example, after the OrderPizza intent is fulfilled, you might prompt the user to find out whether the user wants to order drinks.

See: followUpPrompt smart constructor.

Instances

Eq FollowUpPrompt Source # 
Data FollowUpPrompt Source # 

Methods

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

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

toConstr :: FollowUpPrompt -> Constr #

dataTypeOf :: FollowUpPrompt -> DataType #

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

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

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

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

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

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

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

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

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

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

Read FollowUpPrompt Source # 
Show FollowUpPrompt Source # 
Generic FollowUpPrompt Source # 

Associated Types

type Rep FollowUpPrompt :: * -> * #

Hashable FollowUpPrompt Source # 
FromJSON FollowUpPrompt Source # 
ToJSON FollowUpPrompt Source # 
NFData FollowUpPrompt Source # 

Methods

rnf :: FollowUpPrompt -> () #

type Rep FollowUpPrompt Source # 
type Rep FollowUpPrompt = D1 (MetaData "FollowUpPrompt" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "FollowUpPrompt'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_fupPrompt") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Prompt)) (S1 (MetaSel (Just Symbol "_fupRejectionStatement") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Statement))))

followUpPrompt Source #

Creates a value of FollowUpPrompt with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • fupPrompt - Prompts for information from the user.
  • fupRejectionStatement - If the user answers "no" to the question defined in the prompt field, Amazon Lex responds with this statement to acknowledge that the intent was canceled.

fupPrompt :: Lens' FollowUpPrompt Prompt Source #

Prompts for information from the user.

fupRejectionStatement :: Lens' FollowUpPrompt Statement Source #

If the user answers "no" to the question defined in the prompt field, Amazon Lex responds with this statement to acknowledge that the intent was canceled.

FulfillmentActivity

data FulfillmentActivity Source #

Describes how the intent is fulfilled after the user provides all of the information required for the intent. You can provide a Lambda function to process the intent, or you can return the intent information to the client application. We recommend that you use a Lambda function so that the relevant logic lives in the Cloud and limit the client-side code primarily to presentation. If you need to update the logic, you only update the Lambda function; you don't need to upgrade your client application.

Consider the following examples:

  • In a pizza ordering application, after the user provides all of the information for placing an order, you use a Lambda function to place an order with a pizzeria.
  • In a gaming application, when a user says "pick up a rock," this information must go back to the client application so that it can perform the operation and update the graphics. In this case, you want Amazon Lex to return the intent data to the client.

See: fulfillmentActivity smart constructor.

Instances

Eq FulfillmentActivity Source # 
Data FulfillmentActivity Source # 

Methods

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

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

toConstr :: FulfillmentActivity -> Constr #

dataTypeOf :: FulfillmentActivity -> DataType #

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

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

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

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

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

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

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

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

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

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

Read FulfillmentActivity Source # 
Show FulfillmentActivity Source # 
Generic FulfillmentActivity Source # 
Hashable FulfillmentActivity Source # 
FromJSON FulfillmentActivity Source # 
ToJSON FulfillmentActivity Source # 
NFData FulfillmentActivity Source # 

Methods

rnf :: FulfillmentActivity -> () #

type Rep FulfillmentActivity Source # 
type Rep FulfillmentActivity = D1 (MetaData "FulfillmentActivity" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "FulfillmentActivity'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_faCodeHook") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CodeHook))) (S1 (MetaSel (Just Symbol "_faType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 FulfillmentActivityType))))

fulfillmentActivity Source #

Creates a value of FulfillmentActivity with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • faCodeHook - A description of the Lambda function that is run to fulfill the intent.
  • faType - How the intent should be fulfilled, either by running a Lambda function or by returning the slot data to the client application.

faCodeHook :: Lens' FulfillmentActivity (Maybe CodeHook) Source #

A description of the Lambda function that is run to fulfill the intent.

faType :: Lens' FulfillmentActivity FulfillmentActivityType Source #

How the intent should be fulfilled, either by running a Lambda function or by returning the slot data to the client application.

Intent

data Intent Source #

Identifies the specific version of an intent.

See: intent smart constructor.

Instances

Eq Intent Source # 

Methods

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

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

Data Intent Source # 

Methods

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

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

toConstr :: Intent -> Constr #

dataTypeOf :: Intent -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Intent Source # 
Show Intent Source # 
Generic Intent Source # 

Associated Types

type Rep Intent :: * -> * #

Methods

from :: Intent -> Rep Intent x #

to :: Rep Intent x -> Intent #

Hashable Intent Source # 

Methods

hashWithSalt :: Int -> Intent -> Int #

hash :: Intent -> Int #

FromJSON Intent Source # 
ToJSON Intent Source # 
NFData Intent Source # 

Methods

rnf :: Intent -> () #

type Rep Intent Source # 
type Rep Intent = D1 (MetaData "Intent" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "Intent'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_iIntentName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_iIntentVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

intent Source #

Creates a value of Intent with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

iIntentName :: Lens' Intent Text Source #

The name of the intent.

iIntentVersion :: Lens' Intent Text Source #

The version of the intent.

IntentMetadata

data IntentMetadata Source #

Provides information about an intent.

See: intentMetadata smart constructor.

Instances

Eq IntentMetadata Source # 
Data IntentMetadata Source # 

Methods

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

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

toConstr :: IntentMetadata -> Constr #

dataTypeOf :: IntentMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Read IntentMetadata Source # 
Show IntentMetadata Source # 
Generic IntentMetadata Source # 

Associated Types

type Rep IntentMetadata :: * -> * #

Hashable IntentMetadata Source # 
FromJSON IntentMetadata Source # 
NFData IntentMetadata Source # 

Methods

rnf :: IntentMetadata -> () #

type Rep IntentMetadata Source # 
type Rep IntentMetadata = D1 (MetaData "IntentMetadata" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "IntentMetadata'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_imCreatedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))) (S1 (MetaSel (Just Symbol "_imName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_imVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_imLastUpdatedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))) (S1 (MetaSel (Just Symbol "_imDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

intentMetadata :: IntentMetadata Source #

Creates a value of IntentMetadata with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • imCreatedDate - The date that the intent was created.
  • imName - The name of the intent.
  • imVersion - The version of the intent.
  • imLastUpdatedDate - The date that the intent was updated. When you create an intent, the creation date and last updated date are the same.
  • imDescription - A description of the intent.

imCreatedDate :: Lens' IntentMetadata (Maybe UTCTime) Source #

The date that the intent was created.

imName :: Lens' IntentMetadata (Maybe Text) Source #

The name of the intent.

imVersion :: Lens' IntentMetadata (Maybe Text) Source #

The version of the intent.

imLastUpdatedDate :: Lens' IntentMetadata (Maybe UTCTime) Source #

The date that the intent was updated. When you create an intent, the creation date and last updated date are the same.

imDescription :: Lens' IntentMetadata (Maybe Text) Source #

A description of the intent.

Message

data Message Source #

The message object that provides the message text and its type.

See: message smart constructor.

Instances

Eq Message Source # 

Methods

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

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

Data Message Source # 

Methods

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

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

toConstr :: Message -> Constr #

dataTypeOf :: Message -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Message Source # 
Show Message Source # 
Generic Message Source # 

Associated Types

type Rep Message :: * -> * #

Methods

from :: Message -> Rep Message x #

to :: Rep Message x -> Message #

Hashable Message Source # 

Methods

hashWithSalt :: Int -> Message -> Int #

hash :: Message -> Int #

FromJSON Message Source # 
ToJSON Message Source # 
NFData Message Source # 

Methods

rnf :: Message -> () #

type Rep Message Source # 
type Rep Message = D1 (MetaData "Message" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "Message'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_mContentType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 ContentType)) (S1 (MetaSel (Just Symbol "_mContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

message Source #

Creates a value of Message with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

mContentType :: Lens' Message ContentType Source #

The content type of the message string.

mContent :: Lens' Message Text Source #

The text of the message.

Prompt

data Prompt Source #

Obtains information from the user. To define a prompt, provide one or more messages and specify the number of attempts to get information from the user. If you provide more than one message, Amazon Lex chooses one of the messages to use to prompt the user. For more information, see 'how-it-works' .

See: prompt smart constructor.

Instances

Eq Prompt Source # 

Methods

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

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

Data Prompt Source # 

Methods

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

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

toConstr :: Prompt -> Constr #

dataTypeOf :: Prompt -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Prompt Source # 
Show Prompt Source # 
Generic Prompt Source # 

Associated Types

type Rep Prompt :: * -> * #

Methods

from :: Prompt -> Rep Prompt x #

to :: Rep Prompt x -> Prompt #

Hashable Prompt Source # 

Methods

hashWithSalt :: Int -> Prompt -> Int #

hash :: Prompt -> Int #

FromJSON Prompt Source # 
ToJSON Prompt Source # 
NFData Prompt Source # 

Methods

rnf :: Prompt -> () #

type Rep Prompt Source # 
type Rep Prompt = D1 (MetaData "Prompt" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "Prompt'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_pResponseCard") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_pMessages") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (List1 Message))) (S1 (MetaSel (Just Symbol "_pMaxAttempts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Nat)))))

prompt Source #

Creates a value of Prompt with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • pResponseCard - A response card. Amazon Lex uses this prompt at runtime, in the PostText API response. It substitutes session attributes and slot values for placeholders in the response card. For more information, see 'ex-resp-card' .
  • pMessages - An array of objects, each of which provides a message string and its type. You can specify the message string in plain text or in Speech Synthesis Markup Language (SSML).
  • pMaxAttempts - The number of times to prompt the user for information.

pResponseCard :: Lens' Prompt (Maybe Text) Source #

A response card. Amazon Lex uses this prompt at runtime, in the PostText API response. It substitutes session attributes and slot values for placeholders in the response card. For more information, see 'ex-resp-card' .

pMessages :: Lens' Prompt (NonEmpty Message) Source #

An array of objects, each of which provides a message string and its type. You can specify the message string in plain text or in Speech Synthesis Markup Language (SSML).

pMaxAttempts :: Lens' Prompt Natural Source #

The number of times to prompt the user for information.

Slot

data Slot Source #

Identifies the version of a specific slot.

See: slot smart constructor.

Instances

Eq Slot Source # 

Methods

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

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

Data Slot Source # 

Methods

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

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

toConstr :: Slot -> Constr #

dataTypeOf :: Slot -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Slot Source # 
Show Slot Source # 

Methods

showsPrec :: Int -> Slot -> ShowS #

show :: Slot -> String #

showList :: [Slot] -> ShowS #

Generic Slot Source # 

Associated Types

type Rep Slot :: * -> * #

Methods

from :: Slot -> Rep Slot x #

to :: Rep Slot x -> Slot #

Hashable Slot Source # 

Methods

hashWithSalt :: Int -> Slot -> Int #

hash :: Slot -> Int #

FromJSON Slot Source # 
ToJSON Slot Source # 
NFData Slot Source # 

Methods

rnf :: Slot -> () #

type Rep Slot Source # 

slot Source #

Creates a value of Slot with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • sSlotType - The type of the slot, either a custom slot type that you defined or one of the built-in slot types.
  • sValueElicitationPrompt - The prompt that Amazon Lex uses to elicit the slot value from the user.
  • sResponseCard - A set of possible responses for the slot type used by text-based clients. A user chooses an option from the response card, instead of using text to reply.
  • sPriority - Directs Lex the order in which to elicit this slot value from the user. For example, if the intent has two slots with priorities 1 and 2, AWS Lex first elicits a value for the slot with priority 1. If multiple slots share the same priority, the order in which Lex elicits values is arbitrary.
  • sSlotTypeVersion - The version of the slot type.
  • sSampleUtterances - If you know a specific pattern with which users might respond to an Amazon Lex request for a slot value, you can provide those utterances to improve accuracy. This is optional. In most cases, Amazon Lex is capable of understanding user utterances.
  • sDescription - A description of the slot.
  • sName - The name of the slot.
  • sSlotConstraint - Specifies whether the slot is required or optional.

sSlotType :: Lens' Slot (Maybe Text) Source #

The type of the slot, either a custom slot type that you defined or one of the built-in slot types.

sValueElicitationPrompt :: Lens' Slot (Maybe Prompt) Source #

The prompt that Amazon Lex uses to elicit the slot value from the user.

sResponseCard :: Lens' Slot (Maybe Text) Source #

A set of possible responses for the slot type used by text-based clients. A user chooses an option from the response card, instead of using text to reply.

sPriority :: Lens' Slot (Maybe Natural) Source #

Directs Lex the order in which to elicit this slot value from the user. For example, if the intent has two slots with priorities 1 and 2, AWS Lex first elicits a value for the slot with priority 1. If multiple slots share the same priority, the order in which Lex elicits values is arbitrary.

sSlotTypeVersion :: Lens' Slot (Maybe Text) Source #

The version of the slot type.

sSampleUtterances :: Lens' Slot [Text] Source #

If you know a specific pattern with which users might respond to an Amazon Lex request for a slot value, you can provide those utterances to improve accuracy. This is optional. In most cases, Amazon Lex is capable of understanding user utterances.

sDescription :: Lens' Slot (Maybe Text) Source #

A description of the slot.

sName :: Lens' Slot Text Source #

The name of the slot.

sSlotConstraint :: Lens' Slot SlotConstraint Source #

Specifies whether the slot is required or optional.

SlotTypeMetadata

data SlotTypeMetadata Source #

Provides information about a slot type..

See: slotTypeMetadata smart constructor.

Instances

Eq SlotTypeMetadata Source # 
Data SlotTypeMetadata Source # 

Methods

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

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

toConstr :: SlotTypeMetadata -> Constr #

dataTypeOf :: SlotTypeMetadata -> DataType #

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

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

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

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

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

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

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

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

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

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

Read SlotTypeMetadata Source # 
Show SlotTypeMetadata Source # 
Generic SlotTypeMetadata Source # 
Hashable SlotTypeMetadata Source # 
FromJSON SlotTypeMetadata Source # 
NFData SlotTypeMetadata Source # 

Methods

rnf :: SlotTypeMetadata -> () #

type Rep SlotTypeMetadata Source # 
type Rep SlotTypeMetadata = D1 (MetaData "SlotTypeMetadata" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "SlotTypeMetadata'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_stmCreatedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))) (S1 (MetaSel (Just Symbol "_stmName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_stmVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_stmLastUpdatedDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))) (S1 (MetaSel (Just Symbol "_stmDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

slotTypeMetadata :: SlotTypeMetadata Source #

Creates a value of SlotTypeMetadata with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • stmCreatedDate - The date that the slot type was created.
  • stmName - The name of the slot type.
  • stmVersion - The version of the slot type.
  • stmLastUpdatedDate - The date that the slot type was updated. When you create a resource, the creation date and last updated date are the same.
  • stmDescription - A description of the slot type.

stmCreatedDate :: Lens' SlotTypeMetadata (Maybe UTCTime) Source #

The date that the slot type was created.

stmName :: Lens' SlotTypeMetadata (Maybe Text) Source #

The name of the slot type.

stmVersion :: Lens' SlotTypeMetadata (Maybe Text) Source #

The version of the slot type.

stmLastUpdatedDate :: Lens' SlotTypeMetadata (Maybe UTCTime) Source #

The date that the slot type was updated. When you create a resource, the creation date and last updated date are the same.

stmDescription :: Lens' SlotTypeMetadata (Maybe Text) Source #

A description of the slot type.

Statement

data Statement Source #

A collection of messages that convey information to the user. At runtime, Amazon Lex selects the message to convey.

See: statement smart constructor.

Instances

Eq Statement Source # 
Data Statement Source # 

Methods

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

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

toConstr :: Statement -> Constr #

dataTypeOf :: Statement -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Statement Source # 
Show Statement Source # 
Generic Statement Source # 

Associated Types

type Rep Statement :: * -> * #

Hashable Statement Source # 
FromJSON Statement Source # 
ToJSON Statement Source # 
NFData Statement Source # 

Methods

rnf :: Statement -> () #

type Rep Statement Source # 
type Rep Statement = D1 (MetaData "Statement" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "Statement'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_staResponseCard") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_staMessages") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (List1 Message)))))

statement Source #

Creates a value of Statement with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • staResponseCard - At runtime, if the client is using the PostText API, Amazon Lex includes the response card in the response. It substitutes all of the session attributes and slot values for placeholders in the response card.
  • staMessages - A collection of message objects.

staResponseCard :: Lens' Statement (Maybe Text) Source #

At runtime, if the client is using the PostText API, Amazon Lex includes the response card in the response. It substitutes all of the session attributes and slot values for placeholders in the response card.

staMessages :: Lens' Statement (NonEmpty Message) Source #

A collection of message objects.

UtteranceData

data UtteranceData Source #

Provides information about a single utterance that was made to your bot.

See: utteranceData smart constructor.

Instances

Eq UtteranceData Source # 
Data UtteranceData Source # 

Methods

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

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

toConstr :: UtteranceData -> Constr #

dataTypeOf :: UtteranceData -> DataType #

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

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

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

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

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

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

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

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

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

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

Read UtteranceData Source # 
Show UtteranceData Source # 
Generic UtteranceData Source # 

Associated Types

type Rep UtteranceData :: * -> * #

Hashable UtteranceData Source # 
FromJSON UtteranceData Source # 
NFData UtteranceData Source # 

Methods

rnf :: UtteranceData -> () #

type Rep UtteranceData Source # 
type Rep UtteranceData = D1 (MetaData "UtteranceData" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "UtteranceData'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_udFirstUtteredDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))) (S1 (MetaSel (Just Symbol "_udCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)))) ((:*:) (S1 (MetaSel (Just Symbol "_udUtteranceString") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_udLastUtteredDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe POSIX))) (S1 (MetaSel (Just Symbol "_udDistinctUsers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Int)))))))

utteranceData :: UtteranceData Source #

Creates a value of UtteranceData with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • udFirstUtteredDate - The date that the utterance was first recorded.
  • udCount - The number of times that the utterance was processed.
  • udUtteranceString - The text that was entered by the user or the text representation of an audio clip.
  • udLastUtteredDate - The date that the utterance was last recorded.
  • udDistinctUsers - The total number of individuals that used the utterance.

udFirstUtteredDate :: Lens' UtteranceData (Maybe UTCTime) Source #

The date that the utterance was first recorded.

udCount :: Lens' UtteranceData (Maybe Int) Source #

The number of times that the utterance was processed.

udUtteranceString :: Lens' UtteranceData (Maybe Text) Source #

The text that was entered by the user or the text representation of an audio clip.

udLastUtteredDate :: Lens' UtteranceData (Maybe UTCTime) Source #

The date that the utterance was last recorded.

udDistinctUsers :: Lens' UtteranceData (Maybe Int) Source #

The total number of individuals that used the utterance.

UtteranceList

data UtteranceList Source #

Provides a list of utterances that have been made to a specific version of your bot. The list contains a maximum of 100 utterances.

See: utteranceList smart constructor.

Instances

Eq UtteranceList Source # 
Data UtteranceList Source # 

Methods

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

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

toConstr :: UtteranceList -> Constr #

dataTypeOf :: UtteranceList -> DataType #

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

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

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

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

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

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

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

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

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

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

Read UtteranceList Source # 
Show UtteranceList Source # 
Generic UtteranceList Source # 

Associated Types

type Rep UtteranceList :: * -> * #

Hashable UtteranceList Source # 
FromJSON UtteranceList Source # 
NFData UtteranceList Source # 

Methods

rnf :: UtteranceList -> () #

type Rep UtteranceList Source # 
type Rep UtteranceList = D1 (MetaData "UtteranceList" "Network.AWS.LexModels.Types.Product" "amazonka-lex-models-1.5.0-9L7od5njsTvH7y9BfUkUqe" False) (C1 (MetaCons "UtteranceList'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_ulBotVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_ulUtterances") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [UtteranceData])))))

utteranceList :: UtteranceList Source #

Creates a value of UtteranceList with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

  • ulBotVersion - The version of the bot that processed the list.
  • ulUtterances - One or more UtteranceData objects that contain information about the utterances that have been made to a bot. The maximum number of object is 100.

ulBotVersion :: Lens' UtteranceList (Maybe Text) Source #

The version of the bot that processed the list.

ulUtterances :: Lens' UtteranceList [UtteranceData] Source #

One or more UtteranceData objects that contain information about the utterances that have been made to a bot. The maximum number of object is 100.