amazonka-sagemaker-1.6.0: Amazon SageMaker Service SDK.

Copyright(c) 2013-2018 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.SageMaker.Types

Contents

Description

 

Synopsis

Service Configuration

sageMaker :: Service Source #

API version 2017-07-24 of the Amazon SageMaker Service SDK configuration.

Errors

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

You have exceeded an Amazon SageMaker resource limit. For example, you might have too many training jobs created.

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

Resource being accessed is in use.

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

Resource being access is not found.

CompressionType

data CompressionType Source #

Constructors

CTGzip 
CTNone 

Instances

Bounded CompressionType Source # 
Enum CompressionType Source # 
Eq CompressionType Source # 
Data CompressionType Source # 

Methods

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

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

toConstr :: CompressionType -> Constr #

dataTypeOf :: CompressionType -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: CompressionType -> () #

ToHeader CompressionType Source # 
ToQuery CompressionType Source # 
ToByteString CompressionType Source # 
FromText CompressionType Source # 
ToText CompressionType Source # 
type Rep CompressionType Source # 
type Rep CompressionType = D1 * (MetaData "CompressionType" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "CTGzip" PrefixI False) (U1 *)) (C1 * (MetaCons "CTNone" PrefixI False) (U1 *)))

DirectInternetAccess

data DirectInternetAccess Source #

Constructors

Disabled 
Enabled 

Instances

Bounded DirectInternetAccess Source # 
Enum DirectInternetAccess Source # 
Eq DirectInternetAccess Source # 
Data DirectInternetAccess Source # 

Methods

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

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

toConstr :: DirectInternetAccess -> Constr #

dataTypeOf :: DirectInternetAccess -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: DirectInternetAccess -> () #

ToHeader DirectInternetAccess Source # 
ToQuery DirectInternetAccess Source # 
ToByteString DirectInternetAccess Source # 
FromText DirectInternetAccess Source # 
ToText DirectInternetAccess Source # 
type Rep DirectInternetAccess Source # 
type Rep DirectInternetAccess = D1 * (MetaData "DirectInternetAccess" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "Disabled" PrefixI False) (U1 *)) (C1 * (MetaCons "Enabled" PrefixI False) (U1 *)))

EndpointConfigSortKey

data EndpointConfigSortKey Source #

Constructors

CreationTime 
Name 

Instances

Bounded EndpointConfigSortKey Source # 
Enum EndpointConfigSortKey Source # 
Eq EndpointConfigSortKey Source # 
Data EndpointConfigSortKey Source # 

Methods

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

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

toConstr :: EndpointConfigSortKey -> Constr #

dataTypeOf :: EndpointConfigSortKey -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: EndpointConfigSortKey -> () #

ToHeader EndpointConfigSortKey Source # 
ToQuery EndpointConfigSortKey Source # 
ToByteString EndpointConfigSortKey Source # 
FromText EndpointConfigSortKey Source # 
ToText EndpointConfigSortKey Source # 
type Rep EndpointConfigSortKey Source # 
type Rep EndpointConfigSortKey = D1 * (MetaData "EndpointConfigSortKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "CreationTime" PrefixI False) (U1 *)) (C1 * (MetaCons "Name" PrefixI False) (U1 *)))

EndpointSortKey

data EndpointSortKey Source #

Instances

Bounded EndpointSortKey Source # 
Enum EndpointSortKey Source # 
Eq EndpointSortKey Source # 
Data EndpointSortKey Source # 

Methods

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

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

toConstr :: EndpointSortKey -> Constr #

dataTypeOf :: EndpointSortKey -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: EndpointSortKey -> () #

ToHeader EndpointSortKey Source # 
ToQuery EndpointSortKey Source # 
ToByteString EndpointSortKey Source # 
FromText EndpointSortKey Source # 
ToText EndpointSortKey Source # 
type Rep EndpointSortKey Source # 
type Rep EndpointSortKey = D1 * (MetaData "EndpointSortKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "ESKCreationTime" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "ESKName" PrefixI False) (U1 *)) (C1 * (MetaCons "ESKStatus" PrefixI False) (U1 *))))

EndpointStatus

data EndpointStatus Source #

Instances

Bounded EndpointStatus Source # 
Enum EndpointStatus Source # 
Eq EndpointStatus Source # 
Data EndpointStatus Source # 

Methods

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

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

toConstr :: EndpointStatus -> Constr #

dataTypeOf :: EndpointStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EndpointStatus Source # 
Read EndpointStatus Source # 
Show EndpointStatus Source # 
Generic EndpointStatus Source # 

Associated Types

type Rep EndpointStatus :: * -> * #

Hashable EndpointStatus Source # 
ToJSON EndpointStatus Source # 
FromJSON EndpointStatus Source # 
NFData EndpointStatus Source # 

Methods

rnf :: EndpointStatus -> () #

ToHeader EndpointStatus Source # 
ToQuery EndpointStatus Source # 
ToByteString EndpointStatus Source # 
FromText EndpointStatus Source # 
ToText EndpointStatus Source # 
type Rep EndpointStatus Source # 
type Rep EndpointStatus = D1 * (MetaData "EndpointStatus" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * ((:+:) * (C1 * (MetaCons "Creating" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "Deleting" PrefixI False) (U1 *)) (C1 * (MetaCons "Failed" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "InService" PrefixI False) (U1 *)) (C1 * (MetaCons "OutOfService" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "RollingBack" PrefixI False) (U1 *)) (C1 * (MetaCons "Updating" PrefixI False) (U1 *)))))

InstanceType

data InstanceType Source #

Instances

Bounded InstanceType Source # 
Enum InstanceType Source # 
Eq InstanceType Source # 
Data InstanceType Source # 

Methods

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

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

toConstr :: InstanceType -> Constr #

dataTypeOf :: InstanceType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord InstanceType Source # 
Read InstanceType Source # 
Show InstanceType Source # 
Generic InstanceType Source # 

Associated Types

type Rep InstanceType :: * -> * #

Hashable InstanceType Source # 
ToJSON InstanceType Source # 
FromJSON InstanceType Source # 
NFData InstanceType Source # 

Methods

rnf :: InstanceType -> () #

ToHeader InstanceType Source # 
ToQuery InstanceType Source # 
ToByteString InstanceType Source # 
FromText InstanceType Source # 
ToText InstanceType Source # 

Methods

toText :: InstanceType -> Text #

type Rep InstanceType Source # 
type Rep InstanceType = D1 * (MetaData "InstanceType" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "Ml_M4_10XLarge" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "Ml_M4_16XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "Ml_M4_2XLarge" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "Ml_M4_4XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "Ml_M4_XLarge" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "Ml_P2_16XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "Ml_P2_8XLarge" PrefixI False) (U1 *))))) ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "Ml_P2_XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "Ml_P3_16XLarge" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "Ml_P3_2XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "Ml_P3_8XLarge" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "Ml_T2_2XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "Ml_T2_Large" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "Ml_T2_Medium" PrefixI False) (U1 *)) (C1 * (MetaCons "Ml_T2_XLarge" PrefixI False) (U1 *))))))

ModelSortKey

data ModelSortKey Source #

Constructors

MSKCreationTime 
MSKName 

Instances

Bounded ModelSortKey Source # 
Enum ModelSortKey Source # 
Eq ModelSortKey Source # 
Data ModelSortKey Source # 

Methods

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

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

toConstr :: ModelSortKey -> Constr #

dataTypeOf :: ModelSortKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ModelSortKey Source # 
Read ModelSortKey Source # 
Show ModelSortKey Source # 
Generic ModelSortKey Source # 

Associated Types

type Rep ModelSortKey :: * -> * #

Hashable ModelSortKey Source # 
ToJSON ModelSortKey Source # 
NFData ModelSortKey Source # 

Methods

rnf :: ModelSortKey -> () #

ToHeader ModelSortKey Source # 
ToQuery ModelSortKey Source # 
ToByteString ModelSortKey Source # 
FromText ModelSortKey Source # 
ToText ModelSortKey Source # 

Methods

toText :: ModelSortKey -> Text #

