如何在Dhall中表示“ Data.Map文本文本”?

时间:2019-05-05 00:28:35

标签: haskell yaml dhall

如果我在Haskell中有这样的类型:

data MyType = MyType
  { env :: Map Text Text
  }

我如何在Dhall中表示MyType的值?

{ env = ???
}

我想做的是在Dhall中写入MyType的值,然后从Haskell读取它并将其解组到MyType中,如下所示:

main :: IO ()
main = do
    x <- input auto "./config"
    print (x :: MyType)

我来自Data.Aeson和YAML,您可以在其中代表这样的地图:

env:
  KEY1: "foo"
  KEY2: "bar"

(您可以使用Aeson的MyType将以上内容解析为decodeFileEither类型)。

1 个答案:

答案 0 :(得分:1)

经过一番挖掘,我发现了三种解决方法。如果需要,跳到底部 最好的解决方法,直到 toMap着陆。

截止到2019年5月5日,Dhall中的地图无法像它那样 Aeson / YAML可以实现(尽管对本机toMap函数的支持是 快来了)。所以现在我们基本上必须使用齐次列表 记录。有点笨拙,但至少您可以原生解散。

如果我们要使用元组列表而不是地图,则可以执行以下操作:

{-# LANGUAGE DeriveGeneric     #-}
{-# LANGUAGE GeneralizedNewtypeDeriving   #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE FlexibleInstances     #-}
{-# LANGUAGE RecordWildCards     #-}

module Tuple where

import Dhall
import qualified Data.Text as T

data MyType = MyType { env :: [MyTuple] }
    deriving (Generic, Show)

instance Interpret MyType

newtype MyTuple = MyTuple (T.Text, T.Text)
    deriving (Interpret, Show)

-- input auto "{env = [{_1= \"HOME\", _2 = \"foo\"}] }" :: IO MyType

上面的内容改编自this answer,其中显示了一种 将IP地址解析为4元素元组。

要解析成Map,我们可以这样做:

{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE DeriveGeneric     #-}
{-# LANGUAGE FlexibleInstances     #-}

module MapA where

import Data.Map (Map)
import Data.Text (Text)
import Dhall

import qualified Data.Map

data MyType = MyType { env :: Map Text Text }
    deriving (Generic, Show)

data KeyValue a = KeyValue { mapKey :: Text, mapValue :: a }
    deriving (Generic, Show)

toMap :: [KeyValue a] -> Map Text a
toMap keyValues = Data.Map.fromList (map adapt keyValues)
  where
    adapt (KeyValue {..}) = (mapKey, mapValue)

instance Interpret MyType
instance Interpret a => Interpret (KeyValue a)

-- Wrap `Map` in a newtype if you want to avoid an orphan instance
instance Interpret a => Interpret (Map Text a) where
    autoWith options = fmap toMap (autoWith options)

-- input auto "{env = [{mapKey = \"HOME\", mapValue = \"foo\"}] }" :: IO MapA.MyType

以上改编自此 comment。这个想法是使 看起来像{ mapKey = X, mapValue = Y}可解析的记录,然后 将此类记录的任何列表转换为Map。注意我们如何支持任何价值 类型,而不仅仅是文本(因此我们可以将env中的MyType设为Map Text Int或 如果需要的话)。此解决方案只有1个类型变量a 映射中的值,但我想可以使键更多 通用的。

好的,所以在进行一些调整之后,我得到了以下内容进行编译,该代码同时支持 键和值也要通用:

{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE DeriveGeneric     #-}
{-# LANGUAGE FlexibleInstances     #-}

module MapKV where

import Data.Map (Map)
import Data.Text (Text)
import Dhall

import qualified Data.Map

data MyType = MyType { env :: Map Text Text }
    deriving (Generic, Show)

data MyTypeInts = MyTypeInts { envInts :: Map Integer Integer }
    deriving (Generic, Show)

data KeyValue k v = KeyValue { mapKey :: k, mapValue :: v }
    deriving (Generic, Show)

toMap :: Ord k => [KeyValue k v] -> Map k v
toMap keyValues = Data.Map.fromList (map adapt keyValues)
  where
    adapt (KeyValue {..}) = (mapKey, mapValue)

instance Interpret MyType
instance Interpret MyTypeInts
instance (Interpret k, Interpret v) => Interpret (KeyValue k v)

-- Wrap `Map` in a newtype if you want to avoid an orphan instance
instance (Ord k, Interpret k, Interpret v) => Interpret (Map k v) where
    autoWith options = fmap toMap (autoWith options)

-- input auto "{env = [{mapKey = +1, mapValue = \"foo\"}] }" :: IO MapKV.MyType
-- input auto "{envInts = [{mapKey = +1, mapValue = -22 }] }" :: IO MapKV.MyTypeInts

最后,这是一个避免使用Env newtype包装器的孤立实例的版本:

{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE DeriveGeneric     #-}
{-# LANGUAGE FlexibleInstances     #-}

module MapKV where

import Data.Map (Map)
import Dhall

import qualified Data.Map

data MyType = MyType { env :: Env }
    deriving (Generic, Show)

newtype Env = Env (Map Text Text)
  deriving (Eq, Generic, Show)

data KeyValue k v = KeyValue { mapKey :: k, mapValue :: v }
    deriving (Generic, Show)

toMap :: Ord k => [KeyValue k v] -> Map k v
toMap keyValues = Data.Map.fromList (map adapt keyValues)
  where
    adapt (KeyValue {..}) = (mapKey, mapValue)

instance Interpret MyType
instance (Interpret k, Interpret v) => Interpret (KeyValue k v)

instance Interpret Env where
    autoWith options = fmap (Env . toMap) (autoWith options)

-- input auto "{env = [{mapKey = \"HOME\", mapValue = \"foo\"}] }" :: IO MapKV.MyType