web-routes-generics-0.1.0.0: portable, type-safe URL routing

Safe HaskellNone
LanguageHaskell98

Web.Routes.Generics

Documentation

data Path Source #

Constructors

Foo 
Bar Int Int 
Instances
Show Path Source # 
Instance details

Defined in Web.Routes.Generics

Methods

showsPrec :: Int -> Path -> ShowS #

show :: Path -> String #

showList :: [Path] -> ShowS #

Generic Path Source # 
Instance details

Defined in Web.Routes.Generics

Associated Types

type Rep Path :: Type -> Type #

Methods

from :: Path -> Rep Path x #

to :: Rep Path x -> Path #

PathInfo Path Source # 
Instance details

Defined in Web.Routes.Generics

type Rep Path Source # 
Instance details

Defined in Web.Routes.Generics

type Rep Path = D1 (MetaData "Path" "Web.Routes.Generics" "web-routes-generics-0.1.0.0-JPy2nwKkl9DLaRTg23KHm9" False) (C1 (MetaCons "Foo" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Bar" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))

class GToURL f where Source #

Instances
GToURL (U1 :: k -> Type) Source # 
Instance details

Defined in Web.Routes.Generics

GToURL f => GToURL (S1 c f :: k -> Type) Source # 
Instance details

Defined in Web.Routes.Generics

PathInfo a => GToURL (K1 i a :: k -> Type) Source # 
Instance details

Defined in Web.Routes.Generics

Methods

gtoPathSegments :: K1 i a a0 -> [Text] Source #

gfromPathSegments :: URLParser (K1 i a a0) Source #

GToURL f => GToURL (D1 c f :: k -> Type) Source # 
Instance details

Defined in Web.Routes.Generics

(GToURL f, GToURL g) => GToURL (f :*: g :: k -> Type) Source # 
Instance details

Defined in Web.Routes.Generics

Methods

gtoPathSegments :: (f :*: g) a -> [Text] Source #

gfromPathSegments :: URLParser ((f :*: g) a) Source #

(GToURL f, GToURL g) => GToURL (f :+: g :: k -> Type) Source # 
Instance details

Defined in Web.Routes.Generics

Methods

gtoPathSegments :: (f :+: g) a -> [Text] Source #

gfromPathSegments :: URLParser ((f :+: g) a) Source #

(Constructor c, GToURL f) => GToURL (C1 c f :: k -> Type) Source # 
Instance details

Defined in Web.Routes.Generics