type Rep ModelSortKey Source # 
type Rep ModelSortKey = D1 * (MetaData "ModelSortKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "MSKCreationTime" PrefixI False) (U1 *)) (C1 * (MetaCons "MSKName" PrefixI False) (U1 *)))

NotebookInstanceLifecycleConfigSortKey

data NotebookInstanceLifecycleConfigSortKey Source #

Instances

Bounded NotebookInstanceLifecycleConfigSortKey Source # 
Enum NotebookInstanceLifecycleConfigSortKey Source # 
Eq NotebookInstanceLifecycleConfigSortKey Source # 
Data NotebookInstanceLifecycleConfigSortKey Source # 

Methods

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

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

toConstr :: NotebookInstanceLifecycleConfigSortKey -> Constr #

dataTypeOf :: NotebookInstanceLifecycleConfigSortKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NotebookInstanceLifecycleConfigSortKey Source # 
Read NotebookInstanceLifecycleConfigSortKey Source # 
Show NotebookInstanceLifecycleConfigSortKey Source # 
Generic NotebookInstanceLifecycleConfigSortKey Source # 
Hashable NotebookInstanceLifecycleConfigSortKey Source # 
ToJSON NotebookInstanceLifecycleConfigSortKey Source # 
NFData NotebookInstanceLifecycleConfigSortKey Source # 
ToHeader NotebookInstanceLifecycleConfigSortKey Source # 
ToQuery NotebookInstanceLifecycleConfigSortKey Source # 
ToByteString NotebookInstanceLifecycleConfigSortKey Source # 
FromText NotebookInstanceLifecycleConfigSortKey Source # 
ToText NotebookInstanceLifecycleConfigSortKey Source # 
type Rep NotebookInstanceLifecycleConfigSortKey Source # 
type Rep NotebookInstanceLifecycleConfigSortKey = D1 * (MetaData "NotebookInstanceLifecycleConfigSortKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "NILCSKCreationTime" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "NILCSKLastModifiedTime" PrefixI False) (U1 *)) (C1 * (MetaCons "NILCSKName" PrefixI False) (U1 *))))

NotebookInstanceLifecycleConfigSortOrder

data NotebookInstanceLifecycleConfigSortOrder Source #

Instances

Bounded NotebookInstanceLifecycleConfigSortOrder Source # 
Enum NotebookInstanceLifecycleConfigSortOrder Source # 
Eq NotebookInstanceLifecycleConfigSortOrder Source # 
Data NotebookInstanceLifecycleConfigSortOrder Source # 

Methods

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

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

toConstr :: NotebookInstanceLifecycleConfigSortOrder -> Constr #

dataTypeOf :: NotebookInstanceLifecycleConfigSortOrder -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NotebookInstanceLifecycleConfigSortOrder Source # 
Read NotebookInstanceLifecycleConfigSortOrder Source # 
Show NotebookInstanceLifecycleConfigSortOrder Source # 
Generic NotebookInstanceLifecycleConfigSortOrder Source # 
Hashable NotebookInstanceLifecycleConfigSortOrder Source # 
ToJSON NotebookInstanceLifecycleConfigSortOrder Source # 
NFData NotebookInstanceLifecycleConfigSortOrder Source # 
ToHeader NotebookInstanceLifecycleConfigSortOrder Source # 
ToQuery NotebookInstanceLifecycleConfigSortOrder Source # 
ToByteString NotebookInstanceLifecycleConfigSortOrder Source # 
FromText NotebookInstanceLifecycleConfigSortOrder Source # 
ToText NotebookInstanceLifecycleConfigSortOrder Source # 
type Rep NotebookInstanceLifecycleConfigSortOrder Source # 
type Rep NotebookInstanceLifecycleConfigSortOrder = D1 * (MetaData "NotebookInstanceLifecycleConfigSortOrder" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "NILCSOAscending" PrefixI False) (U1 *)) (C1 * (MetaCons "NILCSODescending" PrefixI False) (U1 *)))

NotebookInstanceSortKey

data NotebookInstanceSortKey Source #

Instances

Bounded NotebookInstanceSortKey Source # 
Enum NotebookInstanceSortKey Source # 
Eq NotebookInstanceSortKey Source # 
Data NotebookInstanceSortKey Source # 

Methods

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

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

toConstr :: NotebookInstanceSortKey -> Constr #

dataTypeOf :: NotebookInstanceSortKey -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: NotebookInstanceSortKey -> () #

ToHeader NotebookInstanceSortKey Source # 
ToQuery NotebookInstanceSortKey Source # 
ToByteString NotebookInstanceSortKey Source # 
FromText NotebookInstanceSortKey Source # 
ToText NotebookInstanceSortKey Source # 
type Rep NotebookInstanceSortKey Source # 
type Rep NotebookInstanceSortKey = D1 * (MetaData "NotebookInstanceSortKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "NISKCreationTime" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "NISKName" PrefixI False) (U1 *)) (C1 * (MetaCons "NISKStatus" PrefixI False) (U1 *))))

NotebookInstanceSortOrder

data NotebookInstanceSortOrder Source #

Constructors

Ascending 
Descending 

Instances

Bounded NotebookInstanceSortOrder Source # 
Enum NotebookInstanceSortOrder Source # 
Eq NotebookInstanceSortOrder Source # 
Data NotebookInstanceSortOrder Source # 

Methods

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

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

toConstr :: NotebookInstanceSortOrder -> Constr #

dataTypeOf :: NotebookInstanceSortOrder -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord NotebookInstanceSortOrder Source # 
Read NotebookInstanceSortOrder Source # 
Show NotebookInstanceSortOrder Source # 
Generic NotebookInstanceSortOrder Source # 
Hashable NotebookInstanceSortOrder Source # 
ToJSON NotebookInstanceSortOrder Source # 
NFData NotebookInstanceSortOrder Source # 
ToHeader NotebookInstanceSortOrder Source # 
ToQuery NotebookInstanceSortOrder Source # 
ToByteString NotebookInstanceSortOrder Source # 
FromText NotebookInstanceSortOrder Source # 
ToText NotebookInstanceSortOrder Source # 
type Rep NotebookInstanceSortOrder Source # 
type Rep NotebookInstanceSortOrder = D1 * (MetaData "NotebookInstanceSortOrder" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "Ascending" PrefixI False) (U1 *)) (C1 * (MetaCons "Descending" PrefixI False) (U1 *)))

NotebookInstanceStatus

data NotebookInstanceStatus Source #

Instances

Bounded NotebookInstanceStatus Source # 
Enum NotebookInstanceStatus Source # 
Eq NotebookInstanceStatus Source # 
Data NotebookInstanceStatus Source # 

Methods

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

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

toConstr :: NotebookInstanceStatus -> Constr #

dataTypeOf :: NotebookInstanceStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: NotebookInstanceStatus -> () #

ToHeader NotebookInstanceStatus Source # 
ToQuery NotebookInstanceStatus Source # 
ToByteString NotebookInstanceStatus Source # 
FromText NotebookInstanceStatus Source # 
ToText NotebookInstanceStatus Source # 
type Rep NotebookInstanceStatus Source # 
type Rep NotebookInstanceStatus = D1 * (MetaData "NotebookInstanceStatus" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * ((:+:) * (C1 * (MetaCons "NISDeleting" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "NISFailed" PrefixI False) (U1 *)) (C1 * (MetaCons "NISInService" PrefixI False) (U1 *)))) ((:+:) * (C1 * (MetaCons "NISPending" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "NISStopped" PrefixI False) (U1 *)) (C1 * (MetaCons "NISStopping" PrefixI False) (U1 *)))))

OrderKey

data OrderKey Source #

Constructors

OKAscending 
OKDescending 

Instances

Bounded OrderKey Source # 
Enum OrderKey Source # 
Eq OrderKey Source # 
Data OrderKey Source # 

Methods

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

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

toConstr :: OrderKey -> Constr #

dataTypeOf :: OrderKey -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord OrderKey Source # 
Read OrderKey Source # 
Show OrderKey Source # 
Generic OrderKey Source # 

Associated Types

type Rep OrderKey :: * -> * #

Methods

from :: OrderKey -> Rep OrderKey x #

to :: Rep OrderKey x -> OrderKey #

Hashable OrderKey Source # 

Methods

hashWithSalt :: Int -> OrderKey -> Int #

hash :: OrderKey -> Int #

ToJSON OrderKey Source # 
NFData OrderKey Source # 

Methods

rnf :: OrderKey -> () #

ToHeader OrderKey Source # 

Methods

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

ToQuery OrderKey Source # 
ToByteString OrderKey Source # 

Methods

toBS :: OrderKey -> ByteString #

FromText OrderKey Source # 
ToText OrderKey Source # 

Methods

toText :: OrderKey -> Text #

type Rep OrderKey Source # 
type Rep OrderKey = D1 * (MetaData "OrderKey" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "OKAscending" PrefixI False) (U1 *)) (C1 * (MetaCons "OKDescending" PrefixI False) (U1 *)))

ProductionVariantInstanceType

data ProductionVariantInstanceType Source #

Instances

Bounded ProductionVariantInstanceType Source # 
Enum ProductionVariantInstanceType Source # 
Eq ProductionVariantInstanceType Source # 
Data ProductionVariantInstanceType Source # 

Methods

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

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

toConstr :: ProductionVariantInstanceType -> Constr #

