raft-0.3.7.2: Miscellaneous Haskell utilities for data structures and data manipulation.

Safe HaskellNone
LanguageHaskell2010

Data.Relational.Value

Description

Deprecated: This module will be replaced in a future release.

Value from aeson for use in tuples and relations.

Synopsis

Documentation

data Value :: * #

A JSON value represented as a Haskell value.

Instances

Eq Value 

Methods

(==) :: Value -> Value -> Bool #

(/=) :: Value -> Value -> Bool #

Data Value 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Value -> c Value #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Value #

toConstr :: Value -> Constr #

dataTypeOf :: Value -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Value) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Value) #

gmapT :: (forall b. Data b => b -> b) -> Value -> Value #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Value -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Value -> r #

gmapQ :: (forall d. Data d => d -> u) -> Value -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Value -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Value -> m Value #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Value -> m Value #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Value -> m Value #

Read Value 
Show Value 

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

IsString Value 

Methods

fromString :: String -> Value #

Lift Value 

Methods

lift :: Value -> Q Exp #

Hashable Value 

Methods

hashWithSalt :: Int -> Value -> Int #

hash :: Value -> Int #

FromJSON Value 
ToJSON Value 
KeyValue Pair 

Methods

(.=) :: ToJSON v => Text -> v -> Pair #

NFData Value 

Methods

rnf :: Value -> () #

asValue Source #

Arguments

:: String

The string.

-> Value

The value.

Read a value.

valueAsRealFloat :: RealFloat a => Value -> a Source #

Convert a numeric value.

asRealFloat :: (RealFloat a, Read a) => String -> a Source #

Read a numeric value.

valueAsString :: Value -> String Source #

Convert to a string value.

string :: String -> Value Source #

Convert a string to a value.

number :: RealFloat a => a -> Value Source #

Convert a number to a value.

number' :: String -> Value Source #

Convert a number to a value.

enum :: (Enum a, Show a) => a -> Value Source #

Convert an enumeration to a value.

valueAsEnum :: (Enum a, Read a) => Value -> a Source #

Convert a value to an enumeration.

readTable Source #

Arguments

:: (Attribute r ~ Value, Tuple r) 
=> FilePath

The file path.

-> IO (Table r)

Action to read the table.

Read a table.

writeTable Source #

Arguments

:: (Attribute r ~ Value, Tuple r) 
=> FilePath

The file path.

-> Table r

The table.

-> IO ()

Action to write the table.

Write a table.