2017-08-27 45 views
0

我想使用仆人,特别是实现一个有识字的haskell文件。我无法弄清楚如何使用literate haskell文件。我一直在寻找文档,但没有任何帮助。仆人执行

到目前为止,我已经正确命名了文件,扩展名为.lhs,并且我执行了runhaskell filename.lhs。我收到以下错误:

servantfinaltest.lhs line 150: unlit: No definitions in file (perhaps you forgot the '>'s?) 
`unlit' failed in phase `Literate pre-processor'. (Exit code: 1) 

这是我.lhs以下文件:

# Serving an API 

Enough chit-chat about type-level combinators and representing an API as a 
type. Can we have a webservice already? 

## A first example 

Equipped with some basic knowledge about the way we represent APIs, let's now 
write our first webservice. 

The source for this tutorial section is a literate haskell file, so first we 
need to have some language extensions and imports: 

``` haskell 
{-# LANGUAGE DataKinds #-} 
{-# LANGUAGE DeriveGeneriC#-} 
{-# LANGUAGE FlexibleInstances #-} 
{-# LANGUAGE GeneralizedNewtypeDeriving #-} 
{-# LANGUAGE MultiParamTypeClasses #-} 
{-# LANGUAGE OverloadedStrings #-} 
{-# LANGUAGE ScopedTypeVariables #-} 
{-# LANGUAGE TypeOperators #-} 

module Server where 

import Prelude() 
import Prelude.Compat 

import Control.Monad.Except 
import Control.Monad.Reader 
import Data.Aeson.Compat 
import Data.Aeson.Types 
import Data.Attoparsec.ByteString 
import Data.ByteString (ByteString) 
import Data.List 
import Data.Maybe 
import Data.String.Conversions 
import Data.Time.Calendar 
import GHC.Generics 
import Lucid 
import Network.HTTP.Media ((//), (/:)) 
import Network.Wai 
import Network.Wai.Handler.Warp 
import Servant 
import System.Directory 
import Text.Blaze 
import Text.Blaze.Html.Renderer.Utf8 
import qualified Data.Aeson.Parser 
import qualified Text.Blaze.Html 
``` 

**Important**: the `Servant` module comes from the **servant-server** package, 
the one that lets us run webservers that implement a particular API type. It 
reexports all the types from the **servant** package that let you declare API 
types as well as everything you need to turn your request handlers into a 
fully-fledged webserver. This means that in your applications, you can just add 
**servant-server** as a dependency, import `Servant` and not worry about anything 
else. 

We will write a server that will serve the following API. 

``` haskell 
type UserAPI1 = "users" :> Get '[JSON] [User] 
``` 

Here's what we would like to see when making a GET request to `/users`. 

``` javascript 
[ {"name": "Isaac Newton", "age": 372, "email": "[email protected]", "registration_date": "1683-03-01"} 
, {"name": "Albert Einstein", "age": 136, "email": "[email protected]", "registration_date": "1905-12-01"} 
] 
``` 

Now let's define our `User` data type and write some instances for it. 

``` haskell 
data User = User 
    { name :: String 
    , age :: Int 
    , email :: String 
    , registration_date :: Day 
    } deriving (Eq, Show, Generic) 

instance ToJSON User 
``` 

Nothing funny going on here. But we now can define our list of two users. 

``` haskell 
users1 :: [User] 
users1 = 
    [ User "Isaac Newton" 372 "[email protected]" (fromGregorian 1683 3 1) 
    , User "Albert Einstein" 136 "[email protected]"   (fromGregorian 1905 12 1) 
    ] 
``` 

Let's also write our API type. 

``` haskell ignore 
type UserAPI1 = "users" :> Get '[JSON] [User] 
``` 

We can now take care of writing the actual webservice that will handle requests 
to such an API. This one will be very simple, being reduced to just a single 
endpoint. The type of the web application is determined by the API type, 
through a *type family* named `Server`. (Type families are just functions that 
take types as input and return types.) The `Server` type family will compute 
the right type that a bunch of request handlers should have just from the 
corresponding API type. 

