mirror of
https://github.com/postgres-haskell/postgres-wire.git
synced 2024-11-22 14:51:09 +03:00
Unfinished decoder for Numeric
This commit is contained in:
parent
5a5dbbd5d0
commit
856d839a7c
@ -35,6 +35,7 @@ library
|
|||||||
, Database.PostgreSQL.Protocol.Codecs.Decoders
|
, Database.PostgreSQL.Protocol.Codecs.Decoders
|
||||||
, Database.PostgreSQL.Protocol.Codecs.PgTypes
|
, Database.PostgreSQL.Protocol.Codecs.PgTypes
|
||||||
, Database.PostgreSQL.Protocol.Codecs.Time
|
, Database.PostgreSQL.Protocol.Codecs.Time
|
||||||
|
, Database.PostgreSQL.Protocol.Codecs.Numeric
|
||||||
other-modules: Database.PostgreSQL.Protocol.Utils
|
other-modules: Database.PostgreSQL.Protocol.Utils
|
||||||
build-depends: base >= 4.7 && < 5
|
build-depends: base >= 4.7 && < 5
|
||||||
, bytestring
|
, bytestring
|
||||||
|
@ -2,6 +2,8 @@ module Database.PostgreSQL.Protocol.Codecs.Decoders where
|
|||||||
|
|
||||||
import Data.Word
|
import Data.Word
|
||||||
import Data.Int
|
import Data.Int
|
||||||
|
import Data.Maybe
|
||||||
|
import Data.Fixed
|
||||||
import Data.Char
|
import Data.Char
|
||||||
import Data.UUID (UUID, fromWords)
|
import Data.UUID (UUID, fromWords)
|
||||||
import Data.Time (Day, UTCTime, LocalTime, DiffTime)
|
import Data.Time (Day, UTCTime, LocalTime, DiffTime)
|
||||||
@ -14,6 +16,7 @@ import Prelude hiding (bool)
|
|||||||
import Database.PostgreSQL.Protocol.Store.Decode
|
import Database.PostgreSQL.Protocol.Store.Decode
|
||||||
import Database.PostgreSQL.Protocol.Types
|
import Database.PostgreSQL.Protocol.Types
|
||||||
import Database.PostgreSQL.Protocol.Codecs.Time
|
import Database.PostgreSQL.Protocol.Codecs.Time
|
||||||
|
import Database.PostgreSQL.Protocol.Codecs.Numeric
|
||||||
|
|
||||||
-- | Decodes DataRow header.
|
-- | Decodes DataRow header.
|
||||||
-- 1 byte - Message Header
|
-- 1 byte - Message Header
|
||||||
@ -62,7 +65,7 @@ arrayHeader = skipBytes 12
|
|||||||
arrayDimensions :: Int -> Decode (V.Vector Int)
|
arrayDimensions :: Int -> Decode (V.Vector Int)
|
||||||
arrayDimensions dims = V.reverse <$> V.replicateM dims arrayDimSize
|
arrayDimensions dims = V.reverse <$> V.replicateM dims arrayDimSize
|
||||||
where
|
where
|
||||||
-- 4 bytes - count of elements in dimension
|
-- 4 bytes - count of elements in the dimension
|
||||||
-- 4 bytes - lower bound
|
-- 4 bytes - lower bound
|
||||||
arrayDimSize = (fromIntegral <$> getWord32BE) <* getWord32BE
|
arrayDimSize = (fromIntegral <$> getWord32BE) <* getWord32BE
|
||||||
|
|
||||||
@ -70,7 +73,7 @@ arrayDimensions dims = V.reverse <$> V.replicateM dims arrayDimSize
|
|||||||
arrayFieldDecoder :: Int -> (V.Vector Int -> Decode a) -> FieldDecoder a
|
arrayFieldDecoder :: Int -> (V.Vector Int -> Decode a) -> FieldDecoder a
|
||||||
arrayFieldDecoder dims f _ = arrayHeader *> arrayDimensions dims >>= f
|
arrayFieldDecoder dims f _ = arrayHeader *> arrayDimensions dims >>= f
|
||||||
|
|
||||||
-- | Decodes only content of a field.
|
-- | Decodes only a content of the field.
|
||||||
type FieldDecoder a = Int -> Decode a
|
type FieldDecoder a = Int -> Decode a
|
||||||
|
|
||||||
--
|
--
|
||||||
@ -127,8 +130,15 @@ bsJsonText = getByteString
|
|||||||
bsJsonBytes :: FieldDecoder B.ByteString
|
bsJsonBytes :: FieldDecoder B.ByteString
|
||||||
bsJsonBytes len = getWord8 *> getByteString (len - 1)
|
bsJsonBytes len = getWord8 *> getByteString (len - 1)
|
||||||
|
|
||||||
-- numeric :: FieldDecoder Scientific
|
numeric :: HasResolution a => FieldDecoder (Fixed a)
|
||||||
-- numeric = undefined
|
numeric _ = do
|
||||||
|
ndigits <- getWord16BE
|
||||||
|
weight <- getInt16BE
|
||||||
|
msign <- numericSign <$> getWord16BE
|
||||||
|
sign <- maybe (fail "unknown numeric") pure msign
|
||||||
|
dscale <- getWord16BE
|
||||||
|
digits <- replicateM (fromIntegral ndigits) getWord16BE
|
||||||
|
pure $ undefined
|
||||||
|
|
||||||
-- | Decodes text without applying encoding.
|
-- | Decodes text without applying encoding.
|
||||||
{-# INLINE bsText #-}
|
{-# INLINE bsText #-}
|
||||||
|
21
src/Database/PostgreSQL/Protocol/Codecs/Numeric.hs
Normal file
21
src/Database/PostgreSQL/Protocol/Codecs/Numeric.hs
Normal file
@ -0,0 +1,21 @@
|
|||||||
|
module Database.PostgreSQL.Protocol.Codecs.Numeric where
|
||||||
|
|
||||||
|
-- TODO test it
|
||||||
|
import Data.Word
|
||||||
|
import Data.Int
|
||||||
|
import Data.Foldable
|
||||||
|
import Data.Fixed
|
||||||
|
|
||||||
|
numericDigit :: [Word16] -> Integer
|
||||||
|
numericDigit = foldl' (\acc n -> acc * nBase + fromIntegral n) 0
|
||||||
|
|
||||||
|
numericSign :: Num a => Word16 -> Maybe a
|
||||||
|
numericSign 0x0000 = Just 1
|
||||||
|
numericSign 0x4000 = Just $ -1
|
||||||
|
numericSign _ = Nothing -- NaN code is 0xC000, it is not supported.
|
||||||
|
|
||||||
|
fixedFromNumeric :: HasResolution a => Int16 -> [Word16] -> Fixed a
|
||||||
|
fixedFromNumeric weight digits = undefined
|
||||||
|
|
||||||
|
nBase :: Num a => a
|
||||||
|
nBase = 10000
|
Loading…
Reference in New Issue
Block a user