Safe Haskell | None |
---|---|
Language | Haskell2010 |
The route type Why I did this I don't know
Documentation
mkRouteBuilder :: RouteBuilder '[] Source #
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 # | |
Defined in Calamity.HTTP.Internal.Route (==) :: RouteRequirement -> RouteRequirement -> Bool # (/=) :: RouteRequirement -> RouteRequirement -> Bool # | |
Show RouteRequirement Source # | |
Defined in Calamity.HTTP.Internal.Route showsPrec :: Int -> RouteRequirement -> ShowS # show :: RouteRequirement -> String # showList :: [RouteRequirement] -> ShowS # | |
Generic RouteRequirement Source # | |
Defined in Calamity.HTTP.Internal.Route type Rep RouteRequirement :: Type -> Type # from :: RouteRequirement -> Rep RouteRequirement x # to :: Rep RouteRequirement x -> RouteRequirement # | |
type Rep RouteRequirement Source # | |
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))) |
Instances
Eq Route Source # | |
Show Route Source # | |
Generic Route Source # | |
Hashable Route Source # | |
Defined in Calamity.HTTP.Internal.Route | |
type Rep Route Source # | |
Defined in Calamity.HTTP.Internal.Route type Rep Route = D1 (MetaData "Route" "Calamity.HTTP.Internal.Route" "calamity-0.1.0.0-inplace" False) (C1 (MetaCons "Route" PrefixI True) ((S1 (MetaSel (Just "path") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text) :*: S1 (MetaSel (Just "key") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) :*: (S1 (MetaSel (Just "channelID") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Snowflake Channel))) :*: S1 (MetaSel (Just "guildID") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Snowflake Guild)))))) |
Instances
RouteFragmentable S ids Source # | |
type ConsRes S ids Source # | |
Defined in Calamity.HTTP.Internal.Route |
Instances
Typeable a => RouteFragmentable (ID a) ids Source # | |
type ConsRes (ID a) ids Source # | |
Defined in Calamity.HTTP.Internal.Route |
class Typeable a => RouteFragmentable a ids where Source #
(//) :: RouteBuilder ids -> a -> ConsRes a ids infixl 5 Source #
Instances
RouteFragmentable S ids Source # | |
Typeable a => RouteFragmentable (ID a) ids Source # | |