hercules-ci-api-0.8.2.0: Hercules CI API definition with Servant
Safe HaskellSafe-Inferred
LanguageHaskell2010

Hercules.API.SimpleAttribute

Synopsis

Documentation

data SimpleAttribute a Source #

NOTE: Generic types must always be wrapped in a newtype, so as to avoid ambiguities in the generated schema.

Constructors

SimpleAttribute 

Fields

Instances

Instances details
Foldable SimpleAttribute Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

Methods

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

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

foldMap' :: Monoid m => (a -> m) -> SimpleAttribute a -> m #

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

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

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

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

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

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

toList :: SimpleAttribute a -> [a] #

null :: SimpleAttribute a -> Bool #

length :: SimpleAttribute a -> Int #

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

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

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

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

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

Traversable SimpleAttribute Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

Methods

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

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

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

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

Functor SimpleAttribute Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

Methods

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

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

FromJSON a => FromJSON (SimpleAttribute a) Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

ToJSON a => ToJSON (SimpleAttribute a) Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

Generic (SimpleAttribute a) Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

Associated Types

type Rep (SimpleAttribute a) :: Type -> Type #

Show a => Show (SimpleAttribute a) Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

NFData a => NFData (SimpleAttribute a) Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

Methods

rnf :: SimpleAttribute a -> () #

Eq a => Eq (SimpleAttribute a) Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

ToSchema a => ToSchema (SimpleAttribute a) Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

ToSchema a => ToSchema (SimpleAttribute a) Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

type Rep (SimpleAttribute a) Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

type Rep (SimpleAttribute a) = D1 ('MetaData "SimpleAttribute" "Hercules.API.SimpleAttribute" "hercules-ci-api-0.8.2.0-inplace" 'False) (C1 ('MetaCons "SimpleAttribute" 'PrefixI 'True) (S1 ('MetaSel ('Just "path") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Text]) :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))