github-0.23: 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

Instances details
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 :: forall r r'. (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

NFData Gist Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

rnf :: Gist -> () #

FromJSON Gist Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

parseJSON :: Value -> Parser Gist #

parseJSONList :: Value -> Parser [Gist] #

Binary Gist Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

put :: Gist -> Put

get :: Get Gist

putList :: [Gist] -> Put

type Rep Gist Source # 
Instance details

Defined in GitHub.Data.Gists

type Rep Gist = D1 ('MetaData "Gist" "GitHub.Data.Gists" "github-0.23-K3uQMQDn7B7DXfUjYtDWP8" 'False) (C1 ('MetaCons "Gist" 'PrefixI 'True) (((S1 ('MetaSel ('Just "gistUser") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SimpleUser) :*: (S1 ('MetaSel ('Just "gistGitPushUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 URL) :*: S1 ('MetaSel ('Just "gistUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 URL))) :*: (S1 ('MetaSel ('Just "gistDescription") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 ('MetaSel ('Just "gistCreatedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: S1 ('MetaSel ('Just "gistPublic") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool)))) :*: ((S1 ('MetaSel ('Just "gistComments") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Int) :*: (S1 ('MetaSel ('Just "gistUpdatedAt") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 UTCTime) :*: S1 ('MetaSel ('Just "gistHtmlUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 URL))) :*: (S1 ('MetaSel ('Just "gistId") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Name Gist)) :*: (S1 ('MetaSel ('Just "gistFiles") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (HashMap Text GistFile)) :*: S1 ('MetaSel ('Just "gistGitPullUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 URL))))))

data GistFile Source #

Constructors

GistFile 

Instances

Instances details
Eq GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

(==) :: GistFile -> GistFile -> Bool

(/=) :: GistFile -> GistFile -> Bool

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 :: forall r r'. (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

Methods

showsPrec :: Int -> GistFile -> ShowS

show :: GistFile -> String

showList :: [GistFile] -> ShowS

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

NFData GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

rnf :: GistFile -> () #

FromJSON GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

parseJSON :: Value -> Parser GistFile #

parseJSONList :: Value -> Parser [GistFile] #

Binary GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

put :: GistFile -> Put

get :: Get GistFile

putList :: [GistFile] -> Put

type Rep GistFile Source # 
Instance details

Defined in GitHub.Data.Gists

type Rep GistFile = D1 ('MetaData "GistFile" "GitHub.Data.Gists" "github-0.23-K3uQMQDn7B7DXfUjYtDWP8" 'False) (C1 ('MetaCons "GistFile" 'PrefixI 'True) ((S1 ('MetaSel ('Just "gistFileType") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: (S1 ('MetaSel ('Just "gistFileRawUrl") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 URL) :*: S1 ('MetaSel ('Just "gistFileSize") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Int))) :*: (S1 ('MetaSel ('Just "gistFileLanguage") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Language)) :*: (S1 ('MetaSel ('Just "gistFileFilename") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Just "gistFileContent") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 (Maybe Text))))))

data GistComment Source #

Instances

Instances details
Eq GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

(==) :: GistComment -> GistComment -> Bool

(/=) :: GistComment -> GistComment -> Bool

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 :: forall r r'. (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

Methods

showsPrec :: Int -> GistComment -> ShowS

show :: GistComment -> String

showList :: [GistComment] -> ShowS

Generic GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Associated Types

type Rep GistComment :: Type -> Type

Methods

from :: GistComment -> Rep GistComment x

to :: Rep GistComment x -> GistComment

NFData GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

rnf :: GistComment -> () #

FromJSON GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

parseJSON :: Value -> Parser GistComment #

parseJSONList :: Value -> Parser [GistComment] #

Binary GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

Methods

put :: GistComment -> Put

get :: Get GistComment

putList :: [GistComment] -> Put

type Rep GistComment Source # 
Instance details

Defined in GitHub.Data.Gists

type Rep GistComment = D1 ('MetaData "GistComment" "GitHub.Data.Gists" "github-0.23-K3uQMQDn7B7DXfUjYtDWP8" '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))))))