dataTypeOf :: ProductionVariantInstanceType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ProductionVariantInstanceType Source # 
Read ProductionVariantInstanceType Source # 
Show ProductionVariantInstanceType Source # 
Generic ProductionVariantInstanceType Source # 
Hashable ProductionVariantInstanceType Source # 
ToJSON ProductionVariantInstanceType Source # 
FromJSON ProductionVariantInstanceType Source # 
NFData ProductionVariantInstanceType Source # 
ToHeader ProductionVariantInstanceType Source # 
ToQuery ProductionVariantInstanceType Source # 
ToByteString ProductionVariantInstanceType Source # 
FromText ProductionVariantInstanceType Source # 
ToText ProductionVariantInstanceType Source # 
type Rep ProductionVariantInstanceType Source # 
type Rep ProductionVariantInstanceType = D1 * (MetaData "ProductionVariantInstanceType" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * ((:+:) * ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "PVITMl_C4_2XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_C4_4XLarge" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "PVITMl_C4_8XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_C4_Large" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "PVITMl_C4_XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_C5_18XLarge" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "PVITMl_C5_2XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_C5_4XLarge" PrefixI False) (U1 *))))) ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "PVITMl_C5_9XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_C5_Large" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "PVITMl_C5_XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_M4_10XLarge" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "PVITMl_M4_16XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_M4_2XLarge" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "PVITMl_M4_4XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_M4_XLarge" PrefixI False) (U1 *)))))) ((:+:) * ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "PVITMl_M5_12XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_M5_24XLarge" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "PVITMl_M5_2XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_M5_4XLarge" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "PVITMl_M5_Large" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_M5_XLarge" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "PVITMl_P2_16XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_P2_8XLarge" PrefixI False) (U1 *))))) ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "PVITMl_P2_XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_P3_16XLarge" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "PVITMl_P3_2XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_P3_8XLarge" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "PVITMl_T2_2XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_T2_Large" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "PVITMl_T2_Medium" PrefixI False) (U1 *)) (C1 * (MetaCons "PVITMl_T2_XLarge" PrefixI False) (U1 *)))))))

RecordWrapper

data RecordWrapper Source #

Constructors

None 
RecordIO 

Instances

Bounded RecordWrapper Source # 
Enum RecordWrapper Source # 
Eq RecordWrapper Source # 
Data RecordWrapper Source # 

Methods

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

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

toConstr :: RecordWrapper -> Constr #

dataTypeOf :: RecordWrapper -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord RecordWrapper Source # 
Read RecordWrapper Source # 
Show RecordWrapper Source # 
Generic RecordWrapper Source # 

Associated Types

type Rep RecordWrapper :: * -> * #

Hashable RecordWrapper Source # 
ToJSON RecordWrapper Source # 
FromJSON RecordWrapper Source # 
NFData RecordWrapper Source # 

Methods

rnf :: RecordWrapper -> () #

ToHeader RecordWrapper Source # 
ToQuery RecordWrapper Source # 
ToByteString RecordWrapper Source # 
FromText RecordWrapper Source # 
ToText RecordWrapper Source # 

Methods

toText :: RecordWrapper -> Text #

type Rep RecordWrapper Source # 
type Rep RecordWrapper = D1 * (MetaData "RecordWrapper" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "None" PrefixI False) (U1 *)) (C1 * (MetaCons "RecordIO" PrefixI False) (U1 *)))

S3DataDistribution

data S3DataDistribution Source #

Instances

Bounded S3DataDistribution Source # 
Enum S3DataDistribution Source # 
Eq S3DataDistribution Source # 
Data S3DataDistribution Source # 

Methods

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

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

toConstr :: S3DataDistribution -> Constr #

dataTypeOf :: S3DataDistribution -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: S3DataDistribution -> () #

ToHeader S3DataDistribution Source # 
ToQuery S3DataDistribution Source # 
ToByteString S3DataDistribution Source # 
FromText S3DataDistribution Source # 
ToText S3DataDistribution Source # 
type Rep S3DataDistribution Source # 
type Rep S3DataDistribution = D1 * (MetaData "S3DataDistribution" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "FullyReplicated" PrefixI False) (U1 *)) (C1 * (MetaCons "ShardedByS3Key" PrefixI False) (U1 *)))

S3DataType

data S3DataType Source #

Constructors

ManifestFile 
S3Prefix 

Instances

Bounded S3DataType Source # 
Enum S3DataType Source # 
Eq S3DataType Source # 
Data S3DataType Source # 

Methods

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

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

toConstr :: S3DataType -> Constr #

dataTypeOf :: S3DataType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord S3DataType Source # 
Read S3DataType Source # 
Show S3DataType Source # 
Generic S3DataType Source # 

Associated Types

type Rep S3DataType :: * -> * #

Hashable S3DataType Source # 
ToJSON S3DataType Source # 
FromJSON S3DataType Source # 
NFData S3DataType Source # 

Methods

rnf :: S3DataType -> () #

ToHeader S3DataType Source # 
ToQuery S3DataType Source # 
ToByteString S3DataType Source # 
FromText S3DataType Source # 
ToText S3DataType Source # 

Methods

toText :: S3DataType -> Text #

type Rep S3DataType Source # 
type Rep S3DataType = D1 * (MetaData "S3DataType" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "ManifestFile" PrefixI False) (U1 *)) (C1 * (MetaCons "S3Prefix" PrefixI False) (U1 *)))

SecondaryStatus

data SecondaryStatus Source #

Instances

Bounded SecondaryStatus Source # 
Enum SecondaryStatus Source # 
Eq SecondaryStatus Source # 
Data SecondaryStatus Source # 

Methods

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

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

toConstr :: SecondaryStatus -> Constr #

dataTypeOf :: SecondaryStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SecondaryStatus Source # 
Read SecondaryStatus Source # 
Show SecondaryStatus Source # 
Generic SecondaryStatus Source # 
Hashable SecondaryStatus Source # 
FromJSON SecondaryStatus Source # 
NFData SecondaryStatus Source # 

Methods

rnf :: SecondaryStatus -> () #

ToHeader SecondaryStatus Source # 
ToQuery SecondaryStatus Source # 
ToByteString SecondaryStatus Source # 
FromText SecondaryStatus Source # 
ToText SecondaryStatus Source # 
type Rep SecondaryStatus Source # 
type Rep SecondaryStatus = D1 * (MetaData "SecondaryStatus" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "SSCompleted" PrefixI False) (U1 *)) (C1 * (MetaCons "SSDownloading" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "SSFailed" PrefixI False) (U1 *)) (C1 * (MetaCons "SSMaxRuntimeExceeded" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "SSStarting" PrefixI False) (U1 *)) (C1 * (MetaCons "SSStopped" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "SSStopping" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "SSTraining" PrefixI False) (U1 *)) (C1 * (MetaCons "SSUploading" PrefixI False) (U1 *))))))

SortBy

data SortBy Source #

Instances

Bounded SortBy Source # 
Enum SortBy Source # 
Eq SortBy Source # 

Methods

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

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

Data SortBy Source # 

Methods

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

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

toConstr :: SortBy -> Constr #

dataTypeOf :: SortBy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SortBy Source # 
Read SortBy Source # 
Show SortBy Source # 
Generic SortBy Source # 

Associated Types

type Rep SortBy :: * -> * #

Methods

from :: SortBy -> Rep SortBy x #

to :: Rep SortBy x -> SortBy #

Hashable SortBy Source # 

Methods

hashWithSalt :: Int -> SortBy -> Int #

hash :: SortBy -> Int #

ToJSON SortBy Source # 
NFData SortBy Source # 

Methods

rnf :: SortBy -> () #

ToHeader SortBy Source # 

Methods

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

ToQuery SortBy Source # 
ToByteString SortBy Source # 

Methods

toBS :: SortBy -> ByteString #

FromText SortBy Source # 

Methods

parser :: Parser SortBy #

ToText SortBy Source # 

Methods

toText :: SortBy -> Text #

type Rep SortBy Source # 
type Rep SortBy = D1 * (MetaData "SortBy" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "SBCreationTime" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "SBName" PrefixI False) (U1 *)) (C1 * (MetaCons "SBStatus" PrefixI False) (U1 *))))

SortOrder

data SortOrder Source #

Constructors

SOAscending 
SODescending 

Instances

Bounded SortOrder Source # 
Enum SortOrder Source # 
Eq SortOrder Source # 
Data SortOrder Source # 

Methods

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

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

toConstr :: SortOrder -> Constr #

dataTypeOf :: SortOrder -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SortOrder Source # 
Read SortOrder Source # 
Show SortOrder Source # 
Generic SortOrder Source # 

Associated Types

type Rep SortOrder :: * -> * #

Hashable SortOrder Source # 
ToJSON SortOrder Source # 
NFData SortOrder Source # 

Methods

rnf :: SortOrder -> () #

ToHeader SortOrder Source # 
ToQuery SortOrder Source # 
ToByteString SortOrder Source # 

Methods

toBS :: SortOrder -> ByteString #

FromText SortOrder Source # 
ToText SortOrder Source # 

Methods

toText :: SortOrder -> Text #

type Rep SortOrder Source # 
type Rep SortOrder = D1 * (MetaData "SortOrder" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "SOAscending" PrefixI False) (U1 *)) (C1 * (MetaCons "SODescending" PrefixI False) (U1 *)))

TrainingInputMode

data TrainingInputMode Source #

Constructors

File 
Pipe 

Instances

Bounded TrainingInputMode Source # 
Enum TrainingInputMode Source # 
Eq TrainingInputMode Source # 
Data TrainingInputMode Source # 

Methods

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

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

toConstr :: TrainingInputMode -> Constr #

dataTypeOf :: TrainingInputMode -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: TrainingInputMode -> () #

ToHeader TrainingInputMode Source # 
ToQuery TrainingInputMode Source # 
ToByteString TrainingInputMode Source # 
FromText TrainingInputMode Source # 
ToText TrainingInputMode Source # 
type Rep TrainingInputMode Source # 
type Rep TrainingInputMode = D1 * (MetaData "TrainingInputMode" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * (C1 * (MetaCons "File" PrefixI False) (U1 *)) (C1 * (MetaCons "Pipe" PrefixI False) (U1 *)))

TrainingInstanceType

data TrainingInstanceType Source #

Instances

Bounded TrainingInstanceType Source # 
Enum TrainingInstanceType Source # 
Eq TrainingInstanceType Source # 
Data TrainingInstanceType Source # 

Methods

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

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

toConstr :: TrainingInstanceType -> Constr #

dataTypeOf :: TrainingInstanceType -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: TrainingInstanceType -> () #

