Merge pull request #289 from mitchellwrosen/master
Add 'pretty' to servant-docs
This commit is contained in:
commit
3429870120
3 changed files with 56 additions and 2 deletions
|
@ -29,8 +29,11 @@ library
|
||||||
exposed-modules:
|
exposed-modules:
|
||||||
Servant.Docs
|
Servant.Docs
|
||||||
, Servant.Docs.Internal
|
, Servant.Docs.Internal
|
||||||
|
, Servant.Docs.Internal.Pretty
|
||||||
build-depends:
|
build-depends:
|
||||||
base >=4.7 && <5
|
base >=4.7 && <5
|
||||||
|
, aeson
|
||||||
|
, aeson-pretty
|
||||||
, bytestring
|
, bytestring
|
||||||
, bytestring-conversion
|
, bytestring-conversion
|
||||||
, case-insensitive
|
, case-insensitive
|
||||||
|
|
|
@ -23,7 +23,7 @@
|
||||||
-- See example/greet.hs for an example.
|
-- See example/greet.hs for an example.
|
||||||
module Servant.Docs
|
module Servant.Docs
|
||||||
( -- * 'HasDocs' class and key functions
|
( -- * 'HasDocs' class and key functions
|
||||||
HasDocs(..), docs, markdown
|
HasDocs(..), docs, pretty, markdown
|
||||||
-- * Generating docs with extra information
|
-- * Generating docs with extra information
|
||||||
, docsWith, docsWithIntros, docsWithOptions
|
, docsWith, docsWithIntros, docsWithOptions
|
||||||
, ExtraInfo(..), extraInfo
|
, ExtraInfo(..), extraInfo
|
||||||
|
@ -54,3 +54,4 @@ module Servant.Docs
|
||||||
) where
|
) where
|
||||||
|
|
||||||
import Servant.Docs.Internal
|
import Servant.Docs.Internal
|
||||||
|
import Servant.Docs.Internal.Pretty
|
||||||
|
|
50
servant-docs/src/Servant/Docs/Internal/Pretty.hs
Normal file
50
servant-docs/src/Servant/Docs/Internal/Pretty.hs
Normal file
|
@ -0,0 +1,50 @@
|
||||||
|
{-# LANGUAGE DataKinds #-}
|
||||||
|
{-# LANGUAGE FlexibleInstances #-}
|
||||||
|
{-# LANGUAGE KindSignatures #-}
|
||||||
|
{-# LANGUAGE MultiParamTypeClasses #-}
|
||||||
|
{-# LANGUAGE OverloadedStrings #-}
|
||||||
|
{-# LANGUAGE PolyKinds #-}
|
||||||
|
{-# LANGUAGE TypeOperators #-}
|
||||||
|
{-# LANGUAGE TypeFamilies #-}
|
||||||
|
|
||||||
|
module Servant.Docs.Internal.Pretty where
|
||||||
|
|
||||||
|
import Data.Aeson (ToJSON(..))
|
||||||
|
import Data.Aeson.Encode.Pretty (encodePretty)
|
||||||
|
import Data.Proxy (Proxy(Proxy))
|
||||||
|
import Network.HTTP.Media ((//))
|
||||||
|
import Servant.API
|
||||||
|
import Servant.API.ContentTypes
|
||||||
|
import Servant.Utils.Links
|
||||||
|
|
||||||
|
-- | PrettyJSON content type.
|
||||||
|
data PrettyJSON
|
||||||
|
|
||||||
|
instance Accept PrettyJSON where
|
||||||
|
contentType _ = "application" // "json"
|
||||||
|
|
||||||
|
instance ToJSON a => MimeRender PrettyJSON a where
|
||||||
|
mimeRender _ = encodePretty
|
||||||
|
|
||||||
|
-- | Prettify generated JSON documentation.
|
||||||
|
--
|
||||||
|
-- @
|
||||||
|
-- 'docs' ('pretty' ('Proxy' :: 'Proxy' MyAPI))
|
||||||
|
-- @
|
||||||
|
pretty :: Proxy layout -> Proxy (Pretty layout)
|
||||||
|
pretty Proxy = Proxy
|
||||||
|
|
||||||
|
-- | Replace all JSON content types with PrettyJSON.
|
||||||
|
-- Kind-polymorphic so it can operate on kinds @*@ and @[*]@.
|
||||||
|
type family Pretty (layout :: k) :: k where
|
||||||
|
Pretty (x :<|> y) = Pretty x :<|> Pretty y
|
||||||
|
Pretty (x :> y) = Pretty x :> Pretty y
|
||||||
|
Pretty (Get cs r) = Get (Pretty cs) r
|
||||||
|
Pretty (Post cs r) = Post (Pretty cs) r
|
||||||
|
Pretty (Put cs r) = Put (Pretty cs) r
|
||||||
|
Pretty (Delete cs r) = Delete (Pretty cs) r
|
||||||
|
Pretty (Patch cs r) = Patch (Pretty cs) r
|
||||||
|
Pretty (ReqBody cs r) = ReqBody (Pretty cs) r
|
||||||
|
Pretty (JSON ': xs) = PrettyJSON ': xs
|
||||||
|
Pretty (x ': xs) = x ': Pretty xs
|
||||||
|
Pretty x = x
|
Loading…
Reference in a new issue