amazonka-core-1.3.3: Core data types and functionality for Amazonka libraries.

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

Network.AWS.Data.List1

Description

 

Documentation

newtype List1 a Source #

Constructors

List1 

Fields

Instances

Monad List1 Source # 

Methods

(>>=) :: List1 a -> (a -> List1 b) -> List1 b #

(>>) :: List1 a -> List1 b -> List1 b #

return :: a -> List1 a #

fail :: String -> List1 a #

Functor List1 Source # 

Methods

fmap :: (a -> b) -> List1 a -> List1 b #

(<$) :: a -> List1 b -> List1 a #

Applicative List1 Source # 

Methods

pure :: a -> List1 a #

(<*>) :: List1 (a -> b) -> List1 a -> List1 b #

(*>) :: List1 a -> List1 b -> List1 b #

(<*) :: List1 a -> List1 b -> List1 a #

Foldable List1 Source # 

Methods

fold :: Monoid m => List1 m -> m #

foldMap :: Monoid m => (a -> m) -> List1 a -> m #

foldr :: (a -> b -> b) -> b -> List1 a -> b #

foldr' :: (a -> b -> b) -> b -> List1 a -> b #

foldl :: (b -> a -> b) -> b -> List1 a -> b #

foldl' :: (b -> a -> b) -> b -> List1 a -> b #

foldr1 :: (a -> a -> a) -> List1 a -> a #

foldl1 :: (a -> a -> a) -> List1 a -> a #

toList :: List1 a -> [a] #

null :: List1 a -> Bool #

length :: List1 a -> Int #

elem :: Eq a => a -> List1 a -> Bool #

maximum :: Ord a => List1 a -> a #

minimum :: Ord a => List1 a -> a #

sum :: Num a => List1 a -> a #

product :: Num a => List1 a -> a #

Traversable List1 Source # 

Methods

traverse :: Applicative f => (a -> f b) -> List1 a -> f (List1 b) #

sequenceA :: Applicative f => List1 (f a) -> f (List1 a) #

mapM :: Monad m => (a -> m b) -> List1 a -> m (List1 b) #

sequence :: Monad m => List1 (m a) -> m (List1 a) #

IsList (List1 a) Source # 

Associated Types

type Item (List1 a) :: * #

Methods

fromList :: [Item (List1 a)] -> List1 a #

fromListN :: Int -> [Item (List1 a)] -> List1 a #

toList :: List1 a -> [Item (List1 a)] #

Eq a => Eq (List1 a) Source # 

Methods

(==) :: List1 a -> List1 a -> Bool #

(/=) :: List1 a -> List1 a -> Bool #

Data a => Data (List1 a) Source # 

Methods

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

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

toConstr :: List1 a -> Constr #

dataTypeOf :: List1 a -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord a => Ord (List1 a) Source # 

Methods

compare :: List1 a -> List1 a -> Ordering #

(<) :: List1 a -> List1 a -> Bool #

(<=) :: List1 a -> List1 a -> Bool #

(>) :: List1 a -> List1 a -> Bool #

(>=) :: List1 a -> List1 a -> Bool #

max :: List1 a -> List1 a -> List1 a #

min :: List1 a -> List1 a -> List1 a #

Read a => Read (List1 a) Source # 
Show a => Show (List1 a) Source # 

Methods

showsPrec :: Int -> List1 a -> ShowS #

show :: List1 a -> String #

showList :: [List1 a] -> ShowS #

Generic (List1 a) Source # 

Associated Types

type Rep (List1 a) :: * -> * #

Methods

from :: List1 a -> Rep (List1 a) x #

to :: Rep (List1 a) x -> List1 a #

Semigroup (List1 a) Source # 

Methods

(<>) :: List1 a -> List1 a -> List1 a #

sconcat :: NonEmpty (List1 a) -> List1 a #

stimes :: Integral b => b -> List1 a -> List1 a #

ToJSON a => ToJSON (List1 a) Source # 
FromJSON a => FromJSON (List1 a) Source # 
type Rep (List1 a) Source # 
type Rep (List1 a) = D1 (MetaData "List1" "Network.AWS.Data.List1" "amazonka-core-1.3.3-9qUf4lohbrtBuPiuejHnJD" True) (C1 (MetaCons "List1" PrefixI True) (S1 (MetaSel (Just Symbol "toNonEmpty") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (NonEmpty a))))
type Item (List1 a) Source # 
type Item (List1 a) = a

_List1 :: (Coercible a b, Coercible b a) => Iso' (List1 a) (NonEmpty b) Source #