Safe Haskell | None |
---|---|
Language | Haskell2010 |
GitHub.Data.Actions.WorkflowJobs
Documentation
Constructors
JobStep | |
Fields
|
Instances
Constructors
Job | |
Fields
|
Instances
FromJSON Job Source # | |||||
Defined in GitHub.Data.Actions.WorkflowJobs | |||||
Data Job Source # | |||||
Defined in GitHub.Data.Actions.WorkflowJobs Methods gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Job -> c Job # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Job # dataTypeOf :: Job -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Job) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Job) # gmapT :: (forall b. Data b => b -> b) -> Job -> Job # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Job -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Job -> r # gmapQ :: (forall d. Data d => d -> u) -> Job -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Job -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Job -> m Job # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Job -> m Job # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Job -> m Job # | |||||
Generic Job Source # | |||||
Defined in GitHub.Data.Actions.WorkflowJobs Associated Types
| |||||
Show Job Source # | |||||
Eq Job Source # | |||||
Ord Job Source # | |||||
FromJSON (WithTotalCount Job) Source # | |||||
Defined in GitHub.Data.Actions.WorkflowJobs Methods parseJSON :: Value -> Parser (WithTotalCount Job) # parseJSONList :: Value -> Parser [WithTotalCount Job] # omittedField :: Maybe (WithTotalCount Job) # | |||||
type Rep Job Source # | |||||
Defined in GitHub.Data.Actions.WorkflowJobs type Rep Job = D1 ('MetaData "Job" "GitHub.Data.Actions.WorkflowJobs" "github-0.30-7PDLbEAlB9u1WnWZZQOkWM" 'False) (C1 ('MetaCons "Job" 'PrefixI 'True) ((((S1 ('MetaSel ('Just "jobId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Id Job)) :*: S1 ('MetaSel ('Just "jobRunId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Id WorkflowRun))) :*: (S1 ('MetaSel ('Just "jobRunUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 URL) :*: (S1 ('MetaSel ('Just "jobRunAttempt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer) :*: S1 ('MetaSel ('Just "jobNodeId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)))) :*: ((S1 ('MetaSel ('Just "jobHeadSha") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "jobUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 URL)) :*: (S1 ('MetaSel ('Just "jobHtmlUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 URL) :*: (S1 ('MetaSel ('Just "jobStatus") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "jobConclusion") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))) :*: (((S1 ('MetaSel ('Just "jobStartedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: S1 ('MetaSel ('Just "jobCompletedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime)) :*: (S1 ('MetaSel ('Just "jobName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Name Job)) :*: (S1 ('MetaSel ('Just "jobSteps") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Vector JobStep)) :*: S1 ('MetaSel ('Just "jobRunCheckUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 URL)))) :*: ((S1 ('MetaSel ('Just "jobLabels") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Vector Text)) :*: S1 ('MetaSel ('Just "jobRunnerId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer)) :*: (S1 ('MetaSel ('Just "jobRunnerName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "jobRunnerGroupId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer) :*: S1 ('MetaSel ('Just "jobRunnerGroupName") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))))) |