Haskell Aeson嵌套数组JSON

时间:2016-08-14 19:06:13

标签: json haskell aeson

我在以下JSON结构中解析Tag时遇到问题。解析器仅在我声明为tags :: !Array时才起作用当我将其声明为tags :: [Tag]

时失败

为什么?

{
  "response": {
    "status": "ok",
    "results": [
      {
        "type": "article",
        "fields": {
          "wordcount": "497"
        },
        "tags": [
          {
            "id": "profile/barryglendenning"
          }
        ]
      }
    ]
  }
}



data Field = Field{
    wordcount :: Int
} deriving (Show)

instance FromJSON Field where
    parseJSON (Object o) = Field <$> (o .: "wordcount")
    parseJSON _ = mzero


data Tag = Tag{
    id :: Text
} deriving (Show)

instance FromJSON Tag where
    parseJSON (Object o) = Tag <$> (o .: "id")
    parseJSON _ = mzero

data SearchResult = SearchResult {
    type:: Text,
    field :: Field,
    tags  :: !Array
} deriving (Show)

instance FromJSON SearchResult where
    parseJSON (Object o) = do
        let t1 = o .: "type"
        let t2 = o .: "fields"
        let t3 = o .: "tags"
        SearchResult <$> t1 <*> t2 <*> t3
    parseJSON _ = mzero


data ContentrResult = ContentrResult {
    results :: [SearchResult],
    status  :: Text
} deriving (Show)

instance FromJSON ContentrResult where
    parseJSON (Object o) = do
        r <- o .: "response"
        ContentrResult <$> r .: "results"
                       <*> r .: "status"
    parseJSON _ = mzero

1 个答案:

答案 0 :(得分:1)

Nothing对于调试是非常有用的吗?

我设法让您的示例JSON将tags解析为[Tag]。我想知道您的错误是否与JSON中wordcount字段String而不是Number相关。

这是一个或多或少的自包含示例,我将示例JSON wordcount更改为数字:

{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE QuasiQuotes #-}

module Main where

import Lib (str)

import Control.Monad (mzero)
import Data.Aeson
import qualified Data.ByteString.Lazy.Char8 as LBSC
import Data.Text

data Field = Field {
  wordcount :: Int
} deriving (Show)

instance FromJSON Field where
  parseJSON (Object o) = Field <$> o .: "wordcount"
  parseJSON _ = mzero

data Tag = Tag {
  id :: Text
} deriving (Show)

instance FromJSON Tag where
  parseJSON (Object o) = Tag <$> (o .: "id")
  parseJSON _ = mzero

data SearchResult = SearchResult {
  typ :: Text,
  fields :: Field,
  tags :: [Tag]
} deriving (Show)

instance FromJSON SearchResult where
  parseJSON (Object v) = SearchResult <$> v .: "type" <*> v .: "fields" <*> v .: "tags"
  parseJSON _ = mzero

data ContentrResult = ContentrResult {
  results :: [SearchResult],
  status :: Text
} deriving (Show)

instance FromJSON ContentrResult where
  parseJSON (Object v) = ContentrResult <$> v.: "results" <*> v .: "status"
  parseJSON _ = mzero

data Response = Response {
  response :: ContentrResult
} deriving (Show)

instance FromJSON Response where
  parseJSON (Object v) = Response <$> v .: "response"
  parseJSON _ = mzero

responseJson :: String
responseJson = [str|
  {
    "response": {
      "status": "ok",
      "results": [
        {
          "type": "article",
          "fields": {
            "wordcount": 497
          },
          "tags": [
            {
              "id": "profile/barryglendenning"
            }
          ]
        }
      ]
    }
  }
|]

main :: IO ()
main = do
  print r
  putStrLn ""
    where
      r :: Maybe Response
      r = decode (LBSC.pack responseJson)