The first thing to know about the `Server` type family is that behind the 
scenes it will drive the routing, letting you focus only on the business 
logic. The second thing to know is that for each endpoint, your handlers will 
by default run in the `Handler` monad. This is overridable very 
easily, as explained near the end of this guide. Third thing, the type of the 
value returned in that monad must be the same as the second argument of the 
HTTP method combinator used for the corresponding endpoint. In our case, it 
means we must provide a handler of type `Handler [User]`. Well, 
we have a monad, let's just `return` our list: 

``` haskell 
server1 :: Server UserAPI1 
server1 = return users1 
``` 

That's it. Now we can turn `server` into an actual webserver using 
[wai](http://hackage.haskell.org/package/wai) and 
[warp](http://hackage.haskell.org/package/warp): 

``` haskell 
userAPI :: Proxy UserAPI1 
userAPI = Proxy 

-- 'serve' comes from servant and hands you a WAI Application, 
-- which you can think of as an "abstract" web application, 
-- not yet a webserver. 
app1 :: Application 
app1 = serve userAPI server1 
``` 

The `userAPI` bit is, alas, boilerplate (we need it to guide type inference). 
But that's about as much boilerplate as you get. 

And we're done! Let's run our webservice on the port 8081. 

``` haskell 
main :: IO() 
main = run 8081 app1 
``` 
+1

您好@Jimbo欢迎计算器的哈斯克尔部分 - 现在你的问题非常广泛,目前还不清楚。你有什么尝试?你面临什么(编译器)错误?另外stackoverflow的问题应该是独立的,所以请包括你的脚本,而不是链接到一个文件。 – epsilonhalbe

+0

你想用什么仆人?编写一个客户端/服务器/文档/ swagger接口说明/ ...仆人[这里]有一个很好的论文(https://haskell-servant.github.io/posts/2015-05-25-servant-paper -wgp-2015.html)[文档](https://haskell-servant.readthedocs.io/en/stable/)也相当广泛,包括几个示例以及一些教程。 – epsilonhalbe

+0

我想使用servant来创建API请求并使用reflex-frp构建GUI。我读了learnyouahaskell.com的13章,但我从未写过哈斯克尔。我正在尝试获得最简单的仆役教程,以便我可以玩。 – Jimbo

回答

2

首先的 - 如果你没有写任何Haskell代码 - 首先是仆人,是我说相当雄心勃勃 - 因为它利用一些高层次的概念/几种语言扩展一样TypeFamiliesDataKinds提供的机制......

什么你写不识字Haskell的文件 - 至少它违反了语法描述here

我建议要么坚持正常的哈斯克尔文件,要么读我先链接的文档。

这里是你的文件翻译成有效的文学Haskell:

# Serving an API 

Enough chit-chat about type-level combinators and representing an API as a 
type. Can we have a webservice already? 

## A first example 

Equipped with some basic knowledge about the way we represent APIs, let's now write our first webservice. 

The source for this tutorial section is a literate haskell file, so first we need to have some language extensions and imports: 

``` haskell 
> {-# LANGUAGE DataKinds #-} 
> {-# LANGUAGE DeriveGeneriC#-} 
> {-# LANGUAGE FlexibleInstances #-} 
> {-# LANGUAGE GeneralizedNewtypeDeriving #-} 
> {-# LANGUAGE MultiParamTypeClasses #-} 
> {-# LANGUAGE OverloadedStrings #-} 
> {-# LANGUAGE ScopedTypeVariables #-} 
> {-# LANGUAGE TypeOperators #-} 

> module Server where 

> import Prelude() 
> import Prelude.Compat 

> import Control.Monad.Except 
> import Control.Monad.Reader 
> import Data.Aeson.Compat 
> import Data.Aeson.Types 
> import Data.Attoparsec.ByteString 
> import Data.ByteString (ByteString) 
> import Data.List 
> import Data.Maybe 
> import Data.String.Conversions 
> import Data.Time.Calendar 
> import GHC.Generics 
> import Lucid 
> import Network.HTTP.Media ((//), (/:)) 
> import Network.Wai 
> import Network.Wai.Handler.Warp 
> import Servant 
> import System.Directory 
> import Text.Blaze 
> import Text.Blaze.Html.Renderer.Utf8 
> import qualified Data.Aeson.Parser 
> import qualified Text.Blaze.Html 
``` 

**Important**: the `Servant` module comes from the **servant-server** package, the one that lets us run webservers that implement a particular API type. It reexports all the types from the **servant** package that let you declare API types as well as everything you need to turn your request handlers into a fully-fledged webserver. This means that in your applications, you can just add **servant-server** as a dependency, import `Servant` and not worry about anything else. 

We will write a server that will serve the following API. 

``` haskell 
> type UserAPI1 = "users" :> Get '[JSON] [User] 
``` 

Here's what we would like to see when making a GET request to `/users`. 

``` javascript 
[ {"name": "Isaac Newton", "age": 372, "email": "[email protected]", "registration_date": "1683-03-01"} 
, {"name": "Albert Einstein", "age": 136, "email": "[email protected]", "registration_date": "1905-12-01"} 
] 
``` 

Now let's define our `User` data type and write some instances for it. 

``` haskell 
> data User = User 
> { name :: String 
> , age :: Int 
> , email :: String 
> , registration_date :: Day 
> } deriving (Eq, Show, Generic) 

> instance ToJSON User 
``` 

Nothing funny going on here. But we now can define our list of two users. 

``` haskell 
> users1 :: [User] 
> users1 = 
> [ User "Isaac Newton" 372 "[email protected]" (fromGregorian 1683 3 1) 
> , User "Albert Einstein" 136 "[email protected]"   (fromGregorian 1905 12 1) 
> ] 
``` 

Let's also write our API type. 

``` haskell ignore 
type UserAPI1 = "users" :> Get '[JSON] [User] 
``` 

We can now take care of writing the actual webservice that will handle requests to such an API. This one will be very simple, being reduced to just a single endpoint. The type of the web application is determined by the API type, through a *type family* named `Server`. (Type families are just functions that take types as input and return types.) The `Server` type family will compute the right type that a bunch of request handlers should have just from the 
corresponding API type. 

The first thing to know about the `Server` type family is that behind the 
scenes it will drive the routing, letting you focus only on the business 
logic. The second thing to know is that for each endpoint, your handlers will by default run in the `Handler` monad. This is overridable very 
easily, as explained near the end of this guide. Third thing, the type of the value returned in that monad must be the same as the second argument of the HTTP method combinator used for the corresponding endpoint. In our case, it means we must provide a handler of type `Handler [User]`. Well, 
we have a monad, let's just `return` our list: 

``` haskell 
> server1 :: Server UserAPI1 
> server1 = return users1 
``` 

That's it. Now we can turn `server` into an actual webserver using 
[wai](http://hackage.haskell.org/package/wai) and 
[warp](http://hackage.haskell.org/package/warp): 

``` haskell 
> userAPI :: Proxy UserAPI1 
> userAPI = Proxy 
``` 

'serve' comes from servant and hands you a WAI Application, 
which you can think of as an "abstract" web application, 
not yet a webserver. 

```haskell 
> app1 :: Application 
> app1 = serve userAPI server1 
``` 

The `userAPI` bit is, alas, boilerplate (we need it to guide type inference). 
But that's about as much boilerplate as you get. 

And we're done! Let's run our webservice on the port 8081. 

```haskell 
> main :: IO() 
> main = run 8081 app1 
``` 
+0

感谢您的回复。即使当我在.hs文件中将脚本截断为导入时,我也无法导入Servant。 – Jimbo

+0

我没有我的球 - 没有具体的错误我不能帮你。 – epsilonhalbe

+0

对于任何人阅读,我解决了我的问题,因为我不明白如何堆栈工作! https://docs.haskellstack.org/en/stable/README/ – Jimbo