Flip fixity of TH sub.
And do some general cleanup.
This commit is contained in:
parent
e6be95fb9e
commit
21c8fcbea2
3 changed files with 61 additions and 32 deletions
|
@ -5,6 +5,7 @@
|
|||
{-# LANGUAGE TypeOperators #-}
|
||||
{-# LANGUAGE FlexibleInstances #-}
|
||||
{-# LANGUAGE OverloadedStrings #-}
|
||||
{-# LANGUAGE QuasiQuotes #-}
|
||||
{-# OPTIONS_GHC -fno-warn-orphans #-}
|
||||
|
||||
import Control.Concurrent (forkIO, killThread)
|
||||
|
@ -54,6 +55,11 @@ type TestApi =
|
|||
:<|> "greet" :> ReqBody Greet :> Post Greet
|
||||
:<|> "delete" :> Capture "greetid" Text :> Delete
|
||||
|
||||
type TestApi2 = [sitemap|
|
||||
GET Bool something/capt:Int
|
||||
POST Bool something
|
||||
|]
|
||||
|
||||
testApi :: Proxy TestApi
|
||||
testApi = Proxy
|
||||
|
||||
|
|
|
@ -23,6 +23,10 @@ module Servant.API (
|
|||
module Servant.API.Delete,
|
||||
-- | PUT requests
|
||||
module Servant.API.Put,
|
||||
|
||||
-- * Utilities
|
||||
-- | QuasiQuotes for endpoints
|
||||
module Servant.API.QQ,
|
||||
) where
|
||||
|
||||
import Servant.API.Capture
|
||||
|
@ -31,6 +35,7 @@ import Servant.API.Get
|
|||
import Servant.API.Post
|
||||
import Servant.API.Put
|
||||
import Servant.API.QueryParam
|
||||
import Servant.API.QQ
|
||||
import Servant.API.ReqBody
|
||||
import Servant.API.Sub
|
||||
import Servant.API.Union
|
||||
|
|
|
@ -2,11 +2,14 @@
|
|||
{-# LANGUAGE FunctionalDependencies #-}
|
||||
{-# LANGUAGE DataKinds #-}
|
||||
{-# LANGUAGE FlexibleInstances #-}
|
||||
{-# LANGUAGE ScopedTypeVariables #-}
|
||||
{-# LANGUAGE TemplateHaskell #-}
|
||||
module Servant.API.QQ where
|
||||
|
||||
import Control.Applicative
|
||||
import Data.List.Split (splitOn)
|
||||
--import Language.Haskell.TH.Quote
|
||||
import Data.Maybe (mapMaybe)
|
||||
import Language.Haskell.TH.Quote
|
||||
import Language.Haskell.TH
|
||||
|
||||
import Servant.API.Capture
|
||||
|
@ -15,45 +18,60 @@ import Servant.API.Post
|
|||
import Servant.API.Put
|
||||
import Servant.API.Delete
|
||||
import Servant.API.Sub
|
||||
import Servant.API.Union
|
||||
|
||||
class ExpSYM repr' repr | repr -> repr', repr' -> repr where
|
||||
simplePath :: String -> repr'
|
||||
capture :: String -> String -> repr'
|
||||
conj :: repr' -> repr' -> repr'
|
||||
get :: String -> repr' -> repr
|
||||
post :: String -> repr' -> repr
|
||||
put :: String -> repr' -> repr
|
||||
delete :: String -> repr' -> repr
|
||||
lit :: String -> repr' -> repr
|
||||
capture :: String -> String -> repr -> repr
|
||||
conj :: repr' -> repr -> repr
|
||||
get :: String -> repr
|
||||
post :: String -> repr
|
||||
put :: String -> repr
|
||||
delete :: String -> repr
|
||||
|
||||
infixr 6 >:
|
||||
|
||||
(>:) :: Type -> Type -> Type
|
||||
(>:) = conj
|
||||
|
||||
instance ExpSYM Type Type where
|
||||
simplePath name = LitT (StrTyLit name)
|
||||
capture name typ = AppT (AppT (ConT ''Capture) (simplePath name))
|
||||
(ConT $ mkName typ)
|
||||
conj f s = AppT (AppT (ConT ''(:>)) f) s
|
||||
get typ r = AppT (AppT (ConT ''(:>)) r)
|
||||
(AppT (ConT ''Get) (ConT $ mkName typ))
|
||||
post typ r = AppT (AppT (ConT ''(:>)) r)
|
||||
(AppT (ConT ''Post) (ConT $ mkName typ))
|
||||
put typ r = AppT (AppT (ConT ''(:>)) r)
|
||||
(AppT (ConT ''Put) (ConT $ mkName typ))
|
||||
delete typ r = AppT (AppT (ConT ''(:>)) r)
|
||||
(AppT (ConT ''Delete) (ConT $ mkName typ))
|
||||
lit name r = (LitT (StrTyLit name)) >: r
|
||||
capture name typ r = (AppT (AppT (ConT ''Capture) (LitT (StrTyLit name)))
|
||||
(ConT $ mkName typ)) >: r
|
||||
conj x y = AppT (AppT (ConT ''(:>)) x) y
|
||||
get typ = AppT (ConT ''Get) (ConT $ mkName typ)
|
||||
post typ = AppT (ConT ''Post) (ConT $ mkName typ)
|
||||
put typ = AppT (ConT ''Put) (ConT $ mkName typ)
|
||||
delete typ = AppT (ConT ''Delete) (ConT $ mkName typ)
|
||||
|
||||
readEntry :: ExpSYM r' r => [String] -> Maybe r
|
||||
readEntry :: ExpSYM r r => [String] -> Maybe r
|
||||
readEntry [] = Nothing
|
||||
readEntry (met:typ:xs) = case met of
|
||||
"GET" -> get typ <$> readEntry' xs
|
||||
"POST" -> post typ <$> readEntry' xs
|
||||
"PUT" -> put typ <$> readEntry' xs
|
||||
"DELETE" -> delete typ <$> readEntry' xs
|
||||
"GET" -> readEntry' xs $ get typ
|
||||
"POST" -> readEntry' xs $ post typ
|
||||
"PUT" -> readEntry' xs $ put typ
|
||||
"DELETE" -> readEntry' xs $ delete typ
|
||||
x -> error $ "Unknown method: " ++ x
|
||||
readEntry x = error $ "Wrong number of elems in line: " ++ show x
|
||||
|
||||
readEntry' :: ExpSYM r' r => [String] -> Maybe r'
|
||||
readEntry' [] = Nothing
|
||||
readEntry' [xs] = Just $ foldr1 conj $ tRepr <$> splitOn "/" xs
|
||||
where tRepr y | [x] <- splitOn ":" y = simplePath x
|
||||
| x:[y] <- splitOn ":" y = capture x y
|
||||
readEntry' :: ExpSYM r r => [String] -> r -> Maybe r
|
||||
readEntry' [] _ = Nothing
|
||||
readEntry' [xs] r = Just $ foldr1 (.) (tRepr <$> splitOn "/" xs) r
|
||||
where
|
||||
tRepr y | [x] <- splitOn ":" y = lit x
|
||||
| a:[b] <- splitOn ":" y = capture a b
|
||||
| otherwise = error "Only one ':' per section"
|
||||
readEntry' _ = Nothing
|
||||
readEntry' _ _ = Nothing
|
||||
|
||||
readAll :: String -> Type
|
||||
readAll s = foldr1 union $ mapMaybe readEntry $ words <$> lines s
|
||||
where union :: Type -> Type -> Type
|
||||
union a b = AppT (AppT (ConT ''(:<|>)) a) b
|
||||
|
||||
sitemap :: QuasiQuoter
|
||||
sitemap = QuasiQuoter { quoteExp = undefined
|
||||
, quotePat = undefined
|
||||
, quoteType = return . readAll
|
||||
, quoteDec = undefined
|
||||
}
|
||||
|
||||
|
|
Loading…
Reference in a new issue