mismi-core-0.0.3: AWS Library

Safe HaskellNone
LanguageHaskell98

Mismi.Environment

Synopsis

Documentation

data Env #

The environment containing the parameters required to make AWS requests.

Instances
MonadAWS AWS 
Instance details

Defined in Network.AWS

Methods

liftAWS :: AWS a -> AWS a #

HasEnv Env 
Instance details

Defined in Network.AWS.Env

ToLog Env 
Instance details

Defined in Network.AWS.Env

Methods

build :: Env -> Builder #

data Region #

The available AWS regions.

Constructors

NorthVirginia

US East ('us-east-1').

Ohio

US East ('us-east-2').

NorthCalifornia

US West ('us-west-1').

Oregon

US West ('us-west-2').

Montreal

Canada ('ca-central-1').

Tokyo

Asia Pacific ('ap-northeast-1').

Seoul

Asia Pacific ('ap-northeast-2').

Mumbai

Asia Pacific ('ap-south-1').

Singapore

Asia Pacific ('ap-southeast-1').

Sydney

Asia Pacific ('ap-southeast-2').

SaoPaulo

South America ('sa-east-1').

Ireland

EU ('eu-west-1').

London

EU ('eu-west-2').

Frankfurt

EU ('eu-central-1').

GovCloud

US GovCloud ('us-gov-west-1').

GovCloudFIPS

US GovCloud FIPS (S3 Only, 'fips-us-gov-west-1').

Beijing

China ('cn-north-1').

Instances
Bounded Region 
Instance details

Defined in Network.AWS.Types

Enum Region 
Instance details

Defined in Network.AWS.Types

Eq Region 
Instance details

Defined in Network.AWS.Types

Methods

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

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

Data Region 
Instance details

Defined in Network.AWS.Types

Methods

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

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

toConstr :: Region -> Constr #

dataTypeOf :: Region -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord Region 
Instance details

Defined in Network.AWS.Types

Read Region 
Instance details

Defined in Network.AWS.Types

Show Region 
Instance details

Defined in Network.AWS.Types

Generic Region 
Instance details

Defined in Network.AWS.Types

Associated Types

type Rep Region :: Type -> Type #

Methods

from :: Region -> Rep Region x #

to :: Rep Region x -> Region #

Hashable Region 
Instance details

Defined in Network.AWS.Types

Methods

hashWithSalt :: Int -> Region -> Int #

hash :: Region -> Int #

ToJSON Region 
Instance details

Defined in Network.AWS.Types

FromJSON Region 
Instance details

Defined in Network.AWS.Types

ToText Region 
Instance details

Defined in Network.AWS.Types

Methods

toText :: Region -> Text #

FromText Region 
Instance details

Defined in Network.AWS.Types

Methods

parser :: Parser Region #

ToByteString Region 
Instance details

Defined in Network.AWS.Types

Methods

toBS :: Region -> ByteString #

ToLog Region 
Instance details

Defined in Network.AWS.Types

Methods

build :: Region -> Builder #

FromXML Region 
Instance details

Defined in Network.AWS.Types

ToXML Region 
Instance details

Defined in Network.AWS.Types

Methods

toXML :: Region -> XML #

NFData Region 
Instance details

Defined in Network.AWS.Types

Methods

rnf :: Region -> () #

type Rep Region 
Instance details

Defined in Network.AWS.Types

type Rep Region = D1 (MetaData "Region" "Network.AWS.Types" "amazonka-core-1.6.0-GPhbuo1MfRULfKX6qbmh20" False) ((((C1 (MetaCons "NorthVirginia" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ohio" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "NorthCalifornia" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Oregon" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Montreal" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Tokyo" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Seoul" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Mumbai" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "Singapore" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Sydney" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SaoPaulo" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ireland" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "London" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Frankfurt" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "GovCloud" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "GovCloudFIPS" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Beijing" PrefixI False) (U1 :: Type -> Type))))))