ToHeader TrainingInstanceType Source # 
ToQuery TrainingInstanceType Source # 
ToByteString TrainingInstanceType Source # 
FromText TrainingInstanceType Source # 
ToText TrainingInstanceType Source # 
type Rep TrainingInstanceType Source # 
type Rep TrainingInstanceType = D1 * (MetaData "TrainingInstanceType" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "TITMl_C4_2XLarge" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "TITMl_C4_4XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "TITMl_C4_8XLarge" PrefixI False) (U1 *)))) ((:+:) * (C1 * (MetaCons "TITMl_C4_XLarge" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "TITMl_C5_18XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "TITMl_C5_2XLarge" PrefixI False) (U1 *))))) ((:+:) * ((:+:) * (C1 * (MetaCons "TITMl_C5_4XLarge" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "TITMl_C5_9XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "TITMl_C5_XLarge" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "TITMl_M4_10XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "TITMl_M4_16XLarge" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "TITMl_M4_2XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "TITMl_M4_4XLarge" PrefixI False) (U1 *)))))) ((:+:) * ((:+:) * ((:+:) * (C1 * (MetaCons "TITMl_M4_XLarge" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "TITMl_M5_12XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "TITMl_M5_24XLarge" PrefixI False) (U1 *)))) ((:+:) * (C1 * (MetaCons "TITMl_M5_2XLarge" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "TITMl_M5_4XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "TITMl_M5_Large" PrefixI False) (U1 *))))) ((:+:) * ((:+:) * (C1 * (MetaCons "TITMl_M5_XLarge" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "TITMl_P2_16XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "TITMl_P2_8XLarge" PrefixI False) (U1 *)))) ((:+:) * ((:+:) * (C1 * (MetaCons "TITMl_P2_XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "TITMl_P3_16XLarge" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "TITMl_P3_2XLarge" PrefixI False) (U1 *)) (C1 * (MetaCons "TITMl_P3_8XLarge" PrefixI False) (U1 *)))))))

TrainingJobStatus

data TrainingJobStatus Source #

Instances

Bounded TrainingJobStatus Source # 
Enum TrainingJobStatus Source # 
Eq TrainingJobStatus Source # 
Data TrainingJobStatus Source # 

Methods

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

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

toConstr :: TrainingJobStatus -> Constr #

dataTypeOf :: TrainingJobStatus -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: TrainingJobStatus -> () #

ToHeader TrainingJobStatus Source # 
ToQuery TrainingJobStatus Source # 
ToByteString TrainingJobStatus Source # 
FromText TrainingJobStatus Source # 
ToText TrainingJobStatus Source # 
type Rep TrainingJobStatus Source # 
type Rep TrainingJobStatus = D1 * (MetaData "TrainingJobStatus" "Network.AWS.SageMaker.Types.Sum" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) ((:+:) * ((:+:) * (C1 * (MetaCons "TJSCompleted" PrefixI False) (U1 *)) (C1 * (MetaCons "TJSFailed" PrefixI False) (U1 *))) ((:+:) * (C1 * (MetaCons "TJSInProgress" PrefixI False) (U1 *)) ((:+:) * (C1 * (MetaCons "TJSStopped" PrefixI False) (U1 *)) (C1 * (MetaCons "TJSStopping" PrefixI False) (U1 *)))))

AlgorithmSpecification

data AlgorithmSpecification Source #

Specifies the training algorithm to use in a CreateTrainingJob request.

For more information about algorithms provided by Amazon SageMaker, see Algorithms . For information about using your own algorithms, see 'your-algorithms' .

See: algorithmSpecification smart constructor.

Instances

Eq AlgorithmSpecification Source # 
Data AlgorithmSpecification Source # 

Methods

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

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

toConstr :: AlgorithmSpecification -> Constr #

dataTypeOf :: AlgorithmSpecification -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: AlgorithmSpecification -> () #

type Rep AlgorithmSpecification Source # 
type Rep AlgorithmSpecification = D1 * (MetaData "AlgorithmSpecification" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "AlgorithmSpecification'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_asTrainingImage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) (S1 * (MetaSel (Just Symbol "_asTrainingInputMode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * TrainingInputMode))))

algorithmSpecification Source #

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

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

  • asTrainingImage - The registry path of the Docker image that contains the training algorithm. For information about docker registry paths for built-in algorithms, see 'sagemaker-algo-docker-registry-paths' .
  • asTrainingInputMode - The input mode that the algorithm supports. For the input modes that Amazon SageMaker algorithms support, see Algorithms . If an algorithm supports the File input mode, Amazon SageMaker downloads the training data from S3 to the provisioned ML storage Volume, and mounts the directory to docker volume for training container. If an algorithm supports the Pipe input mode, Amazon SageMaker streams data directly from S3 to the container. In File mode, make sure you provision ML storage volume with sufficient capacity to accommodate the data download from S3. In addition to the training data, the ML storage volume also stores the output model. The algorithm container use ML storage volume to also store intermediate information, if any. For distributed algorithms using File mode, training data is distributed uniformly, and your training duration is predictable if the input data objects size is approximately same. Amazon SageMaker does not split the files any further for model training. If the object sizes are skewed, training won't be optimal as the data distribution is also skewed where one host in a training cluster is overloaded, thus becoming bottleneck in training.

asTrainingImage :: Lens' AlgorithmSpecification Text Source #

The registry path of the Docker image that contains the training algorithm. For information about docker registry paths for built-in algorithms, see 'sagemaker-algo-docker-registry-paths' .

asTrainingInputMode :: Lens' AlgorithmSpecification TrainingInputMode Source #

The input mode that the algorithm supports. For the input modes that Amazon SageMaker algorithms support, see Algorithms . If an algorithm supports the File input mode, Amazon SageMaker downloads the training data from S3 to the provisioned ML storage Volume, and mounts the directory to docker volume for training container. If an algorithm supports the Pipe input mode, Amazon SageMaker streams data directly from S3 to the container. In File mode, make sure you provision ML storage volume with sufficient capacity to accommodate the data download from S3. In addition to the training data, the ML storage volume also stores the output model. The algorithm container use ML storage volume to also store intermediate information, if any. For distributed algorithms using File mode, training data is distributed uniformly, and your training duration is predictable if the input data objects size is approximately same. Amazon SageMaker does not split the files any further for model training. If the object sizes are skewed, training won't be optimal as the data distribution is also skewed where one host in a training cluster is overloaded, thus becoming bottleneck in training.

Channel

data Channel Source #

A channel is a named input source that training algorithms can consume.

See: channel smart constructor.

Instances

Eq Channel Source # 

Methods

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

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

Data Channel Source # 

Methods

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

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

toConstr :: Channel -> Constr #

dataTypeOf :: Channel -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Channel Source # 
Show Channel Source # 
Generic Channel Source # 

Associated Types

type Rep Channel :: * -> * #

Methods

from :: Channel -> Rep Channel x #

to :: Rep Channel x -> Channel #

Hashable Channel Source # 

Methods

hashWithSalt :: Int -> Channel -> Int #

hash :: Channel -> Int #

ToJSON Channel Source # 
FromJSON Channel Source # 
NFData Channel Source # 

Methods

rnf :: Channel -> () #

type Rep Channel Source # 
type Rep Channel = D1 * (MetaData "Channel" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "Channel'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_cRecordWrapperType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe RecordWrapper))) (S1 * (MetaSel (Just Symbol "_cCompressionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe CompressionType)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_cContentType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) ((:*:) * (S1 * (MetaSel (Just Symbol "_cChannelName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) (S1 * (MetaSel (Just Symbol "_cDataSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * DataSource))))))

channel Source #

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

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

  • cRecordWrapperType - Specify RecordIO as the value when input data is in raw format but the training algorithm requires the RecordIO format, in which caseAmazon SageMaker wraps each individual S3 object in a RecordIO record. If the input data is already in RecordIO format, you don't need to set this attribute. For more information, see Create a Dataset Using RecordIO . In FILE mode, leave this field unset or set it to None.
  • cCompressionType - If training data is compressed, the compression type. The default value is None . CompressionType is used only in PIPE input mode. In FILE mode, leave this field unset or set it to None.
  • cContentType - The MIME type of the data.
  • cChannelName - The name of the channel.
  • cDataSource - The location of the channel data.

cRecordWrapperType :: Lens' Channel (Maybe RecordWrapper) Source #

Specify RecordIO as the value when input data is in raw format but the training algorithm requires the RecordIO format, in which caseAmazon SageMaker wraps each individual S3 object in a RecordIO record. If the input data is already in RecordIO format, you don't need to set this attribute. For more information, see Create a Dataset Using RecordIO . In FILE mode, leave this field unset or set it to None.

cCompressionType :: Lens' Channel (Maybe CompressionType) Source #

If training data is compressed, the compression type. The default value is None . CompressionType is used only in PIPE input mode. In FILE mode, leave this field unset or set it to None.

cContentType :: Lens' Channel (Maybe Text) Source #

The MIME type of the data.

cChannelName :: Lens' Channel Text Source #

The name of the channel.

cDataSource :: Lens' Channel DataSource Source #

The location of the channel data.

ContainerDefinition

data ContainerDefinition Source #

Describes the container, as part of model definition.

See: containerDefinition smart constructor.

Instances

Eq ContainerDefinition Source # 
Data ContainerDefinition Source # 

Methods

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

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

toConstr :: ContainerDefinition -> Constr #

dataTypeOf :: ContainerDefinition -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: ContainerDefinition -> () #

type Rep ContainerDefinition Source # 
type Rep ContainerDefinition = D1 * (MetaData "ContainerDefinition" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "ContainerDefinition'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_cdModelDataURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_cdEnvironment") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe (Map Text Text))))) ((:*:) * (S1 * (MetaSel (Just Symbol "_cdContainerHostname") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_cdImage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)))))

