calamity-0.1.0.0: A library for writing discord bots

Safe HaskellNone
LanguageHaskell2010

Calamity.HTTP.Internal.Route

Description

The route type Why I did this I don't know

Documentation

giveID :: forall k ids. Typeable k => Snowflake k -> RouteBuilder ids -> RouteBuilder ('(k, Satisfied) ': ids) Source #

buildRoute :: forall (ids :: [(Type, RouteRequirement)]). EnsureFulfilled ids => RouteBuilder ids -> Route Source #

data RouteBuilder (idState :: [(Type, RouteRequirement)]) Source #

data RouteRequirement Source #

Instances
Eq RouteRequirement Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

Show RouteRequirement Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

Generic RouteRequirement Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

Associated Types

type Rep RouteRequirement :: Type -> Type #

type Rep RouteRequirement Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

type Rep RouteRequirement = D1 (MetaData "RouteRequirement" "Calamity.HTTP.Internal.Route" "calamity-0.1.0.0-inplace" False) (C1 (MetaCons "NotNeeded" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Required" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Satisfied" PrefixI False) (U1 :: Type -> Type)))

data Route Source #

Instances
Eq Route Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

Methods

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

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

Show Route Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

Methods

showsPrec :: Int -> Route -> ShowS #

show :: Route -> String #

showList :: [Route] -> ShowS #

Generic Route Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

Associated Types

type Rep Route :: Type -> Type #

Methods

from :: Route -> Rep Route x #

to :: Rep Route x -> Route #

Hashable Route Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

Methods

hashWithSalt :: Int -> Route -> Int #

hash :: Route -> Int #

type Rep Route Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

newtype S Source #

Constructors

S Text 
Instances
RouteFragmentable S ids Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

Associated Types

type ConsRes S ids :: Type Source #

Methods

(//) :: RouteBuilder ids -> S -> ConsRes S ids Source #

type ConsRes S ids Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

type ConsRes S ids = RouteBuilder ids

data ID a Source #

Constructors

ID 
Instances
Typeable a => RouteFragmentable (ID a) ids Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

Associated Types

type ConsRes (ID a) ids :: Type Source #

Methods

(//) :: RouteBuilder ids -> ID a -> ConsRes (ID a) ids Source #

type ConsRes (ID a) ids Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

type ConsRes (ID a) ids

class Typeable a => RouteFragmentable a ids where Source #

Associated Types

type ConsRes a ids Source #

Methods

(//) :: RouteBuilder ids -> a -> ConsRes a ids infixl 5 Source #

Instances
RouteFragmentable S ids Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

Associated Types

type ConsRes S ids :: Type Source #

Methods

(//) :: RouteBuilder ids -> S -> ConsRes S ids Source #

Typeable a => RouteFragmentable (ID a) ids Source # 
Instance details

Defined in Calamity.HTTP.Internal.Route

Associated Types

type ConsRes (ID a) ids :: Type Source #

Methods

(//) :: RouteBuilder ids -> ID a -> ConsRes (ID a) ids Source #