module Data.Avro.Types.Value where
import Data.ByteString
import Data.HashMap.Strict (HashMap)
import Data.Int
import Data.List.NonEmpty (NonEmpty)
import Data.Text
import Data.Vector
data Value f
= Null
| Boolean !Bool
| Int {-# UNPACK #-} !Int32
| Long {-# UNPACK #-} !Int64
| Float {-# UNPACK #-} !Float
| Double {-# UNPACK #-} !Double
| Bytes {-# UNPACK #-} !ByteString
| String {-# UNPACK #-} !Text
| Array (Vector (Value f))
| Map (HashMap Text (Value f))
| Record f (HashMap Text (Value f))
| Union (NonEmpty f) f (Value f)
| Fixed f {-# UNPACK #-} !ByteString
| Enum f {-# UNPACK #-} !Int Text
deriving (Eq, Show)