mirror of
https://github.com/haskell-servant/servant-ekg.git
synced 2024-11-23 03:29:43 +01:00
Merge pull request #2 from epsilonhalbe/master
compatibility to servant 0.8/0.9
This commit is contained in:
commit
787bfb5c1b
4 changed files with 24 additions and 3 deletions
1
.gitignore
vendored
1
.gitignore
vendored
|
@ -3,3 +3,4 @@
|
||||||
.cabal-sandbox/*
|
.cabal-sandbox/*
|
||||||
*dist/
|
*dist/
|
||||||
*dist-newstyle/
|
*dist-newstyle/
|
||||||
|
.stack-work/
|
||||||
|
|
|
@ -1,3 +1,4 @@
|
||||||
|
{-# LANGUAGE CPP #-}
|
||||||
{-# LANGUAGE DataKinds #-}
|
{-# LANGUAGE DataKinds #-}
|
||||||
{-# LANGUAGE FlexibleContexts #-}
|
{-# LANGUAGE FlexibleContexts #-}
|
||||||
{-# LANGUAGE FlexibleInstances #-}
|
{-# LANGUAGE FlexibleInstances #-}
|
||||||
|
@ -160,3 +161,8 @@ instance ReflectMethod method => HasEndpoint (Verb method status cts a) where
|
||||||
|
|
||||||
instance HasEndpoint (Raw) where
|
instance HasEndpoint (Raw) where
|
||||||
getEndpoint _ _ = Just ([],"RAW")
|
getEndpoint _ _ = Just ([],"RAW")
|
||||||
|
|
||||||
|
#if MIN_VERSION_servant(0,8,1)
|
||||||
|
instance HasEndpoint (sub :: *) => HasEndpoint (CaptureAll (h :: Symbol) a :> sub) where
|
||||||
|
getEndpoint _ = getEndpoint (Proxy :: Proxy sub)
|
||||||
|
#endif
|
||||||
|
|
|
@ -17,9 +17,9 @@ source-repository HEAD
|
||||||
library
|
library
|
||||||
exposed-modules: Servant.Ekg
|
exposed-modules: Servant.Ekg
|
||||||
hs-source-dirs: lib
|
hs-source-dirs: lib
|
||||||
build-depends: base >=4.7 && <4.9
|
build-depends: base >=4.7 && < 4.10
|
||||||
, ekg-core
|
, ekg-core
|
||||||
, servant > 0.5 && < 0.8
|
, servant > 0.5 && < 0.10
|
||||||
, http-types
|
, http-types
|
||||||
, text
|
, text
|
||||||
, time
|
, time
|
||||||
|
|
|
@ -1,6 +1,6 @@
|
||||||
|
{-# LANGUAGE CPP #-}
|
||||||
{-# LANGUAGE DataKinds #-}
|
{-# LANGUAGE DataKinds #-}
|
||||||
{-# LANGUAGE DeriveGeneric #-}
|
{-# LANGUAGE DeriveGeneric #-}
|
||||||
{-# LANGUAGE OverlappingInstances #-}
|
|
||||||
{-# LANGUAGE OverloadedStrings #-}
|
{-# LANGUAGE OverloadedStrings #-}
|
||||||
{-# LANGUAGE PolyKinds #-}
|
{-# LANGUAGE PolyKinds #-}
|
||||||
{-# LANGUAGE TypeFamilies #-}
|
{-# LANGUAGE TypeFamilies #-}
|
||||||
|
@ -9,7 +9,9 @@
|
||||||
module Servant.EkgSpec (spec) where
|
module Servant.EkgSpec (spec) where
|
||||||
|
|
||||||
import Control.Concurrent
|
import Control.Concurrent
|
||||||
|
#if !MIN_VERSION_servant(0,9,0)
|
||||||
import Control.Monad.Trans.Except
|
import Control.Monad.Trans.Except
|
||||||
|
#endif
|
||||||
import Data.Aeson
|
import Data.Aeson
|
||||||
import Data.Monoid
|
import Data.Monoid
|
||||||
import Data.Proxy
|
import Data.Proxy
|
||||||
|
@ -39,7 +41,11 @@ spec = describe "servant-ekg" $ do
|
||||||
it "collects number of request" $ do
|
it "collects number of request" $ do
|
||||||
withApp $ \port mvar -> do
|
withApp $ \port mvar -> do
|
||||||
mgr <- newManager defaultManagerSettings
|
mgr <- newManager defaultManagerSettings
|
||||||
|
#if MIN_VERSION_servant(0,9,0)
|
||||||
|
Right _result <- runClientM (getEp "name" Nothing) (ClientEnv mgr (BaseUrl Http "localhost" port ""))
|
||||||
|
#else
|
||||||
_result <- runExceptT $ getEp "name" Nothing mgr (BaseUrl Http "localhost" port "")
|
_result <- runExceptT $ getEp "name" Nothing mgr (BaseUrl Http "localhost" port "")
|
||||||
|
#endif
|
||||||
m <- readMVar mvar
|
m <- readMVar mvar
|
||||||
case H.lookup "hello.:name.GET" m of
|
case H.lookup "hello.:name.GET" m of
|
||||||
Nothing -> fail "Expected some value"
|
Nothing -> fail "Expected some value"
|
||||||
|
@ -69,7 +75,11 @@ type TestApi =
|
||||||
:<|> "greet" :> ReqBody '[JSON] Greet :> Post '[JSON] Greet
|
:<|> "greet" :> ReqBody '[JSON] Greet :> Post '[JSON] Greet
|
||||||
|
|
||||||
-- DELETE /greet/:greetid
|
-- DELETE /greet/:greetid
|
||||||
|
#if MIN_VERSION_servant(0,8,0)
|
||||||
|
:<|> "greet" :> Capture "greetid" Text :> Delete '[JSON] NoContent
|
||||||
|
#else
|
||||||
:<|> "greet" :> Capture "greetid" Text :> Delete '[JSON] ()
|
:<|> "greet" :> Capture "greetid" Text :> Delete '[JSON] ()
|
||||||
|
#endif
|
||||||
|
|
||||||
testApi :: Proxy TestApi
|
testApi :: Proxy TestApi
|
||||||
testApi = Proxy
|
testApi = Proxy
|
||||||
|
@ -89,7 +99,11 @@ server = helloH :<|> postGreetH :<|> deleteGreetH
|
||||||
|
|
||||||
postGreetH = return
|
postGreetH = return
|
||||||
|
|
||||||
|
#if MIN_VERSION_servant(0,8,0)
|
||||||
|
deleteGreetH _ = return NoContent
|
||||||
|
#else
|
||||||
deleteGreetH _ = return ()
|
deleteGreetH _ = return ()
|
||||||
|
#endif
|
||||||
|
|
||||||
-- Turn the server into a WAI app. 'serve' is provided by servant,
|
-- Turn the server into a WAI app. 'serve' is provided by servant,
|
||||||
-- more precisely by the Servant.Server module.
|
-- more precisely by the Servant.Server module.
|
||||||
|
|
Loading…
Reference in a new issue