module Stratosphere.Evidently.Experiment (
        module Exports, Experiment(..), mkExperiment
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Evidently.Experiment.MetricGoalObjectProperty as Exports
import {-# SOURCE #-} Stratosphere.Evidently.Experiment.OnlineAbConfigObjectProperty as Exports
import {-# SOURCE #-} Stratosphere.Evidently.Experiment.RunningStatusObjectProperty as Exports
import {-# SOURCE #-} Stratosphere.Evidently.Experiment.TreatmentObjectProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data Experiment
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html>
    Experiment {Experiment -> ()
haddock_workaround_ :: (),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-description>
                Experiment -> Maybe (Value Text)
description :: (Prelude.Maybe (Value Prelude.Text)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-metricgoals>
                Experiment -> [MetricGoalObjectProperty]
metricGoals :: [MetricGoalObjectProperty],
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-name>
                Experiment -> Value Text
name :: (Value Prelude.Text),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-onlineabconfig>
                Experiment -> OnlineAbConfigObjectProperty
onlineAbConfig :: OnlineAbConfigObjectProperty,
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-project>
                Experiment -> Value Text
project :: (Value Prelude.Text),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-randomizationsalt>
                Experiment -> Maybe (Value Text)
randomizationSalt :: (Prelude.Maybe (Value Prelude.Text)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-removesegment>
                Experiment -> Maybe (Value Bool)
removeSegment :: (Prelude.Maybe (Value Prelude.Bool)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-runningstatus>
                Experiment -> Maybe RunningStatusObjectProperty
runningStatus :: (Prelude.Maybe RunningStatusObjectProperty),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-samplingrate>
                Experiment -> Maybe (Value Integer)
samplingRate :: (Prelude.Maybe (Value Prelude.Integer)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-segment>
                Experiment -> Maybe (Value Text)
segment :: (Prelude.Maybe (Value Prelude.Text)),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-tags>
                Experiment -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag]),
                -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-evidently-experiment.html#cfn-evidently-experiment-treatments>
                Experiment -> [TreatmentObjectProperty]
treatments :: [TreatmentObjectProperty]}
  deriving stock (Experiment -> Experiment -> Bool
(Experiment -> Experiment -> Bool)
-> (Experiment -> Experiment -> Bool) -> Eq Experiment
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Experiment -> Experiment -> Bool
== :: Experiment -> Experiment -> Bool
$c/= :: Experiment -> Experiment -> Bool
/= :: Experiment -> Experiment -> Bool
Prelude.Eq, Int -> Experiment -> ShowS
[Experiment] -> ShowS
Experiment -> String
(Int -> Experiment -> ShowS)
-> (Experiment -> String)
-> ([Experiment] -> ShowS)
-> Show Experiment
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Experiment -> ShowS
showsPrec :: Int -> Experiment -> ShowS
$cshow :: Experiment -> String
show :: Experiment -> String
$cshowList :: [Experiment] -> ShowS
showList :: [Experiment] -> ShowS
Prelude.Show)
mkExperiment ::
  [MetricGoalObjectProperty]
  -> Value Prelude.Text
     -> OnlineAbConfigObjectProperty
        -> Value Prelude.Text -> [TreatmentObjectProperty] -> Experiment
mkExperiment :: [MetricGoalObjectProperty]
-> Value Text
-> OnlineAbConfigObjectProperty
-> Value Text
-> [TreatmentObjectProperty]
-> Experiment
mkExperiment [MetricGoalObjectProperty]
metricGoals Value Text
name OnlineAbConfigObjectProperty
onlineAbConfig Value Text
project [TreatmentObjectProperty]
treatments
  = Experiment
      {haddock_workaround_ :: ()
haddock_workaround_ = (), metricGoals :: [MetricGoalObjectProperty]
metricGoals = [MetricGoalObjectProperty]
metricGoals, name :: Value Text
name = Value Text
name,
       onlineAbConfig :: OnlineAbConfigObjectProperty
onlineAbConfig = OnlineAbConfigObjectProperty
onlineAbConfig, project :: Value Text
project = Value Text
project,
       treatments :: [TreatmentObjectProperty]
treatments = [TreatmentObjectProperty]
treatments, description :: Maybe (Value Text)
description = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       randomizationSalt :: Maybe (Value Text)
randomizationSalt = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       removeSegment :: Maybe (Value Bool)
removeSegment = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing, runningStatus :: Maybe RunningStatusObjectProperty
runningStatus = Maybe RunningStatusObjectProperty
forall a. Maybe a
Prelude.Nothing,
       samplingRate :: Maybe (Value Integer)
samplingRate = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing, segment :: Maybe (Value Text)
segment = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties Experiment where
  toResourceProperties :: Experiment -> ResourceProperties
toResourceProperties Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Evidently::Experiment",
         supportsTags :: Bool
supportsTags = Bool
Prelude.True,
         properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
                        ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
                           [Key
"MetricGoals" Key -> [MetricGoalObjectProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [MetricGoalObjectProperty]
metricGoals, Key
"Name" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
name,
                            Key
"OnlineAbConfig" Key -> OnlineAbConfigObjectProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= OnlineAbConfigObjectProperty
onlineAbConfig, Key
"Project" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
project,
                            Key
"Treatments" Key -> [TreatmentObjectProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [TreatmentObjectProperty]
treatments]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Description" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
description,
                               Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RandomizationSalt" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
randomizationSalt,
                               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RemoveSegment" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
removeSegment,
                               Key -> RunningStatusObjectProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RunningStatus" (RunningStatusObjectProperty -> (Key, Value))
-> Maybe RunningStatusObjectProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe RunningStatusObjectProperty
runningStatus,
                               Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SamplingRate" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
samplingRate,
                               Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Segment" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
segment,
                               Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags]))}
instance JSON.ToJSON Experiment where
  toJSON :: Experiment -> Value
toJSON Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = [(Key, Value)] -> Value
JSON.object
        ([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
           ([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
              [Key
"MetricGoals" Key -> [MetricGoalObjectProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [MetricGoalObjectProperty]
metricGoals, Key
"Name" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
name,
               Key
"OnlineAbConfig" Key -> OnlineAbConfigObjectProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= OnlineAbConfigObjectProperty
onlineAbConfig, Key
"Project" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
project,
               Key
"Treatments" Key -> [TreatmentObjectProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [TreatmentObjectProperty]
treatments]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Description" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
description,
                  Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RandomizationSalt" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
randomizationSalt,
                  Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RemoveSegment" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
removeSegment,
                  Key -> RunningStatusObjectProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RunningStatus" (RunningStatusObjectProperty -> (Key, Value))
-> Maybe RunningStatusObjectProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe RunningStatusObjectProperty
runningStatus,
                  Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SamplingRate" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
samplingRate,
                  Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Segment" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
segment,
                  Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags])))
instance Property "Description" Experiment where
  type PropertyType "Description" Experiment = Value Prelude.Text
  set :: PropertyType "Description" Experiment -> Experiment -> Experiment
set PropertyType "Description" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = Experiment {description :: Maybe (Value Text)
description = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Description" Experiment
Value Text
newValue, [MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: ()
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
haddock_workaround_ :: ()
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
instance Property "MetricGoals" Experiment where
  type PropertyType "MetricGoals" Experiment = [MetricGoalObjectProperty]
  set :: PropertyType "MetricGoals" Experiment -> Experiment -> Experiment
set PropertyType "MetricGoals" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = Experiment {metricGoals :: [MetricGoalObjectProperty]
metricGoals = [MetricGoalObjectProperty]
PropertyType "MetricGoals" Experiment
newValue, [TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: ()
description :: Maybe (Value Text)
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
instance Property "Name" Experiment where
  type PropertyType "Name" Experiment = Value Prelude.Text
  set :: PropertyType "Name" Experiment -> Experiment -> Experiment
set PropertyType "Name" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..} = Experiment {name :: Value Text
name = PropertyType "Name" Experiment
Value Text
newValue, [MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
instance Property "OnlineAbConfig" Experiment where
  type PropertyType "OnlineAbConfig" Experiment = OnlineAbConfigObjectProperty
  set :: PropertyType "OnlineAbConfig" Experiment
-> Experiment -> Experiment
set PropertyType "OnlineAbConfig" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = Experiment {onlineAbConfig :: OnlineAbConfigObjectProperty
onlineAbConfig = PropertyType "OnlineAbConfig" Experiment
OnlineAbConfigObjectProperty
newValue, [MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
instance Property "Project" Experiment where
  type PropertyType "Project" Experiment = Value Prelude.Text
  set :: PropertyType "Project" Experiment -> Experiment -> Experiment
set PropertyType "Project" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..} = Experiment {project :: Value Text
project = PropertyType "Project" Experiment
Value Text
newValue, [MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
instance Property "RandomizationSalt" Experiment where
  type PropertyType "RandomizationSalt" Experiment = Value Prelude.Text
  set :: PropertyType "RandomizationSalt" Experiment
-> Experiment -> Experiment
set PropertyType "RandomizationSalt" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = Experiment {randomizationSalt :: Maybe (Value Text)
randomizationSalt = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RandomizationSalt" Experiment
Value Text
newValue, [MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
instance Property "RemoveSegment" Experiment where
  type PropertyType "RemoveSegment" Experiment = Value Prelude.Bool
  set :: PropertyType "RemoveSegment" Experiment -> Experiment -> Experiment
set PropertyType "RemoveSegment" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = Experiment {removeSegment :: Maybe (Value Bool)
removeSegment = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RemoveSegment" Experiment
Value Bool
newValue, [MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
instance Property "RunningStatus" Experiment where
  type PropertyType "RunningStatus" Experiment = RunningStatusObjectProperty
  set :: PropertyType "RunningStatus" Experiment -> Experiment -> Experiment
set PropertyType "RunningStatus" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = Experiment {runningStatus :: Maybe RunningStatusObjectProperty
runningStatus = RunningStatusObjectProperty -> Maybe RunningStatusObjectProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RunningStatus" Experiment
RunningStatusObjectProperty
newValue, [MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
instance Property "SamplingRate" Experiment where
  type PropertyType "SamplingRate" Experiment = Value Prelude.Integer
  set :: PropertyType "SamplingRate" Experiment -> Experiment -> Experiment
set PropertyType "SamplingRate" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = Experiment {samplingRate :: Maybe (Value Integer)
samplingRate = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SamplingRate" Experiment
Value Integer
newValue, [MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
instance Property "Segment" Experiment where
  type PropertyType "Segment" Experiment = Value Prelude.Text
  set :: PropertyType "Segment" Experiment -> Experiment -> Experiment
set PropertyType "Segment" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = Experiment {segment :: Maybe (Value Text)
segment = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Segment" Experiment
Value Text
newValue, [MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
instance Property "Tags" Experiment where
  type PropertyType "Tags" Experiment = [Tag]
  set :: PropertyType "Tags" Experiment -> Experiment -> Experiment
set PropertyType "Tags" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = Experiment {tags :: Maybe [Tag]
tags = [Tag] -> Maybe [Tag]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [Tag]
PropertyType "Tags" Experiment
newValue, [MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
treatments :: [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
treatments :: [TreatmentObjectProperty]
..}
instance Property "Treatments" Experiment where
  type PropertyType "Treatments" Experiment = [TreatmentObjectProperty]
  set :: PropertyType "Treatments" Experiment -> Experiment -> Experiment
set PropertyType "Treatments" Experiment
newValue Experiment {[MetricGoalObjectProperty]
[TreatmentObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: Experiment -> ()
description :: Experiment -> Maybe (Value Text)
metricGoals :: Experiment -> [MetricGoalObjectProperty]
name :: Experiment -> Value Text
onlineAbConfig :: Experiment -> OnlineAbConfigObjectProperty
project :: Experiment -> Value Text
randomizationSalt :: Experiment -> Maybe (Value Text)
removeSegment :: Experiment -> Maybe (Value Bool)
runningStatus :: Experiment -> Maybe RunningStatusObjectProperty
samplingRate :: Experiment -> Maybe (Value Integer)
segment :: Experiment -> Maybe (Value Text)
tags :: Experiment -> Maybe [Tag]
treatments :: Experiment -> [TreatmentObjectProperty]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
treatments :: [TreatmentObjectProperty]
..}
    = Experiment {treatments :: [TreatmentObjectProperty]
treatments = [TreatmentObjectProperty]
PropertyType "Treatments" Experiment
newValue, [MetricGoalObjectProperty]
Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe RunningStatusObjectProperty
()
Value Text
OnlineAbConfigObjectProperty
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
haddock_workaround_ :: ()
description :: Maybe (Value Text)
metricGoals :: [MetricGoalObjectProperty]
name :: Value Text
onlineAbConfig :: OnlineAbConfigObjectProperty
project :: Value Text
randomizationSalt :: Maybe (Value Text)
removeSegment :: Maybe (Value Bool)
runningStatus :: Maybe RunningStatusObjectProperty
samplingRate :: Maybe (Value Integer)
segment :: Maybe (Value Text)
tags :: Maybe [Tag]
..}