generic-data-0.6.0.1: Deriving instances with GHC.Generics and related utilities

Safe HaskellSafe
LanguageHaskell2010

Generic.Data.Internal.Show

Synopsis

Documentation

gshowsPrec :: (Generic a, GShow0 (Rep a)) => Int -> a -> ShowS Source #

Generic showsPrec.

instance Show MyType where
  showsPrec = gshowsPrec

type GShow0 = GShow Proxy Source #

Generic representation of Show types.

gliftShowsPrec :: (Generic1 f, GShow1 (Rep1 f)) => (Int -> a -> ShowS) -> ([a] -> ShowS) -> Int -> f a -> ShowS Source #

Generic liftShowsPrec.

gLiftPrecShows :: GShow1 f => (Int -> a -> ShowS) -> ([a] -> ShowS) -> f a -> PrecShowS Source #

type ShowsPrec a = (Int -> a -> ShowS, [a] -> ShowS) Source #

type GShow1 = GShow Identity Source #

Generic representation of Show1 types.

class GShow p f where Source #

Methods

gPrecShows :: p (ShowsPrec a) -> f a -> PrecShowS Source #

Instances
GShow p (V1 :: Type -> Type) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShows :: p (ShowsPrec a) -> V1 a -> PrecShowS Source #

(GShow p f, GShow p g) => GShow p (f :+: g) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShows :: p (ShowsPrec a) -> (f :+: g) a -> PrecShowS Source #

(Constructor c, GShowC p c f) => GShow p (M1 C c f) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShows :: p (ShowsPrec a) -> M1 C c f a -> PrecShowS Source #

GShow p f => GShow p (M1 D d f) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShows :: p (ShowsPrec a) -> M1 D d f a -> PrecShowS Source #

class GShowC p c f where Source #

Methods

gPrecShowsC :: p (ShowsPrec a) -> String -> Fixity -> M1 C c f a -> PrecShowS Source #

Instances
GShowNamed p f => GShowC p (MetaCons s y True) f Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShowsC :: p (ShowsPrec a) -> String -> Fixity -> M1 C (MetaCons s y True) f a -> PrecShowS Source #

GShowFields p f => GShowC p (MetaCons s y False) f Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShowsC :: p (ShowsPrec a) -> String -> Fixity -> M1 C (MetaCons s y False) f a -> PrecShowS Source #

class GShowFields p f where Source #

Methods

gPrecShowsFields :: p (ShowsPrec a) -> f a -> [PrecShowS] Source #

Instances
GShowFields p (U1 :: Type -> Type) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShowsFields :: p (ShowsPrec a) -> U1 a -> [PrecShowS] Source #

(GShowFields p f, GShowFields p g) => GShowFields p (f :*: g) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShowsFields :: p (ShowsPrec a) -> (f :*: g) a -> [PrecShowS] Source #

GShowSingle p f => GShowFields p (M1 S c f) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShowsFields :: p (ShowsPrec a) -> M1 S c f a -> [PrecShowS] Source #

class GShowNamed p f where Source #

Methods

gPrecShowsNamed :: p (ShowsPrec a) -> f a -> ShowFields Source #

Instances
GShowNamed p (U1 :: Type -> Type) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShowsNamed :: p (ShowsPrec a) -> U1 a -> ShowFields Source #

(GShowNamed p f, GShowNamed p g) => GShowNamed p (f :*: g) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShowsNamed :: p (ShowsPrec a) -> (f :*: g) a -> ShowFields Source #

(Selector c, GShowSingle p f) => GShowNamed p (M1 S c f) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShowsNamed :: p (ShowsPrec a) -> M1 S c f a -> ShowFields Source #

class GShowSingle p f where Source #

Methods

gPrecShowsSingle :: p (ShowsPrec a) -> f a -> PrecShowS Source #

Instances
GShowSingle Identity Par1 Source # 
Instance details

Defined in Generic.Data.Internal.Show

Show1 f => GShowSingle Identity (Rec1 f) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Show a => GShowSingle p (K1 i a :: Type -> Type) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShowsSingle :: p (ShowsPrec a0) -> K1 i a a0 -> PrecShowS Source #

(Show1 f, GShowSingle p g) => GShowSingle p (f :.: g) Source # 
Instance details

Defined in Generic.Data.Internal.Show

Methods

gPrecShowsSingle :: p (ShowsPrec a) -> (f :.: g) a -> PrecShowS Source #