module renaming: S.API.Elem -> S.Utils.Links
This commit is contained in:
parent
af00035b99
commit
1cd35034e9
4 changed files with 8 additions and 8 deletions
|
@ -18,7 +18,6 @@ library
|
|||
Servant.API.Alternative
|
||||
Servant.API.Capture
|
||||
Servant.API.Delete
|
||||
Servant.API.Elem
|
||||
Servant.API.Get
|
||||
Servant.API.Post
|
||||
Servant.API.Put
|
||||
|
@ -31,6 +30,7 @@ library
|
|||
Servant.Server
|
||||
Servant.Utils.ApiQuasiQuoting
|
||||
Servant.Utils.BaseUrl
|
||||
Servant.Utils.Links
|
||||
Servant.Utils.Req
|
||||
Servant.Utils.Text
|
||||
build-depends:
|
||||
|
|
|
@ -28,17 +28,17 @@ module Servant.API (
|
|||
-- | QuasiQuotes for endpoints
|
||||
module Servant.Utils.ApiQuasiQuoting,
|
||||
-- | Type-safe internal URLs
|
||||
module Servant.API.Elem,
|
||||
module Servant.Utils.Links,
|
||||
) where
|
||||
|
||||
import Servant.API.Alternative
|
||||
import Servant.API.Capture
|
||||
import Servant.API.Delete
|
||||
import Servant.API.Elem (mkLink)
|
||||
import Servant.API.Get
|
||||
import Servant.API.Post
|
||||
import Servant.API.Put
|
||||
import Servant.API.QueryParam
|
||||
import Servant.Utils.ApiQuasiQuoting (sitemap)
|
||||
import Servant.API.ReqBody
|
||||
import Servant.API.Sub
|
||||
import Servant.API.Alternative
|
||||
import Servant.Utils.ApiQuasiQuoting (sitemap)
|
||||
import Servant.Utils.Links (mkLink)
|
||||
|
|
|
@ -6,7 +6,7 @@
|
|||
{-# LANGUAGE FunctionalDependencies #-}
|
||||
{-# LANGUAGE ScopedTypeVariables #-}
|
||||
{-# LANGUAGE UndecidableInstances #-}
|
||||
module Servant.API.Elem where
|
||||
module Servant.Utils.Links where
|
||||
|
||||
import Data.Proxy
|
||||
import GHC.TypeLits
|
|
@ -1,13 +1,13 @@
|
|||
{-# LANGUAGE DataKinds #-}
|
||||
{-# LANGUAGE PolyKinds #-}
|
||||
{-# LANGUAGE TypeOperators #-}
|
||||
module Servant.API.ElemSpec where
|
||||
module Servant.Utils.LinksSpec where
|
||||
|
||||
import Test.Hspec
|
||||
|
||||
import Servant.API
|
||||
import Servant.API.Elem (IsElem, IsLink)
|
||||
import Servant.Utils.ApiQuasiQuotingSpec ( (~>) )
|
||||
import Servant.Utils.Links (IsElem, IsLink)
|
||||
|
||||
type TestApi =
|
||||
"hello" :> Capture "name" String :> QueryParam "capital" Bool :> Get Bool
|
Loading…
Reference in a new issue