servant-swagger-tags-0.1.0.0: Swagger Tags for Servant

Safe HaskellNone
LanguageHaskell2010

Servant.Swagger.Tags

Documentation

data Tags (sym :: Symbol) Source #

Instances
(KnownSymbol tags, HasSwagger api) => HasSwagger (Tags tags :> api :: Type) Source # 
Instance details

Defined in Servant.Swagger.Tags

Methods

toSwagger :: Proxy (Tags tags :> api) -> Swagger #

HasMock api context => HasMock (Tags t :> api :: Type) context Source # 
Instance details

Defined in Servant.Swagger.Tags

Methods

mock :: Proxy (Tags t :> api) -> Proxy context -> Server (Tags t :> api) #

HasServer api ctx => HasServer (Tags tags :> api :: Type) ctx Source # 
Instance details

Defined in Servant.Swagger.Tags

Associated Types

type ServerT (Tags tags :> api) m :: Type #

Methods

route :: Proxy (Tags tags :> api) -> Context ctx -> Delayed env (Server (Tags tags :> api)) -> Router env #

hoistServerWithContext :: Proxy (Tags tags :> api) -> Proxy ctx -> (forall x. m x -> n x) -> ServerT (Tags tags :> api) m -> ServerT (Tags tags :> api) n #

type ServerT (Tags tags :> api :: Type) m Source # 
Instance details

Defined in Servant.Swagger.Tags

type ServerT (Tags tags :> api :: Type) m = ServerT api m