hercules-ci-api-agent-0.4.1.0: API definition for Hercules CI Agent to talk to hercules-ci.com or Hercules CI Enterprise
Safe HaskellNone
LanguageHaskell2010

Hercules.API.Agent.Evaluate.EvaluateTask

Synopsis

Documentation

data EvaluateTask Source #

Instances

Instances details
Eq EvaluateTask Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Show EvaluateTask Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Generic EvaluateTask Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Associated Types

type Rep EvaluateTask :: Type -> Type #

ToJSON EvaluateTask Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

FromJSON EvaluateTask Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

NFData EvaluateTask Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Methods

rnf :: EvaluateTask -> () #

type Rep EvaluateTask Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

data NixPathElement a Source #

Constructors

NixPathElement 

Fields

Instances

Instances details
Functor NixPathElement Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Methods

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

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

Foldable NixPathElement Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Methods

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

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

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

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

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

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

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

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

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

toList :: NixPathElement a -> [a] #

null :: NixPathElement a -> Bool #

length :: NixPathElement a -> Int #

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

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

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

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

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

Traversable NixPathElement Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Methods

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

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

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

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

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

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

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

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Generic (NixPathElement a) Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Associated Types

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

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

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

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

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

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

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Methods

rnf :: NixPathElement a -> () #

type Rep (NixPathElement a) Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

type Rep (NixPathElement a) = D1 ('MetaData "NixPathElement" "Hercules.API.Agent.Evaluate.EvaluateTask" "hercules-ci-api-agent-0.4.1.0-LkD8FOTC8m2J63QOSeZ97w" 'False) (C1 ('MetaCons "NixPathElement" 'PrefixI 'True) (S1 ('MetaSel ('Just "prefix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "value") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

data SubPathOf a Source #

For using a path inside a source

Constructors

SubPathOf 

Fields

Instances

Instances details
Functor SubPathOf Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Methods

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

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

Foldable SubPathOf Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Methods

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

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

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

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

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

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

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

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

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

toList :: SubPathOf a -> [a] #

null :: SubPathOf a -> Bool #

length :: SubPathOf a -> Int #

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

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

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

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

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

Traversable SubPathOf Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Methods

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

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

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

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

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

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Methods

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

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

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

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Generic (SubPathOf a) Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Associated Types

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

Methods

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

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

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

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

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

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

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

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

Methods

rnf :: SubPathOf a -> () #

type Rep (SubPathOf a) Source # 
Instance details

Defined in Hercules.API.Agent.Evaluate.EvaluateTask

type Rep (SubPathOf a) = D1 ('MetaData "SubPathOf" "Hercules.API.Agent.Evaluate.EvaluateTask" "hercules-ci-api-agent-0.4.1.0-LkD8FOTC8m2J63QOSeZ97w" 'False) (C1 ('MetaCons "SubPathOf" 'PrefixI 'True) (S1 ('MetaSel ('Just "path") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "subPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text))))