{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TemplateHaskell #-}

module Cassandra.Options where

import Cassandra.Helpers
import Control.Lens
import Data.Aeson.TH
import Imports

data Endpoint = Endpoint
  { Endpoint -> Text
_host :: !Text,
    Endpoint -> Word16
_port :: !Word16
  }
  deriving (Int -> Endpoint -> ShowS
[Endpoint] -> ShowS
Endpoint -> String
(Int -> Endpoint -> ShowS)
-> (Endpoint -> String) -> ([Endpoint] -> ShowS) -> Show Endpoint
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Endpoint -> ShowS
showsPrec :: Int -> Endpoint -> ShowS
$cshow :: Endpoint -> String
show :: Endpoint -> String
$cshowList :: [Endpoint] -> ShowS
showList :: [Endpoint] -> ShowS
Show, (forall x. Endpoint -> Rep Endpoint x)
-> (forall x. Rep Endpoint x -> Endpoint) -> Generic Endpoint
forall x. Rep Endpoint x -> Endpoint
forall x. Endpoint -> Rep Endpoint x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. Endpoint -> Rep Endpoint x
from :: forall x. Endpoint -> Rep Endpoint x
$cto :: forall x. Rep Endpoint x -> Endpoint
to :: forall x. Rep Endpoint x -> Endpoint
Generic)

deriveFromJSON toOptionFieldName ''Endpoint

makeLenses ''Endpoint

data CassandraOpts = CassandraOpts
  { CassandraOpts -> Endpoint
_endpoint :: !Endpoint,
    CassandraOpts -> Text
_keyspace :: !Text,
    -- | If this option is unset, use all available nodes.
    -- If this option is set, use only cassandra nodes in the given datacentre
    --
    -- This option is most likely only necessary during a cassandra DC migration
    -- FUTUREWORK: remove this option again, or support a datacentre migration feature
    CassandraOpts -> Maybe Text
_filterNodesByDatacentre :: !(Maybe Text),
    CassandraOpts -> Maybe String
_tlsCa :: Maybe FilePath
  }
  deriving (Int -> CassandraOpts -> ShowS
[CassandraOpts] -> ShowS
CassandraOpts -> String
(Int -> CassandraOpts -> ShowS)
-> (CassandraOpts -> String)
-> ([CassandraOpts] -> ShowS)
-> Show CassandraOpts
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CassandraOpts -> ShowS
showsPrec :: Int -> CassandraOpts -> ShowS
$cshow :: CassandraOpts -> String
show :: CassandraOpts -> String
$cshowList :: [CassandraOpts] -> ShowS
showList :: [CassandraOpts] -> ShowS
Show, (forall x. CassandraOpts -> Rep CassandraOpts x)
-> (forall x. Rep CassandraOpts x -> CassandraOpts)
-> Generic CassandraOpts
forall x. Rep CassandraOpts x -> CassandraOpts
forall x. CassandraOpts -> Rep CassandraOpts x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cfrom :: forall x. CassandraOpts -> Rep CassandraOpts x
from :: forall x. CassandraOpts -> Rep CassandraOpts x
$cto :: forall x. Rep CassandraOpts x -> CassandraOpts
to :: forall x. Rep CassandraOpts x -> CassandraOpts
Generic)

deriveFromJSON toOptionFieldName ''CassandraOpts

makeLenses ''CassandraOpts