hercules-ci-api-0.8.1.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 Source #

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

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

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

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

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

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

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

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

toList :: SimpleAttribute a -> [a] Source #

null :: SimpleAttribute a -> Bool Source #

length :: SimpleAttribute a -> Int Source #

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

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

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

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

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

Traversable SimpleAttribute Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

Functor SimpleAttribute Source # 
Instance details

Defined in Hercules.API.SimpleAttribute

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 Source #

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 -> () Source #

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

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.1.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)))