containerDefinition Source #

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

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

  • cdModelDataURL - The S3 path where the model artifacts, which result from model training, are stored. This path must point to a single gzip compressed tar archive (.tar.gz suffix).
  • cdEnvironment - The environment variables to set in the Docker container. Each key and value in the Environment string to string map can have length of up to 1024. We support up to 16 entries in the map.
  • cdContainerHostname - The DNS host name for the container after Amazon SageMaker deploys it.
  • cdImage - The Amazon EC2 Container Registry (Amazon ECR) path where inference code is stored. If you are using your own custom algorithm instead of an algorithm provided by Amazon SageMaker, the inference code must meet Amazon SageMaker requirements. For more information, see Using Your Own Algorithms with Amazon SageMaker

cdModelDataURL :: Lens' ContainerDefinition (Maybe Text) Source #

The S3 path where the model artifacts, which result from model training, are stored. This path must point to a single gzip compressed tar archive (.tar.gz suffix).

cdEnvironment :: Lens' ContainerDefinition (HashMap Text Text) Source #

The environment variables to set in the Docker container. Each key and value in the Environment string to string map can have length of up to 1024. We support up to 16 entries in the map.

cdContainerHostname :: Lens' ContainerDefinition (Maybe Text) Source #

The DNS host name for the container after Amazon SageMaker deploys it.

cdImage :: Lens' ContainerDefinition Text Source #

The Amazon EC2 Container Registry (Amazon ECR) path where inference code is stored. If you are using your own custom algorithm instead of an algorithm provided by Amazon SageMaker, the inference code must meet Amazon SageMaker requirements. For more information, see Using Your Own Algorithms with Amazon SageMaker

DataSource

data DataSource Source #

Describes the location of the channel data.

See: dataSource smart constructor.

Instances

Eq DataSource Source # 
Data DataSource Source # 

Methods

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

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

toConstr :: DataSource -> Constr #

dataTypeOf :: DataSource -> DataType #

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

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

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

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

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

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

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

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

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

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

Read DataSource Source # 
Show DataSource Source # 
Generic DataSource Source # 

Associated Types

type Rep DataSource :: * -> * #

Hashable DataSource Source # 
ToJSON DataSource Source # 
FromJSON DataSource Source # 
NFData DataSource Source # 

Methods

rnf :: DataSource -> () #

