github-0.25: Access to the GitHub API, v3.

LicenseBSD-3-Clause
MaintainerOleg Grenrus <oleg.grenrus@iki.fi>
Safe HaskellNone
LanguageHaskell2010

GitHub.Data.Gists

Description

 

Documentation

data Gist Source #

Instances
Eq Gist Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

(==) :: Gist -> Gist -> Bool #

(/=) :: Gist -> Gist -> Bool #

Data Gist Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

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

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

toConstr :: Gist -> Constr #

dataTypeOf :: Gist -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Gist Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

showsPrec :: Int -> Gist -> ShowS #

show :: Gist -> String #

showList :: [Gist] -> ShowS #

Generic Gist Source # 
Instance details

Defined in GitHub.Data.Gists

Associated Types

type Rep Gist :: Type -> Type #

Methods

from :: Gist -> Rep Gist x #

to :: Rep Gist x -> Gist #

FromJSON Gist Source # 
Instance details

Defined in GitHub.Data.Gists

Binary Gist Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

put :: Gist -> Put #

get :: Get Gist #

putList :: [Gist] -> Put #

NFData Gist Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

rnf :: Gist -> () #

type Rep Gist Source # 
Instance details

Defined in GitHub.Data.Gists

data GistFile Source #

Instances
Eq GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

Data GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

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

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

toConstr :: GistFile -> Constr #

dataTypeOf :: GistFile -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

Generic GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

Associated Types

type Rep GistFile :: Type -> Type #

Methods

from :: GistFile -> Rep GistFile x #

to :: Rep GistFile x -> GistFile #

FromJSON GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

Binary GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

put :: GistFile -> Put #

get :: Get GistFile #

putList :: [GistFile] -> Put #

NFData GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

rnf :: GistFile -> () #

type Rep GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

data GistComment Source #

Instances
Eq GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Data GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

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

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

toConstr :: GistComment -> Constr #

dataTypeOf :: GistComment -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Show GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Generic GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Associated Types

type Rep GistComment :: Type -> Type #

FromJSON GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Binary GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

NFData GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

rnf :: GistComment -> () #

type Rep GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

type Rep GistComment = D1 (MetaData "GistComment" "GitHub.Data.Gists" "github-0.25-1HQIU2gSqEnJ7BxC9veRNX" False) (C1 (MetaCons "GistComment" PrefixI True) ((S1 (MetaSel (Just "gistCommentUser") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 SimpleUser) :*: (S1 (MetaSel (Just "gistCommentUrl") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 URL) :*: S1 (MetaSel (Just "gistCommentCreatedAt") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 UTCTime))) :*: (S1 (MetaSel (Just "gistCommentBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "gistCommentUpdatedAt") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 UTCTime) :*: S1 (MetaSel (Just "gistCommentId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Id GistComment))))))