type Rep DataSource Source # 
type Rep DataSource = D1 * (MetaData "DataSource" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" True) (C1 * (MetaCons "DataSource'" PrefixI True) (S1 * (MetaSel (Just Symbol "_dsS3DataSource") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * S3DataSource)))

dataSource Source #

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

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

  • dsS3DataSource - The S3 location of the data source that is associated with a channel.

dsS3DataSource :: Lens' DataSource S3DataSource Source #

The S3 location of the data source that is associated with a channel.

DesiredWeightAndCapacity

data DesiredWeightAndCapacity Source #

Specifies weight and capacity values for a production variant.

See: desiredWeightAndCapacity smart constructor.

Instances

Eq DesiredWeightAndCapacity Source # 
Data DesiredWeightAndCapacity Source # 

Methods

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

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

toConstr :: DesiredWeightAndCapacity -> Constr #

dataTypeOf :: DesiredWeightAndCapacity -> DataType #

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

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

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

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

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

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

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

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

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

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

Read DesiredWeightAndCapacity Source # 
Show DesiredWeightAndCapacity Source # 
Generic DesiredWeightAndCapacity Source # 
Hashable DesiredWeightAndCapacity Source # 
ToJSON DesiredWeightAndCapacity Source # 
NFData DesiredWeightAndCapacity Source # 
type Rep DesiredWeightAndCapacity Source # 
type Rep DesiredWeightAndCapacity = D1 * (MetaData "DesiredWeightAndCapacity" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "DesiredWeightAndCapacity'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_dwacDesiredInstanceCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Nat))) ((:*:) * (S1 * (MetaSel (Just Symbol "_dwacDesiredWeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Double))) (S1 * (MetaSel (Just Symbol "_dwacVariantName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)))))

desiredWeightAndCapacity Source #

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

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

dwacVariantName :: Lens' DesiredWeightAndCapacity Text Source #

The name of the variant to update.

EndpointConfigSummary

data EndpointConfigSummary Source #

Provides summary information for an endpoint configuration.

See: endpointConfigSummary smart constructor.

Instances

Eq EndpointConfigSummary Source # 
Data EndpointConfigSummary Source # 

Methods

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

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

toConstr :: EndpointConfigSummary -> Constr #

dataTypeOf :: EndpointConfigSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: EndpointConfigSummary -> () #

type Rep EndpointConfigSummary Source # 
type Rep EndpointConfigSummary = D1 * (MetaData "EndpointConfigSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "EndpointConfigSummary'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_ecsEndpointConfigName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) ((:*:) * (S1 * (MetaSel (Just Symbol "_ecsEndpointConfigARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) (S1 * (MetaSel (Just Symbol "_ecsCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * POSIX)))))

endpointConfigSummary Source #

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

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

ecsEndpointConfigName :: Lens' EndpointConfigSummary Text Source #

The name of the endpoint configuration.

ecsEndpointConfigARN :: Lens' EndpointConfigSummary Text Source #

The Amazon Resource Name (ARN) of the endpoint configuration.

ecsCreationTime :: Lens' EndpointConfigSummary UTCTime Source #

A timestamp that shows when the endpoint configuration was created.

EndpointSummary

data EndpointSummary Source #

Provides summary information for an endpoint.

See: endpointSummary smart constructor.

Instances

Eq EndpointSummary Source # 
Data EndpointSummary Source # 

Methods

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

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

toConstr :: EndpointSummary -> Constr #

dataTypeOf :: EndpointSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: EndpointSummary -> () #

type Rep EndpointSummary Source # 
type Rep EndpointSummary = D1 * (MetaData "EndpointSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "EndpointSummary'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_esEndpointName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) (S1 * (MetaSel (Just Symbol "_esEndpointARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text))) ((:*:) * (S1 * (MetaSel (Just Symbol "_esCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * POSIX)) ((:*:) * (S1 * (MetaSel (Just Symbol "_esLastModifiedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * POSIX)) (S1 * (MetaSel (Just Symbol "_esEndpointStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * EndpointStatus))))))

endpointSummary Source #

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

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

esEndpointName :: Lens' EndpointSummary Text Source #

The name of the endpoint.

esEndpointARN :: Lens' EndpointSummary Text Source #

The Amazon Resource Name (ARN) of the endpoint.

esCreationTime :: Lens' EndpointSummary UTCTime Source #

A timestamp that shows when the endpoint was created.

esLastModifiedTime :: Lens' EndpointSummary UTCTime Source #

A timestamp that shows when the endpoint was last modified.

ModelArtifacts

data ModelArtifacts Source #

Provides information about the location that is configured for storing model artifacts.

See: modelArtifacts smart constructor.

Instances

Eq ModelArtifacts Source # 
Data ModelArtifacts Source # 

Methods

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

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

toConstr :: ModelArtifacts -> Constr #

dataTypeOf :: ModelArtifacts -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ModelArtifacts Source # 
Show ModelArtifacts Source # 
Generic ModelArtifacts Source # 

Associated Types

type Rep ModelArtifacts :: * -> * #

Hashable ModelArtifacts Source # 
FromJSON ModelArtifacts Source # 
NFData ModelArtifacts Source # 

Methods

rnf :: ModelArtifacts -> () #

type Rep ModelArtifacts Source # 
type Rep ModelArtifacts = D1 * (MetaData "ModelArtifacts" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" True) (C1 * (MetaCons "ModelArtifacts'" PrefixI True) (S1 * (MetaSel (Just Symbol "_maS3ModelArtifacts") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Text)))

modelArtifacts Source #

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

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

  • maS3ModelArtifacts - The path of the S3 object that contains the model artifacts. For example, s3:/bucket-namekeynameprefix/model.tar.gz .

maS3ModelArtifacts :: Lens' ModelArtifacts Text Source #

The path of the S3 object that contains the model artifacts. For example, s3:/bucket-namekeynameprefix/model.tar.gz .

ModelSummary

data ModelSummary Source #

Provides summary information about a model.

See: modelSummary smart constructor.

Instances

Eq ModelSummary Source # 
Data ModelSummary Source # 

Methods

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

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

toConstr :: ModelSummary -> Constr #

dataTypeOf :: ModelSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ModelSummary Source # 
Show ModelSummary Source # 
Generic ModelSummary Source # 

Associated Types

type Rep ModelSummary :: * -> * #

Hashable ModelSummary Source # 
FromJSON ModelSummary Source # 
NFData ModelSummary Source # 

Methods

rnf :: ModelSummary -> () #

type Rep ModelSummary Source # 
type Rep ModelSummary = D1 * (MetaData "ModelSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "ModelSummary'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_msModelName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) ((:*:) * (S1 * (MetaSel (Just Symbol "_msModelARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) (S1 * (MetaSel (Just Symbol "_msCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * POSIX)))))

modelSummary Source #

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

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

  • msModelName - The name of the model that you want a summary for.
  • msModelARN - The Amazon Resource Name (ARN) of the model.
  • msCreationTime - A timestamp that indicates when the model was created.

msModelName :: Lens' ModelSummary Text Source #

The name of the model that you want a summary for.

msModelARN :: Lens' ModelSummary Text Source #

The Amazon Resource Name (ARN) of the model.

msCreationTime :: Lens' ModelSummary UTCTime Source #

A timestamp that indicates when the model was created.

NotebookInstanceLifecycleConfigSummary

data NotebookInstanceLifecycleConfigSummary Source #

Provides a summary of a notebook instance lifecycle configuration.

See: notebookInstanceLifecycleConfigSummary smart constructor.

Instances

Eq NotebookInstanceLifecycleConfigSummary Source # 
Data NotebookInstanceLifecycleConfigSummary Source # 

Methods

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

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

toConstr :: NotebookInstanceLifecycleConfigSummary -> Constr #

dataTypeOf :: NotebookInstanceLifecycleConfigSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Read NotebookInstanceLifecycleConfigSummary Source # 
Show NotebookInstanceLifecycleConfigSummary Source # 
Generic NotebookInstanceLifecycleConfigSummary Source # 
Hashable NotebookInstanceLifecycleConfigSummary Source # 
FromJSON NotebookInstanceLifecycleConfigSummary Source # 
NFData NotebookInstanceLifecycleConfigSummary Source # 
type Rep NotebookInstanceLifecycleConfigSummary Source # 
type Rep NotebookInstanceLifecycleConfigSummary = D1 * (MetaData "NotebookInstanceLifecycleConfigSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "NotebookInstanceLifecycleConfigSummary'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_nilcsCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe POSIX))) (S1 * (MetaSel (Just Symbol "_nilcsLastModifiedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe POSIX)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_nilcsNotebookInstanceLifecycleConfigName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) (S1 * (MetaSel (Just Symbol "_nilcsNotebookInstanceLifecycleConfigARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)))))

notebookInstanceLifecycleConfigSummary Source #

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

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

nilcsCreationTime :: Lens' NotebookInstanceLifecycleConfigSummary (Maybe UTCTime) Source #

A timestamp that tells when the lifecycle configuration was created.

nilcsLastModifiedTime :: Lens' NotebookInstanceLifecycleConfigSummary (Maybe UTCTime) Source #

A timestamp that tells when the lifecycle configuration was last modified.

nilcsNotebookInstanceLifecycleConfigARN :: Lens' NotebookInstanceLifecycleConfigSummary Text Source #

The Amazon Resource Name (ARN) of the lifecycle configuration.

NotebookInstanceLifecycleHook

data NotebookInstanceLifecycleHook Source #

Contains the notebook instance lifecycle configuration script.

Each lifecycle configuration script has a limit of 16384 characters.

The value of the > PATH environment variable that is available to both scripts is sbin:bin:usrsbin:usr/bin .

View CloudWatch Logs for notebook instance lifecycle configurations in log group awssagemaker/NotebookInstances in log stream [notebook-instance-name]/[LifecycleConfigHook] .

Lifecycle configuration scripts cannot run for longer than 5 minutes. If a script runs for longer than 5 minutes, it fails and the notebook instance is not created or started.

For information about notebook instance lifestyle configurations, see 'notebook-lifecycle-config' .

See: notebookInstanceLifecycleHook smart constructor.

Instances

Eq NotebookInstanceLifecycleHook Source # 
Data NotebookInstanceLifecycleHook Source # 

Methods

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

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

toConstr :: NotebookInstanceLifecycleHook -> Constr #

dataTypeOf :: NotebookInstanceLifecycleHook -> DataType #

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

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

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

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

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

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

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

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

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

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

Read NotebookInstanceLifecycleHook Source # 
Show NotebookInstanceLifecycleHook Source # 
Generic NotebookInstanceLifecycleHook Source # 
Hashable NotebookInstanceLifecycleHook Source # 
ToJSON NotebookInstanceLifecycleHook Source # 
FromJSON NotebookInstanceLifecycleHook Source # 
NFData NotebookInstanceLifecycleHook Source # 
type Rep NotebookInstanceLifecycleHook Source # 
type Rep NotebookInstanceLifecycleHook = D1 * (MetaData "NotebookInstanceLifecycleHook" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" True) (C1 * (MetaCons "NotebookInstanceLifecycleHook'" PrefixI True) (S1 * (MetaSel (Just Symbol "_nilhContent") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (Maybe Text))))

notebookInstanceLifecycleHook :: NotebookInstanceLifecycleHook Source #

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

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

  • nilhContent - A base64-encoded string that contains a shell script for a notebook instance lifecycle configuration.

nilhContent :: Lens' NotebookInstanceLifecycleHook (Maybe Text) Source #

A base64-encoded string that contains a shell script for a notebook instance lifecycle configuration.

NotebookInstanceSummary

data NotebookInstanceSummary Source #

Provides summary information for an Amazon SageMaker notebook instance.

See: notebookInstanceSummary smart constructor.

Instances

Eq NotebookInstanceSummary Source # 
Data NotebookInstanceSummary Source # 

Methods

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

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

toConstr :: NotebookInstanceSummary -> Constr #

dataTypeOf :: NotebookInstanceSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: NotebookInstanceSummary -> () #

type Rep NotebookInstanceSummary Source # 
type Rep NotebookInstanceSummary = D1 * (MetaData "NotebookInstanceSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "NotebookInstanceSummary'" PrefixI True) ((:*:) * ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_nisCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe POSIX))) (S1 * (MetaSel (Just Symbol "_nisURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_nisLastModifiedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe POSIX))) (S1 * (MetaSel (Just Symbol "_nisInstanceType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe InstanceType))))) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_nisNotebookInstanceStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe NotebookInstanceStatus))) (S1 * (MetaSel (Just Symbol "_nisNotebookInstanceLifecycleConfigName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_nisNotebookInstanceName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) (S1 * (MetaSel (Just Symbol "_nisNotebookInstanceARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text))))))

notebookInstanceSummary Source #

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

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

  • nisCreationTime - A timestamp that shows when the notebook instance was created.
  • nisURL - The URL that you use to connect to the Jupyter instance running in your notebook instance.
  • nisLastModifiedTime - A timestamp that shows when the notebook instance was last modified.
  • nisInstanceType - The type of ML compute instance that the notebook instance is running on.
  • nisNotebookInstanceStatus - The status of the notebook instance.
  • nisNotebookInstanceLifecycleConfigName - The name of a notebook instance lifecycle configuration associated with this notebook instance. For information about notebook instance lifestyle configurations, see 'notebook-lifecycle-config' .
  • nisNotebookInstanceName - The name of the notebook instance that you want a summary for.
  • nisNotebookInstanceARN - The Amazon Resource Name (ARN) of the notebook instance.

nisCreationTime :: Lens' NotebookInstanceSummary (Maybe UTCTime) Source #

A timestamp that shows when the notebook instance was created.

nisURL :: Lens' NotebookInstanceSummary (Maybe Text) Source #

The URL that you use to connect to the Jupyter instance running in your notebook instance.

nisLastModifiedTime :: Lens' NotebookInstanceSummary (Maybe UTCTime) Source #

A timestamp that shows when the notebook instance was last modified.

nisInstanceType :: Lens' NotebookInstanceSummary (Maybe InstanceType) Source #

The type of ML compute instance that the notebook instance is running on.

nisNotebookInstanceLifecycleConfigName :: Lens' NotebookInstanceSummary (Maybe Text) Source #

The name of a notebook instance lifecycle configuration associated with this notebook instance. For information about notebook instance lifestyle configurations, see 'notebook-lifecycle-config' .

nisNotebookInstanceName :: Lens' NotebookInstanceSummary Text Source #

The name of the notebook instance that you want a summary for.

nisNotebookInstanceARN :: Lens' NotebookInstanceSummary Text Source #

The Amazon Resource Name (ARN) of the notebook instance.

OutputDataConfig

data OutputDataConfig Source #

Provides information about how to store model training results (model artifacts).

See: outputDataConfig smart constructor.

Instances

Eq OutputDataConfig Source # 
Data OutputDataConfig Source # 

Methods

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

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

toConstr :: OutputDataConfig -> Constr #

dataTypeOf :: OutputDataConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: OutputDataConfig -> () #

type Rep OutputDataConfig Source # 
type Rep OutputDataConfig = D1 * (MetaData "OutputDataConfig" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "OutputDataConfig'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_odcKMSKeyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_odcS3OutputPath") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text))))

outputDataConfig Source #

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

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

  • odcKMSKeyId - The AWS Key Management Service (AWS KMS) key that Amazon SageMaker uses to encrypt the model artifacts at rest using Amazon S3 server-side encryption.
  • odcS3OutputPath - Identifies the S3 path where you want Amazon SageMaker to store the model artifacts. For example, s3:/bucket-namekey-name-prefix .

odcKMSKeyId :: Lens' OutputDataConfig (Maybe Text) Source #

The AWS Key Management Service (AWS KMS) key that Amazon SageMaker uses to encrypt the model artifacts at rest using Amazon S3 server-side encryption.

odcS3OutputPath :: Lens' OutputDataConfig Text Source #

Identifies the S3 path where you want Amazon SageMaker to store the model artifacts. For example, s3:/bucket-namekey-name-prefix .

ProductionVariant

data ProductionVariant Source #

Identifies a model that you want to host and the resources to deploy for hosting it. If you are deploying multiple models, tell Amazon SageMaker how to distribute traffic among the models by specifying variant weights.

See: productionVariant smart constructor.

Instances

Eq ProductionVariant Source # 
Data ProductionVariant Source # 

Methods

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

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

toConstr :: ProductionVariant -> Constr #

dataTypeOf :: ProductionVariant -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: ProductionVariant -> () #

type Rep ProductionVariant Source # 
type Rep ProductionVariant = D1 * (MetaData "ProductionVariant" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "ProductionVariant'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_pvInitialVariantWeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Double))) (S1 * (MetaSel (Just Symbol "_pvVariantName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text))) ((:*:) * (S1 * (MetaSel (Just Symbol "_pvModelName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) ((:*:) * (S1 * (MetaSel (Just Symbol "_pvInitialInstanceCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Nat)) (S1 * (MetaSel (Just Symbol "_pvInstanceType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * ProductionVariantInstanceType))))))

productionVariant Source #

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

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

  • pvInitialVariantWeight - Determines initial traffic distribution among all of the models that you specify in the endpoint configuration. The traffic to a production variant is determined by the ratio of the VariantWeight to the sum of all VariantWeight values across all ProductionVariants. If unspecified, it defaults to 1.0.
  • pvVariantName - The name of the production variant.
  • pvModelName - The name of the model that you want to host. This is the name that you specified when creating the model.
  • pvInitialInstanceCount - Number of instances to launch initially.
  • pvInstanceType - The ML compute instance type.

pvInitialVariantWeight :: Lens' ProductionVariant (Maybe Double) Source #

Determines initial traffic distribution among all of the models that you specify in the endpoint configuration. The traffic to a production variant is determined by the ratio of the VariantWeight to the sum of all VariantWeight values across all ProductionVariants. If unspecified, it defaults to 1.0.

pvVariantName :: Lens' ProductionVariant Text Source #

The name of the production variant.

pvModelName :: Lens' ProductionVariant Text Source #

The name of the model that you want to host. This is the name that you specified when creating the model.

pvInitialInstanceCount :: Lens' ProductionVariant Natural Source #

Number of instances to launch initially.

ProductionVariantSummary

data ProductionVariantSummary Source #

Describes weight and capacities for a production variant associated with an endpoint. If you sent a request to the UpdateEndpointWeightsAndCapacities API and the endpoint status is Updating , you get different desired and current values.

See: productionVariantSummary smart constructor.

Instances

Eq ProductionVariantSummary Source # 
Data ProductionVariantSummary Source # 

Methods

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

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

toConstr :: ProductionVariantSummary -> Constr #

dataTypeOf :: ProductionVariantSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ProductionVariantSummary Source # 
Show ProductionVariantSummary Source # 
Generic ProductionVariantSummary Source # 
Hashable ProductionVariantSummary Source # 
FromJSON ProductionVariantSummary Source # 
NFData ProductionVariantSummary Source # 
type Rep ProductionVariantSummary Source # 
type Rep ProductionVariantSummary = D1 * (MetaData "ProductionVariantSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "ProductionVariantSummary'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_pvsDesiredInstanceCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Nat))) (S1 * (MetaSel (Just Symbol "_pvsDesiredWeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Double)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_pvsCurrentWeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Double))) ((:*:) * (S1 * (MetaSel (Just Symbol "_pvsCurrentInstanceCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Nat))) (S1 * (MetaSel (Just Symbol "_pvsVariantName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text))))))

productionVariantSummary Source #

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

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

pvsDesiredInstanceCount :: Lens' ProductionVariantSummary (Maybe Natural) Source #

The number of instances requested in the UpdateEndpointWeightsAndCapacities request.

pvsDesiredWeight :: Lens' ProductionVariantSummary (Maybe Double) Source #

The requested weight, as specified in the UpdateEndpointWeightsAndCapacities request.

pvsCurrentWeight :: Lens' ProductionVariantSummary (Maybe Double) Source #

The weight associated with the variant.

pvsCurrentInstanceCount :: Lens' ProductionVariantSummary (Maybe Natural) Source #

The number of instances associated with the variant.

ResourceConfig

data ResourceConfig Source #

Describes the resources, including ML compute instances and ML storage volumes, to use for model training.

See: resourceConfig smart constructor.

Instances

Eq ResourceConfig Source # 
Data ResourceConfig Source # 

Methods

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

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

toConstr :: ResourceConfig -> Constr #

dataTypeOf :: ResourceConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Read ResourceConfig Source # 
Show ResourceConfig Source # 
Generic ResourceConfig Source # 

Associated Types

type Rep ResourceConfig :: * -> * #

Hashable ResourceConfig Source # 
ToJSON ResourceConfig Source # 
FromJSON ResourceConfig Source # 
NFData ResourceConfig Source # 

Methods

rnf :: ResourceConfig -> () #

type Rep ResourceConfig Source # 
type Rep ResourceConfig = D1 * (MetaData "ResourceConfig" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "ResourceConfig'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_rcVolumeKMSKeyId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe Text))) (S1 * (MetaSel (Just Symbol "_rcInstanceType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * TrainingInstanceType))) ((:*:) * (S1 * (MetaSel (Just Symbol "_rcInstanceCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Nat)) (S1 * (MetaSel (Just Symbol "_rcVolumeSizeInGB") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Nat)))))

resourceConfig Source #

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

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

  • rcVolumeKMSKeyId - The Amazon Resource Name (ARN) of a AWS Key Management Service key that Amazon SageMaker uses to encrypt data on the storage volume attached to the ML compute instance(s) that run the training job.
  • rcInstanceType - The ML compute instance type.
  • rcInstanceCount - The number of ML compute instances to use. For distributed training, provide a value greater than 1.
  • rcVolumeSizeInGB - The size of the ML storage volume that you want to provision. ML storage volumes store model artifacts and incremental states. Training algorithms might also use the ML storage volume for scratch space. If you want to store the training data in the ML storage volume, choose File as the TrainingInputMode in the algorithm specification. You must specify sufficient ML storage for your scenario.

rcVolumeKMSKeyId :: Lens' ResourceConfig (Maybe Text) Source #

The Amazon Resource Name (ARN) of a AWS Key Management Service key that Amazon SageMaker uses to encrypt data on the storage volume attached to the ML compute instance(s) that run the training job.

rcInstanceCount :: Lens' ResourceConfig Natural Source #

The number of ML compute instances to use. For distributed training, provide a value greater than 1.

rcVolumeSizeInGB :: Lens' ResourceConfig Natural Source #

The size of the ML storage volume that you want to provision. ML storage volumes store model artifacts and incremental states. Training algorithms might also use the ML storage volume for scratch space. If you want to store the training data in the ML storage volume, choose File as the TrainingInputMode in the algorithm specification. You must specify sufficient ML storage for your scenario.

S3DataSource

data S3DataSource Source #

Describes the S3 data source.

See: s3DataSource smart constructor.

Instances

Eq S3DataSource Source # 
Data S3DataSource Source # 

Methods

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

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

toConstr :: S3DataSource -> Constr #

dataTypeOf :: S3DataSource -> DataType #

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

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

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

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

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

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

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

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

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

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

Read S3DataSource Source # 
Show S3DataSource Source # 
Generic S3DataSource Source # 

Associated Types

type Rep S3DataSource :: * -> * #

Hashable S3DataSource Source # 
ToJSON S3DataSource Source # 
FromJSON S3DataSource Source # 
NFData S3DataSource Source # 

Methods

rnf :: S3DataSource -> () #

type Rep S3DataSource Source # 
type Rep S3DataSource = D1 * (MetaData "S3DataSource" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "S3DataSource'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_sdsS3DataDistributionType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe S3DataDistribution))) ((:*:) * (S1 * (MetaSel (Just Symbol "_sdsS3DataType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * S3DataType)) (S1 * (MetaSel (Just Symbol "_sdsS3URI") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)))))

s3DataSource Source #

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

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

  • sdsS3DataDistributionType - If you want Amazon SageMaker to replicate the entire dataset on each ML compute instance that is launched for model training, specify FullyReplicated . If you want Amazon SageMaker to replicate a subset of data on each ML compute instance that is launched for model training, specify ShardedByS3Key . If there are n ML compute instances launched for a training job, each instance gets approximately 1/n of the number of S3 objects. In this case, model training on each machine uses only the subset of training data. Don't choose more ML compute instances for training than available S3 objects. If you do, some nodes won't get any data and you will pay for nodes that aren't getting any training data. This applies in both FILE and PIPE modes. Keep this in mind when developing algorithms. In distributed training, where you use multiple ML compute EC2 instances, you might choose ShardedByS3Key . If the algorithm requires copying training data to the ML storage volume (when TrainingInputMode is set to File ), this copies 1/n of the number of objects.
  • sdsS3DataType - If you choose S3Prefix , S3Uri identifies a key name prefix. Amazon SageMaker uses all objects with the specified key name prefix for model training. If you choose ManifestFile , S3Uri identifies an object that is a manifest file containing a list of object keys that you want Amazon SageMaker to use for model training.
  • sdsS3URI - Depending on the value specified for the S3DataType , identifies either a key name prefix or a manifest. For example: * A key name prefix might look like this: s3:/bucketnameexampleprefix . * A manifest might look like this: s3:/bucketnameexample.manifest The manifest is an S3 object which is a JSON file with the following format: [ {"prefix": "s3:/customer_bucketsomeprefix"}, "relativepathto/custdata-1", "relativepathcustdata-2", ... ] The preceding JSON matches the following s3Uris : s3:/customer_bucketsomeprefixrelativepathto/custdata-1 s3:/customer_bucketsomeprefixrelativepathcustdata-1 ... The complete set of s3uris in this manifest constitutes the input data for the channel for this datasource. The object that each s3uris points to must readable by the IAM role that Amazon SageMaker uses to perform tasks on your behalf.

sdsS3DataDistributionType :: Lens' S3DataSource (Maybe S3DataDistribution) Source #

If you want Amazon SageMaker to replicate the entire dataset on each ML compute instance that is launched for model training, specify FullyReplicated . If you want Amazon SageMaker to replicate a subset of data on each ML compute instance that is launched for model training, specify ShardedByS3Key . If there are n ML compute instances launched for a training job, each instance gets approximately 1/n of the number of S3 objects. In this case, model training on each machine uses only the subset of training data. Don't choose more ML compute instances for training than available S3 objects. If you do, some nodes won't get any data and you will pay for nodes that aren't getting any training data. This applies in both FILE and PIPE modes. Keep this in mind when developing algorithms. In distributed training, where you use multiple ML compute EC2 instances, you might choose ShardedByS3Key . If the algorithm requires copying training data to the ML storage volume (when TrainingInputMode is set to File ), this copies 1/n of the number of objects.

sdsS3DataType :: Lens' S3DataSource S3DataType Source #

If you choose S3Prefix , S3Uri identifies a key name prefix. Amazon SageMaker uses all objects with the specified key name prefix for model training. If you choose ManifestFile , S3Uri identifies an object that is a manifest file containing a list of object keys that you want Amazon SageMaker to use for model training.

sdsS3URI :: Lens' S3DataSource Text Source #

Depending on the value specified for the S3DataType , identifies either a key name prefix or a manifest. For example: * A key name prefix might look like this: s3:/bucketnameexampleprefix . * A manifest might look like this: s3:/bucketnameexample.manifest The manifest is an S3 object which is a JSON file with the following format: [ {"prefix": "s3:/customer_bucketsomeprefix"}, "relativepathto/custdata-1", "relativepathcustdata-2", ... ] The preceding JSON matches the following s3Uris : s3:/customer_bucketsomeprefixrelativepathto/custdata-1 s3:/customer_bucketsomeprefixrelativepathcustdata-1 ... The complete set of s3uris in this manifest constitutes the input data for the channel for this datasource. The object that each s3uris points to must readable by the IAM role that Amazon SageMaker uses to perform tasks on your behalf.

StoppingCondition

data StoppingCondition Source #

Specifies how long model training can run. When model training reaches the limit, Amazon SageMaker ends the training job. Use this API to cap model training cost.

To stop a job, Amazon SageMaker sends the algorithm the SIGTERM signal, which delays job termination for120 seconds. Algorithms might use this 120-second window to save the model artifacts, so the results of training is not lost.

Training algorithms provided by Amazon SageMaker automatically saves the intermediate results of a model training job (it is best effort case, as model might not be ready to save as some stages, for example training just started). This intermediate data is a valid model artifact. You can use it to create a model (CreateModel ).

See: stoppingCondition smart constructor.

Instances

Eq StoppingCondition Source # 
Data StoppingCondition Source # 

Methods

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

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

toConstr :: StoppingCondition -> Constr #

dataTypeOf :: StoppingCondition -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: StoppingCondition -> () #

type Rep StoppingCondition Source # 
type Rep StoppingCondition = D1 * (MetaData "StoppingCondition" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" True) (C1 * (MetaCons "StoppingCondition'" PrefixI True) (S1 * (MetaSel (Just Symbol "_scMaxRuntimeInSeconds") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * (Maybe Nat))))

stoppingCondition :: StoppingCondition Source #

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

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

  • scMaxRuntimeInSeconds - The maximum length of time, in seconds, that the training job can run. If model training does not complete during this time, Amazon SageMaker ends the job. If value is not specified, default value is 1 day. Maximum value is 5 days.

scMaxRuntimeInSeconds :: Lens' StoppingCondition (Maybe Natural) Source #

The maximum length of time, in seconds, that the training job can run. If model training does not complete during this time, Amazon SageMaker ends the job. If value is not specified, default value is 1 day. Maximum value is 5 days.

Tag

data Tag Source #

Describes a tag.

See: tag smart constructor.

Instances

Eq Tag Source # 

Methods

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

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

Data Tag Source # 

Methods

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

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

toConstr :: Tag -> Constr #

dataTypeOf :: Tag -> DataType #

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

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

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

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

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

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

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

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

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

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

Read Tag Source # 
Show Tag Source # 

Methods

showsPrec :: Int -> Tag -> ShowS #

show :: Tag -> String #

showList :: [Tag] -> ShowS #

Generic Tag Source # 

Associated Types

type Rep Tag :: * -> * #

Methods

from :: Tag -> Rep Tag x #

to :: Rep Tag x -> Tag #

Hashable Tag Source # 

Methods

hashWithSalt :: Int -> Tag -> Int #

hash :: Tag -> Int #

ToJSON Tag Source # 
FromJSON Tag Source # 
NFData Tag Source # 

Methods

rnf :: Tag -> () #

type Rep Tag Source # 
type Rep Tag = D1 * (MetaData "Tag" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "Tag'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_tagKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) (S1 * (MetaSel (Just Symbol "_tagValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text))))

tag Source #

Arguments

:: Text

tagKey

-> Text

tagValue

-> Tag 

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

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

tagKey :: Lens' Tag Text Source #

The tag key.

tagValue :: Lens' Tag Text Source #

The tag value.

TrainingJobSummary

data TrainingJobSummary Source #

Provides summary information about a training job.

See: trainingJobSummary smart constructor.

Instances

Eq TrainingJobSummary Source # 
Data TrainingJobSummary Source # 

Methods

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

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

toConstr :: TrainingJobSummary -> Constr #

dataTypeOf :: TrainingJobSummary -> DataType #

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

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

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

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

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

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

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

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

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

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

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

Methods

rnf :: TrainingJobSummary -> () #

type Rep TrainingJobSummary Source # 
type Rep TrainingJobSummary = D1 * (MetaData "TrainingJobSummary" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "TrainingJobSummary'" PrefixI True) ((:*:) * ((:*:) * (S1 * (MetaSel (Just Symbol "_tjsTrainingEndTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe POSIX))) ((:*:) * (S1 * (MetaSel (Just Symbol "_tjsLastModifiedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (Maybe POSIX))) (S1 * (MetaSel (Just Symbol "_tjsTrainingJobName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)))) ((:*:) * (S1 * (MetaSel (Just Symbol "_tjsTrainingJobARN") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * Text)) ((:*:) * (S1 * (MetaSel (Just Symbol "_tjsCreationTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * POSIX)) (S1 * (MetaSel (Just Symbol "_tjsTrainingJobStatus") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * TrainingJobStatus))))))

trainingJobSummary Source #

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

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

tjsTrainingEndTime :: Lens' TrainingJobSummary (Maybe UTCTime) Source #

A timestamp that shows when the training job ended. This field is set only if the training job has one of the terminal statuses (Completed , Failed , or Stopped ).

tjsLastModifiedTime :: Lens' TrainingJobSummary (Maybe UTCTime) Source #

Timestamp when the training job was last modified.

tjsTrainingJobName :: Lens' TrainingJobSummary Text Source #

The name of the training job that you want a summary for.

tjsTrainingJobARN :: Lens' TrainingJobSummary Text Source #

The Amazon Resource Name (ARN) of the training job.

tjsCreationTime :: Lens' TrainingJobSummary UTCTime Source #

A timestamp that shows when the training job was created.

VPCConfig

data VPCConfig Source #

Specifies a VPC that your training jobs and hosted models have access to. Control access to and from your training and model containers by configuring the VPC. For more information, see 'host-vpc' and 'train-vpc' .

See: vpcConfig smart constructor.

Instances

Eq VPCConfig Source # 
Data VPCConfig Source # 

Methods

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

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

toConstr :: VPCConfig -> Constr #

dataTypeOf :: VPCConfig -> DataType #

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

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

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

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

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

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

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

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

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

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

Read VPCConfig Source # 
Show VPCConfig Source # 
Generic VPCConfig Source # 

Associated Types

type Rep VPCConfig :: * -> * #

Hashable VPCConfig Source # 
ToJSON VPCConfig Source # 
FromJSON VPCConfig Source # 
NFData VPCConfig Source # 

Methods

rnf :: VPCConfig -> () #

type Rep VPCConfig Source # 
type Rep VPCConfig = D1 * (MetaData "VPCConfig" "Network.AWS.SageMaker.Types.Product" "amazonka-sagemaker-1.6.0-9oNc2IB3ZCo9VZHXZi5zcA" False) (C1 * (MetaCons "VPCConfig'" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "_vcSecurityGroupIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (List1 Text))) (S1 * (MetaSel (Just Symbol "_vcSubnets") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 * (List1 Text)))))

vpcConfig Source #

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

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

  • vcSecurityGroupIds - The VPC security group IDs, in the form sg-xxxxxxxx. Specify the security groups for the VPC that is specified in the Subnets field.
  • vcSubnets - The ID of the subnets in the VPC to which you want to connect your training job or model.

vcSecurityGroupIds :: Lens' VPCConfig (NonEmpty Text) Source #

The VPC security group IDs, in the form sg-xxxxxxxx. Specify the security groups for the VPC that is specified in the Subnets field.

vcSubnets :: Lens' VPCConfig (NonEmpty Text) Source #

The ID of the subnets in the VPC to which you want to connect your training job or model.