From faa45b16d5addb95417943b3f2996f8a13f1d80b Mon Sep 17 00:00:00 2001 From: Yura Lazaryev Date: Thu, 25 Sep 2025 16:22:53 +0200 Subject: [PATCH 01/12] feat: implement comprehensive Value benchmarking framework MIME-Version: 1.0 Content-Type: text/plain; charset=UTF-8 Content-Transfer-Encoding: 8bit Add new benchmarking infrastructure for Value builtin operations: - Values.hs benchmark module with comprehensive test coverage - Integration into main benchmarking suite - Test cases for cost model validation 🤖 Generated with [Claude Code](https://claude.ai/code) Co-Authored-By: Claude --- .../budgeting-bench/Benchmarks/Values.hs | 404 ++++++++++++++++++ .../cost-model/budgeting-bench/Main.hs | 2 + plutus-core/cost-model/test/TestCostModels.hs | 6 + plutus-core/plutus-core.cabal | 1 + 4 files changed, 413 insertions(+) create mode 100644 plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs diff --git a/plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs b/plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs new file mode 100644 index 00000000000..b8597ff6e8d --- /dev/null +++ b/plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs @@ -0,0 +1,404 @@ +{-# LANGUAGE BlockArguments #-} +{-# LANGUAGE ImportQualifiedPost #-} +{-# LANGUAGE NumericUnderscores #-} + +module Benchmarks.Values (makeBenchmarks) where + +import Prelude + +import Common +import Control.Monad (replicateM) +import Control.Monad.State.Strict (State) +import Criterion.Main (Benchmark) +import Data.ByteString (ByteString) +import Data.ByteString qualified as BS +import PlutusCore (DefaultFun (LookupCoin, UnValueData, ValueContains, ValueData)) +import PlutusCore.Evaluation.Machine.ExMemoryUsage (ValueOuterOrMaxInner (..), ValueTotalSize (..)) +import PlutusCore.Value (Value) +import PlutusCore.Value qualified as Value +import System.Random.Stateful (StatefulGen, StdGen, runStateGen_, uniformByteStringM, uniformRM) + +---------------------------------------------------------------------------------------------------- +-- Benchmarks -------------------------------------------------------------------------------------- + +makeBenchmarks :: StdGen -> [Benchmark] +makeBenchmarks gen = + [ lookupCoinBenchmark gen + , valueContainsBenchmark gen + , valueDataBenchmark gen + , unValueDataBenchmark gen + ] + +---------------------------------------------------------------------------------------------------- +-- LookupCoin -------------------------------------------------------------------------------------- + +lookupCoinBenchmark :: StdGen -> Benchmark +lookupCoinBenchmark gen = + createThreeTermBuiltinBenchElementwiseWithWrappers + (id, id, ValueOuterOrMaxInner) -- Wrap Value argument to report outer/max inner size + LookupCoin -- the builtin fun + [] -- no type arguments needed (monomorphic builtin) + (lookupCoinArgs gen) -- the argument combos to generate benchmarks for + +lookupCoinArgs :: StdGen -> [(ByteString, ByteString, Value)] +lookupCoinArgs gen = runStateGen_ gen $ \(g :: g) -> do + let + -- Use common test values and add search keys + testValues = generateTestValues gen + + -- Also include additional random tests specific to lookupCoin + additionalTests = runStateGen_ gen $ \g' -> do + let keySizes = [0, 1, 30, 100, 1_000, 10_000, 20_000] + sequence $ + concat + [ -- Key size impact tests with large keys + [ generateLookupTest g' policySize tokenSize 100 10 + | policySize <- keySizes + , tokenSize <- [0, 30, 1_000, 20_000] + ] + , -- Budget-constrained tests (at 30KB limit) + [ generateBudgetTest g' policySize tokenSize 30_000 + | (policySize, tokenSize) <- + [ (20_000, 1) -- Huge policy, tiny token + , (1, 20_000) -- Tiny policy, huge token + , (10_000, 10_000) -- Both large + , (1, 1) -- Both tiny (max entries) + , (0, 0) -- Empty keys (pathological) + ] + ] + , -- Additional random tests for parameter spread + replicate 50 (generateRandomLookupTest g') + ] + + -- Add search keys to common test values + + -- Add search keys to a value for lookup testing + -- Generates random keys that may or may not exist in the value + addSearchKeysToValue :: Value -> State StdGen (ByteString, ByteString, Value) + addSearchKeysToValue value = do + -- Generate search keys with varying sizes (mostly 30 bytes for consistency) + let keySize = 30 -- Standard key size used in most tests + searchPolicyId <- generatePolicyId keySize g + searchTokenName <- generateTokenName keySize g + pure (searchPolicyId, searchTokenName, value) + + commonWithKeys <- sequence [addSearchKeysToValue value | value <- testValues] + + pure $ commonWithKeys ++ additionalTests + +-- | Generate lookup test with specified parameters +generateLookupTest + :: (StatefulGen g m) + => g + -> Int -- Policy ID byte size + -> Int -- Token name byte size + -> Int -- Number of policies + -> Int -- Tokens per policy + -> m (ByteString, ByteString, Value) +generateLookupTest + g + policyIdBytes + tokenNameBytes + numPolicies + tokensPerPolicy = do + value <- + generateConstrainedValue + numPolicies + tokensPerPolicy + policyIdBytes + tokenNameBytes + g + -- Generate lookup keys (may or may not exist in value) + searchPolicyId <- generatePolicyId policyIdBytes g + searchTokenName <- generateTokenName tokenNameBytes g + pure (searchPolicyId, searchTokenName, value) + +-- | Generate budget-constrained test +generateBudgetTest + :: (StatefulGen g m) + => g + -> Int -- Policy ID byte size + -> Int -- Token name byte size + -> Int -- Total budget + -> m (ByteString, ByteString, Value) +generateBudgetTest g policyIdBytes tokenNameBytes budget = do + value <- generateValueWithBudget policyIdBytes tokenNameBytes budget g + searchPolicyId <- generatePolicyId policyIdBytes g + searchTokenName <- generateTokenName tokenNameBytes g + pure (searchPolicyId, searchTokenName, value) + +-- | Generate random lookup test with varied parameters for better spread +generateRandomLookupTest :: (StatefulGen g m) => g -> m (ByteString, ByteString, Value) +generateRandomLookupTest g = do + policyIdBytes <- uniformRM (0, 20_000) g -- 0-20KB policy ID + tokenNameBytes <- uniformRM (0, 20_000) g -- 0-20KB token name + numPolicies <- uniformRM (1, 2_000) g -- 1-2000 policies + tokensPerPolicy <- uniformRM (1, 1_000) g -- 1-1000 tokens per policy + + -- Generate value with random parameters + value <- generateConstrainedValue numPolicies tokensPerPolicy policyIdBytes tokenNameBytes g + + -- Generate search keys + searchPolicyId <- uniformByteStringM policyIdBytes g + searchTokenName <- uniformByteStringM tokenNameBytes g + + pure (searchPolicyId, searchTokenName, value) + +---------------------------------------------------------------------------------------------------- +-- ValueContains ----------------------------------------------------------------------------------- + +valueContainsBenchmark :: StdGen -> Benchmark +valueContainsBenchmark gen = + createTwoTermBuiltinBenchElementwiseWithWrappers + (ValueOuterOrMaxInner, ValueTotalSize) + -- Container: outer/maxInner, Contained: totalSize + ValueContains -- the builtin fun + [] -- no type arguments needed (monomorphic builtin) + (valueContainsArgs gen) -- the argument combos to generate benchmarks for + +valueContainsArgs :: StdGen -> [(Value, Value)] +valueContainsArgs gen = runStateGen_ gen \g -> do + let + baseKeySizes = [0, 30, 1_000, 10_000] + baseValueSizes = [1, 10, 100, 1_000] + + sequence $ + concat + [ -- Standard key tests with varying value sizes (original Size-based tests) + [ generateContainsTest g containerSize containedSize 30 + | containerSize <- baseValueSizes + , containedSize <- baseValueSizes + , containedSize <= containerSize + ] + , -- Key size impact tests + [ generateContainsTest g 100 10 keySize + | keySize <- baseKeySizes + ] + , -- Budget-constrained tests + [ generateContainsBudgetTest g 30_000 keySize + | keySize <- [0, 30, 3_000, 20_000] + ] + , -- Edge cases + [ generateEmptyContainedTest g containerSize 30 + | containerSize <- [0, 10, 100, 1_000] + ] + , -- Random tests for parameter spread (100 combinations) + replicate 100 (generateRandomContainsTest g) + ] + +-- | Generate valueContains test with specified parameters +generateContainsTest + :: (StatefulGen g m) + => g + -> Int -- Container value size + -> Int -- Contained value size + -> Int -- Key byte size (for both policy and token) + -> m (Value, Value) +generateContainsTest g containerSize containedSize keySize = do + -- Generate container value + container <- generateConstrainedValue containerSize 10 keySize keySize g + + -- Generate contained as subset of container (for true contains relationship) + let containerList = Value.toList container + containedEntries = take containedSize containerList + + let contained = + Value.fromList $ + [ (policyId, take (containedSize `div` max 1 (length containerList)) tokens) + | (policyId, tokens) <- containedEntries + ] + + pure (container, contained) + +-- | Generate budget-constrained contains test +generateContainsBudgetTest + :: (StatefulGen g m) + => g + -> Int -- Total budget + -> Int -- Key size + -> m (Value, Value) +generateContainsBudgetTest g budget keySize = do + container <- generateValueWithBudget keySize keySize budget g + -- Generate smaller contained value (subset) + let containerList = Value.toList container + containedEntries = take (length containerList `div` 2) containerList + pure (container, Value.fromList containedEntries) + +-- | Generate test with empty contained value +generateEmptyContainedTest + :: (StatefulGen g m) + => g + -> Int -- Container size + -> Int -- Key size + -> m (Value, Value) +generateEmptyContainedTest g containerSize keySize = do + container <- generateConstrainedValue containerSize 10 keySize keySize g + pure (container, Value.empty) + +-- | Generate random valueContains test with varied parameters for better spread +generateRandomContainsTest :: (StatefulGen g m) => g -> m (Value, Value) +generateRandomContainsTest g = do + -- Generate random parameters with good spread + containerEntries <- uniformRM (1, 5_000) g -- 1-5000 container entries + containedEntries <- uniformRM (1, containerEntries) g -- 1-container count + keyBytes <- uniformRM (1, 5_000) g -- 1-5000 byte keys + + -- Generate container value with exact entry count + container <- generateRandomValueForContains containerEntries keyBytes g + + -- Generate contained as subset of container entries + let containerList = Value.toList container + containedList = take containedEntries containerList + contained = Value.fromList containedList + + pure (container, contained) + +-- | Generate Value for contains tests with exact entry count +generateRandomValueForContains + :: (StatefulGen g m) + => Int -- Entry count + -> Int -- Key byte size + -> g + -> m Value +generateRandomValueForContains entryCount keyBytes g = do + -- Generate policies and tokens with exact entry count + policyIds <- replicateM entryCount (uniformByteStringM keyBytes g) + tokenNames <- replicateM entryCount (uniformByteStringM keyBytes g) + + let + -- Create amounts (1 to 1000000) + amounts = [fromIntegral (1 + i `mod` 1_000_000) | i <- [0 .. entryCount - 1]] + + pure $ + Value.fromList + [ (policy, [(token, amount)]) + | (policy, token, amount) <- zip3 policyIds tokenNames amounts + ] + +---------------------------------------------------------------------------------------------------- +-- ValueData --------------------------------------------------------------------------------------- + +valueDataBenchmark :: StdGen -> Benchmark +valueDataBenchmark gen = + createOneTermBuiltinBenchWithWrapper + ValueTotalSize + ValueData + [] + (generateTestValues gen) + +---------------------------------------------------------------------------------------------------- +-- UnValueData ------------------------------------------------------------------------------------- + +unValueDataBenchmark :: StdGen -> Benchmark +unValueDataBenchmark gen = + createOneTermBuiltinBench UnValueData [] (Value.valueData <$> generateTestValues gen) + +---------------------------------------------------------------------------------------------------- +-- Value Generators -------------------------------------------------------------------------------- + +-- | Generate common test values for benchmarking +generateTestValues :: StdGen -> [Value] +generateTestValues gen = runStateGen_ gen \g -> do + let + baseValueSizes = [1, 10, 50, 100, 500, 1_000] + keySizes = [0, 30, 100, 1_000, 10_000] + + sequence $ + concat + [ -- Empty value as edge case (first test cbase) + [pure Value.empty] + , -- Standard value sizes with varying key sizes + [ generateConstrainedValue valueSize 10 keySize keySize g + | valueSize <- baseValueSizes + , keySize <- [30, 1_000] + ] + , -- Key size impact tests (fixed value structure, varying key sizes) + [ generateConstrainedValue 100 10 keySize keySize g + | keySize <- keySizes + ] + , -- Budget-constrained tests + [ generateValueWithBudget keySize keySize budget g + | keySize <- [0, 30, 1_000, 10_000] + , budget <- [1_000, 10_000, 30_000] + ] + , -- Random tests for parameter spread (50 combinations) + replicate 50 $ do + numPolicies <- uniformRM (1, 1_000) g + tokensPerPolicy <- uniformRM (1, 500) g + policyIdBytes <- uniformRM (0, 10_000) g + tokenNameBytes <- uniformRM (0, 10_000) g + generateConstrainedValue numPolicies tokensPerPolicy policyIdBytes tokenNameBytes g + ] + +-- | Generate constrained Value with total size budget +generateConstrainedValue + :: (StatefulGen g m) + => Int -- Number of policies + -> Int -- Number of tokens per policy + -> Int -- Policy ID byte length + -> Int -- Token name byte length + -> g + -> m Value +generateConstrainedValue numPolicies tokensPerPolicy policyIdBytes tokenNameBytes g = do + policyIds <- -- Generate policy IDs of specified size + replicateM numPolicies (generatePolicyId policyIdBytes g) + + tokenNames <- -- Generate token names of specified size + replicateM tokensPerPolicy (generateTokenName tokenNameBytes g) + + -- Generate positive quantities (1 to 1000000) + let quantity :: Int -> Int -> Integer + quantity policyIndex tokenIndex = + fromIntegral (1 + (policyIndex * 1_000 + tokenIndex) `mod` 1_000_000) + + nestedMap :: [(ByteString, [(ByteString, Integer)])] + nestedMap = + [ ( policyId + , [ (tokenName, quantity policyIndex tokenIndex) + | (tokenIndex, tokenName) <- zip [0 ..] tokenNames + ] + ) + | (policyIndex, policyId) <- zip [0 ..] policyIds + ] + pure $ Value.fromList nestedMap + +-- | Generate Value within total size budget +generateValueWithBudget + :: (StatefulGen g m) + => Int -- Policy ID byte length + -> Int -- Token name byte length + -> Int -- Target total size budget + -> g + -> m Value +generateValueWithBudget policyIdBytes tokenNameBytes budget g = do + let + overhead = 8 -- bytes per amount + + -- Calculate maximum possible entries + bytesPerEntry = policyIdBytes + tokenNameBytes + overhead + maxEntries = + if bytesPerEntry > 0 + then min (budget `div` bytesPerEntry) budget + else budget -- Handle 0 case + + -- Simple distribution: try to balance policies and tokens + numPolicies = max 1 (floor (sqrt (fromIntegral maxEntries :: Double))) + tokensPerPolicy = if numPolicies > 0 then maxEntries `div` numPolicies else 0 + + generateConstrainedValue numPolicies tokensPerPolicy policyIdBytes tokenNameBytes g + +---------------------------------------------------------------------------------------------------- +-- Other Generators -------------------------------------------------------------------------------- + +-- | Generate policy ID of specified size +generatePolicyId :: (StatefulGen g m) => Int -> g -> m ByteString +generatePolicyId = generateByteString + +-- | Generate token name of specified size +generateTokenName :: (StatefulGen g m) => Int -> g -> m ByteString +generateTokenName = generateByteString + +-- | Generate ByteString of specified size +generateByteString :: (StatefulGen g m) => Int -> g -> m ByteString +generateByteString 0 _ = pure BS.empty +generateByteString l g = uniformByteStringM l g diff --git a/plutus-core/cost-model/budgeting-bench/Main.hs b/plutus-core/cost-model/budgeting-bench/Main.hs index 51be377f0e8..6c9124f4a38 100644 --- a/plutus-core/cost-model/budgeting-bench/Main.hs +++ b/plutus-core/cost-model/budgeting-bench/Main.hs @@ -17,6 +17,7 @@ import Benchmarks.Pairs qualified import Benchmarks.Strings qualified import Benchmarks.Tracing qualified import Benchmarks.Unit qualified +import Benchmarks.Values qualified import Criterion.Main import Criterion.Types as C @@ -60,6 +61,7 @@ main = do <> Benchmarks.Strings.makeBenchmarks gen <> Benchmarks.Tracing.makeBenchmarks gen <> Benchmarks.Unit.makeBenchmarks gen + <> Benchmarks.Values.makeBenchmarks gen {- Run the nop benchmarks with a large time limit (30 seconds) in an attempt to get accurate results. -} diff --git a/plutus-core/cost-model/test/TestCostModels.hs b/plutus-core/cost-model/test/TestCostModels.hs index e202ce228d7..fa0d4ef0652 100644 --- a/plutus-core/cost-model/test/TestCostModels.hs +++ b/plutus-core/cost-model/test/TestCostModels.hs @@ -387,6 +387,12 @@ main = , $(genTest 1 "listToArray") , $(genTest 2 "indexArray") Everywhere + -- Builtin Values + , $(genTest 3 "lookupCoin") + , $(genTest 2 "valueContains") Everywhere + , $(genTest 1 "valueData") + , $(genTest 1 "unValueData") + -- Data , $(genTest 6 "chooseData") , $(genTest 2 "constrData") Everywhere diff --git a/plutus-core/plutus-core.cabal b/plutus-core/plutus-core.cabal index 956d3ade95c..c22310206e5 100644 --- a/plutus-core/plutus-core.cabal +++ b/plutus-core/plutus-core.cabal @@ -935,6 +935,7 @@ executable cost-model-budgeting-bench Benchmarks.Strings Benchmarks.Tracing Benchmarks.Unit + Benchmarks.Values Common CriterionExtensions Generators From 5128377a9772773d083626eb5d78370ca4d528ff Mon Sep 17 00:00:00 2001 From: Yura Lazaryev Date: Thu, 25 Sep 2025 16:23:12 +0200 Subject: [PATCH 02/12] feat: add statistical models and cost parameters for Value builtins MIME-Version: 1.0 Content-Type: text/plain; charset=UTF-8 Content-Transfer-Encoding: 8bit Implement statistical modeling and parameter extraction: - R models for lookupCoin, valueContains, valueData, unValueData - Linear regression models with proper memory scaling - Cost model parameter extraction and conversion infrastructure 🤖 Generated with [Claude Code](https://claude.ai/code) Co-Authored-By: Claude --- .../create-cost-model/BuiltinMemoryModels.hs | 5 ++++ .../CreateBuiltinCostModel.hs | 10 +++++++ plutus-core/cost-model/data/models.R | 29 +++++++++++++++++-- 3 files changed, 42 insertions(+), 2 deletions(-) diff --git a/plutus-core/cost-model/create-cost-model/BuiltinMemoryModels.hs b/plutus-core/cost-model/create-cost-model/BuiltinMemoryModels.hs index 65e647d48f9..a138a9bbf1b 100644 --- a/plutus-core/cost-model/create-cost-model/BuiltinMemoryModels.hs +++ b/plutus-core/cost-model/create-cost-model/BuiltinMemoryModels.hs @@ -176,5 +176,10 @@ builtinMemoryModels = BuiltinCostModelBase , paramLengthOfArray = Id $ ModelOneArgumentConstantCost 10 , paramListToArray = Id $ ModelOneArgumentLinearInX $ OneVariableLinearFunction 7 1 , paramIndexArray = Id $ ModelTwoArgumentsConstantCost 32 + -- Builtin values + , paramLookupCoin = Id $ ModelThreeArgumentsConstantCost 1 + , paramValueContains = Id $ ModelTwoArgumentsConstantCost 1 + , paramValueData = Id $ ModelOneArgumentConstantCost 1 + , paramUnValueData = Id $ ModelOneArgumentConstantCost 1 } where identityFunction = OneVariableLinearFunction 0 1 diff --git a/plutus-core/cost-model/create-cost-model/CreateBuiltinCostModel.hs b/plutus-core/cost-model/create-cost-model/CreateBuiltinCostModel.hs index 889d43da60a..9d138865dde 100644 --- a/plutus-core/cost-model/create-cost-model/CreateBuiltinCostModel.hs +++ b/plutus-core/cost-model/create-cost-model/CreateBuiltinCostModel.hs @@ -131,6 +131,11 @@ builtinCostModelNames = BuiltinCostModelBase , paramLengthOfArray = "lengthOfArrayModel" , paramListToArray = "listToArrayModel" , paramIndexArray = "indexArrayModel" + -- Builtin values + , paramLookupCoin = "lookupCoinModel" + , paramValueContains = "valueContainsModel" + , paramValueData = "valueDataModel" + , paramUnValueData = "unValueDataModel" } @@ -279,6 +284,11 @@ createBuiltinCostModel bmfile rfile = do paramLengthOfArray <- getParams readCF1 paramLengthOfArray paramListToArray <- getParams readCF1 paramListToArray paramIndexArray <- getParams readCF2 paramIndexArray + -- Builtin values + paramLookupCoin <- getParams readCF3 paramLookupCoin + paramValueContains <- getParams readCF2 paramValueContains + paramValueData <- getParams readCF1 paramValueData + paramUnValueData <- getParams readCF1 paramUnValueData pure $ BuiltinCostModelBase {..} diff --git a/plutus-core/cost-model/data/models.R b/plutus-core/cost-model/data/models.R index 974d83d64a4..802a2db11b1 100644 --- a/plutus-core/cost-model/data/models.R +++ b/plutus-core/cost-model/data/models.R @@ -152,6 +152,10 @@ arity <- function(name) { "LengthOfArray" = 1, "ListToArray" = 1, "IndexArray" = 2, + "LookupCoin" = 3, + "ValueContains" = 2, + "ValueData" = 1, + "UnValueData" = 1, -1 ## Default for missing values ) } @@ -804,11 +808,28 @@ modelFun <- function(path) { dropListModel <- linearInX ("DropList") - ## Arrays + ## Arrays lengthOfArrayModel <- constantModel ("LengthOfArray") listToArrayModel <- linearInX ("ListToArray") indexArrayModel <- constantModel ("IndexArray") + ## Values + lookupCoinModel <- linearInZ ("LookupCoin") + + ## ValueContains is O(n₂ × log max(m₁, k₁)) where n₂ is the total size of the second Value + ## We model this as linear in the sum of sizes, which is conservative + valueContainsModel <- { + fname <- "ValueContains" + filtered <- data %>% + filter.and.check.nonempty(fname) %>% + discard.upper.outliers() + m <- lm(t ~ I(x_mem + y_mem), filtered) + mk.result(m, "added_sizes") + } + + valueDataModel <- constantModel ("ValueData") + unValueDataModel <- linearInX ("UnValueData") + ##### Models to be returned to Haskell ##### models.for.adjustment <- @@ -902,7 +923,11 @@ modelFun <- function(path) { dropListModel = dropListModel, lengthOfArrayModel = lengthOfArrayModel, listToArrayModel = listToArrayModel, - indexArrayModel = indexArrayModel + indexArrayModel = indexArrayModel, + lookupCoinModel = lookupCoinModel, + valueContainsModel = valueContainsModel, + valueDataModel = valueDataModel, + unValueDataModel = unValueDataModel ) ## The integer division functions have a complex costing behaviour that requires some negative From 98d9ed80f26e3ef349de2835457807091f393c17 Mon Sep 17 00:00:00 2001 From: Yura Lazaryev Date: Thu, 25 Sep 2025 16:23:29 +0200 Subject: [PATCH 03/12] feat: add comprehensive benchmark data for Value operations MIME-Version: 1.0 Content-Type: text/plain; charset=UTF-8 Content-Transfer-Encoding: 8bit Update benchmarking dataset with extensive Value builtin measurements: - Performance data for lookupCoin, valueContains, valueData, unValueData - Wide range of input sizes for accurate cost modeling - Statistical data supporting linear regression models 🤖 Generated with [Claude Code](https://claude.ai/code) Co-Authored-By: Claude --- .../cost-model/data/benching-conway.csv | 845 +++++++++++++----- 1 file changed, 645 insertions(+), 200 deletions(-) diff --git a/plutus-core/cost-model/data/benching-conway.csv b/plutus-core/cost-model/data/benching-conway.csv index e9f8f948ddd..64cb32a5ddb 100644 --- a/plutus-core/cost-model/data/benching-conway.csv +++ b/plutus-core/cost-model/data/benching-conway.csv @@ -12094,203 +12094,648 @@ IndexArray/42/1,1.075506579052359e-6,1.0748433439930302e-6,1.0762684407023462e-6 IndexArray/46/1,1.0697135554442532e-6,1.0690902192698813e-6,1.0704133377013816e-6,2.2124820728450233e-9,1.8581237858977844e-9,2.6526943923047553e-9 IndexArray/98/1,1.0700747499373992e-6,1.0693842628239684e-6,1.070727062396803e-6,2.2506114869928674e-9,1.9376849028666025e-9,2.7564941558204088e-9 IndexArray/82/1,1.0755056682976695e-6,1.0750405368241111e-6,1.076102212770973e-6,1.8355219893844098e-9,1.5161640335164335e-9,2.4443625958006994e-9 -Bls12_381_G1_multiScalarMul/1/1,8.232134704712041e-5,8.228195390475752e-5,8.23582682466318e-5,1.224261187989977e-7,9.011720721178711e-8,1.843107342917502e-7 -Bls12_381_G1_multiScalarMul/2/2,1.5603352113689742e-4,1.5600025884754734e-4,1.56065185257734e-4,1.094394761986619e-7,8.779071446458298e-8,1.4947970533315267e-7 -Bls12_381_G1_multiScalarMul/3/3,1.939329666457593e-4,1.9388354851368188e-4,1.9402197408734082e-4,2.1995467058503616e-7,1.0779055620051168e-7,3.598144610846602e-7 -Bls12_381_G1_multiScalarMul/4/4,2.3193769861120354e-4,2.3185777330912127e-4,2.3201206490119206e-4,2.61940592999759e-7,2.2941719187582037e-7,3.077882579221989e-7 -Bls12_381_G1_multiScalarMul/5/5,2.7024485787950484e-4,2.701985832375676e-4,2.703562833994201e-4,2.504717874031756e-7,1.061103089376427e-7,4.5178956774050623e-7 -Bls12_381_G1_multiScalarMul/6/6,3.0832848017233854e-4,3.0828505860448953e-4,3.0841239554252326e-4,2.0081914026068556e-7,9.503560402226141e-8,3.348991421491274e-7 -Bls12_381_G1_multiScalarMul/7/7,3.453960291097332e-4,3.4529502000293173e-4,3.455551893661785e-4,4.503893151758501e-7,3.083661872443178e-7,7.81083043020636e-7 -Bls12_381_G1_multiScalarMul/8/8,3.832976511516978e-4,3.831399415816367e-4,3.8350168059661554e-4,6.425351357987778e-7,4.905809379814108e-7,9.901201715565621e-7 -Bls12_381_G1_multiScalarMul/9/9,4.208393675237262e-4,4.207594143609449e-4,4.209463240895972e-4,2.9714485369386276e-7,2.3487011012607412e-7,3.8965401426852136e-7 -Bls12_381_G1_multiScalarMul/10/10,4.590267934709921e-4,4.589529485523938e-4,4.5921225223072857e-4,3.674247719157326e-7,1.960955535102652e-7,6.745469596123421e-7 -Bls12_381_G1_multiScalarMul/11/11,4.97527732566443e-4,4.972281860134679e-4,4.986282302732426e-4,1.7151877711893442e-6,5.122548200854059e-7,3.5332096552138613e-6 -Bls12_381_G1_multiScalarMul/12/12,5.356509855658948e-4,5.355651207657092e-4,5.357300213867713e-4,2.869286988508056e-7,2.2118709297739587e-7,3.945684847893835e-7 -Bls12_381_G1_multiScalarMul/13/13,5.728512759489744e-4,5.726915276394053e-4,5.733007180741135e-4,8.949768255378629e-7,2.990100102556068e-7,1.799582591634419e-6 -Bls12_381_G1_multiScalarMul/14/14,6.102677458891477e-4,6.101406595840958e-4,6.104800133890259e-4,5.730641911125035e-7,4.2156110110763734e-7,9.874293144495503e-7 -Bls12_381_G1_multiScalarMul/15/15,6.477995208670887e-4,6.475756774649752e-4,6.480865282403314e-4,8.809829049973348e-7,7.579659277726546e-7,1.1589928070099792e-6 -Bls12_381_G1_multiScalarMul/16/16,7.10232795606239e-4,7.101357580525187e-4,7.103534690693274e-4,3.9630772993102876e-7,3.017996615312032e-7,6.065624023561599e-7 -Bls12_381_G1_multiScalarMul/17/17,7.482241201028533e-4,7.479063489174819e-4,7.493005226515e-4,1.7468995103377413e-6,4.207394233578458e-7,3.5919072692845237e-6 -Bls12_381_G1_multiScalarMul/18/18,7.705925934553824e-4,7.701144938606196e-4,7.727806329806679e-4,2.721631169491716e-6,7.981968678057562e-7,5.845417811648959e-6 -Bls12_381_G1_multiScalarMul/19/19,8.07991568665831e-4,8.078519602328661e-4,8.082935546448865e-4,6.822381786366707e-7,4.1123728418619586e-7,1.2817508134125719e-6 -Bls12_381_G1_multiScalarMul/20/20,8.305413129620952e-4,8.304197199200644e-4,8.306902645257076e-4,4.3666055013588826e-7,3.4850947949373826e-7,5.517969661861731e-7 -Bls12_381_G1_multiScalarMul/21/21,8.686137577309382e-4,8.683705360374326e-4,8.690514729472171e-4,1.0365305564754837e-6,6.15324072934707e-7,1.7554645846499009e-6 -Bls12_381_G1_multiScalarMul/22/22,8.91652773561559e-4,8.91448841424083e-4,8.919251447254486e-4,8.003760296748043e-7,5.948851969272322e-7,1.1100316085161068e-6 -Bls12_381_G1_multiScalarMul/23/23,9.294873328615929e-4,9.2931706336974e-4,9.29674543066649e-4,6.225406051789035e-7,4.744164895701269e-7,8.695237190578588e-7 -Bls12_381_G1_multiScalarMul/24/24,9.517388775125774e-4,9.51297780087541e-4,9.521482216169379e-4,1.3722719341729154e-6,1.062307342501858e-6,1.7843971621271001e-6 -Bls12_381_G1_multiScalarMul/25/25,9.886064604005137e-4,9.882251183807264e-4,9.897265063364012e-4,1.8798264902284367e-6,6.736369822886704e-7,3.814951405763071e-6 -Bls12_381_G1_multiScalarMul/26/26,1.0107695436644823e-3,1.0105299581864577e-3,1.0111683184415275e-3,9.824869954193735e-7,6.273786628516054e-7,1.789759844703243e-6 -Bls12_381_G1_multiScalarMul/27/27,1.0481752477344507e-3,1.0477770452434242e-3,1.0488436059663702e-3,1.70119074982601e-6,1.1033927625372998e-6,2.421859397722192e-6 -Bls12_381_G1_multiScalarMul/28/28,1.071199845880856e-3,1.0708432481182537e-3,1.0720804641719981e-3,1.6595833959304896e-6,8.543899072576939e-7,2.9475871714734805e-6 -Bls12_381_G1_multiScalarMul/29/29,1.1091453942723057e-3,1.1088806422385156e-3,1.1094556190265087e-3,9.884003711358195e-7,8.097303732520417e-7,1.3599340574873413e-6 -Bls12_381_G1_multiScalarMul/30/30,1.1316695694102287e-3,1.1314082924647447e-3,1.1319750321409226e-3,9.66367104215988e-7,7.685686878341102e-7,1.204378285010742e-6 -Bls12_381_G1_multiScalarMul/31/31,1.1706362298123296e-3,1.1701248243111372e-3,1.1713912110155227e-3,2.1219139874861063e-6,1.5567879843419155e-6,2.916931910163364e-6 -Bls12_381_G1_multiScalarMul/32/32,1.2183054885742289e-3,1.2178167501590653e-3,1.2191423331752846e-3,2.082314742656685e-6,1.3954922622922078e-6,3.3606861800964793e-6 -Bls12_381_G1_multiScalarMul/33/33,1.25554775700385e-3,1.2553212908295874e-3,1.256064024330601e-3,1.103995478961421e-6,6.577553035929982e-7,1.960982872144134e-6 -Bls12_381_G1_multiScalarMul/34/34,1.2814120185183533e-3,1.2811113200601465e-3,1.2817386977410077e-3,1.066328231240918e-6,8.498751061674896e-7,1.3581581158462333e-6 -Bls12_381_G1_multiScalarMul/35/35,1.3147784280299476e-3,1.3142019737646283e-3,1.3159148898431248e-3,2.7821602645732677e-6,1.2576600123958567e-6,4.71910870274486e-6 -Bls12_381_G1_multiScalarMul/36/36,1.3219048104980895e-3,1.3213844160889154e-3,1.3233093194833564e-3,2.6731627087817e-6,1.1691449038920677e-6,4.595666907784908e-6 -Bls12_381_G1_multiScalarMul/37/37,1.3589352301097773e-3,1.3587799204790097e-3,1.3590865392381088e-3,5.239660989144622e-7,4.210132126501093e-7,7.044936055207908e-7 -Bls12_381_G1_multiScalarMul/38/38,1.3842305731809087e-3,1.3838013940827385e-3,1.3851882129520007e-3,2.140116379547782e-6,1.1344089830602969e-6,4.3500220741287305e-6 -Bls12_381_G1_multiScalarMul/39/39,1.4193844818012396e-3,1.4188890128645811e-3,1.4206267802236144e-3,2.384279344480344e-6,1.286298194419277e-6,4.088466911461954e-6 -Bls12_381_G1_multiScalarMul/40/40,1.4275969257372889e-3,1.4266990139967814e-3,1.4296056424476227e-3,4.36532975493508e-6,2.6378910656369093e-6,7.81360464614563e-6 -Bls12_381_G1_multiScalarMul/41/41,1.4662734042718765e-3,1.4655915349289289e-3,1.4670583531661572e-3,2.5114188995059114e-6,2.0097342160937628e-6,3.247155614235915e-6 -Bls12_381_G1_multiScalarMul/42/42,1.4944060105751547e-3,1.493879150367226e-3,1.4952135866693312e-3,2.1205348113616285e-6,1.5093258926943527e-6,2.962889746140889e-6 -Bls12_381_G1_multiScalarMul/43/43,1.5276593205735154e-3,1.5273658668217916e-3,1.5279331130431386e-3,9.74498489934415e-7,7.482627424771116e-7,1.420616015176624e-6 -Bls12_381_G1_multiScalarMul/44/44,1.5353847806862466e-3,1.5346147866390108e-3,1.5363954193265963e-3,2.814562457758291e-6,2.1143530632424383e-6,3.821045577572284e-6 -Bls12_381_G1_multiScalarMul/45/45,1.5694620743296511e-3,1.5687635390181445e-3,1.57029874920667e-3,2.507144487167149e-6,2.0785255381527325e-6,3.0811759778156036e-6 -Bls12_381_G1_multiScalarMul/46/46,1.5907223707740364e-3,1.5893800235731621e-3,1.592471840103437e-3,5.178470382170926e-6,3.88044580623702e-6,6.694012070239517e-6 -Bls12_381_G1_multiScalarMul/47/47,1.628661974360063e-3,1.6283512846939465e-3,1.6291669828813618e-3,1.3671525674743757e-6,9.627490393739244e-7,2.0277210680304897e-6 -Bls12_381_G1_multiScalarMul/48/48,1.6361548091125416e-3,1.6357926793118167e-3,1.6366869716805837e-3,1.442057725476356e-6,1.0667638215275559e-6,2.1942788690677544e-6 -Bls12_381_G1_multiScalarMul/49/49,1.6779864698862684e-3,1.6774419144888844e-3,1.678564301607901e-3,1.9536763807617875e-6,1.5861735530685062e-6,2.9241156321278288e-6 -Bls12_381_G1_multiScalarMul/50/50,1.7052634275253997e-3,1.7041895762385994e-3,1.706524687220049e-3,3.84152102882327e-6,2.956410364369988e-6,4.951832103647607e-6 -Bls12_381_G1_multiScalarMul/51/51,1.7406739448052255e-3,1.739741519600114e-3,1.743488273211799e-3,4.901730860712033e-6,1.681687713060746e-6,9.63314624934489e-6 -Bls12_381_G1_multiScalarMul/52/52,1.7493504703501312e-3,1.7485291809717686e-3,1.7506247910129787e-3,3.6153633132872805e-6,2.6479825651733657e-6,5.832623352761088e-6 -Bls12_381_G1_multiScalarMul/53/53,1.7868267249247544e-3,1.786050505290007e-3,1.7882000160916365e-3,3.3230153222471118e-6,2.3257047340548217e-6,5.4135122168717275e-6 -Bls12_381_G1_multiScalarMul/54/54,1.8119093305955243e-3,1.8112017731004542e-3,1.8128745438316246e-3,2.9582354520945714e-6,2.0538396464527634e-6,4.974892599302226e-6 -Bls12_381_G1_multiScalarMul/55/55,1.84471674435397e-3,1.8442599600963505e-3,1.8452634559156386e-3,1.7601881093901428e-6,1.4750625737533917e-6,2.210525678689879e-6 -Bls12_381_G1_multiScalarMul/56/56,1.8550924625942802e-3,1.8544531007068019e-3,1.8564385668508347e-3,2.9780016999383592e-6,1.8191076732735432e-6,5.031379898838522e-6 -Bls12_381_G1_multiScalarMul/57/57,1.8950408145264643e-3,1.8939992827596826e-3,1.8961977234850831e-3,3.706120655598944e-6,2.9949347749033603e-6,4.641731171151639e-6 -Bls12_381_G1_multiScalarMul/58/58,1.9214190162986646e-3,1.9205644658902652e-3,1.9227436492195735e-3,3.7919868436730406e-6,2.5151125481564216e-6,5.528965031038841e-6 -Bls12_381_G1_multiScalarMul/59/59,1.95611884939017e-3,1.9555311058998062e-3,1.9567680207463758e-3,2.0724783716238652e-6,1.7915625799228621e-6,2.6388010558596374e-6 -Bls12_381_G1_multiScalarMul/60/60,1.9594365520224813e-3,1.958943767917802e-3,1.9600328304991543e-3,1.8565912278242626e-6,1.3182944308809232e-6,3.0498262686954687e-6 -Bls12_381_G1_multiScalarMul/61/61,1.9978785940453596e-3,1.9970364354546e-3,1.9988044814993563e-3,2.814765620751774e-6,2.215278427132277e-6,3.9079749949813176e-6 -Bls12_381_G1_multiScalarMul/62/62,2.025163972129198e-3,2.024292907473527e-3,2.026477198808721e-3,3.4328117679417816e-6,2.424532695157738e-6,4.901533766106334e-6 -Bls12_381_G1_multiScalarMul/63/63,2.0586979562927845e-3,2.057984455859352e-3,2.059909135640746e-3,3.1733556435024334e-6,1.9174464587367093e-6,5.2504225730683016e-6 -Bls12_381_G1_multiScalarMul/64/64,2.0900368436079005e-3,2.088028375590593e-3,2.0984775655780315e-3,1.1646874789686276e-5,3.4252094381705674e-6,2.554205960853732e-5 -Bls12_381_G1_multiScalarMul/65/65,1.8968147378605645e-3,1.8955310391900796e-3,1.898278206886905e-3,4.680707702478362e-6,3.6933847226616885e-6,6.782185825195487e-6 -Bls12_381_G1_multiScalarMul/66/66,1.915527316948408e-3,1.9151048085532891e-3,1.916079596378419e-3,1.652232700882608e-6,1.268984752321262e-6,2.218302657360697e-6 -Bls12_381_G1_multiScalarMul/67/67,1.939873715995447e-3,1.9390300141714943e-3,1.9415345431927143e-3,3.909637666223789e-6,2.4669716449410535e-6,6.3729495513604696e-6 -Bls12_381_G1_multiScalarMul/68/68,1.963955860876783e-3,1.9634908135732973e-3,1.9647235096952164e-3,1.9301982657436205e-6,1.331287045500568e-6,3.069218630466695e-6 -Bls12_381_G1_multiScalarMul/69/69,1.981736462216709e-3,1.9812744529486425e-3,1.982304257342455e-3,1.7179723192754665e-6,1.2576978196442669e-6,2.585535309310991e-6 -Bls12_381_G1_multiScalarMul/70/70,2.015096024360793e-3,2.013930296536576e-3,2.016550975850134e-3,4.183586924132327e-6,2.9592834069943323e-6,5.903222403671096e-6 -Bls12_381_G1_multiScalarMul/71/71,2.039593310853405e-3,2.039230558943095e-3,2.040135103696278e-3,1.517677057313753e-6,1.246493361769726e-6,1.8411731331069727e-6 -Bls12_381_G1_multiScalarMul/72/72,2.058111599882653e-3,2.057193666273917e-3,2.0594723408391942e-3,3.5844251775633503e-6,2.7202401005013457e-6,5.864305886696207e-6 -Bls12_381_G1_multiScalarMul/73/73,2.0934159227994436e-3,2.0906201835026532e-3,2.095693684947171e-3,8.491298188831756e-6,7.241167338179682e-6,1.0176406230578143e-5 -Bls12_381_G1_multiScalarMul/74/74,2.1291335834122513e-3,2.1278241958452133e-3,2.1299943701228743e-3,3.7951510816769475e-6,2.9761746545534362e-6,5.135763083938416e-6 -Bls12_381_G1_multiScalarMul/75/75,2.1496696746573056e-3,2.148587264452237e-3,2.1520893411774615e-3,5.214017226179326e-6,2.831700993722389e-6,9.897946072389741e-6 -Bls12_381_G1_multiScalarMul/76/76,2.1791297355152578e-3,2.1763917538151966e-3,2.1862885859611804e-3,1.3564060446508161e-5,5.983327115746122e-6,2.4308866464862185e-5 -Bls12_381_G1_multiScalarMul/77/77,2.181325091429973e-3,2.1807942464757432e-3,2.1818133665519207e-3,1.7039353205909792e-6,1.3786145694127499e-6,2.27968640731267e-6 -Bls12_381_G1_multiScalarMul/78/78,2.2165097719499824e-3,2.213684889701067e-3,2.219024702852442e-3,9.476092692961542e-6,6.898527736606062e-6,1.3202270738128961e-5 -Bls12_381_G1_multiScalarMul/79/79,2.2220017642692208e-3,2.221452887745163e-3,2.2226621102249605e-3,1.9668594276026276e-6,1.6059114512897864e-6,2.54873438507269e-6 -Bls12_381_G1_multiScalarMul/80/80,2.2649145692548805e-3,2.264315257045781e-3,2.2659321574184485e-3,2.6476167211476292e-6,1.8114591949521001e-6,4.5100102111080466e-6 -Bls12_381_G1_multiScalarMul/81/81,2.2815568928021565e-3,2.2809268030696116e-3,2.282682684357514e-3,2.6571578380668003e-6,1.7065827732222851e-6,4.487951031499547e-6 -Bls12_381_G1_multiScalarMul/82/82,2.310620963737306e-3,2.3090927285613193e-3,2.3126689982238035e-3,5.977435209471239e-6,4.4804403698017714e-6,8.09057887928092e-6 -Bls12_381_G1_multiScalarMul/83/83,2.336733472141597e-3,2.3360361666493012e-3,2.337632382036757e-3,2.560471483733304e-6,1.920620453068812e-6,3.7021660444619836e-6 -Bls12_381_G1_multiScalarMul/84/84,2.373268168042132e-3,2.371319876892892e-3,2.3766426567644805e-3,8.021527609000714e-6,4.830364162650037e-6,1.252095716980909e-5 -Bls12_381_G1_multiScalarMul/85/85,2.384876078524913e-3,2.383959246461071e-3,2.3867334229422466e-3,4.094196151783379e-6,2.3902100912772977e-6,6.961154738344854e-6 -Bls12_381_G1_multiScalarMul/86/86,2.410565039227443e-3,2.4084234057296094e-3,2.412268328550986e-3,6.65915218385595e-6,4.329988822432703e-6,1.0326826016055168e-5 -Bls12_381_G1_multiScalarMul/87/87,2.4297666625285345e-3,2.4270653907625746e-3,2.432196481389161e-3,8.58024905300566e-6,7.109703139729458e-6,1.0051366987525497e-5 -Bls12_381_G1_multiScalarMul/88/88,2.460570343151193e-3,2.459544035208346e-3,2.4615274058159917e-3,3.5198413136176365e-6,2.8384817517665127e-6,4.815807097623251e-6 -Bls12_381_G1_multiScalarMul/89/89,2.489853458509472e-3,2.48760518697685e-3,2.491311540051355e-3,6.19046891378905e-6,4.307330671671395e-6,7.986452835536224e-6 -Bls12_381_G1_multiScalarMul/90/90,2.518729619807173e-3,2.5175955675903593e-3,2.5197557395444242e-3,3.6740724105737384e-6,3.011297773639394e-6,4.579753037221892e-6 -Bls12_381_G1_multiScalarMul/91/91,2.507346287557815e-3,2.5048432606199636e-3,2.5101409467740204e-3,9.127067962491492e-6,7.736890525902875e-6,1.0224347243298884e-5 -Bls12_381_G1_multiScalarMul/92/92,2.5623659852219262e-3,2.5612024891175753e-3,2.564829446827521e-3,5.6507070170772565e-6,3.2998574451510087e-6,9.57583819470183e-6 -Bls12_381_G1_multiScalarMul/93/93,2.5847869535442504e-3,2.5837480732719756e-3,2.5860413313409e-3,3.848008008883357e-6,3.135969999546864e-6,4.874051925178418e-6 -Bls12_381_G1_multiScalarMul/94/94,2.6234813638524954e-3,2.6221188936467322e-3,2.627015683950028e-3,6.9065042519955485e-6,3.5404891910020863e-6,1.266990728387938e-5 -Bls12_381_G1_multiScalarMul/95/95,2.642628219940988e-3,2.641768011136227e-3,2.6442054118635916e-3,3.6007375940600177e-6,2.2125834942189697e-6,6.234015624110293e-6 -Bls12_381_G1_multiScalarMul/96/96,2.6601519782021863e-3,2.6585725995916932e-3,2.6631507793169816e-3,7.137222035771094e-6,4.623560832534806e-6,1.2950373021381417e-5 -Bls12_381_G1_multiScalarMul/97/97,2.681023460582192e-3,2.679568015031102e-3,2.683278541155578e-3,5.991522440852137e-6,3.858505228846451e-6,8.60021764374252e-6 -Bls12_381_G1_multiScalarMul/98/98,2.7083684530633586e-3,2.70727640883435e-3,2.7110584196105647e-3,5.013062986030381e-6,2.3597699562053853e-6,1.002284515969446e-5 -Bls12_381_G1_multiScalarMul/99/99,2.7213371259787855e-3,2.720704088882147e-3,2.722244079978909e-3,2.444787958433492e-6,1.793699194794548e-6,3.7994420578130953e-6 -Bls12_381_G1_multiScalarMul/100/100,2.7642727676665296e-3,2.763395576301587e-3,2.7675024929907544e-3,4.726547836308982e-6,1.8913959977112497e-6,1.0025613006686808e-5 -Bls12_381_G2_multiScalarMul/1/1,1.6266495442804972e-4,1.6264736086074068e-4,1.6270124805713648e-4,7.793865350083726e-8,4.635475091813956e-8,1.4247066440608091e-7 -Bls12_381_G2_multiScalarMul/2/2,3.543638522088684e-4,3.541772068342348e-4,3.5485931188723925e-4,9.360391344324354e-7,3.4976363756994914e-7,1.8211931894900913e-6 -Bls12_381_G2_multiScalarMul/3/3,4.47702794969825e-4,4.475045705500375e-4,4.478850505015342e-4,6.493823174661071e-7,3.5878763258263287e-7,1.0803507174684568e-6 -Bls12_381_G2_multiScalarMul/4/4,5.420723557652644e-4,5.417274673810824e-4,5.426125367479333e-4,1.4301753976362207e-6,9.988141199987564e-7,2.267296520674632e-6 -Bls12_381_G2_multiScalarMul/5/5,6.370512849618329e-4,6.36900784787239e-4,6.37202712666071e-4,5.292403814549932e-7,4.022430073091077e-7,7.556842750685239e-7 -Bls12_381_G2_multiScalarMul/6/6,7.310526489754525e-4,7.30629670999753e-4,7.317446144730351e-4,1.8119026166925256e-6,1.1454709674089216e-6,3.3632913939344345e-6 -Bls12_381_G2_multiScalarMul/7/7,8.236776396240537e-4,8.233271514827839e-4,8.241067273174465e-4,1.3657308675882766e-6,1.0410102352442255e-6,1.83210797347741e-6 -Bls12_381_G2_multiScalarMul/8/8,9.197543555033109e-4,9.189658738224084e-4,9.209830008370004e-4,3.3412724036424652e-6,2.3248417111070747e-6,5.070176355554298e-6 -Bls12_381_G2_multiScalarMul/9/9,1.011991406751168e-3,1.0117382842987513e-3,1.012512156595354e-3,1.1429892811506008e-6,7.64572284352035e-7,1.824620728201617e-6 -Bls12_381_G2_multiScalarMul/10/10,1.109394930774612e-3,1.1087682317862343e-3,1.1115776119988174e-3,3.4944409285465694e-6,1.0503647842087067e-6,7.149880658627584e-6 -Bls12_381_G2_multiScalarMul/11/11,1.2023934491440338e-3,1.202171934481395e-3,1.2026423197250766e-3,7.922161025400925e-7,6.258416318073706e-7,1.029606114863458e-6 -Bls12_381_G2_multiScalarMul/12/12,1.2963025275871496e-3,1.2952163686698916e-3,1.2983463505741011e-3,4.960268500618734e-6,2.845337116066531e-6,9.687158836086103e-6 -Bls12_381_G2_multiScalarMul/13/13,1.3869285962502872e-3,1.3866231292243125e-3,1.3872893550098244e-3,1.1726919062774188e-6,8.791906263916984e-7,1.5913921990012086e-6 -Bls12_381_G2_multiScalarMul/14/14,1.4823956781971994e-3,1.4815973050589385e-3,1.4842137535372652e-3,3.760848566094728e-6,2.472183908899497e-6,6.4465275732684205e-6 -Bls12_381_G2_multiScalarMul/15/15,1.574445631700049e-3,1.574063788581931e-3,1.5749578982368424e-3,1.443263633319882e-6,1.0628032736563463e-6,2.1565979694667185e-6 -Bls12_381_G2_multiScalarMul/16/16,1.5000875796284717e-3,1.4994665426513504e-3,1.5014717203342867e-3,2.802372121079838e-6,1.7676048441935653e-6,4.644089354729122e-6 -Bls12_381_G2_multiScalarMul/17/17,1.5940905703219718e-3,1.5936217521556593e-3,1.5945282467814278e-3,1.547468548627245e-6,1.1967489868918594e-6,2.082313772097416e-6 -Bls12_381_G2_multiScalarMul/18/18,1.6481937447323397e-3,1.6471788901492087e-3,1.6502528733967521e-3,4.67746155264807e-6,2.5560426788421386e-6,8.493562555710135e-6 -Bls12_381_G2_multiScalarMul/19/19,1.7408620063694292e-3,1.7403685953485991e-3,1.7416086573762834e-3,2.034339176777199e-6,1.5411497874186401e-6,2.888074021221646e-6 -Bls12_381_G2_multiScalarMul/20/20,1.7983360168952664e-3,1.7968063959178204e-3,1.8007319622437476e-3,6.701452941660098e-6,3.915890097926392e-6,1.1565951790899295e-5 -Bls12_381_G2_multiScalarMul/21/21,1.8948751419094719e-3,1.8943849272806152e-3,1.8954945505194202e-3,1.8264677812158936e-6,1.5180676580123575e-6,2.3043238795090236e-6 -Bls12_381_G2_multiScalarMul/22/22,1.9483638492318052e-3,1.9468479306608071e-3,1.952898337552636e-3,8.246725685061966e-6,2.916390890917488e-6,1.6554460898097785e-5 -Bls12_381_G2_multiScalarMul/23/23,2.0441566797094976e-3,2.0436200484617298e-3,2.0448120935495366e-3,1.9807680962425035e-6,1.4047597581205637e-6,2.861374149657612e-6 -Bls12_381_G2_multiScalarMul/24/24,2.0976111797810742e-3,2.0969141362790775e-3,2.0983042002160226e-3,2.294409781298406e-6,1.7816482691771947e-6,3.2363169164003804e-6 -Bls12_381_G2_multiScalarMul/25/25,2.1916934430134647e-3,2.1911766683971054e-3,2.192454586070339e-3,2.0791512216562315e-6,1.5171229138063835e-6,2.812518408756342e-6 -Bls12_381_G2_multiScalarMul/26/26,2.2452874242475463e-3,2.2438224649193378e-3,2.248020575104657e-3,6.546744756250407e-6,4.224171258471438e-6,1.1357661995132573e-5 -Bls12_381_G2_multiScalarMul/27/27,2.3342313432099604e-3,2.3334417036587492e-3,2.335903802244924e-3,3.7924501525196913e-6,2.084116468653706e-6,6.745286115407234e-6 -Bls12_381_G2_multiScalarMul/28/28,2.3924196934986424e-3,2.3905980952149135e-3,2.39744572554579e-3,9.270395166568168e-6,3.857502451986574e-6,1.8266974876360255e-5 -Bls12_381_G2_multiScalarMul/29/29,2.4921574096234654e-3,2.4911465295363233e-3,2.4951214940058244e-3,5.209897620887097e-6,2.3932366963378704e-6,1.007979235143704e-5 -Bls12_381_G2_multiScalarMul/30/30,2.5442112572946624e-3,2.5431826880834667e-3,2.5479216241766365e-3,5.7374902589030385e-6,2.166916577225313e-6,1.24589648550128e-5 -Bls12_381_G2_multiScalarMul/31/31,2.6387551082366705e-3,2.6380466280120883e-3,2.6396291501284983e-3,2.5285910565402825e-6,2.0132127254936795e-6,3.4207259760745164e-6 -Bls12_381_G2_multiScalarMul/32/32,2.5150931462186196e-3,2.513387917297599e-3,2.5181977065017046e-3,7.657009385145557e-6,4.5131093648664805e-6,1.3678490989164753e-5 -Bls12_381_G2_multiScalarMul/33/33,3.0889519233376545e-3,3.0883882511648234e-3,3.089672507460859e-3,2.0979675388899346e-6,1.603912694016453e-6,3.0603682324660857e-6 -Bls12_381_G2_multiScalarMul/34/34,3.16771726298734e-3,3.16501045273763e-3,3.172197179196162e-3,1.0825021580641719e-5,6.671829453430046e-6,1.8892794609350383e-5 -Bls12_381_G2_multiScalarMul/35/35,3.2525975758965855e-3,3.251923568635943e-3,3.2534974414252724e-3,2.3923622222660625e-6,1.771511114169158e-6,3.613237863752478e-6 -Bls12_381_G2_multiScalarMul/36/36,3.336138244007564e-3,3.333789111955089e-3,3.344298373821e-3,1.3359645865766898e-5,3.2128822247268738e-6,2.7638521011789944e-5 -Bls12_381_G2_multiScalarMul/37/37,3.4191138605455746e-3,3.4179135859041592e-3,3.4233605791000876e-3,6.592098823336916e-6,2.5157731785295883e-6,1.3141627481895897e-5 -Bls12_381_G2_multiScalarMul/38/38,3.4883584083644226e-3,3.4862131678210493e-3,3.4925344207942677e-3,9.623236210916872e-6,5.191214954965976e-6,1.7597405473000066e-5 -Bls12_381_G2_multiScalarMul/39/39,3.530386408142463e-3,3.5295959082416793e-3,3.531411239014294e-3,2.79677085673492e-6,2.1274732913274754e-6,3.925571150385237e-6 -Bls12_381_G2_multiScalarMul/40/40,3.6147002382323538e-3,3.611572624230025e-3,3.6292011188412323e-3,1.7990113412185996e-5,2.845513840934602e-6,4.043993566101094e-5 -Bls12_381_G2_multiScalarMul/41/41,3.672723290652948e-3,3.6718602367145966e-3,3.673688181816288e-3,2.84241014465167e-6,2.3021696308807956e-6,3.7655879313695054e-6 -Bls12_381_G2_multiScalarMul/42/42,3.793747136886243e-3,3.78926839608175e-3,3.809348971725428e-3,2.269174801044769e-5,4.7237643544819555e-6,4.9663768681186095e-5 -Bls12_381_G2_multiScalarMul/43/43,3.877862027839689e-3,3.876819161298888e-3,3.8794572953528964e-3,4.162065327624179e-6,3.2714009413120982e-6,5.1550470389566275e-6 -Bls12_381_G2_multiScalarMul/44/44,3.965116399895544e-3,3.962804992549213e-3,3.97345386215166e-3,1.3112609308794646e-5,1.8812805162759533e-6,2.7437540345266834e-5 -Bls12_381_G2_multiScalarMul/45/45,4.004527665871219e-3,4.003216183025186e-3,4.00656406563525e-3,5.2564769639065946e-6,2.696936689436533e-6,7.823236463877045e-6 -Bls12_381_G2_multiScalarMul/46/46,4.076804027301204e-3,4.074764849350912e-3,4.082954370562564e-3,1.0195134478551572e-5,3.59758066050906e-6,2.02607321633781e-5 -Bls12_381_G2_multiScalarMul/47/47,4.167774429892586e-3,4.1666246852367335e-3,4.169331500283441e-3,4.095651022675052e-6,3.1833448207887804e-6,5.089866484578962e-6 -Bls12_381_G2_multiScalarMul/48/48,4.2249981616795705e-3,4.222778156184377e-3,4.226612496226903e-3,5.7784805597787715e-6,4.4339723066230185e-6,7.3377180823161815e-6 -Bls12_381_G2_multiScalarMul/49/49,4.3524164098415665e-3,4.351263723172645e-3,4.353648896076485e-3,3.7577346495739375e-6,3.092141280492094e-6,4.52320031610404e-6 -Bls12_381_G2_multiScalarMul/50/50,4.343123429888507e-3,4.341239145934485e-3,4.345694580031099e-3,7.032494846534855e-6,5.430307563910816e-6,1.0261289957428346e-5 -Bls12_381_G2_multiScalarMul/51/51,4.484856489477111e-3,4.481774784858851e-3,4.487312713793393e-3,8.158820364283e-6,6.798014601558509e-6,1.086960763925229e-5 -Bls12_381_G2_multiScalarMul/52/52,4.546562051796544e-3,4.5455748661040974e-3,4.548037932926745e-3,3.6580687673211806e-6,2.8901424834133615e-6,5.219822997121614e-6 -Bls12_381_G2_multiScalarMul/53/53,4.654474034299822e-3,4.65318130717014e-3,4.655917064534823e-3,4.116466278137667e-6,3.166891661793465e-6,5.567941155062992e-6 -Bls12_381_G2_multiScalarMul/54/54,4.721927123629685e-3,4.72071287904244e-3,4.723138528981887e-3,3.94193309418702e-6,3.113913371425901e-6,5.136276379939376e-6 -Bls12_381_G2_multiScalarMul/55/55,4.795039804834155e-3,4.793771853613166e-3,4.796041252525426e-3,3.523502774916879e-6,2.8612449092910447e-6,4.464716550457647e-6 -Bls12_381_G2_multiScalarMul/56/56,4.864016888196152e-3,4.862934237209827e-3,4.865878015473469e-3,4.339172192062833e-6,3.120561122208654e-6,7.091594219853984e-6 -Bls12_381_G2_multiScalarMul/57/57,4.930026691468103e-3,4.928660811034607e-3,4.93184431837138e-3,4.92694965505342e-6,3.631274655946987e-6,6.916774799932921e-6 -Bls12_381_G2_multiScalarMul/58/58,4.999478205962443e-3,4.996476656269146e-3,5.002509748355277e-3,9.65312271848907e-6,8.212314993018033e-6,1.121977177338798e-5 -Bls12_381_G2_multiScalarMul/59/59,5.109930645097379e-3,5.108695300209485e-3,5.111720735214837e-3,4.307666456047917e-6,3.2036925396243358e-6,7.010008721447832e-6 -Bls12_381_G2_multiScalarMul/60/60,5.182636587074396e-3,5.1812215576612815e-3,5.184867458236281e-3,5.045266958501895e-6,3.3630808719106254e-6,7.598293873580799e-6 -Bls12_381_G2_multiScalarMul/61/61,5.261201467559662e-3,5.259483119610097e-3,5.2651003452464235e-3,6.794062799442452e-6,3.965079449462158e-6,1.2745803244159386e-5 -Bls12_381_G2_multiScalarMul/62/62,5.355085149782543e-3,5.353521974098854e-3,5.3568364980710005e-3,5.127106845655141e-6,3.956280257430231e-6,6.764557833667277e-6 -Bls12_381_G2_multiScalarMul/63/63,5.404870448491742e-3,5.401124837066587e-3,5.407497875504651e-3,8.934660522629549e-6,6.290321430881255e-6,1.2732030907646999e-5 -Bls12_381_G2_multiScalarMul/64/64,4.8782659702195615e-3,4.876660673660171e-3,4.8804522014555e-3,5.830661634910927e-6,3.955325665036216e-6,9.38894371358523e-6 -Bls12_381_G2_multiScalarMul/65/65,4.9061548862185346e-3,4.904813116841975e-3,4.9086495754739915e-3,5.295424246670201e-6,3.7451476035762403e-6,8.334611829514347e-6 -Bls12_381_G2_multiScalarMul/66/66,4.967076866858588e-3,4.96587704975757e-3,4.970208209096129e-3,5.500738791485448e-6,2.7782883129256445e-6,1.0490016182322088e-5 -Bls12_381_G2_multiScalarMul/67/67,5.0384188004806525e-3,5.036297660856063e-3,5.040874280488966e-3,7.20767347691469e-6,5.18593994354578e-6,1.1000885848108839e-5 -Bls12_381_G2_multiScalarMul/68/68,5.082679596088205e-3,5.081788191855941e-3,5.083677026915687e-3,2.9879915262955836e-6,2.402250840802348e-6,3.7388441162211205e-6 -Bls12_381_G2_multiScalarMul/69/69,5.131805217231941e-3,5.129945152668336e-3,5.134860292773551e-3,7.121015258734736e-6,4.754387036952524e-6,1.0407485911539298e-5 -Bls12_381_G2_multiScalarMul/70/70,5.223131098010917e-3,5.220270707999523e-3,5.226515783222153e-3,9.515319707834862e-6,7.924704664502419e-6,1.197266014225403e-5 -Bls12_381_G2_multiScalarMul/71/71,5.2882851289316885e-3,5.286944845429294e-3,5.2901838154393414e-3,4.850407193371409e-6,3.951323934404944e-6,6.909977742394703e-6 -Bls12_381_G2_multiScalarMul/72/72,5.31973147751225e-3,5.318376432387295e-3,5.32119875028863e-3,4.277946466566538e-6,3.32076690250808e-6,5.635737244144887e-6 -Bls12_381_G2_multiScalarMul/73/73,5.415258160623588e-3,5.413782714872596e-3,5.416918547393203e-3,4.874528900097905e-6,4.170514576006458e-6,5.848559988534025e-6 -Bls12_381_G2_multiScalarMul/74/74,5.504234496008557e-3,5.500576962955019e-3,5.508481864691515e-3,1.1590261990431737e-5,7.963644443790475e-6,2.0109944098147845e-5 -Bls12_381_G2_multiScalarMul/75/75,5.564079990869667e-3,5.562681956747252e-3,5.56567336402758e-3,4.352958051265566e-6,3.4422969438156352e-6,6.286896453598817e-6 -Bls12_381_G2_multiScalarMul/76/76,5.636188875483629e-3,5.63517382713922e-3,5.637553743099741e-3,3.670518446053137e-6,2.6204373559816722e-6,5.576211218482488e-6 -Bls12_381_G2_multiScalarMul/77/77,5.653980663508052e-3,5.652296820298524e-3,5.657670797268361e-3,7.080543955082813e-6,3.7855994178883683e-6,1.2879875104746403e-5 -Bls12_381_G2_multiScalarMul/78/78,5.740407480489808e-3,5.7391493805168635e-3,5.7418065167963e-3,3.904427361041286e-6,3.074226799333372e-6,5.442029866027754e-6 -Bls12_381_G2_multiScalarMul/79/79,5.751010900543999e-3,5.748323596643336e-3,5.754728295889315e-3,9.270531833024517e-6,6.035547009683968e-6,1.4379971767424256e-5 -Bls12_381_G2_multiScalarMul/80/80,5.858800364486109e-3,5.857269600819101e-3,5.860372363714095e-3,4.878855487808653e-6,3.7581767493947793e-6,6.996843420054578e-6 -Bls12_381_G2_multiScalarMul/81/81,5.896817994473183e-3,5.894063205963552e-3,5.902366128185444e-3,1.1536253196991757e-5,6.383910727541163e-6,2.0982102749864474e-5 -Bls12_381_G2_multiScalarMul/82/82,5.954935473178033e-3,5.953063910957776e-3,5.957530288931881e-3,6.253389324766823e-6,4.779351132702418e-6,7.979956410106285e-6 -Bls12_381_G2_multiScalarMul/83/83,6.0161468367483225e-3,6.013693044072133e-3,6.02177468728205e-3,1.0835798229125257e-5,6.207595030876202e-6,1.9548081431230584e-5 -Bls12_381_G2_multiScalarMul/84/84,6.094614704088679e-3,6.092574358893842e-3,6.0971100378228475e-3,6.666176870479611e-6,5.145944335262237e-6,8.274826825353507e-6 -Bls12_381_G2_multiScalarMul/85/85,6.1380376895836565e-3,6.133725428191463e-3,6.145329879147275e-3,1.626622922741078e-5,1.0821722335694483e-5,2.700730631296616e-5 -Bls12_381_G2_multiScalarMul/86/86,6.2140860516838245e-3,6.212851863373451e-3,6.215546358212723e-3,4.0395006569626435e-6,3.346822769756149e-6,4.7839437803151336e-6 -Bls12_381_G2_multiScalarMul/87/87,6.27302455453059e-3,6.270885529060964e-3,6.275809157451918e-3,6.999595649144767e-6,4.947819532780126e-6,1.0251538631768462e-5 -Bls12_381_G2_multiScalarMul/88/88,6.3404523682942995e-3,6.338680115532713e-3,6.3420519237891515e-3,5.208923709646363e-6,4.108671865132737e-6,6.370714767856116e-6 -Bls12_381_G2_multiScalarMul/89/89,6.410017615442629e-3,6.406159123069732e-3,6.41315635661642e-3,1.0622224787961102e-5,7.696172865576866e-6,1.3963076368862973e-5 -Bls12_381_G2_multiScalarMul/90/90,6.481791869329977e-3,6.479839995502555e-3,6.484276415426917e-3,6.258729255672214e-6,4.848352706810262e-6,7.988412553980431e-6 -Bls12_381_G2_multiScalarMul/91/91,6.475168018503552e-3,6.470179709488667e-3,6.483048340856914e-3,1.7646142713249933e-5,1.3097969794456097e-5,2.6957602312106938e-5 -Bls12_381_G2_multiScalarMul/92/92,6.569285931833285e-3,6.566882844069322e-3,6.574172843329704e-3,9.752702509029438e-6,5.6501870652183995e-6,1.6741066006979055e-5 -Bls12_381_G2_multiScalarMul/93/93,6.629457299321055e-3,6.625183482996535e-3,6.638841711503604e-3,1.7538389603216873e-5,1.0528950637309035e-5,3.0379658274480686e-5 -Bls12_381_G2_multiScalarMul/94/94,6.7320607492387515e-3,6.730167903973191e-3,6.736598035759103e-3,8.15218783569633e-6,3.741189882233103e-6,1.6185222568739163e-5 -Bls12_381_G2_multiScalarMul/95/95,6.801145393237103e-3,6.796607904593793e-3,6.8137432062137055e-3,1.9691935909923513e-5,7.536520887751789e-6,3.768941248607555e-5 -Bls12_381_G2_multiScalarMul/96/96,6.821360358060845e-3,6.816810519501433e-3,6.829564504014655e-3,1.6752380908242913e-5,1.0237675196995415e-5,3.083226102494789e-5 -Bls12_381_G2_multiScalarMul/97/97,6.90522012785712e-3,6.901544208299667e-3,6.918761450372084e-3,1.7088371694161855e-5,5.773286197099474e-6,3.643360035316389e-5 -Bls12_381_G2_multiScalarMul/98/98,6.9597205589059085e-3,6.9554579231546464e-3,6.963825444927238e-3,1.230537047747648e-5,9.828399035508776e-6,1.581113740579338e-5 -Bls12_381_G2_multiScalarMul/99/99,6.998605748330429e-3,6.993956045528542e-3,7.003564931628933e-3,1.3941888558415054e-5,1.1848281516892752e-5,1.8598404587423643e-5 -Bls12_381_G2_multiScalarMul/100/100,7.090569654857228e-3,7.08876305884669e-3,7.093035056145744e-3,6.187076669186285e-6,4.689206191622249e-6,8.297705725121281e-6 +Bls12_381_G1_multiScalarMul/1/1,8.232134704712041e-5,8.228195390475752e-5,8.23582682466318e-5,1.224261187989977e-7,9.011720721178711e-8,1.843107342917502e-7 +Bls12_381_G1_multiScalarMul/2/2,1.5603352113689742e-4,1.5600025884754734e-4,1.56065185257734e-4,1.094394761986619e-7,8.779071446458298e-8,1.4947970533315267e-7 +Bls12_381_G1_multiScalarMul/3/3,1.939329666457593e-4,1.9388354851368188e-4,1.9402197408734082e-4,2.1995467058503616e-7,1.0779055620051168e-7,3.598144610846602e-7 +Bls12_381_G1_multiScalarMul/4/4,2.3193769861120354e-4,2.3185777330912127e-4,2.3201206490119206e-4,2.61940592999759e-7,2.2941719187582037e-7,3.077882579221989e-7 +Bls12_381_G1_multiScalarMul/5/5,2.7024485787950484e-4,2.701985832375676e-4,2.703562833994201e-4,2.504717874031756e-7,1.061103089376427e-7,4.5178956774050623e-7 +Bls12_381_G1_multiScalarMul/6/6,3.0832848017233854e-4,3.0828505860448953e-4,3.0841239554252326e-4,2.0081914026068556e-7,9.503560402226141e-8,3.348991421491274e-7 +Bls12_381_G1_multiScalarMul/7/7,3.453960291097332e-4,3.4529502000293173e-4,3.455551893661785e-4,4.503893151758501e-7,3.083661872443178e-7,7.81083043020636e-7 +Bls12_381_G1_multiScalarMul/8/8,3.832976511516978e-4,3.831399415816367e-4,3.8350168059661554e-4,6.425351357987778e-7,4.905809379814108e-7,9.901201715565621e-7 +Bls12_381_G1_multiScalarMul/9/9,4.208393675237262e-4,4.207594143609449e-4,4.209463240895972e-4,2.9714485369386276e-7,2.3487011012607412e-7,3.8965401426852136e-7 +Bls12_381_G1_multiScalarMul/10/10,4.590267934709921e-4,4.589529485523938e-4,4.5921225223072857e-4,3.674247719157326e-7,1.960955535102652e-7,6.745469596123421e-7 +Bls12_381_G1_multiScalarMul/11/11,4.97527732566443e-4,4.972281860134679e-4,4.986282302732426e-4,1.7151877711893442e-6,5.122548200854059e-7,3.5332096552138613e-6 +Bls12_381_G1_multiScalarMul/12/12,5.356509855658948e-4,5.355651207657092e-4,5.357300213867713e-4,2.869286988508056e-7,2.2118709297739587e-7,3.945684847893835e-7 +Bls12_381_G1_multiScalarMul/13/13,5.728512759489744e-4,5.726915276394053e-4,5.733007180741135e-4,8.949768255378629e-7,2.990100102556068e-7,1.799582591634419e-6 +Bls12_381_G1_multiScalarMul/14/14,6.102677458891477e-4,6.101406595840958e-4,6.104800133890259e-4,5.730641911125035e-7,4.2156110110763734e-7,9.874293144495503e-7 +Bls12_381_G1_multiScalarMul/15/15,6.477995208670887e-4,6.475756774649752e-4,6.480865282403314e-4,8.809829049973348e-7,7.579659277726546e-7,1.1589928070099792e-6 +Bls12_381_G1_multiScalarMul/16/16,7.10232795606239e-4,7.101357580525187e-4,7.103534690693274e-4,3.9630772993102876e-7,3.017996615312032e-7,6.065624023561599e-7 +Bls12_381_G1_multiScalarMul/17/17,7.482241201028533e-4,7.479063489174819e-4,7.493005226515e-4,1.7468995103377413e-6,4.207394233578458e-7,3.5919072692845237e-6 +Bls12_381_G1_multiScalarMul/18/18,7.705925934553824e-4,7.701144938606196e-4,7.727806329806679e-4,2.721631169491716e-6,7.981968678057562e-7,5.845417811648959e-6 +Bls12_381_G1_multiScalarMul/19/19,8.07991568665831e-4,8.078519602328661e-4,8.082935546448865e-4,6.822381786366707e-7,4.1123728418619586e-7,1.2817508134125719e-6 +Bls12_381_G1_multiScalarMul/20/20,8.305413129620952e-4,8.304197199200644e-4,8.306902645257076e-4,4.3666055013588826e-7,3.4850947949373826e-7,5.517969661861731e-7 +Bls12_381_G1_multiScalarMul/21/21,8.686137577309382e-4,8.683705360374326e-4,8.690514729472171e-4,1.0365305564754837e-6,6.15324072934707e-7,1.7554645846499009e-6 +Bls12_381_G1_multiScalarMul/22/22,8.91652773561559e-4,8.91448841424083e-4,8.919251447254486e-4,8.003760296748043e-7,5.948851969272322e-7,1.1100316085161068e-6 +Bls12_381_G1_multiScalarMul/23/23,9.294873328615929e-4,9.2931706336974e-4,9.29674543066649e-4,6.225406051789035e-7,4.744164895701269e-7,8.695237190578588e-7 +Bls12_381_G1_multiScalarMul/24/24,9.517388775125774e-4,9.51297780087541e-4,9.521482216169379e-4,1.3722719341729154e-6,1.062307342501858e-6,1.7843971621271001e-6 +Bls12_381_G1_multiScalarMul/25/25,9.886064604005137e-4,9.882251183807264e-4,9.897265063364012e-4,1.8798264902284367e-6,6.736369822886704e-7,3.814951405763071e-6 +Bls12_381_G1_multiScalarMul/26/26,1.0107695436644823e-3,1.0105299581864577e-3,1.0111683184415275e-3,9.824869954193735e-7,6.273786628516054e-7,1.789759844703243e-6 +Bls12_381_G1_multiScalarMul/27/27,1.0481752477344507e-3,1.0477770452434242e-3,1.0488436059663702e-3,1.70119074982601e-6,1.1033927625372998e-6,2.421859397722192e-6 +Bls12_381_G1_multiScalarMul/28/28,1.071199845880856e-3,1.0708432481182537e-3,1.0720804641719981e-3,1.6595833959304896e-6,8.543899072576939e-7,2.9475871714734805e-6 +Bls12_381_G1_multiScalarMul/29/29,1.1091453942723057e-3,1.1088806422385156e-3,1.1094556190265087e-3,9.884003711358195e-7,8.097303732520417e-7,1.3599340574873413e-6 +Bls12_381_G1_multiScalarMul/30/30,1.1316695694102287e-3,1.1314082924647447e-3,1.1319750321409226e-3,9.66367104215988e-7,7.685686878341102e-7,1.204378285010742e-6 +Bls12_381_G1_multiScalarMul/31/31,1.1706362298123296e-3,1.1701248243111372e-3,1.1713912110155227e-3,2.1219139874861063e-6,1.5567879843419155e-6,2.916931910163364e-6 +Bls12_381_G1_multiScalarMul/32/32,1.2183054885742289e-3,1.2178167501590653e-3,1.2191423331752846e-3,2.082314742656685e-6,1.3954922622922078e-6,3.3606861800964793e-6 +Bls12_381_G1_multiScalarMul/33/33,1.25554775700385e-3,1.2553212908295874e-3,1.256064024330601e-3,1.103995478961421e-6,6.577553035929982e-7,1.960982872144134e-6 +Bls12_381_G1_multiScalarMul/34/34,1.2814120185183533e-3,1.2811113200601465e-3,1.2817386977410077e-3,1.066328231240918e-6,8.498751061674896e-7,1.3581581158462333e-6 +Bls12_381_G1_multiScalarMul/35/35,1.3147784280299476e-3,1.3142019737646283e-3,1.3159148898431248e-3,2.7821602645732677e-6,1.2576600123958567e-6,4.71910870274486e-6 +Bls12_381_G1_multiScalarMul/36/36,1.3219048104980895e-3,1.3213844160889154e-3,1.3233093194833564e-3,2.6731627087817e-6,1.1691449038920677e-6,4.595666907784908e-6 +Bls12_381_G1_multiScalarMul/37/37,1.3589352301097773e-3,1.3587799204790097e-3,1.3590865392381088e-3,5.239660989144622e-7,4.210132126501093e-7,7.044936055207908e-7 +Bls12_381_G1_multiScalarMul/38/38,1.3842305731809087e-3,1.3838013940827385e-3,1.3851882129520007e-3,2.140116379547782e-6,1.1344089830602969e-6,4.3500220741287305e-6 +Bls12_381_G1_multiScalarMul/39/39,1.4193844818012396e-3,1.4188890128645811e-3,1.4206267802236144e-3,2.384279344480344e-6,1.286298194419277e-6,4.088466911461954e-6 +Bls12_381_G1_multiScalarMul/40/40,1.4275969257372889e-3,1.4266990139967814e-3,1.4296056424476227e-3,4.36532975493508e-6,2.6378910656369093e-6,7.81360464614563e-6 +Bls12_381_G1_multiScalarMul/41/41,1.4662734042718765e-3,1.4655915349289289e-3,1.4670583531661572e-3,2.5114188995059114e-6,2.0097342160937628e-6,3.247155614235915e-6 +Bls12_381_G1_multiScalarMul/42/42,1.4944060105751547e-3,1.493879150367226e-3,1.4952135866693312e-3,2.1205348113616285e-6,1.5093258926943527e-6,2.962889746140889e-6 +Bls12_381_G1_multiScalarMul/43/43,1.5276593205735154e-3,1.5273658668217916e-3,1.5279331130431386e-3,9.74498489934415e-7,7.482627424771116e-7,1.420616015176624e-6 +Bls12_381_G1_multiScalarMul/44/44,1.5353847806862466e-3,1.5346147866390108e-3,1.5363954193265963e-3,2.814562457758291e-6,2.1143530632424383e-6,3.821045577572284e-6 +Bls12_381_G1_multiScalarMul/45/45,1.5694620743296511e-3,1.5687635390181445e-3,1.57029874920667e-3,2.507144487167149e-6,2.0785255381527325e-6,3.0811759778156036e-6 +Bls12_381_G1_multiScalarMul/46/46,1.5907223707740364e-3,1.5893800235731621e-3,1.592471840103437e-3,5.178470382170926e-6,3.88044580623702e-6,6.694012070239517e-6 +Bls12_381_G1_multiScalarMul/47/47,1.628661974360063e-3,1.6283512846939465e-3,1.6291669828813618e-3,1.3671525674743757e-6,9.627490393739244e-7,2.0277210680304897e-6 +Bls12_381_G1_multiScalarMul/48/48,1.6361548091125416e-3,1.6357926793118167e-3,1.6366869716805837e-3,1.442057725476356e-6,1.0667638215275559e-6,2.1942788690677544e-6 +Bls12_381_G1_multiScalarMul/49/49,1.6779864698862684e-3,1.6774419144888844e-3,1.678564301607901e-3,1.9536763807617875e-6,1.5861735530685062e-6,2.9241156321278288e-6 +Bls12_381_G1_multiScalarMul/50/50,1.7052634275253997e-3,1.7041895762385994e-3,1.706524687220049e-3,3.84152102882327e-6,2.956410364369988e-6,4.951832103647607e-6 +Bls12_381_G1_multiScalarMul/51/51,1.7406739448052255e-3,1.739741519600114e-3,1.743488273211799e-3,4.901730860712033e-6,1.681687713060746e-6,9.63314624934489e-6 +Bls12_381_G1_multiScalarMul/52/52,1.7493504703501312e-3,1.7485291809717686e-3,1.7506247910129787e-3,3.6153633132872805e-6,2.6479825651733657e-6,5.832623352761088e-6 +Bls12_381_G1_multiScalarMul/53/53,1.7868267249247544e-3,1.786050505290007e-3,1.7882000160916365e-3,3.3230153222471118e-6,2.3257047340548217e-6,5.4135122168717275e-6 +Bls12_381_G1_multiScalarMul/54/54,1.8119093305955243e-3,1.8112017731004542e-3,1.8128745438316246e-3,2.9582354520945714e-6,2.0538396464527634e-6,4.974892599302226e-6 +Bls12_381_G1_multiScalarMul/55/55,1.84471674435397e-3,1.8442599600963505e-3,1.8452634559156386e-3,1.7601881093901428e-6,1.4750625737533917e-6,2.210525678689879e-6 +Bls12_381_G1_multiScalarMul/56/56,1.8550924625942802e-3,1.8544531007068019e-3,1.8564385668508347e-3,2.9780016999383592e-6,1.8191076732735432e-6,5.031379898838522e-6 +Bls12_381_G1_multiScalarMul/57/57,1.8950408145264643e-3,1.8939992827596826e-3,1.8961977234850831e-3,3.706120655598944e-6,2.9949347749033603e-6,4.641731171151639e-6 +Bls12_381_G1_multiScalarMul/58/58,1.9214190162986646e-3,1.9205644658902652e-3,1.9227436492195735e-3,3.7919868436730406e-6,2.5151125481564216e-6,5.528965031038841e-6 +Bls12_381_G1_multiScalarMul/59/59,1.95611884939017e-3,1.9555311058998062e-3,1.9567680207463758e-3,2.0724783716238652e-6,1.7915625799228621e-6,2.6388010558596374e-6 +Bls12_381_G1_multiScalarMul/60/60,1.9594365520224813e-3,1.958943767917802e-3,1.9600328304991543e-3,1.8565912278242626e-6,1.3182944308809232e-6,3.0498262686954687e-6 +Bls12_381_G1_multiScalarMul/61/61,1.9978785940453596e-3,1.9970364354546e-3,1.9988044814993563e-3,2.814765620751774e-6,2.215278427132277e-6,3.9079749949813176e-6 +Bls12_381_G1_multiScalarMul/62/62,2.025163972129198e-3,2.024292907473527e-3,2.026477198808721e-3,3.4328117679417816e-6,2.424532695157738e-6,4.901533766106334e-6 +Bls12_381_G1_multiScalarMul/63/63,2.0586979562927845e-3,2.057984455859352e-3,2.059909135640746e-3,3.1733556435024334e-6,1.9174464587367093e-6,5.2504225730683016e-6 +Bls12_381_G1_multiScalarMul/64/64,2.0900368436079005e-3,2.088028375590593e-3,2.0984775655780315e-3,1.1646874789686276e-5,3.4252094381705674e-6,2.554205960853732e-5 +Bls12_381_G1_multiScalarMul/65/65,1.8968147378605645e-3,1.8955310391900796e-3,1.898278206886905e-3,4.680707702478362e-6,3.6933847226616885e-6,6.782185825195487e-6 +Bls12_381_G1_multiScalarMul/66/66,1.915527316948408e-3,1.9151048085532891e-3,1.916079596378419e-3,1.652232700882608e-6,1.268984752321262e-6,2.218302657360697e-6 +Bls12_381_G1_multiScalarMul/67/67,1.939873715995447e-3,1.9390300141714943e-3,1.9415345431927143e-3,3.909637666223789e-6,2.4669716449410535e-6,6.3729495513604696e-6 +Bls12_381_G1_multiScalarMul/68/68,1.963955860876783e-3,1.9634908135732973e-3,1.9647235096952164e-3,1.9301982657436205e-6,1.331287045500568e-6,3.069218630466695e-6 +Bls12_381_G1_multiScalarMul/69/69,1.981736462216709e-3,1.9812744529486425e-3,1.982304257342455e-3,1.7179723192754665e-6,1.2576978196442669e-6,2.585535309310991e-6 +Bls12_381_G1_multiScalarMul/70/70,2.015096024360793e-3,2.013930296536576e-3,2.016550975850134e-3,4.183586924132327e-6,2.9592834069943323e-6,5.903222403671096e-6 +Bls12_381_G1_multiScalarMul/71/71,2.039593310853405e-3,2.039230558943095e-3,2.040135103696278e-3,1.517677057313753e-6,1.246493361769726e-6,1.8411731331069727e-6 +Bls12_381_G1_multiScalarMul/72/72,2.058111599882653e-3,2.057193666273917e-3,2.0594723408391942e-3,3.5844251775633503e-6,2.7202401005013457e-6,5.864305886696207e-6 +Bls12_381_G1_multiScalarMul/73/73,2.0934159227994436e-3,2.0906201835026532e-3,2.095693684947171e-3,8.491298188831756e-6,7.241167338179682e-6,1.0176406230578143e-5 +Bls12_381_G1_multiScalarMul/74/74,2.1291335834122513e-3,2.1278241958452133e-3,2.1299943701228743e-3,3.7951510816769475e-6,2.9761746545534362e-6,5.135763083938416e-6 +Bls12_381_G1_multiScalarMul/75/75,2.1496696746573056e-3,2.148587264452237e-3,2.1520893411774615e-3,5.214017226179326e-6,2.831700993722389e-6,9.897946072389741e-6 +Bls12_381_G1_multiScalarMul/76/76,2.1791297355152578e-3,2.1763917538151966e-3,2.1862885859611804e-3,1.3564060446508161e-5,5.983327115746122e-6,2.4308866464862185e-5 +Bls12_381_G1_multiScalarMul/77/77,2.181325091429973e-3,2.1807942464757432e-3,2.1818133665519207e-3,1.7039353205909792e-6,1.3786145694127499e-6,2.27968640731267e-6 +Bls12_381_G1_multiScalarMul/78/78,2.2165097719499824e-3,2.213684889701067e-3,2.219024702852442e-3,9.476092692961542e-6,6.898527736606062e-6,1.3202270738128961e-5 +Bls12_381_G1_multiScalarMul/79/79,2.2220017642692208e-3,2.221452887745163e-3,2.2226621102249605e-3,1.9668594276026276e-6,1.6059114512897864e-6,2.54873438507269e-6 +Bls12_381_G1_multiScalarMul/80/80,2.2649145692548805e-3,2.264315257045781e-3,2.2659321574184485e-3,2.6476167211476292e-6,1.8114591949521001e-6,4.5100102111080466e-6 +Bls12_381_G1_multiScalarMul/81/81,2.2815568928021565e-3,2.2809268030696116e-3,2.282682684357514e-3,2.6571578380668003e-6,1.7065827732222851e-6,4.487951031499547e-6 +Bls12_381_G1_multiScalarMul/82/82,2.310620963737306e-3,2.3090927285613193e-3,2.3126689982238035e-3,5.977435209471239e-6,4.4804403698017714e-6,8.09057887928092e-6 +Bls12_381_G1_multiScalarMul/83/83,2.336733472141597e-3,2.3360361666493012e-3,2.337632382036757e-3,2.560471483733304e-6,1.920620453068812e-6,3.7021660444619836e-6 +Bls12_381_G1_multiScalarMul/84/84,2.373268168042132e-3,2.371319876892892e-3,2.3766426567644805e-3,8.021527609000714e-6,4.830364162650037e-6,1.252095716980909e-5 +Bls12_381_G1_multiScalarMul/85/85,2.384876078524913e-3,2.383959246461071e-3,2.3867334229422466e-3,4.094196151783379e-6,2.3902100912772977e-6,6.961154738344854e-6 +Bls12_381_G1_multiScalarMul/86/86,2.410565039227443e-3,2.4084234057296094e-3,2.412268328550986e-3,6.65915218385595e-6,4.329988822432703e-6,1.0326826016055168e-5 +Bls12_381_G1_multiScalarMul/87/87,2.4297666625285345e-3,2.4270653907625746e-3,2.432196481389161e-3,8.58024905300566e-6,7.109703139729458e-6,1.0051366987525497e-5 +Bls12_381_G1_multiScalarMul/88/88,2.460570343151193e-3,2.459544035208346e-3,2.4615274058159917e-3,3.5198413136176365e-6,2.8384817517665127e-6,4.815807097623251e-6 +Bls12_381_G1_multiScalarMul/89/89,2.489853458509472e-3,2.48760518697685e-3,2.491311540051355e-3,6.19046891378905e-6,4.307330671671395e-6,7.986452835536224e-6 +Bls12_381_G1_multiScalarMul/90/90,2.518729619807173e-3,2.5175955675903593e-3,2.5197557395444242e-3,3.6740724105737384e-6,3.011297773639394e-6,4.579753037221892e-6 +Bls12_381_G1_multiScalarMul/91/91,2.507346287557815e-3,2.5048432606199636e-3,2.5101409467740204e-3,9.127067962491492e-6,7.736890525902875e-6,1.0224347243298884e-5 +Bls12_381_G1_multiScalarMul/92/92,2.5623659852219262e-3,2.5612024891175753e-3,2.564829446827521e-3,5.6507070170772565e-6,3.2998574451510087e-6,9.57583819470183e-6 +Bls12_381_G1_multiScalarMul/93/93,2.5847869535442504e-3,2.5837480732719756e-3,2.5860413313409e-3,3.848008008883357e-6,3.135969999546864e-6,4.874051925178418e-6 +Bls12_381_G1_multiScalarMul/94/94,2.6234813638524954e-3,2.6221188936467322e-3,2.627015683950028e-3,6.9065042519955485e-6,3.5404891910020863e-6,1.266990728387938e-5 +Bls12_381_G1_multiScalarMul/95/95,2.642628219940988e-3,2.641768011136227e-3,2.6442054118635916e-3,3.6007375940600177e-6,2.2125834942189697e-6,6.234015624110293e-6 +Bls12_381_G1_multiScalarMul/96/96,2.6601519782021863e-3,2.6585725995916932e-3,2.6631507793169816e-3,7.137222035771094e-6,4.623560832534806e-6,1.2950373021381417e-5 +Bls12_381_G1_multiScalarMul/97/97,2.681023460582192e-3,2.679568015031102e-3,2.683278541155578e-3,5.991522440852137e-6,3.858505228846451e-6,8.60021764374252e-6 +Bls12_381_G1_multiScalarMul/98/98,2.7083684530633586e-3,2.70727640883435e-3,2.7110584196105647e-3,5.013062986030381e-6,2.3597699562053853e-6,1.002284515969446e-5 +Bls12_381_G1_multiScalarMul/99/99,2.7213371259787855e-3,2.720704088882147e-3,2.722244079978909e-3,2.444787958433492e-6,1.793699194794548e-6,3.7994420578130953e-6 +Bls12_381_G1_multiScalarMul/100/100,2.7642727676665296e-3,2.763395576301587e-3,2.7675024929907544e-3,4.726547836308982e-6,1.8913959977112497e-6,1.0025613006686808e-5 +Bls12_381_G2_multiScalarMul/1/1,1.6266495442804972e-4,1.6264736086074068e-4,1.6270124805713648e-4,7.793865350083726e-8,4.635475091813956e-8,1.4247066440608091e-7 +Bls12_381_G2_multiScalarMul/2/2,3.543638522088684e-4,3.541772068342348e-4,3.5485931188723925e-4,9.360391344324354e-7,3.4976363756994914e-7,1.8211931894900913e-6 +Bls12_381_G2_multiScalarMul/3/3,4.47702794969825e-4,4.475045705500375e-4,4.478850505015342e-4,6.493823174661071e-7,3.5878763258263287e-7,1.0803507174684568e-6 +Bls12_381_G2_multiScalarMul/4/4,5.420723557652644e-4,5.417274673810824e-4,5.426125367479333e-4,1.4301753976362207e-6,9.988141199987564e-7,2.267296520674632e-6 +Bls12_381_G2_multiScalarMul/5/5,6.370512849618329e-4,6.36900784787239e-4,6.37202712666071e-4,5.292403814549932e-7,4.022430073091077e-7,7.556842750685239e-7 +Bls12_381_G2_multiScalarMul/6/6,7.310526489754525e-4,7.30629670999753e-4,7.317446144730351e-4,1.8119026166925256e-6,1.1454709674089216e-6,3.3632913939344345e-6 +Bls12_381_G2_multiScalarMul/7/7,8.236776396240537e-4,8.233271514827839e-4,8.241067273174465e-4,1.3657308675882766e-6,1.0410102352442255e-6,1.83210797347741e-6 +Bls12_381_G2_multiScalarMul/8/8,9.197543555033109e-4,9.189658738224084e-4,9.209830008370004e-4,3.3412724036424652e-6,2.3248417111070747e-6,5.070176355554298e-6 +Bls12_381_G2_multiScalarMul/9/9,1.011991406751168e-3,1.0117382842987513e-3,1.012512156595354e-3,1.1429892811506008e-6,7.64572284352035e-7,1.824620728201617e-6 +Bls12_381_G2_multiScalarMul/10/10,1.109394930774612e-3,1.1087682317862343e-3,1.1115776119988174e-3,3.4944409285465694e-6,1.0503647842087067e-6,7.149880658627584e-6 +Bls12_381_G2_multiScalarMul/11/11,1.2023934491440338e-3,1.202171934481395e-3,1.2026423197250766e-3,7.922161025400925e-7,6.258416318073706e-7,1.029606114863458e-6 +Bls12_381_G2_multiScalarMul/12/12,1.2963025275871496e-3,1.2952163686698916e-3,1.2983463505741011e-3,4.960268500618734e-6,2.845337116066531e-6,9.687158836086103e-6 +Bls12_381_G2_multiScalarMul/13/13,1.3869285962502872e-3,1.3866231292243125e-3,1.3872893550098244e-3,1.1726919062774188e-6,8.791906263916984e-7,1.5913921990012086e-6 +Bls12_381_G2_multiScalarMul/14/14,1.4823956781971994e-3,1.4815973050589385e-3,1.4842137535372652e-3,3.760848566094728e-6,2.472183908899497e-6,6.4465275732684205e-6 +Bls12_381_G2_multiScalarMul/15/15,1.574445631700049e-3,1.574063788581931e-3,1.5749578982368424e-3,1.443263633319882e-6,1.0628032736563463e-6,2.1565979694667185e-6 +Bls12_381_G2_multiScalarMul/16/16,1.5000875796284717e-3,1.4994665426513504e-3,1.5014717203342867e-3,2.802372121079838e-6,1.7676048441935653e-6,4.644089354729122e-6 +Bls12_381_G2_multiScalarMul/17/17,1.5940905703219718e-3,1.5936217521556593e-3,1.5945282467814278e-3,1.547468548627245e-6,1.1967489868918594e-6,2.082313772097416e-6 +Bls12_381_G2_multiScalarMul/18/18,1.6481937447323397e-3,1.6471788901492087e-3,1.6502528733967521e-3,4.67746155264807e-6,2.5560426788421386e-6,8.493562555710135e-6 +Bls12_381_G2_multiScalarMul/19/19,1.7408620063694292e-3,1.7403685953485991e-3,1.7416086573762834e-3,2.034339176777199e-6,1.5411497874186401e-6,2.888074021221646e-6 +Bls12_381_G2_multiScalarMul/20/20,1.7983360168952664e-3,1.7968063959178204e-3,1.8007319622437476e-3,6.701452941660098e-6,3.915890097926392e-6,1.1565951790899295e-5 +Bls12_381_G2_multiScalarMul/21/21,1.8948751419094719e-3,1.8943849272806152e-3,1.8954945505194202e-3,1.8264677812158936e-6,1.5180676580123575e-6,2.3043238795090236e-6 +Bls12_381_G2_multiScalarMul/22/22,1.9483638492318052e-3,1.9468479306608071e-3,1.952898337552636e-3,8.246725685061966e-6,2.916390890917488e-6,1.6554460898097785e-5 +Bls12_381_G2_multiScalarMul/23/23,2.0441566797094976e-3,2.0436200484617298e-3,2.0448120935495366e-3,1.9807680962425035e-6,1.4047597581205637e-6,2.861374149657612e-6 +Bls12_381_G2_multiScalarMul/24/24,2.0976111797810742e-3,2.0969141362790775e-3,2.0983042002160226e-3,2.294409781298406e-6,1.7816482691771947e-6,3.2363169164003804e-6 +Bls12_381_G2_multiScalarMul/25/25,2.1916934430134647e-3,2.1911766683971054e-3,2.192454586070339e-3,2.0791512216562315e-6,1.5171229138063835e-6,2.812518408756342e-6 +Bls12_381_G2_multiScalarMul/26/26,2.2452874242475463e-3,2.2438224649193378e-3,2.248020575104657e-3,6.546744756250407e-6,4.224171258471438e-6,1.1357661995132573e-5 +Bls12_381_G2_multiScalarMul/27/27,2.3342313432099604e-3,2.3334417036587492e-3,2.335903802244924e-3,3.7924501525196913e-6,2.084116468653706e-6,6.745286115407234e-6 +Bls12_381_G2_multiScalarMul/28/28,2.3924196934986424e-3,2.3905980952149135e-3,2.39744572554579e-3,9.270395166568168e-6,3.857502451986574e-6,1.8266974876360255e-5 +Bls12_381_G2_multiScalarMul/29/29,2.4921574096234654e-3,2.4911465295363233e-3,2.4951214940058244e-3,5.209897620887097e-6,2.3932366963378704e-6,1.007979235143704e-5 +Bls12_381_G2_multiScalarMul/30/30,2.5442112572946624e-3,2.5431826880834667e-3,2.5479216241766365e-3,5.7374902589030385e-6,2.166916577225313e-6,1.24589648550128e-5 +Bls12_381_G2_multiScalarMul/31/31,2.6387551082366705e-3,2.6380466280120883e-3,2.6396291501284983e-3,2.5285910565402825e-6,2.0132127254936795e-6,3.4207259760745164e-6 +Bls12_381_G2_multiScalarMul/32/32,2.5150931462186196e-3,2.513387917297599e-3,2.5181977065017046e-3,7.657009385145557e-6,4.5131093648664805e-6,1.3678490989164753e-5 +Bls12_381_G2_multiScalarMul/33/33,3.0889519233376545e-3,3.0883882511648234e-3,3.089672507460859e-3,2.0979675388899346e-6,1.603912694016453e-6,3.0603682324660857e-6 +Bls12_381_G2_multiScalarMul/34/34,3.16771726298734e-3,3.16501045273763e-3,3.172197179196162e-3,1.0825021580641719e-5,6.671829453430046e-6,1.8892794609350383e-5 +Bls12_381_G2_multiScalarMul/35/35,3.2525975758965855e-3,3.251923568635943e-3,3.2534974414252724e-3,2.3923622222660625e-6,1.771511114169158e-6,3.613237863752478e-6 +Bls12_381_G2_multiScalarMul/36/36,3.336138244007564e-3,3.333789111955089e-3,3.344298373821e-3,1.3359645865766898e-5,3.2128822247268738e-6,2.7638521011789944e-5 +Bls12_381_G2_multiScalarMul/37/37,3.4191138605455746e-3,3.4179135859041592e-3,3.4233605791000876e-3,6.592098823336916e-6,2.5157731785295883e-6,1.3141627481895897e-5 +Bls12_381_G2_multiScalarMul/38/38,3.4883584083644226e-3,3.4862131678210493e-3,3.4925344207942677e-3,9.623236210916872e-6,5.191214954965976e-6,1.7597405473000066e-5 +Bls12_381_G2_multiScalarMul/39/39,3.530386408142463e-3,3.5295959082416793e-3,3.531411239014294e-3,2.79677085673492e-6,2.1274732913274754e-6,3.925571150385237e-6 +Bls12_381_G2_multiScalarMul/40/40,3.6147002382323538e-3,3.611572624230025e-3,3.6292011188412323e-3,1.7990113412185996e-5,2.845513840934602e-6,4.043993566101094e-5 +Bls12_381_G2_multiScalarMul/41/41,3.672723290652948e-3,3.6718602367145966e-3,3.673688181816288e-3,2.84241014465167e-6,2.3021696308807956e-6,3.7655879313695054e-6 +Bls12_381_G2_multiScalarMul/42/42,3.793747136886243e-3,3.78926839608175e-3,3.809348971725428e-3,2.269174801044769e-5,4.7237643544819555e-6,4.9663768681186095e-5 +Bls12_381_G2_multiScalarMul/43/43,3.877862027839689e-3,3.876819161298888e-3,3.8794572953528964e-3,4.162065327624179e-6,3.2714009413120982e-6,5.1550470389566275e-6 +Bls12_381_G2_multiScalarMul/44/44,3.965116399895544e-3,3.962804992549213e-3,3.97345386215166e-3,1.3112609308794646e-5,1.8812805162759533e-6,2.7437540345266834e-5 +Bls12_381_G2_multiScalarMul/45/45,4.004527665871219e-3,4.003216183025186e-3,4.00656406563525e-3,5.2564769639065946e-6,2.696936689436533e-6,7.823236463877045e-6 +Bls12_381_G2_multiScalarMul/46/46,4.076804027301204e-3,4.074764849350912e-3,4.082954370562564e-3,1.0195134478551572e-5,3.59758066050906e-6,2.02607321633781e-5 +Bls12_381_G2_multiScalarMul/47/47,4.167774429892586e-3,4.1666246852367335e-3,4.169331500283441e-3,4.095651022675052e-6,3.1833448207887804e-6,5.089866484578962e-6 +Bls12_381_G2_multiScalarMul/48/48,4.2249981616795705e-3,4.222778156184377e-3,4.226612496226903e-3,5.7784805597787715e-6,4.4339723066230185e-6,7.3377180823161815e-6 +Bls12_381_G2_multiScalarMul/49/49,4.3524164098415665e-3,4.351263723172645e-3,4.353648896076485e-3,3.7577346495739375e-6,3.092141280492094e-6,4.52320031610404e-6 +Bls12_381_G2_multiScalarMul/50/50,4.343123429888507e-3,4.341239145934485e-3,4.345694580031099e-3,7.032494846534855e-6,5.430307563910816e-6,1.0261289957428346e-5 +Bls12_381_G2_multiScalarMul/51/51,4.484856489477111e-3,4.481774784858851e-3,4.487312713793393e-3,8.158820364283e-6,6.798014601558509e-6,1.086960763925229e-5 +Bls12_381_G2_multiScalarMul/52/52,4.546562051796544e-3,4.5455748661040974e-3,4.548037932926745e-3,3.6580687673211806e-6,2.8901424834133615e-6,5.219822997121614e-6 +Bls12_381_G2_multiScalarMul/53/53,4.654474034299822e-3,4.65318130717014e-3,4.655917064534823e-3,4.116466278137667e-6,3.166891661793465e-6,5.567941155062992e-6 +Bls12_381_G2_multiScalarMul/54/54,4.721927123629685e-3,4.72071287904244e-3,4.723138528981887e-3,3.94193309418702e-6,3.113913371425901e-6,5.136276379939376e-6 +Bls12_381_G2_multiScalarMul/55/55,4.795039804834155e-3,4.793771853613166e-3,4.796041252525426e-3,3.523502774916879e-6,2.8612449092910447e-6,4.464716550457647e-6 +Bls12_381_G2_multiScalarMul/56/56,4.864016888196152e-3,4.862934237209827e-3,4.865878015473469e-3,4.339172192062833e-6,3.120561122208654e-6,7.091594219853984e-6 +Bls12_381_G2_multiScalarMul/57/57,4.930026691468103e-3,4.928660811034607e-3,4.93184431837138e-3,4.92694965505342e-6,3.631274655946987e-6,6.916774799932921e-6 +Bls12_381_G2_multiScalarMul/58/58,4.999478205962443e-3,4.996476656269146e-3,5.002509748355277e-3,9.65312271848907e-6,8.212314993018033e-6,1.121977177338798e-5 +Bls12_381_G2_multiScalarMul/59/59,5.109930645097379e-3,5.108695300209485e-3,5.111720735214837e-3,4.307666456047917e-6,3.2036925396243358e-6,7.010008721447832e-6 +Bls12_381_G2_multiScalarMul/60/60,5.182636587074396e-3,5.1812215576612815e-3,5.184867458236281e-3,5.045266958501895e-6,3.3630808719106254e-6,7.598293873580799e-6 +Bls12_381_G2_multiScalarMul/61/61,5.261201467559662e-3,5.259483119610097e-3,5.2651003452464235e-3,6.794062799442452e-6,3.965079449462158e-6,1.2745803244159386e-5 +Bls12_381_G2_multiScalarMul/62/62,5.355085149782543e-3,5.353521974098854e-3,5.3568364980710005e-3,5.127106845655141e-6,3.956280257430231e-6,6.764557833667277e-6 +Bls12_381_G2_multiScalarMul/63/63,5.404870448491742e-3,5.401124837066587e-3,5.407497875504651e-3,8.934660522629549e-6,6.290321430881255e-6,1.2732030907646999e-5 +Bls12_381_G2_multiScalarMul/64/64,4.8782659702195615e-3,4.876660673660171e-3,4.8804522014555e-3,5.830661634910927e-6,3.955325665036216e-6,9.38894371358523e-6 +Bls12_381_G2_multiScalarMul/65/65,4.9061548862185346e-3,4.904813116841975e-3,4.9086495754739915e-3,5.295424246670201e-6,3.7451476035762403e-6,8.334611829514347e-6 +Bls12_381_G2_multiScalarMul/66/66,4.967076866858588e-3,4.96587704975757e-3,4.970208209096129e-3,5.500738791485448e-6,2.7782883129256445e-6,1.0490016182322088e-5 +Bls12_381_G2_multiScalarMul/67/67,5.0384188004806525e-3,5.036297660856063e-3,5.040874280488966e-3,7.20767347691469e-6,5.18593994354578e-6,1.1000885848108839e-5 +Bls12_381_G2_multiScalarMul/68/68,5.082679596088205e-3,5.081788191855941e-3,5.083677026915687e-3,2.9879915262955836e-6,2.402250840802348e-6,3.7388441162211205e-6 +Bls12_381_G2_multiScalarMul/69/69,5.131805217231941e-3,5.129945152668336e-3,5.134860292773551e-3,7.121015258734736e-6,4.754387036952524e-6,1.0407485911539298e-5 +Bls12_381_G2_multiScalarMul/70/70,5.223131098010917e-3,5.220270707999523e-3,5.226515783222153e-3,9.515319707834862e-6,7.924704664502419e-6,1.197266014225403e-5 +Bls12_381_G2_multiScalarMul/71/71,5.2882851289316885e-3,5.286944845429294e-3,5.2901838154393414e-3,4.850407193371409e-6,3.951323934404944e-6,6.909977742394703e-6 +Bls12_381_G2_multiScalarMul/72/72,5.31973147751225e-3,5.318376432387295e-3,5.32119875028863e-3,4.277946466566538e-6,3.32076690250808e-6,5.635737244144887e-6 +Bls12_381_G2_multiScalarMul/73/73,5.415258160623588e-3,5.413782714872596e-3,5.416918547393203e-3,4.874528900097905e-6,4.170514576006458e-6,5.848559988534025e-6 +Bls12_381_G2_multiScalarMul/74/74,5.504234496008557e-3,5.500576962955019e-3,5.508481864691515e-3,1.1590261990431737e-5,7.963644443790475e-6,2.0109944098147845e-5 +Bls12_381_G2_multiScalarMul/75/75,5.564079990869667e-3,5.562681956747252e-3,5.56567336402758e-3,4.352958051265566e-6,3.4422969438156352e-6,6.286896453598817e-6 +Bls12_381_G2_multiScalarMul/76/76,5.636188875483629e-3,5.63517382713922e-3,5.637553743099741e-3,3.670518446053137e-6,2.6204373559816722e-6,5.576211218482488e-6 +Bls12_381_G2_multiScalarMul/77/77,5.653980663508052e-3,5.652296820298524e-3,5.657670797268361e-3,7.080543955082813e-6,3.7855994178883683e-6,1.2879875104746403e-5 +Bls12_381_G2_multiScalarMul/78/78,5.740407480489808e-3,5.7391493805168635e-3,5.7418065167963e-3,3.904427361041286e-6,3.074226799333372e-6,5.442029866027754e-6 +Bls12_381_G2_multiScalarMul/79/79,5.751010900543999e-3,5.748323596643336e-3,5.754728295889315e-3,9.270531833024517e-6,6.035547009683968e-6,1.4379971767424256e-5 +Bls12_381_G2_multiScalarMul/80/80,5.858800364486109e-3,5.857269600819101e-3,5.860372363714095e-3,4.878855487808653e-6,3.7581767493947793e-6,6.996843420054578e-6 +Bls12_381_G2_multiScalarMul/81/81,5.896817994473183e-3,5.894063205963552e-3,5.902366128185444e-3,1.1536253196991757e-5,6.383910727541163e-6,2.0982102749864474e-5 +Bls12_381_G2_multiScalarMul/82/82,5.954935473178033e-3,5.953063910957776e-3,5.957530288931881e-3,6.253389324766823e-6,4.779351132702418e-6,7.979956410106285e-6 +Bls12_381_G2_multiScalarMul/83/83,6.0161468367483225e-3,6.013693044072133e-3,6.02177468728205e-3,1.0835798229125257e-5,6.207595030876202e-6,1.9548081431230584e-5 +Bls12_381_G2_multiScalarMul/84/84,6.094614704088679e-3,6.092574358893842e-3,6.0971100378228475e-3,6.666176870479611e-6,5.145944335262237e-6,8.274826825353507e-6 +Bls12_381_G2_multiScalarMul/85/85,6.1380376895836565e-3,6.133725428191463e-3,6.145329879147275e-3,1.626622922741078e-5,1.0821722335694483e-5,2.700730631296616e-5 +Bls12_381_G2_multiScalarMul/86/86,6.2140860516838245e-3,6.212851863373451e-3,6.215546358212723e-3,4.0395006569626435e-6,3.346822769756149e-6,4.7839437803151336e-6 +Bls12_381_G2_multiScalarMul/87/87,6.27302455453059e-3,6.270885529060964e-3,6.275809157451918e-3,6.999595649144767e-6,4.947819532780126e-6,1.0251538631768462e-5 +Bls12_381_G2_multiScalarMul/88/88,6.3404523682942995e-3,6.338680115532713e-3,6.3420519237891515e-3,5.208923709646363e-6,4.108671865132737e-6,6.370714767856116e-6 +Bls12_381_G2_multiScalarMul/89/89,6.410017615442629e-3,6.406159123069732e-3,6.41315635661642e-3,1.0622224787961102e-5,7.696172865576866e-6,1.3963076368862973e-5 +Bls12_381_G2_multiScalarMul/90/90,6.481791869329977e-3,6.479839995502555e-3,6.484276415426917e-3,6.258729255672214e-6,4.848352706810262e-6,7.988412553980431e-6 +Bls12_381_G2_multiScalarMul/91/91,6.475168018503552e-3,6.470179709488667e-3,6.483048340856914e-3,1.7646142713249933e-5,1.3097969794456097e-5,2.6957602312106938e-5 +Bls12_381_G2_multiScalarMul/92/92,6.569285931833285e-3,6.566882844069322e-3,6.574172843329704e-3,9.752702509029438e-6,5.6501870652183995e-6,1.6741066006979055e-5 +Bls12_381_G2_multiScalarMul/93/93,6.629457299321055e-3,6.625183482996535e-3,6.638841711503604e-3,1.7538389603216873e-5,1.0528950637309035e-5,3.0379658274480686e-5 +Bls12_381_G2_multiScalarMul/94/94,6.7320607492387515e-3,6.730167903973191e-3,6.736598035759103e-3,8.15218783569633e-6,3.741189882233103e-6,1.6185222568739163e-5 +Bls12_381_G2_multiScalarMul/95/95,6.801145393237103e-3,6.796607904593793e-3,6.8137432062137055e-3,1.9691935909923513e-5,7.536520887751789e-6,3.768941248607555e-5 +Bls12_381_G2_multiScalarMul/96/96,6.821360358060845e-3,6.816810519501433e-3,6.829564504014655e-3,1.6752380908242913e-5,1.0237675196995415e-5,3.083226102494789e-5 +Bls12_381_G2_multiScalarMul/97/97,6.90522012785712e-3,6.901544208299667e-3,6.918761450372084e-3,1.7088371694161855e-5,5.773286197099474e-6,3.643360035316389e-5 +Bls12_381_G2_multiScalarMul/98/98,6.9597205589059085e-3,6.9554579231546464e-3,6.963825444927238e-3,1.230537047747648e-5,9.828399035508776e-6,1.581113740579338e-5 +Bls12_381_G2_multiScalarMul/99/99,6.998605748330429e-3,6.993956045528542e-3,7.003564931628933e-3,1.3941888558415054e-5,1.1848281516892752e-5,1.8598404587423643e-5 +Bls12_381_G2_multiScalarMul/100/100,7.090569654857228e-3,7.08876305884669e-3,7.093035056145744e-3,6.187076669186285e-6,4.689206191622249e-6,8.297705725121281e-6 +LookupCoin/4/4/0,1.1987809246529645e-6,1.1980799694260653e-6,1.199507988172571e-6,2.4107745567835586e-9,2.0584370079307666e-9,2.875392436193467e-9 +LookupCoin/4/4/310,1.2142647691242684e-6,1.2131420571175932e-6,1.2155824079867558e-6,4.0706586084594835e-9,3.341022693427462e-9,5.065716418773158e-9 +LookupCoin/4/4/10010,1.2248007161821862e-6,1.2239051860618773e-6,1.2258178843052394e-6,3.4507929939399797e-9,2.7438893641041726e-9,4.037935320134895e-9 +LookupCoin/4/4/310,1.227249583287171e-6,1.2256517429394646e-6,1.228820138823975e-6,5.135902136033977e-9,4.602249434367064e-9,5.923087021439266e-9 +LookupCoin/4/4/10010,1.2443322171758413e-6,1.2427942185459095e-6,1.245357233115194e-6,4.477283860902663e-9,3.3486755939797695e-9,6.223685793289658e-9 +LookupCoin/4/4/1550,1.2454774811827858e-6,1.24344192850786e-6,1.2470198844553666e-6,6.122793215314405e-9,5.177658728098016e-9,7.799865926329944e-9 +LookupCoin/4/4/50050,1.2571864815375906e-6,1.2564138179154984e-6,1.2579616575806e-6,2.763962545250128e-9,2.377982103186773e-9,3.4290535732906835e-9 +LookupCoin/4/4/3100,1.2439256389929855e-6,1.2432284142565402e-6,1.2447917189730735e-6,2.6963459263387795e-9,2.3388804770411354e-9,3.1487019272388267e-9 +LookupCoin/4/4/100100,1.2614380048646346e-6,1.2607020697810519e-6,1.2622035022217295e-6,2.6041139838164562e-9,2.1634799046250406e-9,3.2905483922706815e-9 +LookupCoin/4/4/15500,1.2817013390502208e-6,1.2805655390473332e-6,1.2826202692983273e-6,3.4355071748599705e-9,2.7556274311754177e-9,4.333780868629672e-9 +LookupCoin/4/4/500500,1.2886652966188255e-6,1.287822313888798e-6,1.2893947030051335e-6,2.4996056527806103e-9,2.0027954951844944e-9,3.51778389213686e-9 +LookupCoin/4/4/31000,1.290122000714343e-6,1.288856340927497e-6,1.2912200541102332e-6,3.7314630573669714e-9,3.1415172863968466e-9,4.4094407974448845e-9 +LookupCoin/4/4/1001000,1.2850523205112054e-6,1.2841146835669193e-6,1.2862444714691543e-6,3.495083997499569e-9,2.7213906501859453e-9,5.135209308347153e-9 +LookupCoin/4/4/1,1.2257006912313622e-6,1.2252367955480791e-6,1.2261868546628844e-6,1.7280071454745501e-9,1.4188404395459067e-9,2.155107450125363e-9 +LookupCoin/4/4/3100,1.2647764517950342e-6,1.2641033185328018e-6,1.2654168552708808e-6,2.2224938263044665e-9,1.8474168055405267e-9,2.7240972942539672e-9 +LookupCoin/4/4/10100,1.2509813815980665e-6,1.2493589833326004e-6,1.2523719298666614e-6,4.852971270116405e-9,4.224063533334953e-9,5.761730062786258e-9 +LookupCoin/4/4/100100,1.272100065961152e-6,1.2713779399535466e-6,1.2729916263321848e-6,2.6442781870170232e-9,2.2315274992244496e-9,3.3894908114610666e-9 +LookupCoin/4/4/1000100,1.2622451455213246e-6,1.2614409542043105e-6,1.2628884167008598e-6,2.4284367212124195e-9,1.952886495004267e-9,3.058594015650686e-9 +LookupCoin/4/4/1,1.2120959773067779e-6,1.2111098168941214e-6,1.2130451144150161e-6,3.340332155521285e-9,2.854400739916875e-9,3.884696635679422e-9 +LookupCoin/4/4/1,1.2202197166189542e-6,1.2192613245401622e-6,1.2212645347977496e-6,3.2388832596863558e-9,2.7203964537861694e-9,3.900896078940326e-9 +LookupCoin/4/4/1,1.2235044799553622e-6,1.2228494680423523e-6,1.2243029181572994e-6,2.418188553655573e-9,1.9596997508446255e-9,3.3537589604273597e-9 +LookupCoin/4/4/124,1.2186676257033273e-6,1.2173292994061867e-6,1.2200318248936087e-6,4.796332197760777e-9,4.009498878734066e-9,6.027489021903283e-9 +LookupCoin/4/4/372,1.2346285723771364e-6,1.2336953254200625e-6,1.235714013792257e-6,3.425255360445383e-9,2.7589262620900956e-9,4.040351857619523e-9 +LookupCoin/4/4/651,1.2372953539593385e-6,1.2362630975860024e-6,1.2383763132577293e-6,3.523259668004743e-9,2.939076484410285e-9,4.317741226544648e-9 +LookupCoin/4/4/0,1.1938943959277518e-6,1.1931943214717257e-6,1.1945778725918846e-6,2.3739978189645768e-9,1.8545949559429995e-9,3.332219238927099e-9 +LookupCoin/4/4/2002,1.2197197605216406e-6,1.2187965672790472e-6,1.2206041280398874e-6,2.9336631903150676e-9,2.4616168455718915e-9,3.632414054858564e-9 +LookupCoin/4/4/4004,1.2251163407493166e-6,1.223376349490241e-6,1.2269137473156499e-6,6.08770401676884e-9,5.158185169323526e-9,7.03140495193674e-9 +LookupCoin/4/4/0,1.1868541548864574e-6,1.185793573842222e-6,1.187690566882342e-6,3.316928649716189e-9,2.732913986532151e-9,4.129135287141955e-9 +LookupCoin/4/4/0,1.1898164242411212e-6,1.1888025275796023e-6,1.1906360315586723e-6,3.105666969872855e-9,2.5406724407764428e-9,4.0336345504799915e-9 +LookupCoin/4/4/10001,1.2150661212171984e-6,1.2143604950573222e-6,1.215820874653369e-6,2.38481675610348e-9,1.9162066170306435e-9,3.0006760018374973e-9 +LookupCoin/4/4/5066270,1.277826580439173e-6,1.2767570441421777e-6,1.2789518483325532e-6,3.5436542776320486e-9,2.858524102842415e-9,4.587631601537296e-9 +LookupCoin/4/4/1292907,1.2677688678187691e-6,1.266718345792965e-6,1.2688009027816102e-6,3.447161199023977e-9,2.8551687550492393e-9,4.1145424069515494e-9 +LookupCoin/4/4/4030899,1.2814323262321796e-6,1.2806641039935756e-6,1.2821530318509303e-6,2.5390170765500563e-9,2.024519511273767e-9,3.2720719989230043e-9 +LookupCoin/4/4/5040432,1.2701222097077116e-6,1.2680642236901763e-6,1.272211683356216e-6,6.785163423685793e-9,5.5778440287708566e-9,8.32836503873299e-9 +LookupCoin/4/4/4561038,1.2744320740219546e-6,1.2732745959940393e-6,1.2753878614609515e-6,3.4966375499144543e-9,2.6380710490775692e-9,5.15651621189535e-9 +LookupCoin/4/4/5375788,1.29023827085883e-6,1.289131346302382e-6,1.2913186917094856e-6,3.6521304151635797e-9,3.077484480052455e-9,4.449439367331406e-9 +LookupCoin/4/4/1262300,1.2539033480175535e-6,1.2526689596121973e-6,1.2556306027786345e-6,4.813588884658454e-9,4.0753081448679886e-9,6.013391116763802e-9 +LookupCoin/4/4/779712,1.2752127020007219e-6,1.2733455510509096e-6,1.276421301457468e-6,4.960204372531049e-9,3.78185565884019e-9,7.938310069673206e-9 +LookupCoin/4/4/1148823,1.257069697085679e-6,1.2550281877305862e-6,1.258357677798816e-6,5.2692097950519294e-9,3.607430925786029e-9,7.84256990197175e-9 +LookupCoin/4/4/7565554,1.2718862218212706e-6,1.270595772895692e-6,1.273500171319768e-6,4.7205100970096915e-9,3.9399955033716265e-9,5.636316687102632e-9 +LookupCoin/4/4/1892372,1.2798022142401478e-6,1.2787601377188223e-6,1.2806492883730673e-6,3.240518096537139e-9,2.6845102219159927e-9,4.024692073232961e-9 +LookupCoin/4/4/3962952,1.2700930008680598e-6,1.269264255671348e-6,1.2709391336121646e-6,2.874679403151091e-9,2.3225902454617737e-9,3.70494574418947e-9 +LookupCoin/4/4/4322668,1.289884201590555e-6,1.2884415967028401e-6,1.2913737248356338e-6,4.801444154073013e-9,3.916001043141595e-9,5.9023486667443996e-9 +LookupCoin/4/4/2970000,1.2784087871552185e-6,1.2767249782735827e-6,1.279942350107124e-6,5.300756075447827e-9,4.125409905431318e-9,7.91576575586899e-9 +LookupCoin/4/4/1902626,1.2825938062683246e-6,1.2812887257240548e-6,1.2840488079301932e-6,4.539085547891917e-9,3.7003355816408288e-9,5.8304818844362325e-9 +LookupCoin/4/4/2058224,1.2674138822348226e-6,1.266517177438222e-6,1.268307129660272e-6,2.920592770603687e-9,2.475360696644196e-9,3.5087547273771266e-9 +LookupCoin/4/4/3287578,1.279789833294665e-6,1.2785676940878397e-6,1.2812666317707647e-6,4.396660300354464e-9,3.659512262281134e-9,5.305430420746576e-9 +LookupCoin/4/4/745890,1.2585346454916983e-6,1.2568337444249753e-6,1.2601251297939e-6,5.430356191272733e-9,4.633445845065433e-9,6.319836603491019e-9 +LookupCoin/4/4/4002026,1.2838087012363595e-6,1.2825086945447733e-6,1.2850242229140597e-6,4.306704983324547e-9,3.5205722930442468e-9,5.654297611220834e-9 +LookupCoin/4/4/1679601,1.26357751253574e-6,1.262826291623019e-6,1.2643169242412846e-6,2.4774181681520444e-9,2.060368542544128e-9,3.039629576081113e-9 +LookupCoin/4/4/6480027,1.2801980877278831e-6,1.2771485096511817e-6,1.2820170540550525e-6,7.943334159431303e-9,5.772244703375927e-9,1.1917062311991287e-8 +LookupCoin/4/4/4498896,1.231625663105949e-6,1.2297170084115537e-6,1.2332704356430894e-6,6.124111331433371e-9,5.385841935470476e-9,7.003288835706173e-9 +LookupCoin/4/4/1674756,1.2735333599690776e-6,1.2710191575535196e-6,1.2756334354586257e-6,7.879868389245381e-9,6.978600463987998e-9,9.154593296359008e-9 +LookupCoin/4/4/2876381,1.261443514778358e-6,1.260767224170065e-6,1.2622450911016386e-6,2.462597798861482e-9,1.9676438830362255e-9,3.096918170975184e-9 +LookupCoin/4/4/6444328,1.2817975648175746e-6,1.2807178055257148e-6,1.2828396916268854e-6,3.5823180401646896e-9,2.8738062669432795e-9,4.531443495722488e-9 +LookupCoin/4/4/375724,1.245765227573596e-6,1.2444678099280414e-6,1.2468631348220374e-6,3.914327458436205e-9,3.338118939061562e-9,4.747447778986924e-9 +LookupCoin/4/4/126540,1.2603295320670344e-6,1.2576543706100949e-6,1.2622416729797346e-6,7.814043532055153e-9,5.869724250780736e-9,1.201854001602634e-8 +LookupCoin/4/4/4706835,1.2659166931421738e-6,1.264223718258494e-6,1.2671110254567974e-6,4.65608823434229e-9,3.141554343089209e-9,6.784674488291999e-9 +LookupCoin/4/4/5364324,1.2701935393151057e-6,1.269043098380611e-6,1.2712397968982748e-6,3.781423003012787e-9,3.1820832804639213e-9,4.755630255677031e-9 +LookupCoin/4/4/1455168,1.2704388582488929e-6,1.269687317776098e-6,1.2711188680637336e-6,2.396816947915933e-9,1.9853818496761954e-9,2.993679944959491e-9 +LookupCoin/4/4/3889776,1.2802125381646228e-6,1.2791239574618982e-6,1.2813999258216065e-6,3.80345065781175e-9,3.149123607025695e-9,4.804823325650835e-9 +LookupCoin/4/4/686750,1.2599963410745547e-6,1.2588914981747105e-6,1.2611105471132294e-6,3.785014969177361e-9,3.147206549401517e-9,4.767167393088846e-9 +LookupCoin/4/4/1963648,1.299818184369183e-6,1.298617040985033e-6,1.301036825644262e-6,4.176587526215176e-9,3.4330381937143528e-9,5.270136974581143e-9 +LookupCoin/4/4/8659209,1.2924287795535367e-6,1.2912655254935138e-6,1.2935332916752233e-6,3.759717198495328e-9,2.8703928008557797e-9,5.27586315684352e-9 +LookupCoin/4/4/2789190,1.2755127933170805e-6,1.2737087407368222e-6,1.2768607596541763e-6,4.963059723596741e-9,3.5158859551543468e-9,6.981879743504883e-9 +LookupCoin/4/4/5625406,1.2959874699702527e-6,1.2950226907122984e-6,1.2970082683444309e-6,3.3391304669998987e-9,2.7941306761813028e-9,4.1386386528375054e-9 +LookupCoin/4/4/1957722,1.2690376232270707e-6,1.2666937311835606e-6,1.2709293087375226e-6,7.103182645095991e-9,4.915885369868955e-9,9.981731048934394e-9 +LookupCoin/4/4/4775708,1.2932987757200833e-6,1.2923933431135412e-6,1.2940935275990051e-6,2.785537307928441e-9,2.3087374360113047e-9,3.4830510090053497e-9 +LookupCoin/4/4/7862841,1.2779049515065047e-6,1.276878213735431e-6,1.279210034062878e-6,3.6895466028508537e-9,3.058034377334638e-9,5.074895055983018e-9 +LookupCoin/4/4/4343103,1.2947015952690554e-6,1.293526049558432e-6,1.2959020546237318e-6,3.840676655557911e-9,3.2213319774607096e-9,4.915737391178833e-9 +LookupCoin/4/4/2628828,1.2576228670548757e-6,1.255184660863472e-6,1.2591729099493177e-6,6.6657091577461195e-9,4.479936777639809e-9,1.0930469098408585e-8 +LookupCoin/4/4/6801147,1.273344935956418e-6,1.2717381856314266e-6,1.2747350340827408e-6,4.964830713393079e-9,4.139696967925825e-9,5.688607530322684e-9 +LookupCoin/4/4/2259715,1.2733626425487013e-6,1.2725687215373529e-6,1.2742045289295303e-6,2.753786442176939e-9,2.2271683907574778e-9,3.6442018276317194e-9 +LookupCoin/4/4/1311960,1.2643513046710382e-6,1.262048535540152e-6,1.2664285395243078e-6,7.211269768344391e-9,6.0887352623941e-9,9.266004580584638e-9 +LookupCoin/4/4/4656600,1.2784770014839777e-6,1.2763424508746477e-6,1.2808613423153377e-6,7.700463816731205e-9,6.8360128237785615e-9,8.690659514605894e-9 +LookupCoin/4/4/1093578,1.2716722138984615e-6,1.2700426000027498e-6,1.2729495582483995e-6,4.8324792890281395e-9,3.958125416800441e-9,6.067383126695396e-9 +LookupCoin/4/4/2868166,1.2775526844976142e-6,1.2753876524451476e-6,1.279449788038799e-6,7.1015328750516004e-9,5.800878613555848e-9,8.76070508863944e-9 +LookupCoin/4/4/2485840,1.2606233541272532e-6,1.2584118705398867e-6,1.2628177461824179e-6,7.2734790619610975e-9,6.412289956484719e-9,8.592412278530262e-9 +LookupCoin/4/4/453354,1.2491237152866404e-6,1.2474513872251372e-6,1.2509309497843268e-6,5.972396719405774e-9,4.80908506645763e-9,7.707294223227184e-9 +LookupCoin/4/4/2631636,1.275835347391731e-6,1.274031323751365e-6,1.2770603929417775e-6,4.848121178368409e-9,3.575817370976392e-9,6.803022453212725e-9 +LookupCoin/1/1/1,1.2062193447359163e-6,1.204720572905251e-6,1.2085664510346082e-6,6.3895396673973984e-9,3.5237401780642824e-9,9.865319076861485e-9 +LookupCoin/1/4/310,1.2477282934661902e-6,1.2457165309461458e-6,1.2500730188409636e-6,7.50234974399736e-9,6.484893665257567e-9,9.090423319721542e-9 +LookupCoin/1/125/10010,1.2364898735039994e-6,1.2339360373470795e-6,1.2388935255579768e-6,8.358163277644683e-9,6.037899233171248e-9,1.2510441623475233e-8 +LookupCoin/1/2500/200010,1.2374699372558117e-6,1.2359148176434845e-6,1.23888079346438e-6,5.061076021241142e-9,4.194002526091644e-9,6.3986008003463075e-9 +LookupCoin/1/1/170,1.2344447450763024e-6,1.2330377959532651e-6,1.2361615688816788e-6,5.196922828874984e-9,3.64700211256897e-9,8.416421668371051e-9 +LookupCoin/1/4/2635,1.2435117760278765e-6,1.2422284752759498e-6,1.2447536719288215e-6,4.408433001343926e-9,3.677681442162629e-9,5.438399421854307e-9 +LookupCoin/1/125/79079,1.2573268594938636e-6,1.2551516899720538e-6,1.2599712779688385e-6,7.80382576748386e-9,4.997720015443988e-9,1.3924166794552906e-8 +LookupCoin/1/2500/1660083,1.2484602746854446e-6,1.247815712373976e-6,1.2491265511584914e-6,2.34795048068606e-9,1.8921582415414914e-9,3.0112347635990135e-9 +LookupCoin/4/1/3100,1.2423704587658755e-6,1.2407630626791196e-6,1.2439468322394299e-6,5.373034335462937e-9,4.7566006320427445e-9,6.301317405621589e-9 +LookupCoin/4/4/3100,1.2525392523923255e-6,1.251729706388684e-6,1.253521581527334e-6,2.914692348843169e-9,2.5332203917450785e-9,3.6522269496455272e-9 +LookupCoin/4/125/100100,1.260774655999151e-6,1.258804266021221e-6,1.2665097440576978e-6,9.852196327494622e-9,4.304536400104611e-9,2.0258395020026988e-8 +LookupCoin/4/2500/2000100,1.2643632216987251e-6,1.2630032246538064e-6,1.2656822810057662e-6,4.334257923244687e-9,3.457742541748888e-9,5.22087199050318e-9 +LookupCoin/13/1/10100,1.2624070567558792e-6,1.2606154235219343e-6,1.2640424050493419e-6,5.657152523515489e-9,4.561599956711443e-9,7.417663438396113e-9 +LookupCoin/13/4/10100,1.2514256046427844e-6,1.2505411221705368e-6,1.25220945382555e-6,2.7559177095290204e-9,2.2419249567489397e-9,3.6490013282809864e-9 +LookupCoin/13/125/100100,1.2516682174012342e-6,1.2494080668363907e-6,1.25599113162234e-6,1.0356156217694294e-8,5.347239956327251e-9,1.845529845521035e-8 +LookupCoin/13/2500/2000100,1.2513709932311224e-6,1.2499746607215296e-6,1.2527092313776355e-6,4.4801455294860196e-9,3.800152944697293e-9,5.2497237732200065e-9 +LookupCoin/125/1/100100,1.2566103108676568e-6,1.255628700812506e-6,1.2575111947018028e-6,3.2302262628515648e-9,2.791524531422057e-9,3.8143780305339686e-9 +LookupCoin/125/4/100100,1.2514828459336215e-6,1.2477222292612055e-6,1.254612459913698e-6,1.1357087989549857e-8,9.45455176911453e-9,1.383532734188531e-8 +LookupCoin/125/125/100100,1.2510536713395532e-6,1.2486776378617943e-6,1.253130098221779e-6,7.604087462788487e-9,6.681597085163331e-9,9.422041323534413e-9 +LookupCoin/125/2500/2000100,1.257567022561272e-6,1.2568076079972548e-6,1.2586232567348466e-6,3.16296838231096e-9,2.6942744714791043e-9,4.065265294010724e-9 +LookupCoin/1250/1/1000100,1.2437022703562684e-6,1.2426624497194861e-6,1.2448352355537035e-6,3.6639170247051537e-9,3.0754055871693162e-9,4.6664050139976854e-9 +LookupCoin/1250/4/1000100,1.2552913141875582e-6,1.2538565802582663e-6,1.2564437487245099e-6,4.248705024921862e-9,3.469885621142994e-9,5.850796247354429e-9 +LookupCoin/1250/125/1000100,1.2527903228863225e-6,1.2518855914459804e-6,1.2537844352544552e-6,3.2593544529421823e-9,2.742839194604889e-9,3.855959694739642e-9 +LookupCoin/1250/2500/2000100,1.244355189731791e-6,1.2437611615642397e-6,1.2450840154318082e-6,2.114101048001732e-9,1.8593202860339957e-9,2.4700062670136815e-9 +LookupCoin/2500/1/2000100,1.2616953743537094e-6,1.2607823671479182e-6,1.2625869674557756e-6,2.995673224252523e-9,2.5848501095906772e-9,3.497831620701429e-9 +LookupCoin/2500/4/2000100,1.2324862369243195e-6,1.231432022400554e-6,1.2338560076276956e-6,4.090214148756135e-9,3.220166680385365e-9,5.312793659204946e-9 +LookupCoin/2500/125/2000100,1.2501426989566735e-6,1.2490513642391722e-6,1.2511800621045136e-6,3.5565143042767577e-9,2.9193085819710178e-9,4.317790069989673e-9 +LookupCoin/2500/2500/2000100,1.2684506473527835e-6,1.2663866623438072e-6,1.2700234602016789e-6,6.255223338613385e-9,5.122911802979287e-9,8.695620223015002e-9 +LookupCoin/2500/1/20001,1.2205950702764077e-6,1.2194837679049681e-6,1.2215739595305359e-6,3.5885412220455425e-9,3.041070733950513e-9,4.345775209121243e-9 +LookupCoin/1/2500/20001,1.225552033705855e-6,1.224475993667657e-6,1.2267310935149546e-6,3.870212721701195e-9,3.1775642399066607e-9,4.993592546496145e-9 +LookupCoin/1250/1250/10001,1.2131187397265325e-6,1.2115373232538786e-6,1.2147049505409275e-6,5.283426708698358e-9,4.755641727910896e-9,5.863281683071315e-9 +LookupCoin/1/1/98,1.2501521377877466e-6,1.2495341913932788e-6,1.2507217872067047e-6,1.9895907484626213e-9,1.4706491314737957e-9,3.3031274098784845e-9 +LookupCoin/1/1/1,1.2075501958236993e-6,1.2068021890272933e-6,1.208262129306143e-6,2.4058069615692213e-9,2.0194049677111022e-9,2.8733377667621385e-9 +LookupCoin/1895/2345/15963058,1.2803196379252948e-6,1.2781771197173325e-6,1.2824991274173064e-6,7.762986271918989e-9,6.828295807122626e-9,8.860257555658608e-9 +LookupCoin/370/2076/12038625,1.280187988079581e-6,1.2788960629861599e-6,1.2812234664338074e-6,3.6888829156735294e-9,3.005689382197591e-9,4.531610661491176e-9 +LookupCoin/2265/757/15420120,1.2794228186796374e-6,1.2775800846507617e-6,1.2806995495549277e-6,5.042315540484943e-9,3.2890802919642043e-9,7.1587364600981135e-9 +LookupCoin/709/489/10818411,1.2926044931678004e-6,1.2910920599573055e-6,1.2938738364742565e-6,4.59334649311881e-9,3.834567590327339e-9,5.643568309075777e-9 +LookupCoin/1974/1712/7151511,1.2618735333861445e-6,1.2602185905997524e-6,1.2632714749891885e-6,5.303975479948274e-9,4.335998165513941e-9,7.595794971707872e-9 +LookupCoin/2249/2078/18765656,1.2768198259782786e-6,1.2760612499536146e-6,1.2776866455140164e-6,2.782660538142238e-9,2.2964653023942013e-9,3.3936086904482942e-9 +LookupCoin/1902/2110/25016160,1.2800125082778773e-6,1.2782090687092827e-6,1.2813538547667959e-6,5.2249049550227564e-9,3.726430052955547e-9,8.966757032776342e-9 +LookupCoin/344/276/2585868,1.2748221163951422e-6,1.2736786979195662e-6,1.2758810964221625e-6,3.5967301348288155e-9,2.9547496393505218e-9,4.371301981521861e-9 +LookupCoin/1815/2039/32405983,1.2881442260618426e-6,1.2846214351971028e-6,1.290809590793673e-6,9.782581561579647e-9,7.975572864826726e-9,1.2664604408656405e-8 +LookupCoin/2407/1150/14459754,1.261742711763931e-6,1.260490055540015e-6,1.262856050041063e-6,3.916552884020715e-9,3.1311750666188257e-9,5.139741809384566e-9 +LookupCoin/51/53/403370,1.2690691201019735e-6,1.2666972707436046e-6,1.2719904736100445e-6,8.644027945417467e-9,6.895220410010281e-9,1.0643318074188051e-8 +LookupCoin/114/2185/15518688,1.2734454001566559e-6,1.2714482679541691e-6,1.2754859090015847e-6,7.129261241642667e-9,6.113117766803054e-9,8.385862555340417e-9 +LookupCoin/1930/184/11964450,1.2646806726004963e-6,1.2619186472531779e-6,1.266631620388074e-6,7.81500116526586e-9,5.318924791154326e-9,1.2112131735135537e-8 +LookupCoin/1661/1441/18361252,1.2793428921774997e-6,1.2773290456115479e-6,1.2816965978336147e-6,6.9161326406910465e-9,5.860419402064908e-9,8.104524793474994e-9 +LookupCoin/1079/1519/10120950,1.2176172342733113e-6,1.215354493542573e-6,1.219484840382208e-6,6.576382648263217e-9,4.955915665560883e-9,9.834786651184058e-9 +LookupCoin/1583/878/18323361,1.273901063799558e-6,1.2724958995911544e-6,1.2752668463417309e-6,4.382471116625853e-9,3.7191484251445385e-9,5.1011845508551176e-9 +LookupCoin/1750/2264/9958850,1.2792231288620218e-6,1.2773527430679643e-6,1.2809795453721968e-6,6.563524166291678e-9,5.620592207284027e-9,7.797812255973995e-9 +LookupCoin/2277/146/14590215,1.2736997031304613e-6,1.2729404628754282e-6,1.274678589065324e-6,2.803802651941421e-9,2.397116093816526e-9,3.337932466090993e-9 +LookupCoin/434/1476/9160680,1.2950377927217072e-6,1.292177950010784e-6,1.2971424929530197e-6,8.517874522069e-9,6.978396259287523e-9,1.0606971559804377e-8 +LookupCoin/1600/323/16538892,1.2748475569688066e-6,1.2739374353277782e-6,1.2757741071194235e-6,3.009126866839188e-9,2.5215172882163673e-9,3.6210540961781523e-9 +LookupCoin/1278/2268/25393200,1.2748429228153157e-6,1.2731909498703963e-6,1.2767655913677555e-6,5.8759116310050834e-9,5.136063002980486e-9,6.93144062101209e-9 +LookupCoin/2037/2155/12391965,1.286507969537781e-6,1.2851082842137748e-6,1.2879782385199171e-6,4.656354491627198e-9,3.924392590758368e-9,5.7189333877099e-9 +LookupCoin/698/2337/24505212,1.3004041448864844e-6,1.2990036884776086e-6,1.302198653199329e-6,5.342213005092348e-9,4.446898938496697e-9,6.400925016937013e-9 +LookupCoin/2083/2136/16163356,1.2764223683796965e-6,1.2747326749110076e-6,1.278022885417272e-6,5.193619740804341e-9,4.18253795872677e-9,6.50739439434995e-9 +LookupCoin/671/776/6029316,1.2915448262587781e-6,1.290620114288026e-6,1.292449612633099e-6,3.1655151644047537e-9,2.650509570099081e-9,4.201734900482966e-9 +LookupCoin/59/2345/34989265,1.288189387415324e-6,1.2857572996775002e-6,1.2894313736155252e-6,5.77855506267552e-9,3.286634406761636e-9,9.23067395758222e-9 +LookupCoin/900/2286/14536575,1.2448490575673767e-6,1.2436205509277125e-6,1.2461113424391198e-6,4.214766252418104e-9,3.5105664402150484e-9,5.402356168004765e-9 +LookupCoin/832/999/2603762,1.2469669931453683e-6,1.245833580412049e-6,1.2481197787736745e-6,3.835242006275528e-9,3.1092729510819287e-9,5.04970050588965e-9 +LookupCoin/1680/1508/22826065,1.2880012317351417e-6,1.2868962639461852e-6,1.289267171137826e-6,4.1157409135944946e-9,3.4279524178612484e-9,5.041552368721841e-9 +LookupCoin/1002/1135/6899280,1.2615340362439734e-6,1.2596000174105259e-6,1.2631098592873918e-6,5.794501833559887e-9,4.562340482651247e-9,7.436081363681221e-9 +LookupCoin/1359/1152/11261320,1.2817921429788798e-6,1.280692690514904e-6,1.282766878523355e-6,3.260336727262534e-9,2.686850069925233e-9,4.0389013073466375e-9 +LookupCoin/1479/1854/13803006,1.2740944860786948e-6,1.272017359375449e-6,1.275593228992704e-6,6.013280935327777e-9,4.97075917451662e-9,8.14866656090185e-9 +LookupCoin/1228/1674/4136274,1.2804318087322261e-6,1.2793348926092004e-6,1.281654185953536e-6,3.624950116338036e-9,2.9043725188905854e-9,4.939386088033429e-9 +LookupCoin/657/1400/17092726,1.281053127582082e-6,1.2791792176585762e-6,1.2829306152492005e-6,6.308782440142078e-9,5.0754542799941174e-9,7.739057463022068e-9 +LookupCoin/2273/210/18379980,1.280677680587168e-6,1.2788447475995189e-6,1.282026514602082e-6,5.306289383708538e-9,3.7157331580635896e-9,7.348475104890475e-9 +LookupCoin/2379/373/14176605,1.2663163225985433e-6,1.2639302078289512e-6,1.2683386698387479e-6,7.23990316849903e-9,6.1218650310142794e-9,8.597931932342572e-9 +LookupCoin/2027/609/23188880,1.295105567032933e-6,1.2940425166399068e-6,1.2961731866357902e-6,3.728919832353806e-9,3.274942293144146e-9,4.328517923189467e-9 +LookupCoin/1863/1686/28971432,1.2825169420362135e-6,1.2804928385281182e-6,1.2845252525717386e-6,7.275604141359334e-9,6.057458607922365e-9,8.691833143851719e-9 +LookupCoin/52/1791/22792666,1.281709793395133e-6,1.2801005292324194e-6,1.283403098669843e-6,5.266251041537131e-9,4.52760161581891e-9,6.151824896588823e-9 +LookupCoin/2352/1129/26569604,1.2778269348736196e-6,1.2757465332763327e-6,1.2796725671718388e-6,6.6653617265910815e-9,5.072710668827788e-9,1.0249419563026495e-8 +LookupCoin/1246/573/6110997,1.2793683625071125e-6,1.277896122360298e-6,1.2809199696787995e-6,4.968435244913596e-9,4.259098678716503e-9,5.959230769465271e-9 +LookupCoin/310/1554/15670447,1.2762542093004263e-6,1.274810442212931e-6,1.2776051488945713e-6,4.816180265316213e-9,4.167931733864282e-9,5.830428336731485e-9 +LookupCoin/1294/1547/16509584,1.2773846030504825e-6,1.2763117660169196e-6,1.2783798666693647e-6,3.465517844763897e-9,2.884712446351482e-9,4.119128215253205e-9 +LookupCoin/1129/448/6962901,1.2807023889182653e-6,1.279431567712355e-6,1.2822567656222109e-6,4.7306819714227345e-9,3.88206505602893e-9,5.757701461919527e-9 +LookupCoin/1589/1186/9012099,1.259328193086861e-6,1.2582289028982644e-6,1.2603655232997637e-6,3.731909085159e-9,3.1385094267051278e-9,4.5413734210007086e-9 +LookupCoin/1625/1893/22423821,1.268217566328228e-6,1.2661110426900448e-6,1.270600590015182e-6,7.536873955700692e-9,6.4829438363242555e-9,8.636468990921138e-9 +LookupCoin/9/1946/18177584,1.2958286550753203e-6,1.2942435964656242e-6,1.2972844012060394e-6,5.074835798824309e-9,3.862947517569473e-9,7.113544720904308e-9 +LookupCoin/2003/828/10528425,1.2660119891220907e-6,1.265114808268792e-6,1.2669678059247464e-6,3.0961043223970374e-9,2.602134311717419e-9,3.727819682601455e-9 +LookupCoin/876/2425/24813879,1.2695039120707998e-6,1.2683998534998996e-6,1.2710728327069194e-6,4.522253022851903e-9,3.241285459336524e-9,7.041325855313811e-9 +LookupCoin/1656/1408/10424602,1.2722888624293668e-6,1.2707823387853345e-6,1.273713506724683e-6,4.962874014529833e-9,4.1673847114882446e-9,5.865926525726256e-9 +ValueContains/310/31,1.150224079634047e-6,1.1484029171593576e-6,1.1520655872900477e-6,6.005570260918549e-9,4.862342923346793e-9,7.521077913330694e-9 +ValueContains/310/0,1.06384320106322e-6,1.062191515033955e-6,1.0654378642108599e-6,5.509382275152861e-9,4.581027672568637e-9,6.9098851874577475e-9 +ValueContains/310/310,1.7619305168090704e-6,1.7586779792752773e-6,1.7652600884404835e-6,1.130839096873276e-8,9.41898501836534e-9,1.4108118237577274e-8 +ValueContains/3100/0,1.0705970595310977e-6,1.0696262985135277e-6,1.0713713385821135e-6,2.872487380202136e-9,2.4019278496237887e-9,3.6053075163534896e-9 +ValueContains/3100/0,1.0657043929147226e-6,1.0642775083128504e-6,1.0671113447204667e-6,4.743608263663756e-9,3.889703167539578e-9,5.989574559564032e-9 +ValueContains/3100/3100,1.1894146744057842e-5,1.1871084222520173e-5,1.191767193116453e-5,7.663599053135675e-8,6.613215443182404e-8,9.643739250799068e-8 +ValueContains/31000/0,1.0677156355522858e-6,1.0654259909394951e-6,1.0698616098158728e-6,7.893785110339014e-9,6.182586930187335e-9,1.016832064207399e-8 +ValueContains/31000/0,1.0676225905277226e-6,1.0666709296050532e-6,1.0684853389377288e-6,2.8139786554644567e-9,2.2748535065168243e-9,3.7035014342306457e-9 +ValueContains/31000/0,1.0689765323263212e-6,1.0677305291841052e-6,1.0702146129018692e-6,4.153616760933364e-9,3.294918839189322e-9,5.552405671833423e-9 +ValueContains/31000/31000,1.3989070972469196e-4,1.3961275529108828e-4,1.4014140206640736e-4,8.671153993656169e-7,7.6414975418358e-7,9.882067921741445e-7 +ValueContains/1/1,1.1103542267638899e-6,1.1091545938139845e-6,1.1115909737856854e-6,4.205783682685009e-9,3.5546448746111783e-9,5.62531694174738e-9 +ValueContains/3100/0,1.0710438033081753e-6,1.0704010953841335e-6,1.0718462620934376e-6,2.488484444011733e-9,2.0557877847046803e-9,3.0489873474860437e-9 +ValueContains/100100/0,1.0645328169031105e-6,1.0622162475708715e-6,1.066656853367623e-6,7.602979479271493e-9,6.4343569983388315e-9,9.00929760184189e-9 +ValueContains/1000100/0,1.066009615081739e-6,1.0644317487918624e-6,1.0674781132396028e-6,5.059237602185728e-9,4.298984305788049e-9,5.899498444881504e-9 +ValueContains/1/0,1.0707510664994408e-6,1.0688014263040615e-6,1.0744053224110398e-6,8.653290657117377e-9,5.716417744402521e-9,1.4758666889717379e-8 +ValueContains/651/6510,1.8768293331625005e-5,1.8735623037201094e-5,1.8834433602150336e-5,1.479036964808042e-7,8.682086466352637e-8,2.6347552785518823e-7 +ValueContains/6002/6002,1.2977825325783861e-6,1.295350415288182e-6,1.3000088661210938e-6,7.269569584734367e-9,4.743744781624348e-9,1.0786484439189123e-8 +ValueContains/0/0,1.0658809918087003e-6,1.064642141097276e-6,1.0670292955565495e-6,4.374952858028444e-9,3.608067388398209e-9,5.251828914098139e-9 +ValueContains/0/0,1.0559905086366154e-6,1.0532986959513952e-6,1.05962723226345e-6,1.0680616302731096e-8,8.108403376724673e-9,1.6991111459695734e-8 +ValueContains/310/0,1.0716910600781161e-6,1.0706227908410502e-6,1.072598412217162e-6,3.2668191835731764e-9,2.88482953898635e-9,3.851011348259737e-9 +ValueContains/3100/0,1.065442367224129e-6,1.0639547859810193e-6,1.0687240823022984e-6,7.274364500262141e-9,3.739654571820177e-9,1.4891287855036637e-8 +ValueContains/31000/0,1.067519833120599e-6,1.0670093260065182e-6,1.068122613480877e-6,1.866640161684788e-9,1.4687606205704114e-9,2.368675885581133e-9 +ValueContains/1388240/1131480,5.830377894608075e-4,5.821675362234542e-4,5.841232073966954e-4,3.369025104679992e-6,2.834202732795799e-6,4.046879330172387e-6 +ValueContains/1230323/564167,6.957637639708246e-5,6.955956916495848e-5,6.959694875467544e-5,6.312446495406844e-8,4.809150972110265e-8,9.619774963274347e-8 +ValueContains/4035324/2503148,2.4917818695306486e-4,2.488740279681662e-4,2.504652388499471e-4,1.7966337495919435e-6,3.3382868647699937e-7,4.077061376227551e-6 +ValueContains/4797225/1867905,1.1298833376394714e-4,1.129045361082674e-4,1.1307031864043225e-4,2.854406184222403e-7,2.391807868462668e-7,3.5618050652586186e-7 +ValueContains/10835055/9374274,1.5335386801324598e-3,1.5318350982017343e-3,1.5379264227913564e-3,8.543138429232696e-6,3.908796093951306e-6,1.5229404241807767e-5 +ValueContains/12920960/975284,7.787465365647193e-5,7.78420278708246e-5,7.792727123487767e-5,1.3934696167567474e-7,1.0577024852677797e-7,2.0650866021535924e-7 +ValueContains/4708200/3670800,3.2189371844861713e-4,3.2150494682355317e-4,3.231951907590193e-4,2.1279453801609014e-6,6.057641810259562e-7,4.770434654200116e-6 +ValueContains/5032730/2914202,4.4632291921110087e-4,4.459043462632429e-4,4.475786076834567e-4,2.320167134598466e-6,8.420951551137534e-7,4.246168716058968e-6 +ValueContains/2774306/2038766,2.0218706694471707e-4,2.019965715302176e-4,2.028792056625027e-4,1.1025374870853495e-6,3.513069810941506e-7,2.4451455148839037e-6 +ValueContains/4020059/3892243,5.906132100414774e-4,5.903243585569346e-4,5.913624956317791e-4,1.470087000916268e-6,6.975667267168607e-7,2.65762554322302e-6 +ValueContains/4886109/3662556,3.2147460519542283e-4,3.213241376324112e-4,3.217071380767817e-4,5.938081388368038e-7,3.9546371750080744e-7,1.0364500615543388e-6 +ValueContains/5235852/1199292,1.372392804691373e-4,1.3720117227167361e-4,1.3729818364340758e-4,1.6202421861255058e-7,9.12126479788811e-8,2.5458418247796685e-7 +ValueContains/2945850/1345990,7.977577086502939e-5,7.975265920392309e-5,7.980776844774855e-5,9.408103233206765e-8,6.939296252705069e-8,1.4176818513985068e-7 +ValueContains/980343/549990,1.3848510081532306e-4,1.3836134411876637e-4,1.386279615391105e-4,4.397023092391429e-7,3.5175845858049713e-7,5.311761295383437e-7 +ValueContains/4713406/3666582,3.184150609185994e-4,3.1827502634776004e-4,3.1857087934551574e-4,4.960888019016048e-7,3.9488356265782485e-7,6.234062993995696e-7 +ValueContains/4392192/174838,1.9185488022869813e-5,1.917432377290978e-5,1.9196127357667117e-5,3.668720069998244e-8,3.146128801545269e-8,4.6060045380628914e-8 +ValueContains/5993043/1393056,1.3698697007419702e-4,1.3694169384738768e-4,1.3703898844114826e-4,1.6315053698114676e-7,1.2765054957267603e-7,2.4922858841547223e-7 +ValueContains/2841216/258944,4.4569751518569055e-5,4.455853857311547e-5,4.458634102791225e-5,4.4622445698346663e-8,3.3782123234928744e-8,6.043866835102693e-8 +ValueContains/16889220/6440265,9.630807665046082e-4,9.626643496364997e-4,9.638691403644825e-4,1.969808428789295e-6,1.4020089798171394e-6,3.2323864058579634e-6 +ValueContains/3416075/179400,2.1114615681243928e-5,2.110543246119949e-5,2.1123974058483687e-5,3.1805446389729774e-8,2.5908251759538914e-8,4.22730124319113e-8 +ValueContains/10474516/6931665,9.064818915605667e-4,9.05987443309439e-4,9.072612704764007e-4,2.036234445019851e-6,1.4482572524718826e-6,2.820824620618682e-6 +ValueContains/23280000/14317200,2.6943367275251776e-3,2.6935838951761227e-3,2.6954131081267352e-3,2.858873305393497e-6,1.8261059946685073e-6,4.911560735731439e-6 +ValueContains/17607912/400589,2.509700334064018e-5,2.5090201730613753e-5,2.5105845387826096e-5,2.4304443668200548e-8,1.9937384758448563e-8,3.1795332354781644e-8 +ValueContains/18476472/2509380,1.595515446835561e-4,1.5948902551541017e-4,1.5969817373887767e-4,3.14792644619481e-7,1.589795748224896e-7,5.329421866453197e-7 +ValueContains/2276082/130528,8.041209938911082e-6,8.036901279192637e-6,8.044849043957893e-6,1.2820036444411411e-8,1.0776473394324325e-8,1.5535420296847403e-8 +ValueContains/3930056/2725737,3.1776002333520296e-4,3.1739194817070323e-4,3.179661744289935e-4,9.513836575001647e-7,5.650491562578674e-7,1.5340286373147029e-6 +ValueContains/3598356/380092,3.4536686380287794e-5,3.4399022056096784e-5,3.469292924889314e-5,4.806422245761377e-7,4.1350889124018223e-7,5.141444004997678e-7 +ValueContains/12169248/10889424,1.9602809428612435e-3,1.959506477247854e-3,1.9612077354371504e-3,2.937546561276068e-6,2.317477571806379e-6,4.106702668950206e-6 +ValueContains/142848/72416,1.614800770779478e-5,1.612640184397839e-5,1.6165503144045665e-5,6.261322158873831e-8,5.358060856632499e-8,7.382795473265937e-8 +ValueContains/28446/20658,7.336275590839956e-5,7.317459349934284e-5,7.357110721408839e-5,6.919130313477668e-7,6.130125155079317e-7,8.055478060102782e-7 +ValueContains/4093319/1247625,1.9056177958026678e-4,1.9051540553801757e-4,1.9062486788885537e-4,1.814675437951522e-7,1.3510555555817223e-7,2.66118650443016e-7 +ValueContains/12390235/7859709,1.2939251469556306e-3,1.2933431902760165e-3,1.294682410466329e-3,2.193951997280829e-6,1.6794123785165327e-6,2.835225981249992e-6 +ValueContains/6129818/4066035,6.062322109240712e-4,6.056020612027894e-4,6.074113543857627e-4,2.7384695691856397e-6,1.625285264130118e-6,4.472293627737563e-6 +ValueContains/1657800/1530702,3.6554774539165115e-4,3.653782969910462e-4,3.658347842664113e-4,8.17317508543419e-7,4.893817089973439e-7,1.2591133108369015e-6 +ValueContains/3304800/910440,1.4289209811072542e-4,1.4272768310138654e-4,1.430164460749529e-4,4.743737818229538e-7,3.692018891019297e-7,6.635150006708321e-7 +ValueContains/15869112/9918608,1.966922026999833e-3,1.965532162311767e-3,1.9684557580459637e-3,4.886900380572334e-6,3.8114339023972606e-6,6.5043272023058915e-6 +ValueContains/1535940/1437408,1.675079192369487e-4,1.6743898345902722e-4,1.675974683410271e-4,2.621316159867751e-7,2.0779990830234897e-7,4.0570627069547474e-7 +ValueContains/19866756/18316004,3.433782972066689e-3,3.431825291604356e-3,3.4371936732783457e-3,7.942605267700316e-6,4.4658213648082326e-6,1.543699282200521e-5 +ValueContains/2767554/101535,7.370376782582864e-6,7.367301893150696e-6,7.373809574781905e-6,1.1399966273118639e-8,9.46164017266115e-9,1.528392137629673e-8 +ValueContains/6418466/4957062,7.712746413388413e-4,7.705837930356645e-4,7.72257699804622e-4,2.691519911527554e-6,1.908409434797522e-6,3.620458138777805e-6 +ValueContains/3595660/2643280,5.897573926490326e-4,5.894703531110593e-4,5.901217699060191e-4,1.063906555408471e-6,8.012659689797687e-7,1.400088770302344e-6 +ValueContains/19078421/11705351,2.1984832793282365e-3,2.1976878588428382e-3,2.1994700112280448e-3,2.9207560746456993e-6,2.25976489043177e-6,4.385016227957237e-6 +ValueContains/2078188/690368,1.6287475493861336e-4,1.6277688884120615e-4,1.62957700148916e-4,3.0162048245436194e-7,2.560271912897383e-7,3.572126881676112e-7 +ValueContains/9108300/2616575,2.5582738803681283e-4,2.556821249609247e-4,2.560011799020167e-4,5.270886608887014e-7,4.213315620704924e-7,6.986846618352393e-7 +ValueContains/6916158/368406,3.802286624021897e-5,3.80151539227574e-5,3.8030383790436226e-5,2.629032044731183e-8,2.201626061128466e-8,3.195811927303817e-8 +ValueContains/8999515/5208710,8.056136157809999e-4,8.051642952842769e-4,8.065927838704155e-4,1.9952438976326107e-6,1.3453298416225953e-6,3.350980804138213e-6 +ValueContains/3590204/1011148,1.0520207337524529e-4,1.0517766716611235e-4,1.0523286251531954e-4,9.108695273412249e-8,6.679970571243264e-8,1.437262741780023e-7 +ValueContains/8618405/1525841,1.3447990003810246e-4,1.34435364937348e-4,1.345662890706284e-4,1.9738886556091444e-7,1.247201488379852e-7,3.4329718865165016e-7 +ValueContains/1090566/676218,3.652853539745162e-4,3.6521368175826543e-4,3.65390955680254e-4,3.044283349559993e-7,2.0695871997905786e-7,4.2463426025938833e-7 +ValueContains/17998150/4896483,5.460585925365607e-4,5.455005274479362e-4,5.46969339199242e-4,2.3611739251008407e-6,1.6155650868680277e-6,3.914730201986467e-6 +ValueContains/4799844/2492436,1.716249294942824e-4,1.7156983053522086e-4,1.7170664969734048e-4,2.3100847784072545e-7,1.6075694098077668e-7,3.441386203411614e-7 +ValueContains/1984837/245685,2.8775986614012295e-5,2.8704105825927887e-5,2.888419479974047e-5,2.891212852817797e-7,2.0878208775377933e-7,3.570018596709635e-7 +ValueContains/2142174/75164,1.3258165336340797e-5,1.3247097446542808e-5,1.3274550072140676e-5,4.469849048208671e-8,2.98946888580418e-8,6.098090781938885e-8 +ValueContains/14913261/8624418,1.5338686319268332e-3,1.5331670660293957e-3,1.5357364274093583e-3,3.656842792549137e-6,1.7468799923239558e-6,6.908436014702568e-6 +ValueContains/1707401/1316703,1.0862070605606819e-4,1.0860062436163804e-4,1.0866147173040616e-4,9.194726055446758e-8,5.269977898019595e-8,1.6790017195090266e-7 +ValueContains/4980024/1591128,1.3112143079769268e-4,1.3106926433345794e-4,1.3118613286673027e-4,1.9444865449562152e-7,1.4586150234421572e-7,2.6503330569164106e-7 +ValueContains/12956460/10548000,1.957508654239913e-3,1.95677647570763e-3,1.9583060351476274e-3,2.562461652561229e-6,1.9438229299769547e-6,3.602066047576493e-6 +ValueContains/8217775/5729209,1.0698956920126381e-3,1.0687585732563776e-3,1.0715867872757533e-3,4.868050250114949e-6,3.4296121068493134e-6,7.228146110756961e-6 +ValueContains/7272552/1557528,2.022156255589961e-4,2.0213498541107506e-4,2.022869607648368e-4,2.53115688383433e-7,1.9725970108425334e-7,3.691933219173594e-7 +ValueContains/10713400/2240361,1.812366193284897e-4,1.8116235779877508e-4,1.813766927053128e-4,3.332839427048048e-7,1.612596811539039e-7,5.703943676029055e-7 +ValueContains/963590/240480,2.4903560578250308e-5,2.489362059974177e-5,2.4915891216710552e-5,3.661956008621002e-8,2.9660121160896844e-8,4.8637963844660726e-8 +ValueContains/2394639/1603701,2.859391048819322e-4,2.8576317224094007e-4,2.862141624524469e-4,7.468778052987474e-7,4.7542197032452347e-7,1.287212303358601e-6 +ValueContains/11033220/7677912,1.631541304212993e-3,1.6308410706675916e-3,1.6326555517465176e-3,2.914717684729703e-6,1.874019892893764e-6,4.933954966466973e-6 +ValueContains/491009/179958,6.889524112989753e-5,6.882464026662156e-5,6.897513676503781e-5,2.4796183246476124e-7,2.2431121147365143e-7,2.700409630551564e-7 +ValueContains/11084414/8896750,1.4232107805540568e-3,1.4225235585870345e-3,1.4243043895285736e-3,2.765726490585935e-6,1.711780295744547e-6,4.266028265120588e-6 +ValueContains/271467/172980,2.3894128756798898e-4,2.3877636199911618e-4,2.3910103920611503e-4,5.639201789091078e-7,4.84146265106951e-7,6.505974886269501e-7 +ValueContains/40089/14857,2.0954979970178162e-5,2.0917315871604934e-5,2.1000604057377935e-5,1.3379340441460844e-7,1.1198361996558905e-7,1.5957093576177045e-7 +ValueContains/1200337/1125892,2.339006505113107e-4,2.3366650649583206e-4,2.3418223480905142e-4,8.337769259963321e-7,6.576979972783795e-7,1.2112979799509469e-6 +ValueContains/1838826/428238,9.653993911295394e-5,9.648059017078725e-5,9.661753189516794e-5,2.2395968970038456e-7,1.5411237607620095e-7,3.3927380681589213e-7 +ValueContains/13389200/4701435,5.285062717968509e-4,5.279808745318598e-4,5.294051455991618e-4,2.3074935466244204e-6,1.5036910408140082e-6,3.6691863871758815e-6 +ValueContains/1360924/490784,6.47162531082863e-5,6.470281894065016e-5,6.473263563193671e-5,4.84700294875406e-8,3.856698702898866e-8,6.351389790864793e-8 +ValueContains/7060235/1710410,1.1332567192810901e-4,1.1326013541582326e-4,1.1345067846458714e-4,2.9390185807507663e-7,1.859520264861708e-7,4.5224611836576073e-7 +ValueContains/7168728/2925342,2.3019958166231518e-4,2.3005209069534727e-4,2.3028836665561712e-4,3.925922320298606e-7,2.704538532702406e-7,6.412876014677384e-7 +ValueContains/3062696/1755572,1.4265677665455828e-4,1.425505538475746e-4,1.4304286573034607e-4,6.32558480895347e-7,2.3363813145649228e-7,1.2681246047672563e-6 +ValueContains/11969680/6332685,9.617240714933561e-4,9.611633517332247e-4,9.623093765333572e-4,2.0511425912438474e-6,1.6481397327727508e-6,2.8499370524871487e-6 +ValueContains/12699336/2423394,2.031868348925432e-4,2.0306625300929392e-4,2.034224470500471e-4,5.943785919606138e-7,3.7321236608462653e-7,9.84547111295116e-7 +ValueContains/12861500/8116375,1.3066861599144667e-3,1.3056968758639396e-3,1.307842903177105e-3,3.6527969418481483e-6,2.8884249963033977e-6,4.5825585672189005e-6 +ValueContains/20953377/15412274,2.90334709367055e-3,2.9006281181731207e-3,2.909060092516673e-3,1.2912355593307847e-5,6.47157975795324e-6,2.2357280960906057e-5 +ValueContains/7975503/3657069,5.031441153067773e-4,5.009936984129138e-4,5.04852475034121e-4,6.607943723273288e-6,5.57902102994008e-6,7.3936978355426465e-6 +ValueContains/8992218/912254,6.007525093072982e-5,6.004279292609082e-5,6.013039079988352e-5,1.3889958907855164e-7,8.54974566307128e-8,2.1970939936341664e-7 +ValueContains/116157/96173,9.175802716744137e-6,9.166092411893076e-6,9.188875187795383e-6,3.897604192065501e-8,2.952711146139307e-8,5.281903213223849e-8 +ValueContains/5366844/1303239,7.892804244199633e-5,7.888257342229591e-5,7.898322612015493e-5,1.7485088997300327e-7,1.4493882112906774e-7,2.2651537843986237e-7 +ValueContains/14277360/5654400,7.593722407604015e-4,7.58819151047441e-4,7.603205576715492e-4,2.3443319112155012e-6,1.654684408460267e-6,3.634371237506103e-6 +ValueContains/2778300/1994220,3.865455187892309e-4,3.862213776945122e-4,3.8734584942507036e-4,1.631389705385232e-6,7.419321061731839e-7,3.1389138468626554e-6 +ValueContains/2625714/1714804,2.2752714411573664e-4,2.2748011187241212e-4,2.2759856575259196e-4,1.964998717496885e-7,1.219909353824142e-7,3.747787287802566e-7 +ValueContains/3694722/1318710,1.1303820545854332e-4,1.1294941990435116e-4,1.132438432832616e-4,4.206203474210641e-7,2.2367360602305687e-7,7.565624356871839e-7 +ValueContains/6103626/4472940,6.649648364049148e-4,6.642859692890245e-4,6.662788577883692e-4,3.1023889137297782e-6,1.8653117644462426e-6,5.4753211265038996e-6 +ValueContains/10497826/9042142,2.039619603141005e-3,2.0382483819400316e-3,2.042269702048698e-3,6.047705510960005e-6,3.755850538337618e-6,1.0035148338055982e-5 +ValueContains/1960059/1455077,1.1222745901610427e-4,1.1219456665476382e-4,1.1225918423301758e-4,1.0674095875053205e-7,9.045417886847991e-8,1.2991122074798892e-7 +ValueContains/2096406/150858,2.663133880325886e-5,2.6620253179459178e-5,2.6650375062978732e-5,4.743218932646712e-8,3.308943823306096e-8,6.909814199182092e-8 +ValueContains/12989004/5392182,6.886762998329002e-4,6.879156013965011e-4,6.897338691186196e-4,2.8565415615684417e-6,2.0936482685871293e-6,3.824954796850235e-6 +ValueContains/642390/173964,3.071113180708838e-5,3.067057367187396e-5,3.080765445618444e-5,2.006366456375042e-7,8.853559204569966e-8,3.8568429886307546e-7 +ValueContains/115482/27512,9.064147361675596e-5,9.051128570298819e-5,9.076600350655485e-5,4.360960850239288e-7,3.6452723098708387e-7,5.263913215392148e-7 +ValueContains/1328176/1141482,5.035514198409748e-4,5.032739606692311e-4,5.043542802297387e-4,1.4546264394098652e-6,6.335811471276296e-7,2.9006992241714765e-6 +ValueContains/7806181/100413,6.5512674297340936e-6,6.545302453209767e-6,6.563307233192391e-6,2.6380763024944244e-8,1.0592452441477217e-8,4.314270025865915e-8 +ValueContains/4788828/917676,1.503257594000041e-4,1.501594977377007e-4,1.5093315389857768e-4,9.360293386563395e-7,2.1254033773254456e-7,1.9290513829692186e-6 +ValueContains/5688024/263720,3.428285525167467e-5,3.427291719885072e-5,3.4297396798349265e-5,4.0382747853099325e-8,2.828644276513103e-8,6.248144683887384e-8 +ValueContains/6878420/3657938,6.592213508033889e-4,6.579409944279702e-4,6.61782605276198e-4,5.969530361920488e-6,3.3639617412526817e-6,1.056368392720555e-5 +ValueContains/19772224/4693360,5.019688315456157e-4,5.015567800541507e-4,5.026393294589733e-4,1.7682410268291807e-6,1.2422627569658219e-6,2.9274257767392108e-6 +ValueContains/6070955/3682305,4.5444711174498444e-4,4.539127267159825e-4,4.5536546997632376e-4,2.507300024949188e-6,1.454923133744795e-6,4.735308195468392e-6 +ValueData/0,8.418827647332715e-7,8.406364924059727e-7,8.430511236959718e-7,4.228968769787951e-9,3.350265134194421e-9,5.52193867271448e-9 +ValueData/310,8.402301843504803e-7,8.388539266978065e-7,8.414977875398123e-7,4.53637351272408e-9,4.005400636141299e-9,5.330502271514917e-9 +ValueData/10010,8.391259092024053e-7,8.384177293764994e-7,8.401526028087785e-7,2.921712591386777e-9,2.0707511605044246e-9,4.061325794002173e-9 +ValueData/3100,8.342175442443498e-7,8.334818977970995e-7,8.351161874675031e-7,2.8195253175472212e-9,2.1366873079008e-9,3.7930414743281805e-9 +ValueData/100100,8.361193386107816e-7,8.354333265915687e-7,8.367524444397392e-7,2.2502222267797217e-9,1.8680040387885782e-9,2.8367276970193656e-9 +ValueData/15500,8.34920653772081e-7,8.338919068189608e-7,8.361315890794138e-7,3.839065820579126e-9,3.163562037275167e-9,4.718229842298579e-9 +ValueData/500500,8.364620969776601e-7,8.346899640352888e-7,8.382646200672804e-7,5.766847343863459e-9,4.959464151883948e-9,6.7726061900647335e-9 +ValueData/31000,8.331536090409528e-7,8.32058933275143e-7,8.342781190800316e-7,3.736227872132318e-9,3.2818738047935596e-9,4.4397673360039906e-9 +ValueData/1001000,8.393265493953698e-7,8.379907153601986e-7,8.407633365898754e-7,4.607582651177787e-9,3.781296747492819e-9,5.577572028145693e-9 +ValueData/155000,8.317364730912021e-7,8.306129208243904e-7,8.329280634084248e-7,4.007335640268514e-9,3.457142218065267e-9,4.7392423624639465e-9 +ValueData/5005000,8.375592714531803e-7,8.360308404992177e-7,8.389375664442166e-7,4.981115925330214e-9,4.013164613983244e-9,6.148977469890174e-9 +ValueData/310000,8.356662246302629e-7,8.347894469803179e-7,8.366865702919445e-7,3.1062323129070527e-9,2.6307512837614688e-9,3.5995063305853884e-9 +ValueData/10010000,8.313816951349355e-7,8.306195780984316e-7,8.321804301437021e-7,2.7018496445444647e-9,2.3114173143718117e-9,3.360862398207549e-9 +ValueData/1,8.320952254329666e-7,8.307436007530951e-7,8.334074545104827e-7,4.53402470639955e-9,3.7261647018696426e-9,5.769305562308112e-9 +ValueData/31000,8.313240024415208e-7,8.304641161622377e-7,8.321643485818008e-7,2.9747329185733077e-9,2.5113650678429515e-9,3.951833369083697e-9 +ValueData/101000,8.357311112173579e-7,8.339142973294277e-7,8.373924523865356e-7,5.9275657287416054e-9,5.114414493249217e-9,7.1917747904892785e-9 +ValueData/1001000,8.403976392335721e-7,8.395648972659591e-7,8.413923490505756e-7,3.0134784946585153e-9,2.48479874333293e-9,3.6765590121464964e-9 +ValueData/10001000,8.354598772203511e-7,8.342958204649119e-7,8.365673863660954e-7,4.113817813847052e-9,3.2860153611091584e-9,5.382766255480916e-9 +ValueData/1,8.359563959545971e-7,8.352256796308287e-7,8.368185556759494e-7,2.580079081989403e-9,2.2202775977066663e-9,3.1426292782376305e-9 +ValueData/1,8.355409626241368e-7,8.344256394524936e-7,8.364682236288436e-7,3.3804573966734627e-9,2.8190592210717604e-9,4.2600577702086725e-9 +ValueData/1,8.355497470677276e-7,8.345042450418713e-7,8.36573344264951e-7,3.5865516763737992e-9,3.0493959908389782e-9,4.27320143314404e-9 +ValueData/372,8.304458806885512e-7,8.294980785989246e-7,8.311693116628208e-7,2.7132220906130954e-9,2.2727898946143188e-9,3.2455605829949305e-9 +ValueData/4464,8.37087041502963e-7,8.348611037827397e-7,8.384341159512792e-7,5.656999106237545e-9,3.929497909489194e-9,8.179569752407955e-9 +ValueData/13671,8.334699558209153e-7,8.312782702234725e-7,8.353166011998522e-7,6.715552314809075e-9,5.135452830935462e-9,8.676901262980374e-9 +ValueData/0,8.365471118888463e-7,8.358317934326861e-7,8.373028966225967e-7,2.5138911379716034e-9,2.121905668075633e-9,3.0829822098382673e-9 +ValueData/4004,8.316582415424153e-7,8.306162900429198e-7,8.3263942376706e-7,3.411011421684825e-9,2.804463723199865e-9,4.491696245318665e-9 +ValueData/12012,8.336073510122591e-7,8.318990063148113e-7,8.357138070979305e-7,6.289696872642892e-9,5.229746433464625e-9,7.508891900424924e-9 +ValueData/0,8.372156166638558e-7,8.354505435316374e-7,8.387179651989658e-7,5.603405482122876e-9,4.533616865239102e-9,7.486457700465207e-9 +ValueData/0,8.366997045543013e-7,8.356166168384731e-7,8.377325566515527e-7,3.6733242653726517e-9,3.1855420411527433e-9,4.361624714887185e-9 +ValueData/10001,8.406335362149474e-7,8.397676188702039e-7,8.419164497783673e-7,3.3601115446954036e-9,2.5372189896699404e-9,5.245084455402154e-9 +ValueData/68999004,8.31553656832119e-7,8.304458762376193e-7,8.326074418583719e-7,3.5790984292855947e-9,2.933511330542944e-9,4.35026047191198e-9 +ValueData/21503610,8.326608520414254e-7,8.311458619524217e-7,8.339358020027043e-7,4.777572257253187e-9,3.404891738631844e-9,6.875573392033055e-9 +ValueData/568278720,8.365835976731405e-7,8.351979401041599e-7,8.377844399495186e-7,4.236280101535315e-9,3.488943084705646e-9,5.3836880146549036e-9 +ValueData/43996680,8.343191853917281e-7,8.325097382250238e-7,8.358650664364003e-7,5.807621166412308e-9,4.820955277120339e-9,7.182523688409067e-9 +ValueData/87592515,8.32423136655854e-7,8.311578217183637e-7,8.338056527696812e-7,4.543719518752423e-9,3.6639838936619403e-9,5.673266961350827e-9 +ValueData/25605168,8.339198759221821e-7,8.32003163604454e-7,8.356730983124638e-7,6.061483174697854e-9,5.194929529644089e-9,7.052791362857045e-9 +ValueData/1343016675,8.320585125263101e-7,8.309702610809962e-7,8.329873112688617e-7,3.333030343774536e-9,2.535255200252225e-9,4.5389933870878e-9 +ValueData/2358916056,8.336373121743329e-7,8.321605487768588e-7,8.358889793181534e-7,5.8717050658620715e-9,4.088990385399278e-9,8.546933589582342e-9 +ValueData/2270282400,8.39523234127705e-7,8.38442097410199e-7,8.407027769298704e-7,3.7737969329158155e-9,3.3338886149222964e-9,4.285524981717739e-9 +ValueData/995295050,8.322240398297427e-7,8.302046153332941e-7,8.34284219040791e-7,7.1915431610708785e-9,5.7136049148197535e-9,9.46539539520023e-9 +ValueData/255017948,8.312479438847913e-7,8.304701155335883e-7,8.32160607458106e-7,2.7428378238920633e-9,2.2456734968459773e-9,3.5955139249466288e-9 +ValueData/2640130899,8.3454370911696e-7,8.326602049148029e-7,8.372127722762551e-7,7.718260259113449e-9,6.087293386959521e-9,1.2095106556728957e-8 +ValueData/572575536,8.370036388813572e-7,8.360366697847139e-7,8.381891143837643e-7,3.6463915784097505e-9,3.2103774149996575e-9,4.260131442056785e-9 +ValueData/896945944,8.323716195707944e-7,8.306352575568122e-7,8.363166273342828e-7,8.58756730299788e-9,4.5152620011581085e-9,1.8192970871821472e-8 +ValueData/664822613,8.338929764046384e-7,8.334168929729892e-7,8.3443778668868e-7,1.7632744870385238e-9,1.4794392810515812e-9,2.121537684196626e-9 +ValueData/203648256,8.369954470502104e-7,8.353950716656956e-7,8.386149435490301e-7,5.4366621630476186e-9,4.611266836851746e-9,6.419869047174166e-9 +ValueData/674682060,8.364984529949322e-7,8.354267420977408e-7,8.377906152149856e-7,3.868807785127355e-9,3.107012913524379e-9,4.9494467379330374e-9 +ValueData/982349136,8.317033019311673e-7,8.304291023071224e-7,8.328707416939535e-7,4.215536287271019e-9,3.511110493567134e-9,5.062535522138427e-9 +ValueData/1365692567,8.379944032458084e-7,8.372568590856548e-7,8.38891364857553e-7,2.6198256227969553e-9,2.291337878994748e-9,3.1391463558372688e-9 +ValueData/122733325,8.321767006256971e-7,8.304636175921993e-7,8.338741802993841e-7,5.64541801210698e-9,4.729865619877702e-9,6.904248840670601e-9 +ValueData/1378551624,8.336311921387102e-7,8.32644037020611e-7,8.347379824986389e-7,3.417960854307334e-9,2.9231556083484344e-9,4.2088103279921896e-9 +ValueData/458447682,8.327305661857879e-7,8.314295863871424e-7,8.342449430028732e-7,4.495746193822054e-9,3.769366814741398e-9,5.495326587369328e-9 +ValueData/159936810,8.372473704508392e-7,8.366303577594088e-7,8.3795900879603e-7,2.3257562178385297e-9,1.9150525524431577e-9,2.972435273468302e-9 +ValueData/1672276352,8.331926641720792e-7,8.31838606170299e-7,8.346556509537175e-7,4.834243577182311e-9,4.202470349935511e-9,5.629601548035559e-9 +ValueData/7764064,8.352848382290337e-7,8.342121595476755e-7,8.363730413960998e-7,3.6704954095586525e-9,3.1080846227003483e-9,4.368622480473239e-9 +ValueData/55051650,8.310466575934385e-7,8.296699581876705e-7,8.326941068340328e-7,5.0886280834943874e-9,4.400678561986972e-9,5.762887463989158e-9 +ValueData/948783143,8.348741687890034e-7,8.329596103638754e-7,8.367337216699198e-7,6.423524188601603e-9,5.123769230327913e-9,8.414669173709954e-9 +ValueData/2317902000,8.306237734327112e-7,8.298271149756774e-7,8.316538884168973e-7,3.0376930233404063e-9,2.5929244990136826e-9,3.6763837703177516e-9 +ValueData/631131264,8.369706852455653e-7,8.357394151176831e-7,8.380410051884862e-7,3.684337383679832e-9,3.071174947209883e-9,4.5539266762550505e-9 +ValueData/54031131,8.337365730866282e-7,8.32673380338648e-7,8.352864958303912e-7,3.949271626518148e-9,2.9383801450673264e-9,5.831551974145263e-9 +ValueData/569891799,8.341464531420572e-7,8.330944760966308e-7,8.351895628477855e-7,3.483562096953171e-9,2.8137675344904913e-9,4.968232681253347e-9 +ValueData/492262530,8.335561593828288e-7,8.318147921973356e-7,8.354640288684736e-7,6.297113334615433e-9,5.613297559198172e-9,7.520975163906036e-9 +ValueData/222431391,8.320469705569873e-7,8.308043833966042e-7,8.338753076319149e-7,4.87756731093952e-9,3.5268869835061545e-9,7.860947000791552e-9 +ValueData/310534560,8.298568882108103e-7,8.282435393035169e-7,8.313094412634323e-7,4.946039672672682e-9,4.0233261978020955e-9,6.05611053104837e-9 +ValueData/123179835,8.330827199917958e-7,8.317935251342123e-7,8.345369404328234e-7,4.729903943056869e-9,3.998589861192949e-9,5.747656404214176e-9 +ValueData/3112520400,8.416732417253562e-7,8.406163211302001e-7,8.429924865196261e-7,4.30288502909049e-9,3.4296412034917355e-9,5.4906226104870775e-9 +ValueData/826852950,8.372369045960214e-7,8.359700833084417e-7,8.382514161493984e-7,3.982173541129315e-9,3.329619282997102e-9,4.8647043512642936e-9 +ValueData/550177628,8.314823773972723e-7,8.299963280771628e-7,8.327389640331132e-7,4.61335144082279e-9,3.851324094275406e-9,5.884567514945494e-9 +ValueData/2091445876,8.322446653826633e-7,8.307710075061724e-7,8.333890880872483e-7,4.237955841597532e-9,3.3902991408080455e-9,5.94419112549328e-9 +ValueData/2925000162,8.336228169094975e-7,8.330724430583917e-7,8.342784609037878e-7,2.089896415672401e-9,1.6530143364325522e-9,2.7054738911100056e-9 +ValueData/175071425,8.345312303873754e-7,8.335368552619059e-7,8.356449744482984e-7,3.512238364032363e-9,2.775151927719076e-9,5.231403025010735e-9 +ValueData/185518080,8.347133047190563e-7,8.336544883579677e-7,8.35771507692285e-7,3.6534604440236317e-9,3.082583174947934e-9,4.386287433818316e-9 +ValueData/4220522592,8.352169382793905e-7,8.33511430715327e-7,8.36530960543797e-7,5.2989439750793456e-9,4.221595596785533e-9,6.409629720279829e-9 +ValueData/3070618824,8.34464511593199e-7,8.335888974472487e-7,8.351943948848201e-7,2.632421516104345e-9,2.2734692265976536e-9,3.0958894699817272e-9 +ValueData/218497005,8.335479466635635e-7,8.322186682043131e-7,8.349633848602757e-7,4.7518199711260545e-9,4.078224041890696e-9,5.561951695492579e-9 +ValueData/140711148,8.325481808736293e-7,8.317655440217647e-7,8.335984089322574e-7,2.951821806114711e-9,2.345025033330239e-9,3.883933950516084e-9 +ValueData/488896947,8.325547357662142e-7,8.317170342806836e-7,8.337820791158804e-7,3.3477719548282174e-9,2.2324242142052472e-9,5.701771096199071e-9 +ValueData/1049521200,8.397651916683005e-7,8.390280927753695e-7,8.403257596341625e-7,2.248351062507957e-9,1.8113585326358155e-9,2.93843303432851e-9 +ValueData/292516072,8.314711359343089e-7,8.301808662010776e-7,8.327916376842255e-7,4.2798428484236564e-9,3.3550623689141524e-9,5.677617006403355e-9 +ValueData/272485350,8.356191666313024e-7,8.337123417844823e-7,8.374273924184536e-7,6.2468123869883425e-9,5.438457738823542e-9,7.211256135466203e-9 +UnValueData/4,9.068421423883069e-7,9.061851879315348e-7,9.075469372063723e-7,2.3716507105819652e-9,1.984981132077256e-9,2.910120402091428e-9 +UnValueData/146,2.9053981872376373e-6,2.9011623792897847e-6,2.9094564963237254e-6,1.41087031722094e-8,1.1888875739712734e-8,1.684538919437561e-8 +UnValueData/1477,2.907111413865943e-6,2.9040351426743376e-6,2.9107160438364092e-6,1.1722585169505525e-8,1.0239625213678274e-8,1.3533701087446573e-8 +UnValueData/1424,1.959057274947463e-5,1.9584082643210964e-5,1.9599699159862095e-5,2.7663350371587914e-8,1.998773073048335e-8,4.518875236145975e-8 +UnValueData/14734,1.9530668905760955e-5,1.951921165483708e-5,1.9541567915562188e-5,3.781919240040988e-8,3.3077890275871535e-8,4.419280781957179e-8 +UnValueData/7104,9.655933642292642e-5,9.653139723454666e-5,9.658943571528039e-5,1.0030607319282723e-7,7.988801564224824e-8,1.2919696335077385e-7 +UnValueData/73654,9.584704253047986e-5,9.578387454994725e-5,9.592021181429972e-5,2.298477743663809e-7,1.9824512203122537e-7,2.7625798128862695e-7 +UnValueData/14204,1.9539873295628687e-4,1.953129313131433e-4,1.9547535630241525e-4,2.878289571323345e-7,2.3950686541812354e-7,3.669177852270458e-7 +UnValueData/147304,1.93966071639084e-4,1.9383708601387238e-4,1.9409713066233938e-4,4.364766920954256e-7,3.6711989177859925e-7,5.529617642161011e-7 +UnValueData/71004,1.1330109053186875e-3,1.1221081458933117e-3,1.1404336363814711e-3,2.8998910958958856e-5,2.533149833057745e-5,3.6442361282690845e-5 +UnValueData/736504,1.0916397816359352e-3,1.0889953921723629e-3,1.096596068415768e-3,1.1552661496214139e-5,5.941820435510034e-6,1.8388129989159933e-5 +UnValueData/142004,2.477771794323466e-3,2.4694298869129072e-3,2.4990196172122964e-3,3.9179072105422557e-5,2.028957489738693e-5,6.98673025622596e-5 +UnValueData/1473004,2.4601048481371355e-3,2.4502083290617567e-3,2.4813366173195416e-3,4.4844819826607744e-5,2.061743345585051e-5,7.180641490025408e-5 +UnValueData/23,1.3049032491374263e-6,1.3031286663478204e-6,1.3071530087461587e-6,6.570290203634116e-9,5.436206142884675e-9,7.993355508172386e-9 +UnValueData/14204,1.946569963557336e-4,1.9450583005103632e-4,1.9484030254448623e-4,5.261890092257365e-7,3.869223921703829e-7,7.086335871840278e-7 +UnValueData/24104,1.9495938063596527e-4,1.9488872545065825e-4,1.9506189336538642e-4,2.751536681324497e-7,2.18786289415935e-7,3.566909955074637e-7 +UnValueData/147304,1.948521636948272e-4,1.9456742487488558e-4,1.9587441255395857e-4,1.6446144902511552e-6,2.8362401483757646e-7,3.468789690953717e-6 +UnValueData/1384804,1.9521958382787111e-4,1.9517200204708117e-4,1.952707562669848e-4,1.6704652042495765e-7,1.3902808007457288e-7,2.2348042922625153e-7 +UnValueData/23,1.3052076954454706e-6,1.3035432771074695e-6,1.3082312923546576e-6,7.803860530317902e-9,4.711306614460252e-9,1.3487953164312609e-8 +UnValueData/23,1.3090297713192198e-6,1.3074075434157618e-6,1.3106717219773248e-6,5.446584556746961e-9,4.822819115074655e-9,6.235147687747254e-9 +UnValueData/23,1.311386557650879e-6,1.3088097018827555e-6,1.318287998798856e-6,1.3791990291854225e-8,6.311566356543765e-9,2.6689878350957732e-8 +UnValueData/196,3.382253929834435e-6,3.3795791241429007e-6,3.3851415479600903e-6,9.13658293127138e-9,7.703123817753193e-9,1.0991138050387187e-8 +UnValueData/2020,2.769565193646776e-5,2.7677945960578738e-5,2.7709181695998228e-5,4.956861112358337e-8,4.172359040001151e-8,5.96667485220342e-8 +UnValueData/5989,8.78085379449701e-5,8.778680857966858e-5,8.783528126893412e-5,8.119635179360278e-8,6.54034652565772e-8,1.0519581251380834e-7 +UnValueData/4,8.965831917220561e-7,8.948946698968546e-7,8.975403269391364e-7,3.978636354308552e-9,2.5987193605874843e-9,7.418045188187781e-9 +UnValueData/806,1.8966673571113277e-6,1.8949694196063312e-6,1.8981767711669928e-6,5.574189488354453e-9,4.691170079282188e-9,6.656525613718971e-9 +UnValueData/2011,3.344681350987945e-6,3.3431182788229923e-6,3.3463257102325986e-6,5.210658433772258e-9,4.358519179727488e-9,6.217635254393469e-9 +UnValueData/4,8.974299954678173e-7,8.959739565868861e-7,8.989408107594033e-7,4.982089757543563e-9,4.365105929330059e-9,5.718492070203431e-9 +UnValueData/4,9.033425126442837e-7,9.020432332067919e-7,9.063245352883466e-7,6.327583302498122e-9,3.2921135915017722e-9,1.2572453341446008e-8 +UnValueData/2521,1.3118266500716435e-6,1.3102686939287234e-6,1.3133088924617764e-6,5.006353386537573e-9,4.332272366330288e-9,5.895966419360369e-9 +UnValueData/114871409,0.10230505891494138,0.10058317513688018,0.1060228517330769,3.9575937235628664e-3,1.706012930590348e-3,6.337289958860899e-3 +UnValueData/7955480,1.059066568250036e-2,1.054941025225458e-2,1.066469347657569e-2,1.4679691606051868e-4,7.389838990047171e-5,2.262859181130299e-4 +UnValueData/106506417,3.917322197078474e-2,3.881943096081982e-2,3.9712471356661255e-2,9.042729147858443e-4,5.544791072843227e-4,1.308271556527119e-3 +UnValueData/133276873,6.741456710439037e-2,6.701763781806142e-2,6.816392717958127e-2,9.078776424407558e-4,2.815588758165663e-4,1.3521281422263936e-3 +UnValueData/149948764,9.55795649538881e-2,9.491136615231101e-2,9.670401054124038e-2,1.3827573370439122e-3,3.006590766389777e-4,1.7950013442465046e-3 +UnValueData/42684588,1.3889494518145267e-2,1.381745397196657e-2,1.4011565751498796e-2,2.4574506577860144e-4,1.546708243977333e-4,3.622194317290015e-4 +UnValueData/2328330,1.7326415313575014e-2,1.724567491226159e-2,1.7460563129391007e-2,2.4275882922429468e-4,1.6242407349935e-4,3.5579022994900096e-4 +UnValueData/1817236,3.865449638314245e-3,3.8509280349554734e-3,3.8911741896913103e-3,5.8295468960910656e-5,3.389961966563605e-5,9.564524858489304e-5 +UnValueData/5018602,1.5891421680943685e-3,1.5851306547804945e-3,1.6003460257286524e-3,2.0521513321048193e-5,1.1261232038182564e-5,3.745105940473335e-5 +UnValueData/298760976,0.11766399265782508,0.11564502278841766,0.1206492872326635,3.732029898764641e-3,2.0403676296774716e-3,5.893750786666082e-3 +UnValueData/61509608,6.0072692947197005e-2,5.964346627794168e-2,6.098620435515281e-2,1.0841719945671922e-3,4.035311641393299e-4,1.7142900966794275e-3 +UnValueData/148895716,6.846849368629207e-2,6.811004588534393e-2,6.90899393872007e-2,7.924890688677503e-4,4.422023058021328e-4,1.0826088099082309e-3 +UnValueData/187844113,8.633297566867744e-2,8.563077018518622e-2,8.740873092785477e-2,1.5681982014464574e-3,9.956656284170928e-4,1.9664579627141957e-3 +UnValueData/96560479,8.770143541766123e-2,8.717671918475793e-2,8.832345825309554e-2,9.760061846602834e-4,6.064344582901466e-4,1.4253389015221323e-3 +UnValueData/5750026,0.10621549403032114,0.10489735715140505,0.10826498204497276,2.7426436165770727e-3,1.9944064160961456e-3,3.3512016431393467e-3 +UnValueData/30569413,1.524956531653715e-2,1.5194020764744331e-2,1.5347827184350507e-2,1.7769511596496746e-4,1.0563131021824827e-4,2.704359805582908e-4 +UnValueData/50809742,0.173982669152066,0.17140015408928905,0.17786427413043723,4.497340793485504e-3,2.5847689502076937e-3,6.169008569130326e-3 +UnValueData/1357928,1.263916227803773e-3,1.2617772876837034e-3,1.2681803026916147e-3,9.761145025447326e-6,4.496233328702742e-6,1.7261333861755356e-5 +UnValueData/14682800,1.79078948324892e-2,1.7763709491000097e-2,1.8097800251242215e-2,4.0319671438415647e-4,3.331163869988835e-4,4.923810804524641e-4 +UnValueData/35229121,1.3747346986933686e-2,1.3686864398855775e-2,1.3827945906666876e-2,1.7003271753283423e-4,1.2209423987234437e-4,2.2591384882888379e-4 +UnValueData/76705843,7.926317495781751e-2,7.860985664384705e-2,8.01817899538825e-2,1.3416947365746988e-3,1.0023044305621205e-3,1.8301638796914843e-3 +UnValueData/2587834,1.0072654491918435e-3,1.006579665272486e-3,1.007918925387012e-3,2.4207415639179877e-6,2.0102539711100953e-6,3.109838767548292e-6 +UnValueData/13586134,4.3119579343260115e-3,4.299409219863996e-3,4.334282567032606e-3,5.248090508033591e-5,3.434124112779327e-5,7.88640397177202e-5 +UnValueData/65975004,2.086420145344267e-2,2.0723782770528217e-2,2.105179817385415e-2,3.723693542529308e-4,2.808698420265533e-4,4.973768407227705e-4 +UnValueData/86182573,2.7016138464276727e-2,2.6838813843668572e-2,2.7321639495573508e-2,4.94126432140938e-4,3.0545446453326047e-4,7.035530617835902e-4 +UnValueData/2202211,1.0083952425196518e-3,1.0074714840597537e-3,1.009350773723672e-3,3.2321764164667094e-6,2.326334966866852e-6,4.919550979849351e-6 +UnValueData/3626914,2.340661469725662e-2,2.325101441219348e-2,2.3599846081283526e-2,3.898602954368183e-4,3.1165357117876927e-4,4.877970278032597e-4 +UnValueData/210747884,7.666129932339702e-2,7.568121474679737e-2,7.74360370099367e-2,1.5723035737500244e-3,1.0643488402185951e-3,2.4860264919901553e-3 +UnValueData/279233266,0.15765267788293155,0.15265699509835365,0.1616267102064096,6.747794309759976e-3,3.3005427832788095e-3,1.0563488348119952e-2 +UnValueData/16616604,2.2555180938968182e-2,2.2366449410268073e-2,2.2760927396947996e-2,4.343505767591083e-4,3.0134831172842725e-4,6.684628228788499e-4 +UnValueData/1759604,6.871022698594183e-4,6.865251517819906e-4,6.876065820641521e-4,1.7576441565825255e-6,1.4225349192904165e-6,2.4124859130789056e-6 +UnValueData/8817504,3.660277346543132e-3,3.650840296025303e-3,3.676240838505098e-3,3.76614550435916e-5,2.59139591619614e-5,5.4328584851303237e-5 +UnValueData/8690724,8.495466347728154e-3,8.462949503605741e-3,8.543558245591977e-3,1.0109925449702793e-4,7.579850045069569e-5,1.4692845224440897e-4 +UnValueData/269407217,9.773407785408364e-2,9.647709665704203e-2,9.949821337229675e-2,2.4081049713073057e-3,1.9146099373921828e-3,3.021067724304747e-3 +UnValueData/2347534,6.565488314749383e-4,6.561091736415499e-4,6.568947216249377e-4,1.3397100185705023e-6,1.0417283899960786e-6,1.749216169723167e-6 +UnValueData/241997912,0.10299819983382638,0.10126023418639624,0.10516212606240832,3.1767174399700455e-3,2.015755310872373e-3,4.747485988133599e-3 +UnValueData/16206322,4.412175649838896e-2,4.384531305185683e-2,4.457355014969472e-2,6.750426038807096e-4,4.350987200721451e-4,1.0522920720509913e-3 +UnValueData/75211182,7.876843805210518e-2,7.784845081719732e-2,7.970574629544798e-2,1.6062835723028406e-3,1.29859849475821e-3,1.983599687129346e-3 +UnValueData/259779678,0.12150476825190708,0.12016215596425657,0.12267757131485268,1.9738532269128633e-3,1.4481775998724114e-3,2.604093798204616e-3 +UnValueData/196591531,0.10164275914003557,9.94190867461356e-2,0.10327495369219224,3.179082870929967e-3,2.2198253875588573e-3,3.7089635026842033e-3 +UnValueData/27275076,2.2996221114788298e-2,2.2849392289812063e-2,2.3206296322648732e-2,4.057237645367218e-4,2.594701360594864e-4,6.179159594195236e-4 +UnValueData/331610230,0.1171365568365824,0.11489116091979668,0.12029999292766054,3.91535831852172e-3,2.7972016546109098e-3,5.008812554304281e-3 +UnValueData/21224754,2.63530527376584e-2,2.6136459742041068e-2,2.656662110838686e-2,4.671014484644755e-4,3.776654235679501e-4,5.893222572907877e-4 +UnValueData/50641504,4.849716296275775e-2,4.79671129815398e-2,4.9104121905264406e-2,1.0509414776559748e-3,8.284674155887278e-4,1.3301064799037486e-3 +UnValueData/278609244,0.1137901517429522,0.11170282214131605,0.11637218942854642,3.49374511357859e-3,2.2884030916294575e-3,4.906859579362178e-3 +UnValueData/22452206,9.870166622796498e-3,9.825475612238323e-3,9.904329596564173e-3,1.0178622841891616e-4,7.314005343534361e-5,1.4808184908100952e-4 +UnValueData/92714696,0.17159821468715866,0.16569243465505895,0.17883632250928455,9.627202022390665e-3,4.858150670255226e-3,1.4862449007653556e-2 +UnValueData/22287115,1.3370951614584556e-2,1.3290041733088198e-2,1.3418783818341185e-2,1.5541067658567622e-4,9.75270219091354e-5,2.4039724813167723e-4 +UnValueData/2008654,5.493689912123631e-4,5.491444016020693e-4,5.496271868811518e-4,8.62199502496023e-7,6.974190917911312e-7,1.1903651550599839e-6 +UnValueData/21066567,4.760839045584599e-2,4.687811097533973e-2,4.8757656406249024e-2,1.7906345575714306e-3,8.154148988534519e-4,2.550632242102737e-3 From 4a83e556e5c81f9b370a92540701037f7c0b9ac4 Mon Sep 17 00:00:00 2001 From: Yura Lazaryev Date: Thu, 25 Sep 2025 16:23:43 +0200 Subject: [PATCH 04/12] feat: replace placeholder costing with parameter-driven implementation MIME-Version: 1.0 Content-Type: text/plain; charset=UTF-8 Content-Transfer-Encoding: 8bit Replace unimplementedCostingFun with proper parameter-based costing: - Wire Value builtin cost parameters into evaluation machinery - Update all cost model configurations (A, B, C) with generated parameters - Enable accurate gas cost estimation for Value operations 🤖 Generated with [Claude Code](https://claude.ai/code) Co-Authored-By: Claude --- .../cost-model/data/builtinCostModelA.json | 49 +++++++++++++++++++ .../cost-model/data/builtinCostModelB.json | 49 +++++++++++++++++++ .../cost-model/data/builtinCostModelC.json | 49 +++++++++++++++++++ .../src/PlutusCore/Default/Builtins.hs | 8 +-- .../Evaluation/Machine/BuiltinCostModel.hs | 5 ++ .../Evaluation/Machine/ExBudgetingDefaults.hs | 5 ++ 6 files changed, 161 insertions(+), 4 deletions(-) diff --git a/plutus-core/cost-model/data/builtinCostModelA.json b/plutus-core/cost-model/data/builtinCostModelA.json index d1c4baf684c..cc018476137 100644 --- a/plutus-core/cost-model/data/builtinCostModelA.json +++ b/plutus-core/cost-model/data/builtinCostModelA.json @@ -1205,5 +1205,54 @@ "arguments": 4, "type": "constant_cost" } + }, + "lookupCoin": { + "cpu": { + "arguments": { + "intercept": 284421, + "slope": 1 + }, + "type": "linear_in_z" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } + }, + "valueContains": { + "cpu": { + "arguments": { + "intercept": 42125119, + "slope": 30 + }, + "type": "added_sizes" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } + }, + "valueData": { + "cpu": { + "arguments": 164963, + "type": "constant_cost" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } + }, + "unValueData": { + "cpu": { + "arguments": { + "intercept": 10532326261, + "slope": 431 + }, + "type": "linear_in_x" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } } } diff --git a/plutus-core/cost-model/data/builtinCostModelB.json b/plutus-core/cost-model/data/builtinCostModelB.json index 7b4350c3c10..f0bb76c2c88 100644 --- a/plutus-core/cost-model/data/builtinCostModelB.json +++ b/plutus-core/cost-model/data/builtinCostModelB.json @@ -1205,5 +1205,54 @@ "arguments": 4, "type": "constant_cost" } + }, + "lookupCoin": { + "cpu": { + "arguments": { + "intercept": 284421, + "slope": 1 + }, + "type": "linear_in_z" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } + }, + "valueContains": { + "cpu": { + "arguments": { + "intercept": 42125119, + "slope": 30 + }, + "type": "added_sizes" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } + }, + "valueData": { + "cpu": { + "arguments": 164963, + "type": "constant_cost" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } + }, + "unValueData": { + "cpu": { + "arguments": { + "intercept": 10532326261, + "slope": 431 + }, + "type": "linear_in_x" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } } } diff --git a/plutus-core/cost-model/data/builtinCostModelC.json b/plutus-core/cost-model/data/builtinCostModelC.json index f69154d323c..738b3047b8d 100644 --- a/plutus-core/cost-model/data/builtinCostModelC.json +++ b/plutus-core/cost-model/data/builtinCostModelC.json @@ -1223,5 +1223,54 @@ "arguments": 4, "type": "constant_cost" } + }, + "lookupCoin": { + "cpu": { + "arguments": { + "intercept": 284421, + "slope": 1 + }, + "type": "linear_in_z" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } + }, + "valueContains": { + "cpu": { + "arguments": { + "intercept": 42125119, + "slope": 30 + }, + "type": "added_sizes" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } + }, + "valueData": { + "cpu": { + "arguments": 164963, + "type": "constant_cost" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } + }, + "unValueData": { + "cpu": { + "arguments": { + "intercept": 10532326261, + "slope": 431 + }, + "type": "linear_in_x" + }, + "memory": { + "arguments": 1, + "type": "constant_cost" + } } } diff --git a/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs b/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs index 675cd9b70a2..6b1b20c5178 100644 --- a/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs +++ b/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs @@ -2060,7 +2060,7 @@ instance uni ~ DefaultUni => ToBuiltinMeaning uni DefaultFun where {-# INLINE lookupCoinDenotation #-} in makeBuiltinMeaning lookupCoinDenotation - (runCostingFunThreeArguments . unimplementedCostingFun) + (runCostingFunThreeArguments . paramLookupCoin) toBuiltinMeaning _semvar UnionValue = let unionValueDenotation :: Value -> Value -> Value @@ -2076,7 +2076,7 @@ instance uni ~ DefaultUni => ToBuiltinMeaning uni DefaultFun where {-# INLINE valueContainsDenotation #-} in makeBuiltinMeaning valueContainsDenotation - (runCostingFunTwoArguments . unimplementedCostingFun) + (runCostingFunTwoArguments . paramValueContains) toBuiltinMeaning _semvar ValueData = let valueDataDenotation :: Value -> Data @@ -2084,7 +2084,7 @@ instance uni ~ DefaultUni => ToBuiltinMeaning uni DefaultFun where {-# INLINE valueDataDenotation #-} in makeBuiltinMeaning valueDataDenotation - (runCostingFunOneArgument . unimplementedCostingFun) + (runCostingFunOneArgument . paramValueData) toBuiltinMeaning _semvar UnValueData = let unValueDataDenotation :: Data -> BuiltinResult Value @@ -2092,7 +2092,7 @@ instance uni ~ DefaultUni => ToBuiltinMeaning uni DefaultFun where {-# INLINE unValueDataDenotation #-} in makeBuiltinMeaning unValueDataDenotation - (runCostingFunOneArgument . unimplementedCostingFun) + (runCostingFunOneArgument . paramUnValueData) -- See Note [Inlining meanings of builtins]. {-# INLINE toBuiltinMeaning #-} diff --git a/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/BuiltinCostModel.hs b/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/BuiltinCostModel.hs index 9cb77e0bb64..35ff0ee0e74 100644 --- a/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/BuiltinCostModel.hs +++ b/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/BuiltinCostModel.hs @@ -193,6 +193,11 @@ data BuiltinCostModelBase f = , paramLengthOfArray :: f ModelOneArgument , paramListToArray :: f ModelOneArgument , paramIndexArray :: f ModelTwoArguments + -- Builtin values + , paramLookupCoin :: f ModelThreeArguments + , paramValueContains :: f ModelTwoArguments + , paramValueData :: f ModelOneArgument + , paramUnValueData :: f ModelOneArgument } deriving stock (Generic) deriving anyclass (FunctorB, TraversableB, ConstraintsB) diff --git a/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/ExBudgetingDefaults.hs b/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/ExBudgetingDefaults.hs index b70266cb250..a5a1a2e97c9 100644 --- a/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/ExBudgetingDefaults.hs +++ b/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/ExBudgetingDefaults.hs @@ -355,6 +355,11 @@ unitCostBuiltinCostModel = BuiltinCostModelBase , paramLengthOfArray = unitCostOneArgument , paramListToArray = unitCostOneArgument , paramIndexArray = unitCostTwoArguments + -- Builtin values + , paramLookupCoin = unitCostThreeArguments + , paramValueContains = unitCostTwoArguments + , paramValueData = unitCostOneArgument + , paramUnValueData = unitCostOneArgument } unitCekParameters :: Typeable ann => MachineParameters CekMachineCosts DefaultFun (CekValue DefaultUni DefaultFun ann) From eddebe077f2e196cf9b8cda8268d8002ecd7c00d Mon Sep 17 00:00:00 2001 From: Yura Lazaryev Date: Fri, 26 Sep 2025 19:39:52 +0200 Subject: [PATCH 05/12] fix(cost-model): cap Value generators to prevent unrealistic benchmark sizes Refactor Value benchmark generators to use Cardano-compliant constraints and prevent generation of unrealistically large Values that were causing inflated cost model parameters. - Fix policy IDs to exactly 28 bytes (MintingPolicyHash size) - Limit token names to 0-32 bytes per Cardano ledger spec - Cap random generation to max 10,000 policy/token pairs - Simplify generator architecture by removing complex layered logic - Remove unused helper functions and imports - Apply code quality improvements from HLint suggestions This addresses the unValueData builtin having an extremely high intercept cost (10+ billion) due to benchmarking against Values with millions of entries that would never exist on-chain. --- .../budgeting-bench/Benchmarks/Values.hs | 376 ++++-------------- 1 file changed, 83 insertions(+), 293 deletions(-) diff --git a/plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs b/plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs index b8597ff6e8d..3efb1867c3a 100644 --- a/plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs +++ b/plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs @@ -8,10 +8,8 @@ import Prelude import Common import Control.Monad (replicateM) -import Control.Monad.State.Strict (State) import Criterion.Main (Benchmark) import Data.ByteString (ByteString) -import Data.ByteString qualified as BS import PlutusCore (DefaultFun (LookupCoin, UnValueData, ValueContains, ValueData)) import PlutusCore.Evaluation.Machine.ExMemoryUsage (ValueOuterOrMaxInner (..), ValueTotalSize (..)) import PlutusCore.Value (Value) @@ -41,108 +39,17 @@ lookupCoinBenchmark gen = (lookupCoinArgs gen) -- the argument combos to generate benchmarks for lookupCoinArgs :: StdGen -> [(ByteString, ByteString, Value)] -lookupCoinArgs gen = runStateGen_ gen $ \(g :: g) -> do - let - -- Use common test values and add search keys - testValues = generateTestValues gen - - -- Also include additional random tests specific to lookupCoin - additionalTests = runStateGen_ gen $ \g' -> do - let keySizes = [0, 1, 30, 100, 1_000, 10_000, 20_000] - sequence $ - concat - [ -- Key size impact tests with large keys - [ generateLookupTest g' policySize tokenSize 100 10 - | policySize <- keySizes - , tokenSize <- [0, 30, 1_000, 20_000] - ] - , -- Budget-constrained tests (at 30KB limit) - [ generateBudgetTest g' policySize tokenSize 30_000 - | (policySize, tokenSize) <- - [ (20_000, 1) -- Huge policy, tiny token - , (1, 20_000) -- Tiny policy, huge token - , (10_000, 10_000) -- Both large - , (1, 1) -- Both tiny (max entries) - , (0, 0) -- Empty keys (pathological) - ] - ] - , -- Additional random tests for parameter spread - replicate 50 (generateRandomLookupTest g') - ] - - -- Add search keys to common test values - - -- Add search keys to a value for lookup testing - -- Generates random keys that may or may not exist in the value - addSearchKeysToValue :: Value -> State StdGen (ByteString, ByteString, Value) - addSearchKeysToValue value = do - -- Generate search keys with varying sizes (mostly 30 bytes for consistency) - let keySize = 30 -- Standard key size used in most tests - searchPolicyId <- generatePolicyId keySize g - searchTokenName <- generateTokenName keySize g - pure (searchPolicyId, searchTokenName, value) - - commonWithKeys <- sequence [addSearchKeysToValue value | value <- testValues] - - pure $ commonWithKeys ++ additionalTests - --- | Generate lookup test with specified parameters -generateLookupTest - :: (StatefulGen g m) - => g - -> Int -- Policy ID byte size - -> Int -- Token name byte size - -> Int -- Number of policies - -> Int -- Tokens per policy - -> m (ByteString, ByteString, Value) -generateLookupTest - g - policyIdBytes - tokenNameBytes - numPolicies - tokensPerPolicy = do - value <- - generateConstrainedValue - numPolicies - tokensPerPolicy - policyIdBytes - tokenNameBytes - g - -- Generate lookup keys (may or may not exist in value) - searchPolicyId <- generatePolicyId policyIdBytes g - searchTokenName <- generateTokenName tokenNameBytes g - pure (searchPolicyId, searchTokenName, value) - --- | Generate budget-constrained test -generateBudgetTest - :: (StatefulGen g m) - => g - -> Int -- Policy ID byte size - -> Int -- Token name byte size - -> Int -- Total budget - -> m (ByteString, ByteString, Value) -generateBudgetTest g policyIdBytes tokenNameBytes budget = do - value <- generateValueWithBudget policyIdBytes tokenNameBytes budget g - searchPolicyId <- generatePolicyId policyIdBytes g - searchTokenName <- generateTokenName tokenNameBytes g - pure (searchPolicyId, searchTokenName, value) - --- | Generate random lookup test with varied parameters for better spread -generateRandomLookupTest :: (StatefulGen g m) => g -> m (ByteString, ByteString, Value) -generateRandomLookupTest g = do - policyIdBytes <- uniformRM (0, 20_000) g -- 0-20KB policy ID - tokenNameBytes <- uniformRM (0, 20_000) g -- 0-20KB token name - numPolicies <- uniformRM (1, 2_000) g -- 1-2000 policies - tokensPerPolicy <- uniformRM (1, 1_000) g -- 1-1000 tokens per policy - - -- Generate value with random parameters - value <- generateConstrainedValue numPolicies tokensPerPolicy policyIdBytes tokenNameBytes g - - -- Generate search keys - searchPolicyId <- uniformByteStringM policyIdBytes g - searchTokenName <- uniformByteStringM tokenNameBytes g - - pure (searchPolicyId, searchTokenName, value) +lookupCoinArgs gen = runStateGen_ gen $ \g -> do + let testValues = generateTestValues gen + + -- Add random search keys to each test value + sequence + [ do + searchPolicyId <- generatePolicyId 28 g + searchTokenName <- generateTokenName 32 g + pure (searchPolicyId, searchTokenName, value) + | value <- testValues + ] ---------------------------------------------------------------------------------------------------- -- ValueContains ----------------------------------------------------------------------------------- @@ -157,113 +64,36 @@ valueContainsBenchmark gen = (valueContainsArgs gen) -- the argument combos to generate benchmarks for valueContainsArgs :: StdGen -> [(Value, Value)] -valueContainsArgs gen = runStateGen_ gen \g -> do - let - baseKeySizes = [0, 30, 1_000, 10_000] - baseValueSizes = [1, 10, 100, 1_000] - +valueContainsArgs gen = runStateGen_ gen \g -> sequence $ - concat - [ -- Standard key tests with varying value sizes (original Size-based tests) - [ generateContainsTest g containerSize containedSize 30 - | containerSize <- baseValueSizes - , containedSize <- baseValueSizes - , containedSize <= containerSize - ] - , -- Key size impact tests - [ generateContainsTest g 100 10 keySize - | keySize <- baseKeySizes - ] - , -- Budget-constrained tests - [ generateContainsBudgetTest g 30_000 keySize - | keySize <- [0, 30, 3_000, 20_000] - ] - , -- Edge cases - [ generateEmptyContainedTest g containerSize 30 - | containerSize <- [0, 10, 100, 1_000] - ] - , -- Random tests for parameter spread (100 combinations) - replicate 100 (generateRandomContainsTest g) - ] - --- | Generate valueContains test with specified parameters -generateContainsTest - :: (StatefulGen g m) - => g - -> Int -- Container value size - -> Int -- Contained value size - -> Int -- Key byte size (for both policy and token) - -> m (Value, Value) -generateContainsTest g containerSize containedSize keySize = do - -- Generate container value - container <- generateConstrainedValue containerSize 10 keySize keySize g - - -- Generate contained as subset of container (for true contains relationship) - let containerList = Value.toList container - containedEntries = take containedSize containerList + -- Use test values as containers with empty contained value (edge case) + [pure (container, Value.empty) | container <- generateTestValues gen] + ++ + -- Random contains tests with varied entry counts + replicate 100 do + containerEntries <- uniformRM (1, 1000) g + containedEntries <- uniformRM (0, containerEntries) g - let contained = - Value.fromList $ - [ (policyId, take (containedSize `div` max 1 (length containerList)) tokens) - | (policyId, tokens) <- containedEntries - ] + -- Generate container + container <- generateRandomValueForContains containerEntries g - pure (container, contained) + -- Generate contained as subset + let containerList = Value.toList container + containedList = take containedEntries containerList + contained = Value.fromList containedList --- | Generate budget-constrained contains test -generateContainsBudgetTest - :: (StatefulGen g m) - => g - -> Int -- Total budget - -> Int -- Key size - -> m (Value, Value) -generateContainsBudgetTest g budget keySize = do - container <- generateValueWithBudget keySize keySize budget g - -- Generate smaller contained value (subset) - let containerList = Value.toList container - containedEntries = take (length containerList `div` 2) containerList - pure (container, Value.fromList containedEntries) - --- | Generate test with empty contained value -generateEmptyContainedTest - :: (StatefulGen g m) - => g - -> Int -- Container size - -> Int -- Key size - -> m (Value, Value) -generateEmptyContainedTest g containerSize keySize = do - container <- generateConstrainedValue containerSize 10 keySize keySize g - pure (container, Value.empty) - --- | Generate random valueContains test with varied parameters for better spread -generateRandomContainsTest :: (StatefulGen g m) => g -> m (Value, Value) -generateRandomContainsTest g = do - -- Generate random parameters with good spread - containerEntries <- uniformRM (1, 5_000) g -- 1-5000 container entries - containedEntries <- uniformRM (1, containerEntries) g -- 1-container count - keyBytes <- uniformRM (1, 5_000) g -- 1-5000 byte keys - - -- Generate container value with exact entry count - container <- generateRandomValueForContains containerEntries keyBytes g - - -- Generate contained as subset of container entries - let containerList = Value.toList container - containedList = take containedEntries containerList - contained = Value.fromList containedList - - pure (container, contained) + pure (container, contained) -- | Generate Value for contains tests with exact entry count generateRandomValueForContains :: (StatefulGen g m) => Int -- Entry count - -> Int -- Key byte size -> g -> m Value -generateRandomValueForContains entryCount keyBytes g = do - -- Generate policies and tokens with exact entry count - policyIds <- replicateM entryCount (uniformByteStringM keyBytes g) - tokenNames <- replicateM entryCount (uniformByteStringM keyBytes g) +generateRandomValueForContains entryCount g = do + -- Generate policies and tokens with exact entry count (realistic sizes) + policyIds <- replicateM entryCount (generatePolicyId 28 g) + tokenNames <- replicateM entryCount (generateTokenName 32 g) let -- Create amounts (1 to 1000000) @@ -280,11 +110,7 @@ generateRandomValueForContains entryCount keyBytes g = do valueDataBenchmark :: StdGen -> Benchmark valueDataBenchmark gen = - createOneTermBuiltinBenchWithWrapper - ValueTotalSize - ValueData - [] - (generateTestValues gen) + createOneTermBuiltinBenchWithWrapper ValueTotalSize ValueData [] (generateTestValues gen) ---------------------------------------------------------------------------------------------------- -- UnValueData ------------------------------------------------------------------------------------- @@ -299,106 +125,70 @@ unValueDataBenchmark gen = -- | Generate common test values for benchmarking generateTestValues :: StdGen -> [Value] generateTestValues gen = runStateGen_ gen \g -> do - let - baseValueSizes = [1, 10, 50, 100, 500, 1_000] - keySizes = [0, 30, 100, 1_000, 10_000] - sequence $ - concat - [ -- Empty value as edge case (first test cbase) - [pure Value.empty] - , -- Standard value sizes with varying key sizes - [ generateConstrainedValue valueSize 10 keySize keySize g - | valueSize <- baseValueSizes - , keySize <- [30, 1_000] - ] - , -- Key size impact tests (fixed value structure, varying key sizes) - [ generateConstrainedValue 100 10 keySize keySize g - | keySize <- keySizes - ] - , -- Budget-constrained tests - [ generateValueWithBudget keySize keySize budget g - | keySize <- [0, 30, 1_000, 10_000] - , budget <- [1_000, 10_000, 30_000] - ] - , -- Random tests for parameter spread (50 combinations) - replicate 50 $ do - numPolicies <- uniformRM (1, 1_000) g - tokensPerPolicy <- uniformRM (1, 500) g - policyIdBytes <- uniformRM (0, 10_000) g - tokenNameBytes <- uniformRM (0, 10_000) g - generateConstrainedValue numPolicies tokensPerPolicy policyIdBytes tokenNameBytes g - ] - --- | Generate constrained Value with total size budget + -- Specific cases of interest + [ generateConstrainedValue 1 2000 g -- 1 policy with 2000 tokens + , generateConstrainedValue 2000 1 g -- 2000 policies with 1 token each + , pure Value.empty -- Empty value as edge case + ] + ++ + -- Random test values (~100 combinations) + replicate + 100 + ( do + numPolicies <- uniformRM (0, 2000) g -- 0-2000 policies + let maxTokens = if numPolicies == 0 then 2000 else 10_000 `div` numPolicies + tokensPerPolicy <- uniformRM (1, min 2000 maxTokens) g -- Cap at 10,000 total entries + generateConstrainedValue numPolicies tokensPerPolicy g + ) + +-- | Generate constrained Value generateConstrainedValue :: (StatefulGen g m) => Int -- Number of policies -> Int -- Number of tokens per policy - -> Int -- Policy ID byte length - -> Int -- Token name byte length -> g -> m Value -generateConstrainedValue numPolicies tokensPerPolicy policyIdBytes tokenNameBytes g = do - policyIds <- -- Generate policy IDs of specified size - replicateM numPolicies (generatePolicyId policyIdBytes g) - - tokenNames <- -- Generate token names of specified size - replicateM tokensPerPolicy (generateTokenName tokenNameBytes g) - - -- Generate positive quantities (1 to 1000000) - let quantity :: Int -> Int -> Integer - quantity policyIndex tokenIndex = - fromIntegral (1 + (policyIndex * 1_000 + tokenIndex) `mod` 1_000_000) - - nestedMap :: [(ByteString, [(ByteString, Integer)])] - nestedMap = - [ ( policyId - , [ (tokenName, quantity policyIndex tokenIndex) - | (tokenIndex, tokenName) <- zip [0 ..] tokenNames +generateConstrainedValue numPolicies tokensPerPolicy g = do + -- Handle edge case: no policies means empty value + if numPolicies <= 0 + then pure Value.empty + else do + policyIds <- -- Generate policy IDs (always 28 bytes) + replicateM numPolicies (generatePolicyId 0 g) + + tokenNames <- -- Generate token names (random 0-32 bytes) + replicateM tokensPerPolicy (generateTokenName 0 g) + + -- Generate positive quantities (1 to 1000000) + let quantity :: Int -> Int -> Integer + quantity policyIndex tokenIndex = + fromIntegral (1 + (policyIndex * 1_000 + tokenIndex) `mod` 1_000_000) + + nestedMap :: [(ByteString, [(ByteString, Integer)])] + nestedMap = + [ ( policyId + , [ (tokenName, quantity policyIndex tokenIndex) + | (tokenIndex, tokenName) <- zip [0 ..] tokenNames + ] + ) + | (policyIndex, policyId) <- zip [0 ..] policyIds ] - ) - | (policyIndex, policyId) <- zip [0 ..] policyIds - ] - pure $ Value.fromList nestedMap - --- | Generate Value within total size budget -generateValueWithBudget - :: (StatefulGen g m) - => Int -- Policy ID byte length - -> Int -- Token name byte length - -> Int -- Target total size budget - -> g - -> m Value -generateValueWithBudget policyIdBytes tokenNameBytes budget g = do - let - overhead = 8 -- bytes per amount - - -- Calculate maximum possible entries - bytesPerEntry = policyIdBytes + tokenNameBytes + overhead - maxEntries = - if bytesPerEntry > 0 - then min (budget `div` bytesPerEntry) budget - else budget -- Handle 0 case - - -- Simple distribution: try to balance policies and tokens - numPolicies = max 1 (floor (sqrt (fromIntegral maxEntries :: Double))) - tokensPerPolicy = if numPolicies > 0 then maxEntries `div` numPolicies else 0 - - generateConstrainedValue numPolicies tokensPerPolicy policyIdBytes tokenNameBytes g + pure $ Value.fromList nestedMap ---------------------------------------------------------------------------------------------------- -- Other Generators -------------------------------------------------------------------------------- --- | Generate policy ID of specified size +{-| Generate policy ID of exactly 28 bytes (MintingPolicyHash size) +Size parameter ignored - always generates 28 bytes +-} generatePolicyId :: (StatefulGen g m) => Int -> g -> m ByteString -generatePolicyId = generateByteString +generatePolicyId _size = uniformByteStringM 28 --- | Generate token name of specified size +{-| Generate token name of random size (0-32 bytes) +Size parameter ignored - generates random size 0-32 bytes +-} generateTokenName :: (StatefulGen g m) => Int -> g -> m ByteString -generateTokenName = generateByteString - --- | Generate ByteString of specified size -generateByteString :: (StatefulGen g m) => Int -> g -> m ByteString -generateByteString 0 _ = pure BS.empty -generateByteString l g = uniformByteStringM l g +generateTokenName _size g = do + tokenSize <- uniformRM (0, 32) g + uniformByteStringM tokenSize g From 8c110e9d93e19ebc00618f0fdeff84bfc8f5aa36 Mon Sep 17 00:00:00 2001 From: Yura Lazaryev Date: Mon, 29 Sep 2025 14:13:14 +0200 Subject: [PATCH 06/12] refactor(cost-model): remove unused size parameters from Value generators Remove unused size parameters from generatePolicyId and generateTokenName functions in the benchmarking framework. Both functions ignored their size parameters and used fixed or random sizes instead. Changes: - generatePolicyId now takes only the generator parameter (always 28 bytes) - generateTokenName now takes only the generator parameter (random 0-32 bytes) - Updated all call sites to remove the unused size arguments - Added TupleSections language extension for cleaner tuple construction - Simplified lookupCoinArgs tuple construction using applicative style --- .../budgeting-bench/Benchmarks/Values.hs | 34 ++++++++----------- 1 file changed, 14 insertions(+), 20 deletions(-) diff --git a/plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs b/plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs index 3efb1867c3a..7a34ee2f1b8 100644 --- a/plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs +++ b/plutus-core/cost-model/budgeting-bench/Benchmarks/Values.hs @@ -1,6 +1,7 @@ {-# LANGUAGE BlockArguments #-} {-# LANGUAGE ImportQualifiedPost #-} {-# LANGUAGE NumericUnderscores #-} +{-# LANGUAGE TupleSections #-} module Benchmarks.Values (makeBenchmarks) where @@ -39,15 +40,12 @@ lookupCoinBenchmark gen = (lookupCoinArgs gen) -- the argument combos to generate benchmarks for lookupCoinArgs :: StdGen -> [(ByteString, ByteString, Value)] -lookupCoinArgs gen = runStateGen_ gen $ \g -> do +lookupCoinArgs gen = runStateGen_ gen \g -> do let testValues = generateTestValues gen -- Add random search keys to each test value sequence - [ do - searchPolicyId <- generatePolicyId 28 g - searchTokenName <- generateTokenName 32 g - pure (searchPolicyId, searchTokenName, value) + [ (,,value) <$> generatePolicyId g <*> generateTokenName g | value <- testValues ] @@ -92,8 +90,8 @@ generateRandomValueForContains -> m Value generateRandomValueForContains entryCount g = do -- Generate policies and tokens with exact entry count (realistic sizes) - policyIds <- replicateM entryCount (generatePolicyId 28 g) - tokenNames <- replicateM entryCount (generateTokenName 32 g) + policyIds <- replicateM entryCount (generatePolicyId g) + tokenNames <- replicateM entryCount (generateTokenName g) let -- Create amounts (1 to 1000000) @@ -155,10 +153,10 @@ generateConstrainedValue numPolicies tokensPerPolicy g = do then pure Value.empty else do policyIds <- -- Generate policy IDs (always 28 bytes) - replicateM numPolicies (generatePolicyId 0 g) + replicateM numPolicies (generatePolicyId g) tokenNames <- -- Generate token names (random 0-32 bytes) - replicateM tokensPerPolicy (generateTokenName 0 g) + replicateM tokensPerPolicy (generateTokenName g) -- Generate positive quantities (1 to 1000000) let quantity :: Int -> Int -> Integer @@ -179,16 +177,12 @@ generateConstrainedValue numPolicies tokensPerPolicy g = do ---------------------------------------------------------------------------------------------------- -- Other Generators -------------------------------------------------------------------------------- -{-| Generate policy ID of exactly 28 bytes (MintingPolicyHash size) -Size parameter ignored - always generates 28 bytes --} -generatePolicyId :: (StatefulGen g m) => Int -> g -> m ByteString -generatePolicyId _size = uniformByteStringM 28 - -{-| Generate token name of random size (0-32 bytes) -Size parameter ignored - generates random size 0-32 bytes --} -generateTokenName :: (StatefulGen g m) => Int -> g -> m ByteString -generateTokenName _size g = do +-- | Generate policy ID of exactly 28 bytes (MintingPolicyHash size) +generatePolicyId :: (StatefulGen g m) => g -> m ByteString +generatePolicyId = uniformByteStringM 28 + +-- | Generate token name of random size (0-32 bytes) +generateTokenName :: (StatefulGen g m) => g -> m ByteString +generateTokenName g = do tokenSize <- uniformRM (0, 32) g uniformByteStringM tokenSize g From 824134a946d68e743013d7909e467fcdbdcd9a72 Mon Sep 17 00:00:00 2001 From: Yura Lazaryev Date: Tue, 30 Sep 2025 12:15:48 +0200 Subject: [PATCH 07/12] feat(cost-model): update benchmark data for Value builtin functions Regenerate benchmark measurements for lookupCoin, valueContains, valueData, and unValueData builtins. The updated benchmarks reflect optimized test cases with realistic Value sizes and proper parameter coverage for Conway-era cost modeling. The new benchmark data shows significantly improved performance characteristics for Value operations, particularly for valueContains and unValueData which previously had placeholder costs. --- .../cost-model/data/benching-conway.csv | 957 ++++++++++-------- 1 file changed, 512 insertions(+), 445 deletions(-) diff --git a/plutus-core/cost-model/data/benching-conway.csv b/plutus-core/cost-model/data/benching-conway.csv index 64cb32a5ddb..b626f441a77 100644 --- a/plutus-core/cost-model/data/benching-conway.csv +++ b/plutus-core/cost-model/data/benching-conway.csv @@ -12294,448 +12294,515 @@ Bls12_381_G2_multiScalarMul/97/97,6.90522012785712e-3,6.901544208299667e-3,6.918 Bls12_381_G2_multiScalarMul/98/98,6.9597205589059085e-3,6.9554579231546464e-3,6.963825444927238e-3,1.230537047747648e-5,9.828399035508776e-6,1.581113740579338e-5 Bls12_381_G2_multiScalarMul/99/99,6.998605748330429e-3,6.993956045528542e-3,7.003564931628933e-3,1.3941888558415054e-5,1.1848281516892752e-5,1.8598404587423643e-5 Bls12_381_G2_multiScalarMul/100/100,7.090569654857228e-3,7.08876305884669e-3,7.093035056145744e-3,6.187076669186285e-6,4.689206191622249e-6,8.297705725121281e-6 -LookupCoin/4/4/0,1.1987809246529645e-6,1.1980799694260653e-6,1.199507988172571e-6,2.4107745567835586e-9,2.0584370079307666e-9,2.875392436193467e-9 -LookupCoin/4/4/310,1.2142647691242684e-6,1.2131420571175932e-6,1.2155824079867558e-6,4.0706586084594835e-9,3.341022693427462e-9,5.065716418773158e-9 -LookupCoin/4/4/10010,1.2248007161821862e-6,1.2239051860618773e-6,1.2258178843052394e-6,3.4507929939399797e-9,2.7438893641041726e-9,4.037935320134895e-9 -LookupCoin/4/4/310,1.227249583287171e-6,1.2256517429394646e-6,1.228820138823975e-6,5.135902136033977e-9,4.602249434367064e-9,5.923087021439266e-9 -LookupCoin/4/4/10010,1.2443322171758413e-6,1.2427942185459095e-6,1.245357233115194e-6,4.477283860902663e-9,3.3486755939797695e-9,6.223685793289658e-9 -LookupCoin/4/4/1550,1.2454774811827858e-6,1.24344192850786e-6,1.2470198844553666e-6,6.122793215314405e-9,5.177658728098016e-9,7.799865926329944e-9 -LookupCoin/4/4/50050,1.2571864815375906e-6,1.2564138179154984e-6,1.2579616575806e-6,2.763962545250128e-9,2.377982103186773e-9,3.4290535732906835e-9 -LookupCoin/4/4/3100,1.2439256389929855e-6,1.2432284142565402e-6,1.2447917189730735e-6,2.6963459263387795e-9,2.3388804770411354e-9,3.1487019272388267e-9 -LookupCoin/4/4/100100,1.2614380048646346e-6,1.2607020697810519e-6,1.2622035022217295e-6,2.6041139838164562e-9,2.1634799046250406e-9,3.2905483922706815e-9 -LookupCoin/4/4/15500,1.2817013390502208e-6,1.2805655390473332e-6,1.2826202692983273e-6,3.4355071748599705e-9,2.7556274311754177e-9,4.333780868629672e-9 -LookupCoin/4/4/500500,1.2886652966188255e-6,1.287822313888798e-6,1.2893947030051335e-6,2.4996056527806103e-9,2.0027954951844944e-9,3.51778389213686e-9 -LookupCoin/4/4/31000,1.290122000714343e-6,1.288856340927497e-6,1.2912200541102332e-6,3.7314630573669714e-9,3.1415172863968466e-9,4.4094407974448845e-9 -LookupCoin/4/4/1001000,1.2850523205112054e-6,1.2841146835669193e-6,1.2862444714691543e-6,3.495083997499569e-9,2.7213906501859453e-9,5.135209308347153e-9 -LookupCoin/4/4/1,1.2257006912313622e-6,1.2252367955480791e-6,1.2261868546628844e-6,1.7280071454745501e-9,1.4188404395459067e-9,2.155107450125363e-9 -LookupCoin/4/4/3100,1.2647764517950342e-6,1.2641033185328018e-6,1.2654168552708808e-6,2.2224938263044665e-9,1.8474168055405267e-9,2.7240972942539672e-9 -LookupCoin/4/4/10100,1.2509813815980665e-6,1.2493589833326004e-6,1.2523719298666614e-6,4.852971270116405e-9,4.224063533334953e-9,5.761730062786258e-9 -LookupCoin/4/4/100100,1.272100065961152e-6,1.2713779399535466e-6,1.2729916263321848e-6,2.6442781870170232e-9,2.2315274992244496e-9,3.3894908114610666e-9 -LookupCoin/4/4/1000100,1.2622451455213246e-6,1.2614409542043105e-6,1.2628884167008598e-6,2.4284367212124195e-9,1.952886495004267e-9,3.058594015650686e-9 -LookupCoin/4/4/1,1.2120959773067779e-6,1.2111098168941214e-6,1.2130451144150161e-6,3.340332155521285e-9,2.854400739916875e-9,3.884696635679422e-9 -LookupCoin/4/4/1,1.2202197166189542e-6,1.2192613245401622e-6,1.2212645347977496e-6,3.2388832596863558e-9,2.7203964537861694e-9,3.900896078940326e-9 -LookupCoin/4/4/1,1.2235044799553622e-6,1.2228494680423523e-6,1.2243029181572994e-6,2.418188553655573e-9,1.9596997508446255e-9,3.3537589604273597e-9 -LookupCoin/4/4/124,1.2186676257033273e-6,1.2173292994061867e-6,1.2200318248936087e-6,4.796332197760777e-9,4.009498878734066e-9,6.027489021903283e-9 -LookupCoin/4/4/372,1.2346285723771364e-6,1.2336953254200625e-6,1.235714013792257e-6,3.425255360445383e-9,2.7589262620900956e-9,4.040351857619523e-9 -LookupCoin/4/4/651,1.2372953539593385e-6,1.2362630975860024e-6,1.2383763132577293e-6,3.523259668004743e-9,2.939076484410285e-9,4.317741226544648e-9 -LookupCoin/4/4/0,1.1938943959277518e-6,1.1931943214717257e-6,1.1945778725918846e-6,2.3739978189645768e-9,1.8545949559429995e-9,3.332219238927099e-9 -LookupCoin/4/4/2002,1.2197197605216406e-6,1.2187965672790472e-6,1.2206041280398874e-6,2.9336631903150676e-9,2.4616168455718915e-9,3.632414054858564e-9 -LookupCoin/4/4/4004,1.2251163407493166e-6,1.223376349490241e-6,1.2269137473156499e-6,6.08770401676884e-9,5.158185169323526e-9,7.03140495193674e-9 -LookupCoin/4/4/0,1.1868541548864574e-6,1.185793573842222e-6,1.187690566882342e-6,3.316928649716189e-9,2.732913986532151e-9,4.129135287141955e-9 -LookupCoin/4/4/0,1.1898164242411212e-6,1.1888025275796023e-6,1.1906360315586723e-6,3.105666969872855e-9,2.5406724407764428e-9,4.0336345504799915e-9 -LookupCoin/4/4/10001,1.2150661212171984e-6,1.2143604950573222e-6,1.215820874653369e-6,2.38481675610348e-9,1.9162066170306435e-9,3.0006760018374973e-9 -LookupCoin/4/4/5066270,1.277826580439173e-6,1.2767570441421777e-6,1.2789518483325532e-6,3.5436542776320486e-9,2.858524102842415e-9,4.587631601537296e-9 -LookupCoin/4/4/1292907,1.2677688678187691e-6,1.266718345792965e-6,1.2688009027816102e-6,3.447161199023977e-9,2.8551687550492393e-9,4.1145424069515494e-9 -LookupCoin/4/4/4030899,1.2814323262321796e-6,1.2806641039935756e-6,1.2821530318509303e-6,2.5390170765500563e-9,2.024519511273767e-9,3.2720719989230043e-9 -LookupCoin/4/4/5040432,1.2701222097077116e-6,1.2680642236901763e-6,1.272211683356216e-6,6.785163423685793e-9,5.5778440287708566e-9,8.32836503873299e-9 -LookupCoin/4/4/4561038,1.2744320740219546e-6,1.2732745959940393e-6,1.2753878614609515e-6,3.4966375499144543e-9,2.6380710490775692e-9,5.15651621189535e-9 -LookupCoin/4/4/5375788,1.29023827085883e-6,1.289131346302382e-6,1.2913186917094856e-6,3.6521304151635797e-9,3.077484480052455e-9,4.449439367331406e-9 -LookupCoin/4/4/1262300,1.2539033480175535e-6,1.2526689596121973e-6,1.2556306027786345e-6,4.813588884658454e-9,4.0753081448679886e-9,6.013391116763802e-9 -LookupCoin/4/4/779712,1.2752127020007219e-6,1.2733455510509096e-6,1.276421301457468e-6,4.960204372531049e-9,3.78185565884019e-9,7.938310069673206e-9 -LookupCoin/4/4/1148823,1.257069697085679e-6,1.2550281877305862e-6,1.258357677798816e-6,5.2692097950519294e-9,3.607430925786029e-9,7.84256990197175e-9 -LookupCoin/4/4/7565554,1.2718862218212706e-6,1.270595772895692e-6,1.273500171319768e-6,4.7205100970096915e-9,3.9399955033716265e-9,5.636316687102632e-9 -LookupCoin/4/4/1892372,1.2798022142401478e-6,1.2787601377188223e-6,1.2806492883730673e-6,3.240518096537139e-9,2.6845102219159927e-9,4.024692073232961e-9 -LookupCoin/4/4/3962952,1.2700930008680598e-6,1.269264255671348e-6,1.2709391336121646e-6,2.874679403151091e-9,2.3225902454617737e-9,3.70494574418947e-9 -LookupCoin/4/4/4322668,1.289884201590555e-6,1.2884415967028401e-6,1.2913737248356338e-6,4.801444154073013e-9,3.916001043141595e-9,5.9023486667443996e-9 -LookupCoin/4/4/2970000,1.2784087871552185e-6,1.2767249782735827e-6,1.279942350107124e-6,5.300756075447827e-9,4.125409905431318e-9,7.91576575586899e-9 -LookupCoin/4/4/1902626,1.2825938062683246e-6,1.2812887257240548e-6,1.2840488079301932e-6,4.539085547891917e-9,3.7003355816408288e-9,5.8304818844362325e-9 -LookupCoin/4/4/2058224,1.2674138822348226e-6,1.266517177438222e-6,1.268307129660272e-6,2.920592770603687e-9,2.475360696644196e-9,3.5087547273771266e-9 -LookupCoin/4/4/3287578,1.279789833294665e-6,1.2785676940878397e-6,1.2812666317707647e-6,4.396660300354464e-9,3.659512262281134e-9,5.305430420746576e-9 -LookupCoin/4/4/745890,1.2585346454916983e-6,1.2568337444249753e-6,1.2601251297939e-6,5.430356191272733e-9,4.633445845065433e-9,6.319836603491019e-9 -LookupCoin/4/4/4002026,1.2838087012363595e-6,1.2825086945447733e-6,1.2850242229140597e-6,4.306704983324547e-9,3.5205722930442468e-9,5.654297611220834e-9 -LookupCoin/4/4/1679601,1.26357751253574e-6,1.262826291623019e-6,1.2643169242412846e-6,2.4774181681520444e-9,2.060368542544128e-9,3.039629576081113e-9 -LookupCoin/4/4/6480027,1.2801980877278831e-6,1.2771485096511817e-6,1.2820170540550525e-6,7.943334159431303e-9,5.772244703375927e-9,1.1917062311991287e-8 -LookupCoin/4/4/4498896,1.231625663105949e-6,1.2297170084115537e-6,1.2332704356430894e-6,6.124111331433371e-9,5.385841935470476e-9,7.003288835706173e-9 -LookupCoin/4/4/1674756,1.2735333599690776e-6,1.2710191575535196e-6,1.2756334354586257e-6,7.879868389245381e-9,6.978600463987998e-9,9.154593296359008e-9 -LookupCoin/4/4/2876381,1.261443514778358e-6,1.260767224170065e-6,1.2622450911016386e-6,2.462597798861482e-9,1.9676438830362255e-9,3.096918170975184e-9 -LookupCoin/4/4/6444328,1.2817975648175746e-6,1.2807178055257148e-6,1.2828396916268854e-6,3.5823180401646896e-9,2.8738062669432795e-9,4.531443495722488e-9 -LookupCoin/4/4/375724,1.245765227573596e-6,1.2444678099280414e-6,1.2468631348220374e-6,3.914327458436205e-9,3.338118939061562e-9,4.747447778986924e-9 -LookupCoin/4/4/126540,1.2603295320670344e-6,1.2576543706100949e-6,1.2622416729797346e-6,7.814043532055153e-9,5.869724250780736e-9,1.201854001602634e-8 -LookupCoin/4/4/4706835,1.2659166931421738e-6,1.264223718258494e-6,1.2671110254567974e-6,4.65608823434229e-9,3.141554343089209e-9,6.784674488291999e-9 -LookupCoin/4/4/5364324,1.2701935393151057e-6,1.269043098380611e-6,1.2712397968982748e-6,3.781423003012787e-9,3.1820832804639213e-9,4.755630255677031e-9 -LookupCoin/4/4/1455168,1.2704388582488929e-6,1.269687317776098e-6,1.2711188680637336e-6,2.396816947915933e-9,1.9853818496761954e-9,2.993679944959491e-9 -LookupCoin/4/4/3889776,1.2802125381646228e-6,1.2791239574618982e-6,1.2813999258216065e-6,3.80345065781175e-9,3.149123607025695e-9,4.804823325650835e-9 -LookupCoin/4/4/686750,1.2599963410745547e-6,1.2588914981747105e-6,1.2611105471132294e-6,3.785014969177361e-9,3.147206549401517e-9,4.767167393088846e-9 -LookupCoin/4/4/1963648,1.299818184369183e-6,1.298617040985033e-6,1.301036825644262e-6,4.176587526215176e-9,3.4330381937143528e-9,5.270136974581143e-9 -LookupCoin/4/4/8659209,1.2924287795535367e-6,1.2912655254935138e-6,1.2935332916752233e-6,3.759717198495328e-9,2.8703928008557797e-9,5.27586315684352e-9 -LookupCoin/4/4/2789190,1.2755127933170805e-6,1.2737087407368222e-6,1.2768607596541763e-6,4.963059723596741e-9,3.5158859551543468e-9,6.981879743504883e-9 -LookupCoin/4/4/5625406,1.2959874699702527e-6,1.2950226907122984e-6,1.2970082683444309e-6,3.3391304669998987e-9,2.7941306761813028e-9,4.1386386528375054e-9 -LookupCoin/4/4/1957722,1.2690376232270707e-6,1.2666937311835606e-6,1.2709293087375226e-6,7.103182645095991e-9,4.915885369868955e-9,9.981731048934394e-9 -LookupCoin/4/4/4775708,1.2932987757200833e-6,1.2923933431135412e-6,1.2940935275990051e-6,2.785537307928441e-9,2.3087374360113047e-9,3.4830510090053497e-9 -LookupCoin/4/4/7862841,1.2779049515065047e-6,1.276878213735431e-6,1.279210034062878e-6,3.6895466028508537e-9,3.058034377334638e-9,5.074895055983018e-9 -LookupCoin/4/4/4343103,1.2947015952690554e-6,1.293526049558432e-6,1.2959020546237318e-6,3.840676655557911e-9,3.2213319774607096e-9,4.915737391178833e-9 -LookupCoin/4/4/2628828,1.2576228670548757e-6,1.255184660863472e-6,1.2591729099493177e-6,6.6657091577461195e-9,4.479936777639809e-9,1.0930469098408585e-8 -LookupCoin/4/4/6801147,1.273344935956418e-6,1.2717381856314266e-6,1.2747350340827408e-6,4.964830713393079e-9,4.139696967925825e-9,5.688607530322684e-9 -LookupCoin/4/4/2259715,1.2733626425487013e-6,1.2725687215373529e-6,1.2742045289295303e-6,2.753786442176939e-9,2.2271683907574778e-9,3.6442018276317194e-9 -LookupCoin/4/4/1311960,1.2643513046710382e-6,1.262048535540152e-6,1.2664285395243078e-6,7.211269768344391e-9,6.0887352623941e-9,9.266004580584638e-9 -LookupCoin/4/4/4656600,1.2784770014839777e-6,1.2763424508746477e-6,1.2808613423153377e-6,7.700463816731205e-9,6.8360128237785615e-9,8.690659514605894e-9 -LookupCoin/4/4/1093578,1.2716722138984615e-6,1.2700426000027498e-6,1.2729495582483995e-6,4.8324792890281395e-9,3.958125416800441e-9,6.067383126695396e-9 -LookupCoin/4/4/2868166,1.2775526844976142e-6,1.2753876524451476e-6,1.279449788038799e-6,7.1015328750516004e-9,5.800878613555848e-9,8.76070508863944e-9 -LookupCoin/4/4/2485840,1.2606233541272532e-6,1.2584118705398867e-6,1.2628177461824179e-6,7.2734790619610975e-9,6.412289956484719e-9,8.592412278530262e-9 -LookupCoin/4/4/453354,1.2491237152866404e-6,1.2474513872251372e-6,1.2509309497843268e-6,5.972396719405774e-9,4.80908506645763e-9,7.707294223227184e-9 -LookupCoin/4/4/2631636,1.275835347391731e-6,1.274031323751365e-6,1.2770603929417775e-6,4.848121178368409e-9,3.575817370976392e-9,6.803022453212725e-9 -LookupCoin/1/1/1,1.2062193447359163e-6,1.204720572905251e-6,1.2085664510346082e-6,6.3895396673973984e-9,3.5237401780642824e-9,9.865319076861485e-9 -LookupCoin/1/4/310,1.2477282934661902e-6,1.2457165309461458e-6,1.2500730188409636e-6,7.50234974399736e-9,6.484893665257567e-9,9.090423319721542e-9 -LookupCoin/1/125/10010,1.2364898735039994e-6,1.2339360373470795e-6,1.2388935255579768e-6,8.358163277644683e-9,6.037899233171248e-9,1.2510441623475233e-8 -LookupCoin/1/2500/200010,1.2374699372558117e-6,1.2359148176434845e-6,1.23888079346438e-6,5.061076021241142e-9,4.194002526091644e-9,6.3986008003463075e-9 -LookupCoin/1/1/170,1.2344447450763024e-6,1.2330377959532651e-6,1.2361615688816788e-6,5.196922828874984e-9,3.64700211256897e-9,8.416421668371051e-9 -LookupCoin/1/4/2635,1.2435117760278765e-6,1.2422284752759498e-6,1.2447536719288215e-6,4.408433001343926e-9,3.677681442162629e-9,5.438399421854307e-9 -LookupCoin/1/125/79079,1.2573268594938636e-6,1.2551516899720538e-6,1.2599712779688385e-6,7.80382576748386e-9,4.997720015443988e-9,1.3924166794552906e-8 -LookupCoin/1/2500/1660083,1.2484602746854446e-6,1.247815712373976e-6,1.2491265511584914e-6,2.34795048068606e-9,1.8921582415414914e-9,3.0112347635990135e-9 -LookupCoin/4/1/3100,1.2423704587658755e-6,1.2407630626791196e-6,1.2439468322394299e-6,5.373034335462937e-9,4.7566006320427445e-9,6.301317405621589e-9 -LookupCoin/4/4/3100,1.2525392523923255e-6,1.251729706388684e-6,1.253521581527334e-6,2.914692348843169e-9,2.5332203917450785e-9,3.6522269496455272e-9 -LookupCoin/4/125/100100,1.260774655999151e-6,1.258804266021221e-6,1.2665097440576978e-6,9.852196327494622e-9,4.304536400104611e-9,2.0258395020026988e-8 -LookupCoin/4/2500/2000100,1.2643632216987251e-6,1.2630032246538064e-6,1.2656822810057662e-6,4.334257923244687e-9,3.457742541748888e-9,5.22087199050318e-9 -LookupCoin/13/1/10100,1.2624070567558792e-6,1.2606154235219343e-6,1.2640424050493419e-6,5.657152523515489e-9,4.561599956711443e-9,7.417663438396113e-9 -LookupCoin/13/4/10100,1.2514256046427844e-6,1.2505411221705368e-6,1.25220945382555e-6,2.7559177095290204e-9,2.2419249567489397e-9,3.6490013282809864e-9 -LookupCoin/13/125/100100,1.2516682174012342e-6,1.2494080668363907e-6,1.25599113162234e-6,1.0356156217694294e-8,5.347239956327251e-9,1.845529845521035e-8 -LookupCoin/13/2500/2000100,1.2513709932311224e-6,1.2499746607215296e-6,1.2527092313776355e-6,4.4801455294860196e-9,3.800152944697293e-9,5.2497237732200065e-9 -LookupCoin/125/1/100100,1.2566103108676568e-6,1.255628700812506e-6,1.2575111947018028e-6,3.2302262628515648e-9,2.791524531422057e-9,3.8143780305339686e-9 -LookupCoin/125/4/100100,1.2514828459336215e-6,1.2477222292612055e-6,1.254612459913698e-6,1.1357087989549857e-8,9.45455176911453e-9,1.383532734188531e-8 -LookupCoin/125/125/100100,1.2510536713395532e-6,1.2486776378617943e-6,1.253130098221779e-6,7.604087462788487e-9,6.681597085163331e-9,9.422041323534413e-9 -LookupCoin/125/2500/2000100,1.257567022561272e-6,1.2568076079972548e-6,1.2586232567348466e-6,3.16296838231096e-9,2.6942744714791043e-9,4.065265294010724e-9 -LookupCoin/1250/1/1000100,1.2437022703562684e-6,1.2426624497194861e-6,1.2448352355537035e-6,3.6639170247051537e-9,3.0754055871693162e-9,4.6664050139976854e-9 -LookupCoin/1250/4/1000100,1.2552913141875582e-6,1.2538565802582663e-6,1.2564437487245099e-6,4.248705024921862e-9,3.469885621142994e-9,5.850796247354429e-9 -LookupCoin/1250/125/1000100,1.2527903228863225e-6,1.2518855914459804e-6,1.2537844352544552e-6,3.2593544529421823e-9,2.742839194604889e-9,3.855959694739642e-9 -LookupCoin/1250/2500/2000100,1.244355189731791e-6,1.2437611615642397e-6,1.2450840154318082e-6,2.114101048001732e-9,1.8593202860339957e-9,2.4700062670136815e-9 -LookupCoin/2500/1/2000100,1.2616953743537094e-6,1.2607823671479182e-6,1.2625869674557756e-6,2.995673224252523e-9,2.5848501095906772e-9,3.497831620701429e-9 -LookupCoin/2500/4/2000100,1.2324862369243195e-6,1.231432022400554e-6,1.2338560076276956e-6,4.090214148756135e-9,3.220166680385365e-9,5.312793659204946e-9 -LookupCoin/2500/125/2000100,1.2501426989566735e-6,1.2490513642391722e-6,1.2511800621045136e-6,3.5565143042767577e-9,2.9193085819710178e-9,4.317790069989673e-9 -LookupCoin/2500/2500/2000100,1.2684506473527835e-6,1.2663866623438072e-6,1.2700234602016789e-6,6.255223338613385e-9,5.122911802979287e-9,8.695620223015002e-9 -LookupCoin/2500/1/20001,1.2205950702764077e-6,1.2194837679049681e-6,1.2215739595305359e-6,3.5885412220455425e-9,3.041070733950513e-9,4.345775209121243e-9 -LookupCoin/1/2500/20001,1.225552033705855e-6,1.224475993667657e-6,1.2267310935149546e-6,3.870212721701195e-9,3.1775642399066607e-9,4.993592546496145e-9 -LookupCoin/1250/1250/10001,1.2131187397265325e-6,1.2115373232538786e-6,1.2147049505409275e-6,5.283426708698358e-9,4.755641727910896e-9,5.863281683071315e-9 -LookupCoin/1/1/98,1.2501521377877466e-6,1.2495341913932788e-6,1.2507217872067047e-6,1.9895907484626213e-9,1.4706491314737957e-9,3.3031274098784845e-9 -LookupCoin/1/1/1,1.2075501958236993e-6,1.2068021890272933e-6,1.208262129306143e-6,2.4058069615692213e-9,2.0194049677111022e-9,2.8733377667621385e-9 -LookupCoin/1895/2345/15963058,1.2803196379252948e-6,1.2781771197173325e-6,1.2824991274173064e-6,7.762986271918989e-9,6.828295807122626e-9,8.860257555658608e-9 -LookupCoin/370/2076/12038625,1.280187988079581e-6,1.2788960629861599e-6,1.2812234664338074e-6,3.6888829156735294e-9,3.005689382197591e-9,4.531610661491176e-9 -LookupCoin/2265/757/15420120,1.2794228186796374e-6,1.2775800846507617e-6,1.2806995495549277e-6,5.042315540484943e-9,3.2890802919642043e-9,7.1587364600981135e-9 -LookupCoin/709/489/10818411,1.2926044931678004e-6,1.2910920599573055e-6,1.2938738364742565e-6,4.59334649311881e-9,3.834567590327339e-9,5.643568309075777e-9 -LookupCoin/1974/1712/7151511,1.2618735333861445e-6,1.2602185905997524e-6,1.2632714749891885e-6,5.303975479948274e-9,4.335998165513941e-9,7.595794971707872e-9 -LookupCoin/2249/2078/18765656,1.2768198259782786e-6,1.2760612499536146e-6,1.2776866455140164e-6,2.782660538142238e-9,2.2964653023942013e-9,3.3936086904482942e-9 -LookupCoin/1902/2110/25016160,1.2800125082778773e-6,1.2782090687092827e-6,1.2813538547667959e-6,5.2249049550227564e-9,3.726430052955547e-9,8.966757032776342e-9 -LookupCoin/344/276/2585868,1.2748221163951422e-6,1.2736786979195662e-6,1.2758810964221625e-6,3.5967301348288155e-9,2.9547496393505218e-9,4.371301981521861e-9 -LookupCoin/1815/2039/32405983,1.2881442260618426e-6,1.2846214351971028e-6,1.290809590793673e-6,9.782581561579647e-9,7.975572864826726e-9,1.2664604408656405e-8 -LookupCoin/2407/1150/14459754,1.261742711763931e-6,1.260490055540015e-6,1.262856050041063e-6,3.916552884020715e-9,3.1311750666188257e-9,5.139741809384566e-9 -LookupCoin/51/53/403370,1.2690691201019735e-6,1.2666972707436046e-6,1.2719904736100445e-6,8.644027945417467e-9,6.895220410010281e-9,1.0643318074188051e-8 -LookupCoin/114/2185/15518688,1.2734454001566559e-6,1.2714482679541691e-6,1.2754859090015847e-6,7.129261241642667e-9,6.113117766803054e-9,8.385862555340417e-9 -LookupCoin/1930/184/11964450,1.2646806726004963e-6,1.2619186472531779e-6,1.266631620388074e-6,7.81500116526586e-9,5.318924791154326e-9,1.2112131735135537e-8 -LookupCoin/1661/1441/18361252,1.2793428921774997e-6,1.2773290456115479e-6,1.2816965978336147e-6,6.9161326406910465e-9,5.860419402064908e-9,8.104524793474994e-9 -LookupCoin/1079/1519/10120950,1.2176172342733113e-6,1.215354493542573e-6,1.219484840382208e-6,6.576382648263217e-9,4.955915665560883e-9,9.834786651184058e-9 -LookupCoin/1583/878/18323361,1.273901063799558e-6,1.2724958995911544e-6,1.2752668463417309e-6,4.382471116625853e-9,3.7191484251445385e-9,5.1011845508551176e-9 -LookupCoin/1750/2264/9958850,1.2792231288620218e-6,1.2773527430679643e-6,1.2809795453721968e-6,6.563524166291678e-9,5.620592207284027e-9,7.797812255973995e-9 -LookupCoin/2277/146/14590215,1.2736997031304613e-6,1.2729404628754282e-6,1.274678589065324e-6,2.803802651941421e-9,2.397116093816526e-9,3.337932466090993e-9 -LookupCoin/434/1476/9160680,1.2950377927217072e-6,1.292177950010784e-6,1.2971424929530197e-6,8.517874522069e-9,6.978396259287523e-9,1.0606971559804377e-8 -LookupCoin/1600/323/16538892,1.2748475569688066e-6,1.2739374353277782e-6,1.2757741071194235e-6,3.009126866839188e-9,2.5215172882163673e-9,3.6210540961781523e-9 -LookupCoin/1278/2268/25393200,1.2748429228153157e-6,1.2731909498703963e-6,1.2767655913677555e-6,5.8759116310050834e-9,5.136063002980486e-9,6.93144062101209e-9 -LookupCoin/2037/2155/12391965,1.286507969537781e-6,1.2851082842137748e-6,1.2879782385199171e-6,4.656354491627198e-9,3.924392590758368e-9,5.7189333877099e-9 -LookupCoin/698/2337/24505212,1.3004041448864844e-6,1.2990036884776086e-6,1.302198653199329e-6,5.342213005092348e-9,4.446898938496697e-9,6.400925016937013e-9 -LookupCoin/2083/2136/16163356,1.2764223683796965e-6,1.2747326749110076e-6,1.278022885417272e-6,5.193619740804341e-9,4.18253795872677e-9,6.50739439434995e-9 -LookupCoin/671/776/6029316,1.2915448262587781e-6,1.290620114288026e-6,1.292449612633099e-6,3.1655151644047537e-9,2.650509570099081e-9,4.201734900482966e-9 -LookupCoin/59/2345/34989265,1.288189387415324e-6,1.2857572996775002e-6,1.2894313736155252e-6,5.77855506267552e-9,3.286634406761636e-9,9.23067395758222e-9 -LookupCoin/900/2286/14536575,1.2448490575673767e-6,1.2436205509277125e-6,1.2461113424391198e-6,4.214766252418104e-9,3.5105664402150484e-9,5.402356168004765e-9 -LookupCoin/832/999/2603762,1.2469669931453683e-6,1.245833580412049e-6,1.2481197787736745e-6,3.835242006275528e-9,3.1092729510819287e-9,5.04970050588965e-9 -LookupCoin/1680/1508/22826065,1.2880012317351417e-6,1.2868962639461852e-6,1.289267171137826e-6,4.1157409135944946e-9,3.4279524178612484e-9,5.041552368721841e-9 -LookupCoin/1002/1135/6899280,1.2615340362439734e-6,1.2596000174105259e-6,1.2631098592873918e-6,5.794501833559887e-9,4.562340482651247e-9,7.436081363681221e-9 -LookupCoin/1359/1152/11261320,1.2817921429788798e-6,1.280692690514904e-6,1.282766878523355e-6,3.260336727262534e-9,2.686850069925233e-9,4.0389013073466375e-9 -LookupCoin/1479/1854/13803006,1.2740944860786948e-6,1.272017359375449e-6,1.275593228992704e-6,6.013280935327777e-9,4.97075917451662e-9,8.14866656090185e-9 -LookupCoin/1228/1674/4136274,1.2804318087322261e-6,1.2793348926092004e-6,1.281654185953536e-6,3.624950116338036e-9,2.9043725188905854e-9,4.939386088033429e-9 -LookupCoin/657/1400/17092726,1.281053127582082e-6,1.2791792176585762e-6,1.2829306152492005e-6,6.308782440142078e-9,5.0754542799941174e-9,7.739057463022068e-9 -LookupCoin/2273/210/18379980,1.280677680587168e-6,1.2788447475995189e-6,1.282026514602082e-6,5.306289383708538e-9,3.7157331580635896e-9,7.348475104890475e-9 -LookupCoin/2379/373/14176605,1.2663163225985433e-6,1.2639302078289512e-6,1.2683386698387479e-6,7.23990316849903e-9,6.1218650310142794e-9,8.597931932342572e-9 -LookupCoin/2027/609/23188880,1.295105567032933e-6,1.2940425166399068e-6,1.2961731866357902e-6,3.728919832353806e-9,3.274942293144146e-9,4.328517923189467e-9 -LookupCoin/1863/1686/28971432,1.2825169420362135e-6,1.2804928385281182e-6,1.2845252525717386e-6,7.275604141359334e-9,6.057458607922365e-9,8.691833143851719e-9 -LookupCoin/52/1791/22792666,1.281709793395133e-6,1.2801005292324194e-6,1.283403098669843e-6,5.266251041537131e-9,4.52760161581891e-9,6.151824896588823e-9 -LookupCoin/2352/1129/26569604,1.2778269348736196e-6,1.2757465332763327e-6,1.2796725671718388e-6,6.6653617265910815e-9,5.072710668827788e-9,1.0249419563026495e-8 -LookupCoin/1246/573/6110997,1.2793683625071125e-6,1.277896122360298e-6,1.2809199696787995e-6,4.968435244913596e-9,4.259098678716503e-9,5.959230769465271e-9 -LookupCoin/310/1554/15670447,1.2762542093004263e-6,1.274810442212931e-6,1.2776051488945713e-6,4.816180265316213e-9,4.167931733864282e-9,5.830428336731485e-9 -LookupCoin/1294/1547/16509584,1.2773846030504825e-6,1.2763117660169196e-6,1.2783798666693647e-6,3.465517844763897e-9,2.884712446351482e-9,4.119128215253205e-9 -LookupCoin/1129/448/6962901,1.2807023889182653e-6,1.279431567712355e-6,1.2822567656222109e-6,4.7306819714227345e-9,3.88206505602893e-9,5.757701461919527e-9 -LookupCoin/1589/1186/9012099,1.259328193086861e-6,1.2582289028982644e-6,1.2603655232997637e-6,3.731909085159e-9,3.1385094267051278e-9,4.5413734210007086e-9 -LookupCoin/1625/1893/22423821,1.268217566328228e-6,1.2661110426900448e-6,1.270600590015182e-6,7.536873955700692e-9,6.4829438363242555e-9,8.636468990921138e-9 -LookupCoin/9/1946/18177584,1.2958286550753203e-6,1.2942435964656242e-6,1.2972844012060394e-6,5.074835798824309e-9,3.862947517569473e-9,7.113544720904308e-9 -LookupCoin/2003/828/10528425,1.2660119891220907e-6,1.265114808268792e-6,1.2669678059247464e-6,3.0961043223970374e-9,2.602134311717419e-9,3.727819682601455e-9 -LookupCoin/876/2425/24813879,1.2695039120707998e-6,1.2683998534998996e-6,1.2710728327069194e-6,4.522253022851903e-9,3.241285459336524e-9,7.041325855313811e-9 -LookupCoin/1656/1408/10424602,1.2722888624293668e-6,1.2707823387853345e-6,1.273713506724683e-6,4.962874014529833e-9,4.1673847114882446e-9,5.865926525726256e-9 -ValueContains/310/31,1.150224079634047e-6,1.1484029171593576e-6,1.1520655872900477e-6,6.005570260918549e-9,4.862342923346793e-9,7.521077913330694e-9 -ValueContains/310/0,1.06384320106322e-6,1.062191515033955e-6,1.0654378642108599e-6,5.509382275152861e-9,4.581027672568637e-9,6.9098851874577475e-9 -ValueContains/310/310,1.7619305168090704e-6,1.7586779792752773e-6,1.7652600884404835e-6,1.130839096873276e-8,9.41898501836534e-9,1.4108118237577274e-8 -ValueContains/3100/0,1.0705970595310977e-6,1.0696262985135277e-6,1.0713713385821135e-6,2.872487380202136e-9,2.4019278496237887e-9,3.6053075163534896e-9 -ValueContains/3100/0,1.0657043929147226e-6,1.0642775083128504e-6,1.0671113447204667e-6,4.743608263663756e-9,3.889703167539578e-9,5.989574559564032e-9 -ValueContains/3100/3100,1.1894146744057842e-5,1.1871084222520173e-5,1.191767193116453e-5,7.663599053135675e-8,6.613215443182404e-8,9.643739250799068e-8 -ValueContains/31000/0,1.0677156355522858e-6,1.0654259909394951e-6,1.0698616098158728e-6,7.893785110339014e-9,6.182586930187335e-9,1.016832064207399e-8 -ValueContains/31000/0,1.0676225905277226e-6,1.0666709296050532e-6,1.0684853389377288e-6,2.8139786554644567e-9,2.2748535065168243e-9,3.7035014342306457e-9 -ValueContains/31000/0,1.0689765323263212e-6,1.0677305291841052e-6,1.0702146129018692e-6,4.153616760933364e-9,3.294918839189322e-9,5.552405671833423e-9 -ValueContains/31000/31000,1.3989070972469196e-4,1.3961275529108828e-4,1.4014140206640736e-4,8.671153993656169e-7,7.6414975418358e-7,9.882067921741445e-7 -ValueContains/1/1,1.1103542267638899e-6,1.1091545938139845e-6,1.1115909737856854e-6,4.205783682685009e-9,3.5546448746111783e-9,5.62531694174738e-9 -ValueContains/3100/0,1.0710438033081753e-6,1.0704010953841335e-6,1.0718462620934376e-6,2.488484444011733e-9,2.0557877847046803e-9,3.0489873474860437e-9 -ValueContains/100100/0,1.0645328169031105e-6,1.0622162475708715e-6,1.066656853367623e-6,7.602979479271493e-9,6.4343569983388315e-9,9.00929760184189e-9 -ValueContains/1000100/0,1.066009615081739e-6,1.0644317487918624e-6,1.0674781132396028e-6,5.059237602185728e-9,4.298984305788049e-9,5.899498444881504e-9 -ValueContains/1/0,1.0707510664994408e-6,1.0688014263040615e-6,1.0744053224110398e-6,8.653290657117377e-9,5.716417744402521e-9,1.4758666889717379e-8 -ValueContains/651/6510,1.8768293331625005e-5,1.8735623037201094e-5,1.8834433602150336e-5,1.479036964808042e-7,8.682086466352637e-8,2.6347552785518823e-7 -ValueContains/6002/6002,1.2977825325783861e-6,1.295350415288182e-6,1.3000088661210938e-6,7.269569584734367e-9,4.743744781624348e-9,1.0786484439189123e-8 -ValueContains/0/0,1.0658809918087003e-6,1.064642141097276e-6,1.0670292955565495e-6,4.374952858028444e-9,3.608067388398209e-9,5.251828914098139e-9 -ValueContains/0/0,1.0559905086366154e-6,1.0532986959513952e-6,1.05962723226345e-6,1.0680616302731096e-8,8.108403376724673e-9,1.6991111459695734e-8 -ValueContains/310/0,1.0716910600781161e-6,1.0706227908410502e-6,1.072598412217162e-6,3.2668191835731764e-9,2.88482953898635e-9,3.851011348259737e-9 -ValueContains/3100/0,1.065442367224129e-6,1.0639547859810193e-6,1.0687240823022984e-6,7.274364500262141e-9,3.739654571820177e-9,1.4891287855036637e-8 -ValueContains/31000/0,1.067519833120599e-6,1.0670093260065182e-6,1.068122613480877e-6,1.866640161684788e-9,1.4687606205704114e-9,2.368675885581133e-9 -ValueContains/1388240/1131480,5.830377894608075e-4,5.821675362234542e-4,5.841232073966954e-4,3.369025104679992e-6,2.834202732795799e-6,4.046879330172387e-6 -ValueContains/1230323/564167,6.957637639708246e-5,6.955956916495848e-5,6.959694875467544e-5,6.312446495406844e-8,4.809150972110265e-8,9.619774963274347e-8 -ValueContains/4035324/2503148,2.4917818695306486e-4,2.488740279681662e-4,2.504652388499471e-4,1.7966337495919435e-6,3.3382868647699937e-7,4.077061376227551e-6 -ValueContains/4797225/1867905,1.1298833376394714e-4,1.129045361082674e-4,1.1307031864043225e-4,2.854406184222403e-7,2.391807868462668e-7,3.5618050652586186e-7 -ValueContains/10835055/9374274,1.5335386801324598e-3,1.5318350982017343e-3,1.5379264227913564e-3,8.543138429232696e-6,3.908796093951306e-6,1.5229404241807767e-5 -ValueContains/12920960/975284,7.787465365647193e-5,7.78420278708246e-5,7.792727123487767e-5,1.3934696167567474e-7,1.0577024852677797e-7,2.0650866021535924e-7 -ValueContains/4708200/3670800,3.2189371844861713e-4,3.2150494682355317e-4,3.231951907590193e-4,2.1279453801609014e-6,6.057641810259562e-7,4.770434654200116e-6 -ValueContains/5032730/2914202,4.4632291921110087e-4,4.459043462632429e-4,4.475786076834567e-4,2.320167134598466e-6,8.420951551137534e-7,4.246168716058968e-6 -ValueContains/2774306/2038766,2.0218706694471707e-4,2.019965715302176e-4,2.028792056625027e-4,1.1025374870853495e-6,3.513069810941506e-7,2.4451455148839037e-6 -ValueContains/4020059/3892243,5.906132100414774e-4,5.903243585569346e-4,5.913624956317791e-4,1.470087000916268e-6,6.975667267168607e-7,2.65762554322302e-6 -ValueContains/4886109/3662556,3.2147460519542283e-4,3.213241376324112e-4,3.217071380767817e-4,5.938081388368038e-7,3.9546371750080744e-7,1.0364500615543388e-6 -ValueContains/5235852/1199292,1.372392804691373e-4,1.3720117227167361e-4,1.3729818364340758e-4,1.6202421861255058e-7,9.12126479788811e-8,2.5458418247796685e-7 -ValueContains/2945850/1345990,7.977577086502939e-5,7.975265920392309e-5,7.980776844774855e-5,9.408103233206765e-8,6.939296252705069e-8,1.4176818513985068e-7 -ValueContains/980343/549990,1.3848510081532306e-4,1.3836134411876637e-4,1.386279615391105e-4,4.397023092391429e-7,3.5175845858049713e-7,5.311761295383437e-7 -ValueContains/4713406/3666582,3.184150609185994e-4,3.1827502634776004e-4,3.1857087934551574e-4,4.960888019016048e-7,3.9488356265782485e-7,6.234062993995696e-7 -ValueContains/4392192/174838,1.9185488022869813e-5,1.917432377290978e-5,1.9196127357667117e-5,3.668720069998244e-8,3.146128801545269e-8,4.6060045380628914e-8 -ValueContains/5993043/1393056,1.3698697007419702e-4,1.3694169384738768e-4,1.3703898844114826e-4,1.6315053698114676e-7,1.2765054957267603e-7,2.4922858841547223e-7 -ValueContains/2841216/258944,4.4569751518569055e-5,4.455853857311547e-5,4.458634102791225e-5,4.4622445698346663e-8,3.3782123234928744e-8,6.043866835102693e-8 -ValueContains/16889220/6440265,9.630807665046082e-4,9.626643496364997e-4,9.638691403644825e-4,1.969808428789295e-6,1.4020089798171394e-6,3.2323864058579634e-6 -ValueContains/3416075/179400,2.1114615681243928e-5,2.110543246119949e-5,2.1123974058483687e-5,3.1805446389729774e-8,2.5908251759538914e-8,4.22730124319113e-8 -ValueContains/10474516/6931665,9.064818915605667e-4,9.05987443309439e-4,9.072612704764007e-4,2.036234445019851e-6,1.4482572524718826e-6,2.820824620618682e-6 -ValueContains/23280000/14317200,2.6943367275251776e-3,2.6935838951761227e-3,2.6954131081267352e-3,2.858873305393497e-6,1.8261059946685073e-6,4.911560735731439e-6 -ValueContains/17607912/400589,2.509700334064018e-5,2.5090201730613753e-5,2.5105845387826096e-5,2.4304443668200548e-8,1.9937384758448563e-8,3.1795332354781644e-8 -ValueContains/18476472/2509380,1.595515446835561e-4,1.5948902551541017e-4,1.5969817373887767e-4,3.14792644619481e-7,1.589795748224896e-7,5.329421866453197e-7 -ValueContains/2276082/130528,8.041209938911082e-6,8.036901279192637e-6,8.044849043957893e-6,1.2820036444411411e-8,1.0776473394324325e-8,1.5535420296847403e-8 -ValueContains/3930056/2725737,3.1776002333520296e-4,3.1739194817070323e-4,3.179661744289935e-4,9.513836575001647e-7,5.650491562578674e-7,1.5340286373147029e-6 -ValueContains/3598356/380092,3.4536686380287794e-5,3.4399022056096784e-5,3.469292924889314e-5,4.806422245761377e-7,4.1350889124018223e-7,5.141444004997678e-7 -ValueContains/12169248/10889424,1.9602809428612435e-3,1.959506477247854e-3,1.9612077354371504e-3,2.937546561276068e-6,2.317477571806379e-6,4.106702668950206e-6 -ValueContains/142848/72416,1.614800770779478e-5,1.612640184397839e-5,1.6165503144045665e-5,6.261322158873831e-8,5.358060856632499e-8,7.382795473265937e-8 -ValueContains/28446/20658,7.336275590839956e-5,7.317459349934284e-5,7.357110721408839e-5,6.919130313477668e-7,6.130125155079317e-7,8.055478060102782e-7 -ValueContains/4093319/1247625,1.9056177958026678e-4,1.9051540553801757e-4,1.9062486788885537e-4,1.814675437951522e-7,1.3510555555817223e-7,2.66118650443016e-7 -ValueContains/12390235/7859709,1.2939251469556306e-3,1.2933431902760165e-3,1.294682410466329e-3,2.193951997280829e-6,1.6794123785165327e-6,2.835225981249992e-6 -ValueContains/6129818/4066035,6.062322109240712e-4,6.056020612027894e-4,6.074113543857627e-4,2.7384695691856397e-6,1.625285264130118e-6,4.472293627737563e-6 -ValueContains/1657800/1530702,3.6554774539165115e-4,3.653782969910462e-4,3.658347842664113e-4,8.17317508543419e-7,4.893817089973439e-7,1.2591133108369015e-6 -ValueContains/3304800/910440,1.4289209811072542e-4,1.4272768310138654e-4,1.430164460749529e-4,4.743737818229538e-7,3.692018891019297e-7,6.635150006708321e-7 -ValueContains/15869112/9918608,1.966922026999833e-3,1.965532162311767e-3,1.9684557580459637e-3,4.886900380572334e-6,3.8114339023972606e-6,6.5043272023058915e-6 -ValueContains/1535940/1437408,1.675079192369487e-4,1.6743898345902722e-4,1.675974683410271e-4,2.621316159867751e-7,2.0779990830234897e-7,4.0570627069547474e-7 -ValueContains/19866756/18316004,3.433782972066689e-3,3.431825291604356e-3,3.4371936732783457e-3,7.942605267700316e-6,4.4658213648082326e-6,1.543699282200521e-5 -ValueContains/2767554/101535,7.370376782582864e-6,7.367301893150696e-6,7.373809574781905e-6,1.1399966273118639e-8,9.46164017266115e-9,1.528392137629673e-8 -ValueContains/6418466/4957062,7.712746413388413e-4,7.705837930356645e-4,7.72257699804622e-4,2.691519911527554e-6,1.908409434797522e-6,3.620458138777805e-6 -ValueContains/3595660/2643280,5.897573926490326e-4,5.894703531110593e-4,5.901217699060191e-4,1.063906555408471e-6,8.012659689797687e-7,1.400088770302344e-6 -ValueContains/19078421/11705351,2.1984832793282365e-3,2.1976878588428382e-3,2.1994700112280448e-3,2.9207560746456993e-6,2.25976489043177e-6,4.385016227957237e-6 -ValueContains/2078188/690368,1.6287475493861336e-4,1.6277688884120615e-4,1.62957700148916e-4,3.0162048245436194e-7,2.560271912897383e-7,3.572126881676112e-7 -ValueContains/9108300/2616575,2.5582738803681283e-4,2.556821249609247e-4,2.560011799020167e-4,5.270886608887014e-7,4.213315620704924e-7,6.986846618352393e-7 -ValueContains/6916158/368406,3.802286624021897e-5,3.80151539227574e-5,3.8030383790436226e-5,2.629032044731183e-8,2.201626061128466e-8,3.195811927303817e-8 -ValueContains/8999515/5208710,8.056136157809999e-4,8.051642952842769e-4,8.065927838704155e-4,1.9952438976326107e-6,1.3453298416225953e-6,3.350980804138213e-6 -ValueContains/3590204/1011148,1.0520207337524529e-4,1.0517766716611235e-4,1.0523286251531954e-4,9.108695273412249e-8,6.679970571243264e-8,1.437262741780023e-7 -ValueContains/8618405/1525841,1.3447990003810246e-4,1.34435364937348e-4,1.345662890706284e-4,1.9738886556091444e-7,1.247201488379852e-7,3.4329718865165016e-7 -ValueContains/1090566/676218,3.652853539745162e-4,3.6521368175826543e-4,3.65390955680254e-4,3.044283349559993e-7,2.0695871997905786e-7,4.2463426025938833e-7 -ValueContains/17998150/4896483,5.460585925365607e-4,5.455005274479362e-4,5.46969339199242e-4,2.3611739251008407e-6,1.6155650868680277e-6,3.914730201986467e-6 -ValueContains/4799844/2492436,1.716249294942824e-4,1.7156983053522086e-4,1.7170664969734048e-4,2.3100847784072545e-7,1.6075694098077668e-7,3.441386203411614e-7 -ValueContains/1984837/245685,2.8775986614012295e-5,2.8704105825927887e-5,2.888419479974047e-5,2.891212852817797e-7,2.0878208775377933e-7,3.570018596709635e-7 -ValueContains/2142174/75164,1.3258165336340797e-5,1.3247097446542808e-5,1.3274550072140676e-5,4.469849048208671e-8,2.98946888580418e-8,6.098090781938885e-8 -ValueContains/14913261/8624418,1.5338686319268332e-3,1.5331670660293957e-3,1.5357364274093583e-3,3.656842792549137e-6,1.7468799923239558e-6,6.908436014702568e-6 -ValueContains/1707401/1316703,1.0862070605606819e-4,1.0860062436163804e-4,1.0866147173040616e-4,9.194726055446758e-8,5.269977898019595e-8,1.6790017195090266e-7 -ValueContains/4980024/1591128,1.3112143079769268e-4,1.3106926433345794e-4,1.3118613286673027e-4,1.9444865449562152e-7,1.4586150234421572e-7,2.6503330569164106e-7 -ValueContains/12956460/10548000,1.957508654239913e-3,1.95677647570763e-3,1.9583060351476274e-3,2.562461652561229e-6,1.9438229299769547e-6,3.602066047576493e-6 -ValueContains/8217775/5729209,1.0698956920126381e-3,1.0687585732563776e-3,1.0715867872757533e-3,4.868050250114949e-6,3.4296121068493134e-6,7.228146110756961e-6 -ValueContains/7272552/1557528,2.022156255589961e-4,2.0213498541107506e-4,2.022869607648368e-4,2.53115688383433e-7,1.9725970108425334e-7,3.691933219173594e-7 -ValueContains/10713400/2240361,1.812366193284897e-4,1.8116235779877508e-4,1.813766927053128e-4,3.332839427048048e-7,1.612596811539039e-7,5.703943676029055e-7 -ValueContains/963590/240480,2.4903560578250308e-5,2.489362059974177e-5,2.4915891216710552e-5,3.661956008621002e-8,2.9660121160896844e-8,4.8637963844660726e-8 -ValueContains/2394639/1603701,2.859391048819322e-4,2.8576317224094007e-4,2.862141624524469e-4,7.468778052987474e-7,4.7542197032452347e-7,1.287212303358601e-6 -ValueContains/11033220/7677912,1.631541304212993e-3,1.6308410706675916e-3,1.6326555517465176e-3,2.914717684729703e-6,1.874019892893764e-6,4.933954966466973e-6 -ValueContains/491009/179958,6.889524112989753e-5,6.882464026662156e-5,6.897513676503781e-5,2.4796183246476124e-7,2.2431121147365143e-7,2.700409630551564e-7 -ValueContains/11084414/8896750,1.4232107805540568e-3,1.4225235585870345e-3,1.4243043895285736e-3,2.765726490585935e-6,1.711780295744547e-6,4.266028265120588e-6 -ValueContains/271467/172980,2.3894128756798898e-4,2.3877636199911618e-4,2.3910103920611503e-4,5.639201789091078e-7,4.84146265106951e-7,6.505974886269501e-7 -ValueContains/40089/14857,2.0954979970178162e-5,2.0917315871604934e-5,2.1000604057377935e-5,1.3379340441460844e-7,1.1198361996558905e-7,1.5957093576177045e-7 -ValueContains/1200337/1125892,2.339006505113107e-4,2.3366650649583206e-4,2.3418223480905142e-4,8.337769259963321e-7,6.576979972783795e-7,1.2112979799509469e-6 -ValueContains/1838826/428238,9.653993911295394e-5,9.648059017078725e-5,9.661753189516794e-5,2.2395968970038456e-7,1.5411237607620095e-7,3.3927380681589213e-7 -ValueContains/13389200/4701435,5.285062717968509e-4,5.279808745318598e-4,5.294051455991618e-4,2.3074935466244204e-6,1.5036910408140082e-6,3.6691863871758815e-6 -ValueContains/1360924/490784,6.47162531082863e-5,6.470281894065016e-5,6.473263563193671e-5,4.84700294875406e-8,3.856698702898866e-8,6.351389790864793e-8 -ValueContains/7060235/1710410,1.1332567192810901e-4,1.1326013541582326e-4,1.1345067846458714e-4,2.9390185807507663e-7,1.859520264861708e-7,4.5224611836576073e-7 -ValueContains/7168728/2925342,2.3019958166231518e-4,2.3005209069534727e-4,2.3028836665561712e-4,3.925922320298606e-7,2.704538532702406e-7,6.412876014677384e-7 -ValueContains/3062696/1755572,1.4265677665455828e-4,1.425505538475746e-4,1.4304286573034607e-4,6.32558480895347e-7,2.3363813145649228e-7,1.2681246047672563e-6 -ValueContains/11969680/6332685,9.617240714933561e-4,9.611633517332247e-4,9.623093765333572e-4,2.0511425912438474e-6,1.6481397327727508e-6,2.8499370524871487e-6 -ValueContains/12699336/2423394,2.031868348925432e-4,2.0306625300929392e-4,2.034224470500471e-4,5.943785919606138e-7,3.7321236608462653e-7,9.84547111295116e-7 -ValueContains/12861500/8116375,1.3066861599144667e-3,1.3056968758639396e-3,1.307842903177105e-3,3.6527969418481483e-6,2.8884249963033977e-6,4.5825585672189005e-6 -ValueContains/20953377/15412274,2.90334709367055e-3,2.9006281181731207e-3,2.909060092516673e-3,1.2912355593307847e-5,6.47157975795324e-6,2.2357280960906057e-5 -ValueContains/7975503/3657069,5.031441153067773e-4,5.009936984129138e-4,5.04852475034121e-4,6.607943723273288e-6,5.57902102994008e-6,7.3936978355426465e-6 -ValueContains/8992218/912254,6.007525093072982e-5,6.004279292609082e-5,6.013039079988352e-5,1.3889958907855164e-7,8.54974566307128e-8,2.1970939936341664e-7 -ValueContains/116157/96173,9.175802716744137e-6,9.166092411893076e-6,9.188875187795383e-6,3.897604192065501e-8,2.952711146139307e-8,5.281903213223849e-8 -ValueContains/5366844/1303239,7.892804244199633e-5,7.888257342229591e-5,7.898322612015493e-5,1.7485088997300327e-7,1.4493882112906774e-7,2.2651537843986237e-7 -ValueContains/14277360/5654400,7.593722407604015e-4,7.58819151047441e-4,7.603205576715492e-4,2.3443319112155012e-6,1.654684408460267e-6,3.634371237506103e-6 -ValueContains/2778300/1994220,3.865455187892309e-4,3.862213776945122e-4,3.8734584942507036e-4,1.631389705385232e-6,7.419321061731839e-7,3.1389138468626554e-6 -ValueContains/2625714/1714804,2.2752714411573664e-4,2.2748011187241212e-4,2.2759856575259196e-4,1.964998717496885e-7,1.219909353824142e-7,3.747787287802566e-7 -ValueContains/3694722/1318710,1.1303820545854332e-4,1.1294941990435116e-4,1.132438432832616e-4,4.206203474210641e-7,2.2367360602305687e-7,7.565624356871839e-7 -ValueContains/6103626/4472940,6.649648364049148e-4,6.642859692890245e-4,6.662788577883692e-4,3.1023889137297782e-6,1.8653117644462426e-6,5.4753211265038996e-6 -ValueContains/10497826/9042142,2.039619603141005e-3,2.0382483819400316e-3,2.042269702048698e-3,6.047705510960005e-6,3.755850538337618e-6,1.0035148338055982e-5 -ValueContains/1960059/1455077,1.1222745901610427e-4,1.1219456665476382e-4,1.1225918423301758e-4,1.0674095875053205e-7,9.045417886847991e-8,1.2991122074798892e-7 -ValueContains/2096406/150858,2.663133880325886e-5,2.6620253179459178e-5,2.6650375062978732e-5,4.743218932646712e-8,3.308943823306096e-8,6.909814199182092e-8 -ValueContains/12989004/5392182,6.886762998329002e-4,6.879156013965011e-4,6.897338691186196e-4,2.8565415615684417e-6,2.0936482685871293e-6,3.824954796850235e-6 -ValueContains/642390/173964,3.071113180708838e-5,3.067057367187396e-5,3.080765445618444e-5,2.006366456375042e-7,8.853559204569966e-8,3.8568429886307546e-7 -ValueContains/115482/27512,9.064147361675596e-5,9.051128570298819e-5,9.076600350655485e-5,4.360960850239288e-7,3.6452723098708387e-7,5.263913215392148e-7 -ValueContains/1328176/1141482,5.035514198409748e-4,5.032739606692311e-4,5.043542802297387e-4,1.4546264394098652e-6,6.335811471276296e-7,2.9006992241714765e-6 -ValueContains/7806181/100413,6.5512674297340936e-6,6.545302453209767e-6,6.563307233192391e-6,2.6380763024944244e-8,1.0592452441477217e-8,4.314270025865915e-8 -ValueContains/4788828/917676,1.503257594000041e-4,1.501594977377007e-4,1.5093315389857768e-4,9.360293386563395e-7,2.1254033773254456e-7,1.9290513829692186e-6 -ValueContains/5688024/263720,3.428285525167467e-5,3.427291719885072e-5,3.4297396798349265e-5,4.0382747853099325e-8,2.828644276513103e-8,6.248144683887384e-8 -ValueContains/6878420/3657938,6.592213508033889e-4,6.579409944279702e-4,6.61782605276198e-4,5.969530361920488e-6,3.3639617412526817e-6,1.056368392720555e-5 -ValueContains/19772224/4693360,5.019688315456157e-4,5.015567800541507e-4,5.026393294589733e-4,1.7682410268291807e-6,1.2422627569658219e-6,2.9274257767392108e-6 -ValueContains/6070955/3682305,4.5444711174498444e-4,4.539127267159825e-4,4.5536546997632376e-4,2.507300024949188e-6,1.454923133744795e-6,4.735308195468392e-6 -ValueData/0,8.418827647332715e-7,8.406364924059727e-7,8.430511236959718e-7,4.228968769787951e-9,3.350265134194421e-9,5.52193867271448e-9 -ValueData/310,8.402301843504803e-7,8.388539266978065e-7,8.414977875398123e-7,4.53637351272408e-9,4.005400636141299e-9,5.330502271514917e-9 -ValueData/10010,8.391259092024053e-7,8.384177293764994e-7,8.401526028087785e-7,2.921712591386777e-9,2.0707511605044246e-9,4.061325794002173e-9 -ValueData/3100,8.342175442443498e-7,8.334818977970995e-7,8.351161874675031e-7,2.8195253175472212e-9,2.1366873079008e-9,3.7930414743281805e-9 -ValueData/100100,8.361193386107816e-7,8.354333265915687e-7,8.367524444397392e-7,2.2502222267797217e-9,1.8680040387885782e-9,2.8367276970193656e-9 -ValueData/15500,8.34920653772081e-7,8.338919068189608e-7,8.361315890794138e-7,3.839065820579126e-9,3.163562037275167e-9,4.718229842298579e-9 -ValueData/500500,8.364620969776601e-7,8.346899640352888e-7,8.382646200672804e-7,5.766847343863459e-9,4.959464151883948e-9,6.7726061900647335e-9 -ValueData/31000,8.331536090409528e-7,8.32058933275143e-7,8.342781190800316e-7,3.736227872132318e-9,3.2818738047935596e-9,4.4397673360039906e-9 -ValueData/1001000,8.393265493953698e-7,8.379907153601986e-7,8.407633365898754e-7,4.607582651177787e-9,3.781296747492819e-9,5.577572028145693e-9 -ValueData/155000,8.317364730912021e-7,8.306129208243904e-7,8.329280634084248e-7,4.007335640268514e-9,3.457142218065267e-9,4.7392423624639465e-9 -ValueData/5005000,8.375592714531803e-7,8.360308404992177e-7,8.389375664442166e-7,4.981115925330214e-9,4.013164613983244e-9,6.148977469890174e-9 -ValueData/310000,8.356662246302629e-7,8.347894469803179e-7,8.366865702919445e-7,3.1062323129070527e-9,2.6307512837614688e-9,3.5995063305853884e-9 -ValueData/10010000,8.313816951349355e-7,8.306195780984316e-7,8.321804301437021e-7,2.7018496445444647e-9,2.3114173143718117e-9,3.360862398207549e-9 -ValueData/1,8.320952254329666e-7,8.307436007530951e-7,8.334074545104827e-7,4.53402470639955e-9,3.7261647018696426e-9,5.769305562308112e-9 -ValueData/31000,8.313240024415208e-7,8.304641161622377e-7,8.321643485818008e-7,2.9747329185733077e-9,2.5113650678429515e-9,3.951833369083697e-9 -ValueData/101000,8.357311112173579e-7,8.339142973294277e-7,8.373924523865356e-7,5.9275657287416054e-9,5.114414493249217e-9,7.1917747904892785e-9 -ValueData/1001000,8.403976392335721e-7,8.395648972659591e-7,8.413923490505756e-7,3.0134784946585153e-9,2.48479874333293e-9,3.6765590121464964e-9 -ValueData/10001000,8.354598772203511e-7,8.342958204649119e-7,8.365673863660954e-7,4.113817813847052e-9,3.2860153611091584e-9,5.382766255480916e-9 -ValueData/1,8.359563959545971e-7,8.352256796308287e-7,8.368185556759494e-7,2.580079081989403e-9,2.2202775977066663e-9,3.1426292782376305e-9 -ValueData/1,8.355409626241368e-7,8.344256394524936e-7,8.364682236288436e-7,3.3804573966734627e-9,2.8190592210717604e-9,4.2600577702086725e-9 -ValueData/1,8.355497470677276e-7,8.345042450418713e-7,8.36573344264951e-7,3.5865516763737992e-9,3.0493959908389782e-9,4.27320143314404e-9 -ValueData/372,8.304458806885512e-7,8.294980785989246e-7,8.311693116628208e-7,2.7132220906130954e-9,2.2727898946143188e-9,3.2455605829949305e-9 -ValueData/4464,8.37087041502963e-7,8.348611037827397e-7,8.384341159512792e-7,5.656999106237545e-9,3.929497909489194e-9,8.179569752407955e-9 -ValueData/13671,8.334699558209153e-7,8.312782702234725e-7,8.353166011998522e-7,6.715552314809075e-9,5.135452830935462e-9,8.676901262980374e-9 -ValueData/0,8.365471118888463e-7,8.358317934326861e-7,8.373028966225967e-7,2.5138911379716034e-9,2.121905668075633e-9,3.0829822098382673e-9 -ValueData/4004,8.316582415424153e-7,8.306162900429198e-7,8.3263942376706e-7,3.411011421684825e-9,2.804463723199865e-9,4.491696245318665e-9 -ValueData/12012,8.336073510122591e-7,8.318990063148113e-7,8.357138070979305e-7,6.289696872642892e-9,5.229746433464625e-9,7.508891900424924e-9 -ValueData/0,8.372156166638558e-7,8.354505435316374e-7,8.387179651989658e-7,5.603405482122876e-9,4.533616865239102e-9,7.486457700465207e-9 -ValueData/0,8.366997045543013e-7,8.356166168384731e-7,8.377325566515527e-7,3.6733242653726517e-9,3.1855420411527433e-9,4.361624714887185e-9 -ValueData/10001,8.406335362149474e-7,8.397676188702039e-7,8.419164497783673e-7,3.3601115446954036e-9,2.5372189896699404e-9,5.245084455402154e-9 -ValueData/68999004,8.31553656832119e-7,8.304458762376193e-7,8.326074418583719e-7,3.5790984292855947e-9,2.933511330542944e-9,4.35026047191198e-9 -ValueData/21503610,8.326608520414254e-7,8.311458619524217e-7,8.339358020027043e-7,4.777572257253187e-9,3.404891738631844e-9,6.875573392033055e-9 -ValueData/568278720,8.365835976731405e-7,8.351979401041599e-7,8.377844399495186e-7,4.236280101535315e-9,3.488943084705646e-9,5.3836880146549036e-9 -ValueData/43996680,8.343191853917281e-7,8.325097382250238e-7,8.358650664364003e-7,5.807621166412308e-9,4.820955277120339e-9,7.182523688409067e-9 -ValueData/87592515,8.32423136655854e-7,8.311578217183637e-7,8.338056527696812e-7,4.543719518752423e-9,3.6639838936619403e-9,5.673266961350827e-9 -ValueData/25605168,8.339198759221821e-7,8.32003163604454e-7,8.356730983124638e-7,6.061483174697854e-9,5.194929529644089e-9,7.052791362857045e-9 -ValueData/1343016675,8.320585125263101e-7,8.309702610809962e-7,8.329873112688617e-7,3.333030343774536e-9,2.535255200252225e-9,4.5389933870878e-9 -ValueData/2358916056,8.336373121743329e-7,8.321605487768588e-7,8.358889793181534e-7,5.8717050658620715e-9,4.088990385399278e-9,8.546933589582342e-9 -ValueData/2270282400,8.39523234127705e-7,8.38442097410199e-7,8.407027769298704e-7,3.7737969329158155e-9,3.3338886149222964e-9,4.285524981717739e-9 -ValueData/995295050,8.322240398297427e-7,8.302046153332941e-7,8.34284219040791e-7,7.1915431610708785e-9,5.7136049148197535e-9,9.46539539520023e-9 -ValueData/255017948,8.312479438847913e-7,8.304701155335883e-7,8.32160607458106e-7,2.7428378238920633e-9,2.2456734968459773e-9,3.5955139249466288e-9 -ValueData/2640130899,8.3454370911696e-7,8.326602049148029e-7,8.372127722762551e-7,7.718260259113449e-9,6.087293386959521e-9,1.2095106556728957e-8 -ValueData/572575536,8.370036388813572e-7,8.360366697847139e-7,8.381891143837643e-7,3.6463915784097505e-9,3.2103774149996575e-9,4.260131442056785e-9 -ValueData/896945944,8.323716195707944e-7,8.306352575568122e-7,8.363166273342828e-7,8.58756730299788e-9,4.5152620011581085e-9,1.8192970871821472e-8 -ValueData/664822613,8.338929764046384e-7,8.334168929729892e-7,8.3443778668868e-7,1.7632744870385238e-9,1.4794392810515812e-9,2.121537684196626e-9 -ValueData/203648256,8.369954470502104e-7,8.353950716656956e-7,8.386149435490301e-7,5.4366621630476186e-9,4.611266836851746e-9,6.419869047174166e-9 -ValueData/674682060,8.364984529949322e-7,8.354267420977408e-7,8.377906152149856e-7,3.868807785127355e-9,3.107012913524379e-9,4.9494467379330374e-9 -ValueData/982349136,8.317033019311673e-7,8.304291023071224e-7,8.328707416939535e-7,4.215536287271019e-9,3.511110493567134e-9,5.062535522138427e-9 -ValueData/1365692567,8.379944032458084e-7,8.372568590856548e-7,8.38891364857553e-7,2.6198256227969553e-9,2.291337878994748e-9,3.1391463558372688e-9 -ValueData/122733325,8.321767006256971e-7,8.304636175921993e-7,8.338741802993841e-7,5.64541801210698e-9,4.729865619877702e-9,6.904248840670601e-9 -ValueData/1378551624,8.336311921387102e-7,8.32644037020611e-7,8.347379824986389e-7,3.417960854307334e-9,2.9231556083484344e-9,4.2088103279921896e-9 -ValueData/458447682,8.327305661857879e-7,8.314295863871424e-7,8.342449430028732e-7,4.495746193822054e-9,3.769366814741398e-9,5.495326587369328e-9 -ValueData/159936810,8.372473704508392e-7,8.366303577594088e-7,8.3795900879603e-7,2.3257562178385297e-9,1.9150525524431577e-9,2.972435273468302e-9 -ValueData/1672276352,8.331926641720792e-7,8.31838606170299e-7,8.346556509537175e-7,4.834243577182311e-9,4.202470349935511e-9,5.629601548035559e-9 -ValueData/7764064,8.352848382290337e-7,8.342121595476755e-7,8.363730413960998e-7,3.6704954095586525e-9,3.1080846227003483e-9,4.368622480473239e-9 -ValueData/55051650,8.310466575934385e-7,8.296699581876705e-7,8.326941068340328e-7,5.0886280834943874e-9,4.400678561986972e-9,5.762887463989158e-9 -ValueData/948783143,8.348741687890034e-7,8.329596103638754e-7,8.367337216699198e-7,6.423524188601603e-9,5.123769230327913e-9,8.414669173709954e-9 -ValueData/2317902000,8.306237734327112e-7,8.298271149756774e-7,8.316538884168973e-7,3.0376930233404063e-9,2.5929244990136826e-9,3.6763837703177516e-9 -ValueData/631131264,8.369706852455653e-7,8.357394151176831e-7,8.380410051884862e-7,3.684337383679832e-9,3.071174947209883e-9,4.5539266762550505e-9 -ValueData/54031131,8.337365730866282e-7,8.32673380338648e-7,8.352864958303912e-7,3.949271626518148e-9,2.9383801450673264e-9,5.831551974145263e-9 -ValueData/569891799,8.341464531420572e-7,8.330944760966308e-7,8.351895628477855e-7,3.483562096953171e-9,2.8137675344904913e-9,4.968232681253347e-9 -ValueData/492262530,8.335561593828288e-7,8.318147921973356e-7,8.354640288684736e-7,6.297113334615433e-9,5.613297559198172e-9,7.520975163906036e-9 -ValueData/222431391,8.320469705569873e-7,8.308043833966042e-7,8.338753076319149e-7,4.87756731093952e-9,3.5268869835061545e-9,7.860947000791552e-9 -ValueData/310534560,8.298568882108103e-7,8.282435393035169e-7,8.313094412634323e-7,4.946039672672682e-9,4.0233261978020955e-9,6.05611053104837e-9 -ValueData/123179835,8.330827199917958e-7,8.317935251342123e-7,8.345369404328234e-7,4.729903943056869e-9,3.998589861192949e-9,5.747656404214176e-9 -ValueData/3112520400,8.416732417253562e-7,8.406163211302001e-7,8.429924865196261e-7,4.30288502909049e-9,3.4296412034917355e-9,5.4906226104870775e-9 -ValueData/826852950,8.372369045960214e-7,8.359700833084417e-7,8.382514161493984e-7,3.982173541129315e-9,3.329619282997102e-9,4.8647043512642936e-9 -ValueData/550177628,8.314823773972723e-7,8.299963280771628e-7,8.327389640331132e-7,4.61335144082279e-9,3.851324094275406e-9,5.884567514945494e-9 -ValueData/2091445876,8.322446653826633e-7,8.307710075061724e-7,8.333890880872483e-7,4.237955841597532e-9,3.3902991408080455e-9,5.94419112549328e-9 -ValueData/2925000162,8.336228169094975e-7,8.330724430583917e-7,8.342784609037878e-7,2.089896415672401e-9,1.6530143364325522e-9,2.7054738911100056e-9 -ValueData/175071425,8.345312303873754e-7,8.335368552619059e-7,8.356449744482984e-7,3.512238364032363e-9,2.775151927719076e-9,5.231403025010735e-9 -ValueData/185518080,8.347133047190563e-7,8.336544883579677e-7,8.35771507692285e-7,3.6534604440236317e-9,3.082583174947934e-9,4.386287433818316e-9 -ValueData/4220522592,8.352169382793905e-7,8.33511430715327e-7,8.36530960543797e-7,5.2989439750793456e-9,4.221595596785533e-9,6.409629720279829e-9 -ValueData/3070618824,8.34464511593199e-7,8.335888974472487e-7,8.351943948848201e-7,2.632421516104345e-9,2.2734692265976536e-9,3.0958894699817272e-9 -ValueData/218497005,8.335479466635635e-7,8.322186682043131e-7,8.349633848602757e-7,4.7518199711260545e-9,4.078224041890696e-9,5.561951695492579e-9 -ValueData/140711148,8.325481808736293e-7,8.317655440217647e-7,8.335984089322574e-7,2.951821806114711e-9,2.345025033330239e-9,3.883933950516084e-9 -ValueData/488896947,8.325547357662142e-7,8.317170342806836e-7,8.337820791158804e-7,3.3477719548282174e-9,2.2324242142052472e-9,5.701771096199071e-9 -ValueData/1049521200,8.397651916683005e-7,8.390280927753695e-7,8.403257596341625e-7,2.248351062507957e-9,1.8113585326358155e-9,2.93843303432851e-9 -ValueData/292516072,8.314711359343089e-7,8.301808662010776e-7,8.327916376842255e-7,4.2798428484236564e-9,3.3550623689141524e-9,5.677617006403355e-9 -ValueData/272485350,8.356191666313024e-7,8.337123417844823e-7,8.374273924184536e-7,6.2468123869883425e-9,5.438457738823542e-9,7.211256135466203e-9 -UnValueData/4,9.068421423883069e-7,9.061851879315348e-7,9.075469372063723e-7,2.3716507105819652e-9,1.984981132077256e-9,2.910120402091428e-9 -UnValueData/146,2.9053981872376373e-6,2.9011623792897847e-6,2.9094564963237254e-6,1.41087031722094e-8,1.1888875739712734e-8,1.684538919437561e-8 -UnValueData/1477,2.907111413865943e-6,2.9040351426743376e-6,2.9107160438364092e-6,1.1722585169505525e-8,1.0239625213678274e-8,1.3533701087446573e-8 -UnValueData/1424,1.959057274947463e-5,1.9584082643210964e-5,1.9599699159862095e-5,2.7663350371587914e-8,1.998773073048335e-8,4.518875236145975e-8 -UnValueData/14734,1.9530668905760955e-5,1.951921165483708e-5,1.9541567915562188e-5,3.781919240040988e-8,3.3077890275871535e-8,4.419280781957179e-8 -UnValueData/7104,9.655933642292642e-5,9.653139723454666e-5,9.658943571528039e-5,1.0030607319282723e-7,7.988801564224824e-8,1.2919696335077385e-7 -UnValueData/73654,9.584704253047986e-5,9.578387454994725e-5,9.592021181429972e-5,2.298477743663809e-7,1.9824512203122537e-7,2.7625798128862695e-7 -UnValueData/14204,1.9539873295628687e-4,1.953129313131433e-4,1.9547535630241525e-4,2.878289571323345e-7,2.3950686541812354e-7,3.669177852270458e-7 -UnValueData/147304,1.93966071639084e-4,1.9383708601387238e-4,1.9409713066233938e-4,4.364766920954256e-7,3.6711989177859925e-7,5.529617642161011e-7 -UnValueData/71004,1.1330109053186875e-3,1.1221081458933117e-3,1.1404336363814711e-3,2.8998910958958856e-5,2.533149833057745e-5,3.6442361282690845e-5 -UnValueData/736504,1.0916397816359352e-3,1.0889953921723629e-3,1.096596068415768e-3,1.1552661496214139e-5,5.941820435510034e-6,1.8388129989159933e-5 -UnValueData/142004,2.477771794323466e-3,2.4694298869129072e-3,2.4990196172122964e-3,3.9179072105422557e-5,2.028957489738693e-5,6.98673025622596e-5 -UnValueData/1473004,2.4601048481371355e-3,2.4502083290617567e-3,2.4813366173195416e-3,4.4844819826607744e-5,2.061743345585051e-5,7.180641490025408e-5 -UnValueData/23,1.3049032491374263e-6,1.3031286663478204e-6,1.3071530087461587e-6,6.570290203634116e-9,5.436206142884675e-9,7.993355508172386e-9 -UnValueData/14204,1.946569963557336e-4,1.9450583005103632e-4,1.9484030254448623e-4,5.261890092257365e-7,3.869223921703829e-7,7.086335871840278e-7 -UnValueData/24104,1.9495938063596527e-4,1.9488872545065825e-4,1.9506189336538642e-4,2.751536681324497e-7,2.18786289415935e-7,3.566909955074637e-7 -UnValueData/147304,1.948521636948272e-4,1.9456742487488558e-4,1.9587441255395857e-4,1.6446144902511552e-6,2.8362401483757646e-7,3.468789690953717e-6 -UnValueData/1384804,1.9521958382787111e-4,1.9517200204708117e-4,1.952707562669848e-4,1.6704652042495765e-7,1.3902808007457288e-7,2.2348042922625153e-7 -UnValueData/23,1.3052076954454706e-6,1.3035432771074695e-6,1.3082312923546576e-6,7.803860530317902e-9,4.711306614460252e-9,1.3487953164312609e-8 -UnValueData/23,1.3090297713192198e-6,1.3074075434157618e-6,1.3106717219773248e-6,5.446584556746961e-9,4.822819115074655e-9,6.235147687747254e-9 -UnValueData/23,1.311386557650879e-6,1.3088097018827555e-6,1.318287998798856e-6,1.3791990291854225e-8,6.311566356543765e-9,2.6689878350957732e-8 -UnValueData/196,3.382253929834435e-6,3.3795791241429007e-6,3.3851415479600903e-6,9.13658293127138e-9,7.703123817753193e-9,1.0991138050387187e-8 -UnValueData/2020,2.769565193646776e-5,2.7677945960578738e-5,2.7709181695998228e-5,4.956861112358337e-8,4.172359040001151e-8,5.96667485220342e-8 -UnValueData/5989,8.78085379449701e-5,8.778680857966858e-5,8.783528126893412e-5,8.119635179360278e-8,6.54034652565772e-8,1.0519581251380834e-7 -UnValueData/4,8.965831917220561e-7,8.948946698968546e-7,8.975403269391364e-7,3.978636354308552e-9,2.5987193605874843e-9,7.418045188187781e-9 -UnValueData/806,1.8966673571113277e-6,1.8949694196063312e-6,1.8981767711669928e-6,5.574189488354453e-9,4.691170079282188e-9,6.656525613718971e-9 -UnValueData/2011,3.344681350987945e-6,3.3431182788229923e-6,3.3463257102325986e-6,5.210658433772258e-9,4.358519179727488e-9,6.217635254393469e-9 -UnValueData/4,8.974299954678173e-7,8.959739565868861e-7,8.989408107594033e-7,4.982089757543563e-9,4.365105929330059e-9,5.718492070203431e-9 -UnValueData/4,9.033425126442837e-7,9.020432332067919e-7,9.063245352883466e-7,6.327583302498122e-9,3.2921135915017722e-9,1.2572453341446008e-8 -UnValueData/2521,1.3118266500716435e-6,1.3102686939287234e-6,1.3133088924617764e-6,5.006353386537573e-9,4.332272366330288e-9,5.895966419360369e-9 -UnValueData/114871409,0.10230505891494138,0.10058317513688018,0.1060228517330769,3.9575937235628664e-3,1.706012930590348e-3,6.337289958860899e-3 -UnValueData/7955480,1.059066568250036e-2,1.054941025225458e-2,1.066469347657569e-2,1.4679691606051868e-4,7.389838990047171e-5,2.262859181130299e-4 -UnValueData/106506417,3.917322197078474e-2,3.881943096081982e-2,3.9712471356661255e-2,9.042729147858443e-4,5.544791072843227e-4,1.308271556527119e-3 -UnValueData/133276873,6.741456710439037e-2,6.701763781806142e-2,6.816392717958127e-2,9.078776424407558e-4,2.815588758165663e-4,1.3521281422263936e-3 -UnValueData/149948764,9.55795649538881e-2,9.491136615231101e-2,9.670401054124038e-2,1.3827573370439122e-3,3.006590766389777e-4,1.7950013442465046e-3 -UnValueData/42684588,1.3889494518145267e-2,1.381745397196657e-2,1.4011565751498796e-2,2.4574506577860144e-4,1.546708243977333e-4,3.622194317290015e-4 -UnValueData/2328330,1.7326415313575014e-2,1.724567491226159e-2,1.7460563129391007e-2,2.4275882922429468e-4,1.6242407349935e-4,3.5579022994900096e-4 -UnValueData/1817236,3.865449638314245e-3,3.8509280349554734e-3,3.8911741896913103e-3,5.8295468960910656e-5,3.389961966563605e-5,9.564524858489304e-5 -UnValueData/5018602,1.5891421680943685e-3,1.5851306547804945e-3,1.6003460257286524e-3,2.0521513321048193e-5,1.1261232038182564e-5,3.745105940473335e-5 -UnValueData/298760976,0.11766399265782508,0.11564502278841766,0.1206492872326635,3.732029898764641e-3,2.0403676296774716e-3,5.893750786666082e-3 -UnValueData/61509608,6.0072692947197005e-2,5.964346627794168e-2,6.098620435515281e-2,1.0841719945671922e-3,4.035311641393299e-4,1.7142900966794275e-3 -UnValueData/148895716,6.846849368629207e-2,6.811004588534393e-2,6.90899393872007e-2,7.924890688677503e-4,4.422023058021328e-4,1.0826088099082309e-3 -UnValueData/187844113,8.633297566867744e-2,8.563077018518622e-2,8.740873092785477e-2,1.5681982014464574e-3,9.956656284170928e-4,1.9664579627141957e-3 -UnValueData/96560479,8.770143541766123e-2,8.717671918475793e-2,8.832345825309554e-2,9.760061846602834e-4,6.064344582901466e-4,1.4253389015221323e-3 -UnValueData/5750026,0.10621549403032114,0.10489735715140505,0.10826498204497276,2.7426436165770727e-3,1.9944064160961456e-3,3.3512016431393467e-3 -UnValueData/30569413,1.524956531653715e-2,1.5194020764744331e-2,1.5347827184350507e-2,1.7769511596496746e-4,1.0563131021824827e-4,2.704359805582908e-4 -UnValueData/50809742,0.173982669152066,0.17140015408928905,0.17786427413043723,4.497340793485504e-3,2.5847689502076937e-3,6.169008569130326e-3 -UnValueData/1357928,1.263916227803773e-3,1.2617772876837034e-3,1.2681803026916147e-3,9.761145025447326e-6,4.496233328702742e-6,1.7261333861755356e-5 -UnValueData/14682800,1.79078948324892e-2,1.7763709491000097e-2,1.8097800251242215e-2,4.0319671438415647e-4,3.331163869988835e-4,4.923810804524641e-4 -UnValueData/35229121,1.3747346986933686e-2,1.3686864398855775e-2,1.3827945906666876e-2,1.7003271753283423e-4,1.2209423987234437e-4,2.2591384882888379e-4 -UnValueData/76705843,7.926317495781751e-2,7.860985664384705e-2,8.01817899538825e-2,1.3416947365746988e-3,1.0023044305621205e-3,1.8301638796914843e-3 -UnValueData/2587834,1.0072654491918435e-3,1.006579665272486e-3,1.007918925387012e-3,2.4207415639179877e-6,2.0102539711100953e-6,3.109838767548292e-6 -UnValueData/13586134,4.3119579343260115e-3,4.299409219863996e-3,4.334282567032606e-3,5.248090508033591e-5,3.434124112779327e-5,7.88640397177202e-5 -UnValueData/65975004,2.086420145344267e-2,2.0723782770528217e-2,2.105179817385415e-2,3.723693542529308e-4,2.808698420265533e-4,4.973768407227705e-4 -UnValueData/86182573,2.7016138464276727e-2,2.6838813843668572e-2,2.7321639495573508e-2,4.94126432140938e-4,3.0545446453326047e-4,7.035530617835902e-4 -UnValueData/2202211,1.0083952425196518e-3,1.0074714840597537e-3,1.009350773723672e-3,3.2321764164667094e-6,2.326334966866852e-6,4.919550979849351e-6 -UnValueData/3626914,2.340661469725662e-2,2.325101441219348e-2,2.3599846081283526e-2,3.898602954368183e-4,3.1165357117876927e-4,4.877970278032597e-4 -UnValueData/210747884,7.666129932339702e-2,7.568121474679737e-2,7.74360370099367e-2,1.5723035737500244e-3,1.0643488402185951e-3,2.4860264919901553e-3 -UnValueData/279233266,0.15765267788293155,0.15265699509835365,0.1616267102064096,6.747794309759976e-3,3.3005427832788095e-3,1.0563488348119952e-2 -UnValueData/16616604,2.2555180938968182e-2,2.2366449410268073e-2,2.2760927396947996e-2,4.343505767591083e-4,3.0134831172842725e-4,6.684628228788499e-4 -UnValueData/1759604,6.871022698594183e-4,6.865251517819906e-4,6.876065820641521e-4,1.7576441565825255e-6,1.4225349192904165e-6,2.4124859130789056e-6 -UnValueData/8817504,3.660277346543132e-3,3.650840296025303e-3,3.676240838505098e-3,3.76614550435916e-5,2.59139591619614e-5,5.4328584851303237e-5 -UnValueData/8690724,8.495466347728154e-3,8.462949503605741e-3,8.543558245591977e-3,1.0109925449702793e-4,7.579850045069569e-5,1.4692845224440897e-4 -UnValueData/269407217,9.773407785408364e-2,9.647709665704203e-2,9.949821337229675e-2,2.4081049713073057e-3,1.9146099373921828e-3,3.021067724304747e-3 -UnValueData/2347534,6.565488314749383e-4,6.561091736415499e-4,6.568947216249377e-4,1.3397100185705023e-6,1.0417283899960786e-6,1.749216169723167e-6 -UnValueData/241997912,0.10299819983382638,0.10126023418639624,0.10516212606240832,3.1767174399700455e-3,2.015755310872373e-3,4.747485988133599e-3 -UnValueData/16206322,4.412175649838896e-2,4.384531305185683e-2,4.457355014969472e-2,6.750426038807096e-4,4.350987200721451e-4,1.0522920720509913e-3 -UnValueData/75211182,7.876843805210518e-2,7.784845081719732e-2,7.970574629544798e-2,1.6062835723028406e-3,1.29859849475821e-3,1.983599687129346e-3 -UnValueData/259779678,0.12150476825190708,0.12016215596425657,0.12267757131485268,1.9738532269128633e-3,1.4481775998724114e-3,2.604093798204616e-3 -UnValueData/196591531,0.10164275914003557,9.94190867461356e-2,0.10327495369219224,3.179082870929967e-3,2.2198253875588573e-3,3.7089635026842033e-3 -UnValueData/27275076,2.2996221114788298e-2,2.2849392289812063e-2,2.3206296322648732e-2,4.057237645367218e-4,2.594701360594864e-4,6.179159594195236e-4 -UnValueData/331610230,0.1171365568365824,0.11489116091979668,0.12029999292766054,3.91535831852172e-3,2.7972016546109098e-3,5.008812554304281e-3 -UnValueData/21224754,2.63530527376584e-2,2.6136459742041068e-2,2.656662110838686e-2,4.671014484644755e-4,3.776654235679501e-4,5.893222572907877e-4 -UnValueData/50641504,4.849716296275775e-2,4.79671129815398e-2,4.9104121905264406e-2,1.0509414776559748e-3,8.284674155887278e-4,1.3301064799037486e-3 -UnValueData/278609244,0.1137901517429522,0.11170282214131605,0.11637218942854642,3.49374511357859e-3,2.2884030916294575e-3,4.906859579362178e-3 -UnValueData/22452206,9.870166622796498e-3,9.825475612238323e-3,9.904329596564173e-3,1.0178622841891616e-4,7.314005343534361e-5,1.4808184908100952e-4 -UnValueData/92714696,0.17159821468715866,0.16569243465505895,0.17883632250928455,9.627202022390665e-3,4.858150670255226e-3,1.4862449007653556e-2 -UnValueData/22287115,1.3370951614584556e-2,1.3290041733088198e-2,1.3418783818341185e-2,1.5541067658567622e-4,9.75270219091354e-5,2.4039724813167723e-4 -UnValueData/2008654,5.493689912123631e-4,5.491444016020693e-4,5.496271868811518e-4,8.62199502496023e-7,6.974190917911312e-7,1.1903651550599839e-6 -UnValueData/21066567,4.760839045584599e-2,4.687811097533973e-2,4.8757656406249024e-2,1.7906345575714306e-3,8.154148988534519e-4,2.550632242102737e-3 +LookupCoin/4/4/1941,1.2099290601733442e-6,1.2083153557899885e-6,1.2118190350742815e-6,5.81908186900081e-9,4.297599190144749e-9,8.699026996671137e-9 +LookupCoin/4/4/2000,1.263962482927185e-6,1.2626751889265905e-6,1.2651287861306148e-6,4.0139358332478404e-9,3.450861092560281e-9,4.8043390545522835e-9 +LookupCoin/4/1/0,1.182303989619614e-6,1.1815544689668174e-6,1.1834797373879564e-6,3.115195646393345e-9,2.093111256210446e-9,4.9299125866046525e-9 +LookupCoin/4/4/1377,1.267551529799483e-6,1.266581270364521e-6,1.268692425444755e-6,3.639047415442263e-9,3.0777074086674777e-9,4.3927181071216085e-9 +LookupCoin/4/4/1474,1.2570576702845137e-6,1.255972766547404e-6,1.2582612614382911e-6,3.7037442136637023e-9,2.9935389995685576e-9,4.874826590832197e-9 +LookupCoin/4/2/865,1.2482849645480626e-6,1.2469085281432584e-6,1.2492549833007781e-6,3.632025809169239e-9,2.6067687048953873e-9,5.644791014888371e-9 +LookupCoin/4/2/424,1.2459501727292264e-6,1.2442961476614228e-6,1.248673313685348e-6,7.008556549191257e-9,4.1906582610380275e-9,1.2434704131187341e-8 +LookupCoin/4/1/1261,1.2566311622141241e-6,1.255857077075437e-6,1.2576040103810896e-6,2.9873617865386026e-9,2.4041378085419448e-9,3.799557600108652e-9 +LookupCoin/4/4/709,1.261927941887455e-6,1.2598530362150802e-6,1.2637818370051234e-6,6.929571973171179e-9,5.608198164568385e-9,9.071659076003086e-9 +LookupCoin/4/2/473,1.2536193600218737e-6,1.2522950969787805e-6,1.2548894124912592e-6,4.373570331544024e-9,3.7976835698375666e-9,5.1980722250469035e-9 +LookupCoin/4/1/1635,1.2591313969765046e-6,1.2581833536055129e-6,1.2603074575281222e-6,3.53427233905004e-9,2.9471285330998955e-9,4.6488334486474785e-9 +LookupCoin/4/2/635,1.2477117772777182e-6,1.2461100199751527e-6,1.2490040363666169e-6,4.807855645311272e-9,4.1235948154934e-9,5.764849544389051e-9 +LookupCoin/4/4/305,1.2425059902254396e-6,1.2407518702507744e-6,1.244168953921855e-6,5.84352449854114e-9,4.549050537914644e-9,7.80326484501955e-9 +LookupCoin/4/3/186,1.2530364974491342e-6,1.2516219751104819e-6,1.2542405774010673e-6,4.512543704899226e-9,3.655938720253158e-9,5.906991890855321e-9 +LookupCoin/4/1/1384,1.2607045267671776e-6,1.258943415220449e-6,1.2627790371408432e-6,6.635295624283548e-9,5.030588392231537e-9,1.0333783073964522e-8 +LookupCoin/4/3/1635,1.2585367929171297e-6,1.2576565718844006e-6,1.2593992923822128e-6,3.0784980248895894e-9,2.5777684750227055e-9,3.88401410802952e-9 +LookupCoin/4/3/1753,1.2675225028803989e-6,1.2659737520012162e-6,1.2692773218081745e-6,5.2321936970877426e-9,3.909736616277929e-9,7.745940519080702e-9 +LookupCoin/4/3/717,1.258396832404609e-6,1.257219019436686e-6,1.2598889590626648e-6,4.583946624630117e-9,3.976385112422162e-9,5.5259668402931426e-9 +LookupCoin/4/3/1067,1.24493573110303e-6,1.2432178591385692e-6,1.2466875933359962e-6,6.057679179346355e-9,4.559671198356602e-9,8.232079845641701e-9 +LookupCoin/4/3/699,1.269273731403419e-6,1.2677600844860157e-6,1.2704844246448894e-6,4.746738445643781e-9,3.794025061573992e-9,5.82684065718847e-9 +LookupCoin/4/2/1514,1.260122608268287e-6,1.2584625920132232e-6,1.2622273127805128e-6,6.47114407761682e-9,3.188466734562789e-9,1.0604092184877621e-8 +LookupCoin/4/2/492,1.2501546352192733e-6,1.2487795388890063e-6,1.25124918857253e-6,4.19331685247959e-9,2.988102720561683e-9,5.79414159338583e-9 +LookupCoin/4/2/1422,1.2774268301705716e-6,1.2765040975622525e-6,1.2784101636141578e-6,3.2470653652601065e-9,2.7657409824237242e-9,3.891030104178399e-9 +LookupCoin/4/2/554,1.2099341834380745e-6,1.2092875323128623e-6,1.2105798725001612e-6,2.123862735657797e-9,1.6874239971707224e-9,2.716371587605628e-9 +LookupCoin/4/4/1846,1.276132262752473e-6,1.274814676707836e-6,1.2775249956679903e-6,4.69055236220179e-9,3.973338431710107e-9,5.825079833208221e-9 +LookupCoin/4/4/258,1.244905276120655e-6,1.2441247867061339e-6,1.245642717317428e-6,2.60984751064269e-9,2.12870673180129e-9,3.4540924531227904e-9 +LookupCoin/4/3/1064,1.2731706589997528e-6,1.2710402132653113e-6,1.2755493799508315e-6,7.219131489417484e-9,5.650357658409002e-9,9.610868898830734e-9 +LookupCoin/4/4/1615,1.2672089025846366e-6,1.2662770772243011e-6,1.2680055859788743e-6,2.9431381169757736e-9,2.48789488650362e-9,3.5979948240159138e-9 +LookupCoin/4/1/75,1.2388182146269002e-6,1.2372865668448349e-6,1.2400050768635e-6,4.526016671069336e-9,3.5979746578354265e-9,5.836283772058075e-9 +LookupCoin/4/2/1049,1.2661068981342546e-6,1.2648228057336438e-6,1.2673816544461361e-6,4.2210904548646294e-9,3.531999772829978e-9,5.408519262046894e-9 +LookupCoin/4/3/1936,1.2562052135735867e-6,1.2543318623289094e-6,1.2581754281845629e-6,6.502116282722036e-9,5.626022356299025e-9,7.743876706871337e-9 +LookupCoin/4/2/996,1.2601434416589069e-6,1.2587179080826597e-6,1.2621817652180817e-6,5.990136572559659e-9,3.780939601409619e-9,9.533463271392024e-9 +LookupCoin/4/1/1911,1.2710697851397337e-6,1.2690310508290083e-6,1.272798904953773e-6,6.451356980354716e-9,5.500883896588881e-9,7.771014305693228e-9 +LookupCoin/4/1/825,1.260800434872154e-6,1.2594020569696539e-6,1.2618996920794139e-6,4.344142511079843e-9,3.6968338950356697e-9,5.143627860649896e-9 +LookupCoin/4/1/1817,1.2674403185583998e-6,1.2663150500165288e-6,1.2686163891498086e-6,3.792516304314103e-9,3.103802878623202e-9,5.022365437334514e-9 +LookupCoin/4/2/1392,1.2561701739252014e-6,1.2549675916954485e-6,1.257441374484885e-6,4.373059189360812e-9,3.1835156851131317e-9,6.800462414603944e-9 +LookupCoin/4/4/264,1.2448315169910615e-6,1.2437052173686614e-6,1.2458242649062894e-6,3.6534520022396253e-9,3.024562760705647e-9,4.869474025478529e-9 +LookupCoin/4/2/1039,1.257780446214735e-6,1.2561470663018918e-6,1.2591973592088815e-6,5.088469319984512e-9,3.953211768237475e-9,6.570919927061545e-9 +LookupCoin/4/3/1999,1.2712849202262505e-6,1.269779456411099e-6,1.2729740901823939e-6,5.338705018898157e-9,4.688099541543846e-9,6.450231298999057e-9 +LookupCoin/4/1/1891,1.2675920837841648e-6,1.266194858507318e-6,1.2688259628673854e-6,4.385772401733762e-9,3.3582237185152816e-9,5.472429614903799e-9 +LookupCoin/4/1/82,1.237627394722075e-6,1.2368185187811198e-6,1.2386847180704102e-6,3.0347610459393914e-9,2.506823976177255e-9,3.6361046046899967e-9 +LookupCoin/4/3/1370,1.2717503541302177e-6,1.270830677190067e-6,1.272621654057385e-6,3.054149525161517e-9,2.519540452284075e-9,4.332056963135638e-9 +LookupCoin/4/2/716,1.2599672480083068e-6,1.2584964089586e-6,1.261411291478005e-6,4.996687502362016e-9,4.116885256552783e-9,6.177241665922245e-9 +LookupCoin/4/1/700,1.265354833181043e-6,1.2643850060091481e-6,1.2661831083907466e-6,2.9736053790655615e-9,2.270362511170755e-9,3.791726174851157e-9 +LookupCoin/4/4/1875,1.2739030141881859e-6,1.2723751360822983e-6,1.2751991934859619e-6,4.721492408797256e-9,3.991126137452377e-9,5.627541223975132e-9 +LookupCoin/4/4/530,1.2673916251751333e-6,1.2664398313537881e-6,1.2684569441631355e-6,3.11046053350972e-9,2.583862292332204e-9,3.775255542181607e-9 +LookupCoin/4/3/170,1.2364650888849977e-6,1.2347075148605475e-6,1.2382156368149306e-6,5.770729651978215e-9,4.955270484969811e-9,6.983910751806327e-9 +LookupCoin/4/1/1185,1.2443306109710608e-6,1.2435902758746318e-6,1.2449655452930213e-6,2.3193338193396664e-9,1.822851401903931e-9,3.113788035273931e-9 +LookupCoin/4/1/814,1.257490569648031e-6,1.2569317747063175e-6,1.2580429099027308e-6,1.817631291634746e-9,1.5570580032526942e-9,2.1730506542328224e-9 +LookupCoin/4/2/1984,1.2669426584292243e-6,1.2658152823368194e-6,1.2682424221017303e-6,3.950352580792424e-9,3.3511090163523752e-9,4.596327346734161e-9 +LookupCoin/4/2/669,1.2532181985080193e-6,1.2518408335226801e-6,1.2542763075938748e-6,4.104991161691834e-9,3.210317669081556e-9,5.132838546288511e-9 +LookupCoin/4/4/1102,1.25963765923032e-6,1.25823056525656e-6,1.261174707675424e-6,5.0665749153416346e-9,4.330464918316081e-9,6.068012877181455e-9 +LookupCoin/4/4/1590,1.2717887877527429e-6,1.2708840330012155e-6,1.2726134679055489e-6,2.878583054926874e-9,2.3303518614783313e-9,3.613754801485005e-9 +LookupCoin/4/2/99,1.2335689669962706e-6,1.2313539970664841e-6,1.2353328525966396e-6,6.632766972429087e-9,5.474680823704876e-9,8.086355954211574e-9 +LookupCoin/4/4/423,1.2437255583833758e-6,1.2429822933780755e-6,1.2445586014774631e-6,2.632187646109121e-9,2.262964252764793e-9,3.2433296075407514e-9 +LookupCoin/4/1/193,1.253951432627247e-6,1.2532005093508152e-6,1.2548048706640951e-6,2.8002037980664875e-9,2.210415773767243e-9,3.709778120349775e-9 +LookupCoin/4/3/1957,1.2659341409653457e-6,1.2649509072232248e-6,1.2670762706052669e-6,3.567641971897211e-9,3.0682612337756368e-9,4.261449480943793e-9 +LookupCoin/4/4/293,1.2554190620321072e-6,1.2535495192126615e-6,1.256399330968427e-6,4.493807409408786e-9,3.0742950312961486e-9,6.653589380576234e-9 +LookupCoin/4/1/1711,1.2666871281079437e-6,1.2657066297577347e-6,1.2675871209441707e-6,3.1506331885224733e-9,2.4282732565911564e-9,3.985814475973065e-9 +LookupCoin/4/4/647,1.2535207329040018e-6,1.2524707388441124e-6,1.2545041389407245e-6,3.3603706125105627e-9,2.8366395747981606e-9,4.0510411525349215e-9 +LookupCoin/4/1/313,1.2374161055318747e-6,1.236454553195423e-6,1.238477605083973e-6,3.409089669251884e-9,2.8450258390796608e-9,4.074626615665905e-9 +LookupCoin/4/1/1636,1.2669398876395989e-6,1.2659294241111233e-6,1.2682105306026225e-6,3.794049524872123e-9,3.3068063716783075e-9,4.481708572935728e-9 +LookupCoin/4/1/448,1.2516518250074e-6,1.2509952839718582e-6,1.252506463829953e-6,2.54823461094115e-9,2.0855802753096793e-9,3.1893473865078868e-9 +LookupCoin/4/2/1260,1.270191649222978e-6,1.2688721687173385e-6,1.2710673768320028e-6,3.6791018488429654e-9,2.485208412465243e-9,5.206617957338348e-9 +LookupCoin/4/2/568,1.2470362713843768e-6,1.245957464783253e-6,1.2482396662367748e-6,3.808403164621178e-9,3.1801590682055347e-9,4.890973193115783e-9 +LookupCoin/4/2/50,1.2199188404631702e-6,1.2183768714921385e-6,1.2218612289697213e-6,5.634750575760773e-9,4.322073695143475e-9,9.37198214540019e-9 +LookupCoin/4/2/1761,1.2529888398838452e-6,1.2521817743150948e-6,1.2542734467090725e-6,3.183417504065581e-9,2.199725646097509e-9,5.597358173976347e-9 +LookupCoin/4/3/1499,1.2626962662006926e-6,1.2618120251726073e-6,1.2636609392100827e-6,3.0309927916427637e-9,2.4428812557820733e-9,3.8231798624820016e-9 +LookupCoin/4/4/729,1.2470326120540437e-6,1.2460033570806534e-6,1.2481198368686737e-6,3.8472974898483426e-9,3.3393669388140793e-9,4.5059972790009025e-9 +LookupCoin/4/4/1671,1.2640368508926e-6,1.2631681290280244e-6,1.2647631915353857e-6,2.7220001453072447e-9,2.060557240441626e-9,3.562623101891194e-9 +LookupCoin/4/1/780,1.2467320568545286e-6,1.2460674218503655e-6,1.247393984755929e-6,2.2405242874037037e-9,1.84628520410837e-9,3.015582365848289e-9 +LookupCoin/4/3/1090,1.249454277289292e-6,1.2487201256804026e-6,1.250153270874042e-6,2.3967634350345406e-9,1.8621219105359725e-9,3.2506935402719697e-9 +LookupCoin/4/3/1948,1.2671580450166966e-6,1.266280956328182e-6,1.2681056459271303e-6,3.137467289633508e-9,2.451336924027001e-9,4.456970255193901e-9 +LookupCoin/4/1/884,1.2633043932278233e-6,1.262390142562315e-6,1.2642701688608693e-6,3.0508908878448442e-9,2.668516094865094e-9,3.581783581374332e-9 +LookupCoin/4/1/212,1.2595825026985178e-6,1.2578615143954295e-6,1.261179539701188e-6,5.688487998545077e-9,4.683201133986747e-9,6.745872398627344e-9 +LookupCoin/4/2/1734,1.2821196209722983e-6,1.2811722700824554e-6,1.283507566853e-6,3.755470616284377e-9,2.9697872904834218e-9,5.2651030954197406e-9 +LookupCoin/4/2/1432,1.2648565222952083e-6,1.2640631401303057e-6,1.265728931968658e-6,2.6998021749455992e-9,2.3272034486546956e-9,3.296158240395178e-9 +LookupCoin/4/4/1026,1.2596742238766096e-6,1.2581415204017064e-6,1.2608653731940624e-6,4.494793102385613e-9,3.642408885777473e-9,5.703083713079936e-9 +LookupCoin/4/2/268,1.233355567982698e-6,1.2325671919133414e-6,1.2353541730205757e-6,3.860276882933147e-9,1.8274918924694966e-9,7.40309481270045e-9 +LookupCoin/4/3/294,1.2533269075870097e-6,1.2521923088304496e-6,1.2556619208764189e-6,5.380180976445231e-9,3.0128641141324837e-9,1.0051813483556786e-8 +LookupCoin/4/3/179,1.2335605922757587e-6,1.2327187009437602e-6,1.2344707203678718e-6,3.0998223206150834e-9,2.4133857704444653e-9,4.242255219103207e-9 +LookupCoin/4/2/817,1.2584837012630395e-6,1.2576501619663458e-6,1.259306036276936e-6,2.8725332373141013e-9,2.4153351220539344e-9,3.489508939833649e-9 +LookupCoin/4/1/857,1.2583618488258463e-6,1.257631841143659e-6,1.2591316629916386e-6,2.518899020406613e-9,1.9931311736937553e-9,3.4780290379369583e-9 +LookupCoin/4/1/61,1.2269882267555677e-6,1.225793402424182e-6,1.2282628713809258e-6,4.2903312665804205e-9,3.6128701156627896e-9,5.3578656773142624e-9 +LookupCoin/4/2/500,1.2767209574095081e-6,1.2760907508186271e-6,1.277236407920572e-6,1.9039555407296722e-9,1.582860024107718e-9,2.411764610342152e-9 +LookupCoin/4/2/1138,1.2666787124858883e-6,1.2651332414005322e-6,1.268643697752686e-6,5.827780343772291e-9,4.54411280913828e-9,8.70357406024228e-9 +LookupCoin/4/3/569,1.2539476074507414e-6,1.2525647815919868e-6,1.2552698205592212e-6,4.767859320070877e-9,3.6223945891481234e-9,6.847014709146792e-9 +LookupCoin/4/1/829,1.2470683870916736e-6,1.2459029284079345e-6,1.2481308132445217e-6,3.816213645727349e-9,3.139642292025568e-9,4.6191836481465055e-9 +LookupCoin/4/4/1895,1.2750745962521363e-6,1.2741068365691494e-6,1.276019516538221e-6,3.1021454397692688e-9,2.540252396093476e-9,3.958867285210403e-9 +LookupCoin/4/2/147,1.2292920797907283e-6,1.2280872779774047e-6,1.2301175434237885e-6,3.130636181041268e-9,2.474843236094403e-9,4.180849823217478e-9 +LookupCoin/4/2/694,1.2525231425460175e-6,1.250931088158127e-6,1.2539469119223562e-6,5.232315488455619e-9,4.267087393564163e-9,6.469197734342586e-9 +LookupCoin/4/3/1251,1.275654095852841e-6,1.2745036701210345e-6,1.2769353858801519e-6,4.122433029110044e-9,3.5293988077576843e-9,5.321029389800074e-9 +LookupCoin/4/1/1135,1.2659303872237878e-6,1.2652240048281306e-6,1.2666507070967692e-6,2.4646542718332795e-9,1.90382267899826e-9,3.344640967271877e-9 +LookupCoin/4/2/934,1.2545594992044652e-6,1.2534277815586392e-6,1.2556180593130433e-6,3.421975676962756e-9,2.809437675247923e-9,4.722712286384977e-9 +LookupCoin/4/4/392,1.2436663440149698e-6,1.2428006447256707e-6,1.244700558752261e-6,3.1659960628926658e-9,2.6362102744319375e-9,3.743428175090666e-9 +LookupCoin/4/2/402,1.258307014576956e-6,1.2570224923005987e-6,1.259706246007779e-6,4.5473909356500424e-9,3.684035251009951e-9,5.50377920950641e-9 +LookupCoin/4/1/1759,1.264901276265316e-6,1.2641939053076416e-6,1.265917381362148e-6,2.7943574520924446e-9,2.0884682072184187e-9,3.844338466725823e-9 +LookupCoin/4/4/854,1.2783434915788928e-6,1.2773319218958052e-6,1.2793714721660433e-6,3.3184431842757996e-9,2.812775908265822e-9,4.159735533123082e-9 +LookupCoin/4/3/1374,1.258044712207174e-6,1.2569860154154048e-6,1.259135003960508e-6,3.6700088539635305e-9,3.1689491937764395e-9,4.297818754667379e-9 +LookupCoin/4/1/283,1.2438002563592681e-6,1.2416534116815977e-6,1.2455554281525005e-6,6.3065190184861354e-9,4.811306473463054e-9,8.356026273132514e-9 +LookupCoin/4/4/1432,1.270963016592164e-6,1.270458320925732e-6,1.2715721773066389e-6,1.870707862785424e-9,1.4410951783098801e-9,2.67598037817361e-9 +LookupCoin/4/1/100,1.2370536410975514e-6,1.235441383019558e-6,1.238498443738211e-6,5.13476732032314e-9,4.055195938718297e-9,6.67950433483119e-9 +LookupCoin/4/2/1863,1.2782166251462652e-6,1.2773024218129996e-6,1.2792614907638668e-6,3.2092692423663556e-9,2.6957678623040476e-9,3.799721599969248e-9 +ValueContains/1941/0,1.0447421733346114e-6,1.042791763185493e-6,1.0462471975163973e-6,5.689955679309607e-9,4.261122281900713e-9,7.558664381265046e-9 +ValueContains/2000/0,1.0425614532957985e-6,1.0418502073742308e-6,1.0433541756558467e-6,2.6377572354071168e-9,2.2331408262496758e-9,3.339543526864987e-9 +ValueContains/0/0,1.0352241874952619e-6,1.0344077611050406e-6,1.0361814960147387e-6,2.9435613851071588e-9,2.3026170693474157e-9,4.0820141627369115e-9 +ValueContains/1377/0,1.0314768548952726e-6,1.0301374859293949e-6,1.0327992598673402e-6,4.341147297666407e-9,3.6860468232343225e-9,4.966237615241755e-9 +ValueContains/1474/0,1.036091300482452e-6,1.0345516627743029e-6,1.0377100887408548e-6,5.264242944964152e-9,4.45551537632903e-9,6.284658694121405e-9 +ValueContains/865/0,1.0312506936145905e-6,1.03048038228762e-6,1.0321955933713683e-6,2.9767044126692546e-9,2.548448393318469e-9,3.47496352328017e-9 +ValueContains/424/0,1.035095038647676e-6,1.0337581923288471e-6,1.0366788978858052e-6,4.803648834615479e-9,4.045263765294875e-9,5.668341810667094e-9 +ValueContains/1261/0,1.0352299836119575e-6,1.0343124357688695e-6,1.0362756620280145e-6,3.3762201619220386e-9,2.7547233255871196e-9,5.023183195766623e-9 +ValueContains/709/0,1.0281402725264013e-6,1.0272540348837455e-6,1.028999259349732e-6,2.857896399754783e-9,2.437064563624699e-9,3.5620370432418787e-9 +ValueContains/473/0,1.0373974163197718e-6,1.0360825842665552e-6,1.0389048162369022e-6,4.773743692571427e-9,4.031541101629912e-9,5.805617954584377e-9 +ValueContains/1635/0,1.0317553366059756e-6,1.0299817369710395e-6,1.0336547133537503e-6,6.170188161661942e-9,5.204729937600441e-9,7.358966268733104e-9 +ValueContains/635/0,1.0244588211511957e-6,1.0232720837137958e-6,1.0257673359170711e-6,4.266735711357054e-9,3.675054040100601e-9,5.001578077003953e-9 +ValueContains/305/0,1.032625530770953e-6,1.0299450937871901e-6,1.0356379588149998e-6,9.129015475799432e-9,8.296054524511257e-9,1.0208454410028952e-8 +ValueContains/186/0,1.0290503420360945e-6,1.027998853714287e-6,1.0302749117491732e-6,3.67710186162807e-9,3.1304864702464144e-9,4.332688445674818e-9 +ValueContains/1384/0,1.0312129325402292e-6,1.0298181192383907e-6,1.032537069483042e-6,4.492530872445812e-9,2.8487442117503185e-9,7.329261206197325e-9 +ValueContains/1635/0,1.033638141575145e-6,1.032331730916693e-6,1.0350989848938772e-6,4.4601755113453045e-9,3.548426645344805e-9,5.631919022244787e-9 +ValueContains/1753/0,1.0322324279172035e-6,1.0313587467817661e-6,1.0338942593237838e-6,3.9825537223043495e-9,2.4709636504729573e-9,7.61930474457333e-9 +ValueContains/717/0,1.0274673936294322e-6,1.0263651313224253e-6,1.02899225129232e-6,4.357958544670977e-9,3.143692383064033e-9,5.795141446768529e-9 +ValueContains/1067/0,1.0352121458382532e-6,1.0336672815227641e-6,1.0367108862403865e-6,5.227459611525177e-9,4.308487658451906e-9,6.340861887480351e-9 +ValueContains/699/0,1.0327414165011e-6,1.0322049083333306e-6,1.0333697350753706e-6,1.918058688915664e-9,1.6139432687006484e-9,2.5191881908586832e-9 +ValueContains/1514/0,1.0356120320799818e-6,1.0345018372729676e-6,1.0367530956495821e-6,3.904090530309525e-9,3.236010328069612e-9,4.792635001442734e-9 +ValueContains/492/0,1.0320438181468604e-6,1.0298608555978071e-6,1.034386246407094e-6,7.881016759899177e-9,7.014355347785797e-9,8.899765656092366e-9 +ValueContains/1422/0,1.0337855474982016e-6,1.0327072060198415e-6,1.0349017887333833e-6,3.6117770480750907e-9,3.002930084339793e-9,4.46269791174139e-9 +ValueContains/554/0,1.0306843097583927e-6,1.0298166147611878e-6,1.0318728618862626e-6,3.5154552416503234e-9,2.9427443975533853e-9,4.494038472106789e-9 +ValueContains/1846/0,1.0321557664794201e-6,1.0308391679850718e-6,1.0333542409469713e-6,4.028120233600354e-9,3.398745956101516e-9,4.9373330863906126e-9 +ValueContains/258/0,1.0338143439324888e-6,1.0328854205133798e-6,1.0347564324416647e-6,3.2813423402702563e-9,2.66956031895511e-9,4.412907055434224e-9 +ValueContains/1064/0,1.0381925880119778e-6,1.0371708771936139e-6,1.039160043253698e-6,3.273410012040961e-9,2.810140435778958e-9,3.974916652965863e-9 +ValueContains/1615/0,1.0336027224251062e-6,1.0328561537166904e-6,1.034470328474874e-6,2.8109593161857493e-9,2.293919606686719e-9,3.3734944235537014e-9 +ValueContains/75/0,1.0311940285873582e-6,1.0301180861791524e-6,1.0325193015677028e-6,4.239301438054663e-9,3.420020816528398e-9,5.340830115730067e-9 +ValueContains/1049/0,1.0340956951959538e-6,1.0323589556734182e-6,1.0355333822747506e-6,5.573165533245389e-9,5.012466149280473e-9,6.339286845125182e-9 +ValueContains/1936/0,1.0329505914807513e-6,1.031861814782581e-6,1.0339383799912962e-6,3.5905588849556734e-9,3.10163769774018e-9,4.2493437454608126e-9 +ValueContains/996/0,1.0295086136838665e-6,1.0282409596071932e-6,1.0309184238856502e-6,4.588093770019802e-9,3.836968381495649e-9,5.538111471301541e-9 +ValueContains/1911/0,1.0312030203887918e-6,1.0298948140546983e-6,1.0325122303324259e-6,4.355354127609901e-9,3.850497670279506e-9,4.973465662437733e-9 +ValueContains/825/0,1.0319708241006903e-6,1.030402530780415e-6,1.0331698183394545e-6,4.351254871959645e-9,3.605393301015765e-9,5.410225735742536e-9 +ValueContains/1817/0,1.0336764182230356e-6,1.032017204101376e-6,1.0352757396096728e-6,5.538630690935984e-9,4.826437975064421e-9,6.459273466294702e-9 +ValueContains/1392/0,1.032823044024764e-6,1.0310431688913813e-6,1.034438187862574e-6,5.979960250781161e-9,5.118740237325688e-9,7.0022372492200456e-9 +ValueContains/264/0,1.0340645101413139e-6,1.0330458439549499e-6,1.036398401748361e-6,5.172048322004471e-9,3.0310374485932254e-9,9.848527301486744e-9 +ValueContains/1039/0,1.0316281193781628e-6,1.030420373088009e-6,1.0328381339811856e-6,4.199412392077724e-9,3.588804827683369e-9,4.97480028419002e-9 +ValueContains/1999/0,1.0358450359760332e-6,1.0344867670120996e-6,1.037217359550089e-6,4.643417324607884e-9,3.9534160429183274e-9,5.530535126440061e-9 +ValueContains/1891/0,1.031372799891094e-6,1.0305861039911334e-6,1.0320244421655545e-6,2.493570826167633e-9,2.0289181603329556e-9,3.1360948865642228e-9 +ValueContains/82/0,1.0384834574119357e-6,1.0365521891964691e-6,1.0403052347267773e-6,6.099398309520228e-9,5.586209800946584e-9,6.782742508661545e-9 +ValueContains/1370/0,1.0314750788731906e-6,1.0305175088765723e-6,1.0325678544700702e-6,3.4137939080778526e-9,2.8609839522877448e-9,4.325358792947334e-9 +ValueContains/716/0,1.032045132428243e-6,1.0309993108783801e-6,1.0332269929625547e-6,3.740644362609707e-9,3.195111823851123e-9,4.480682755641185e-9 +ValueContains/700/0,1.0301039614271862e-6,1.028595934184355e-6,1.032083866439612e-6,6.011587045042245e-9,5.263724848908924e-9,6.977805315500248e-9 +ValueContains/1875/0,1.027725272406908e-6,1.0263798717708292e-6,1.028824191775566e-6,4.106263791599006e-9,3.325703732273969e-9,5.063798331431012e-9 +ValueContains/530/0,1.0352465938845614e-6,1.03420231411926e-6,1.0361949612765253e-6,3.3299733655500005e-9,2.467237583434573e-9,4.643127487312056e-9 +ValueContains/170/0,1.0334170072630892e-6,1.0322434012897569e-6,1.0345125052016114e-6,3.874470828482491e-9,3.4168256716150917e-9,4.467670582722164e-9 +ValueContains/1185/0,1.0319539045060614e-6,1.0308467164320044e-6,1.0332577879618961e-6,4.3355051954364216e-9,3.833431932326372e-9,5.003172701424347e-9 +ValueContains/814/0,1.0308134150317023e-6,1.0296536340651413e-6,1.0320623263682111e-6,4.1531150629460056e-9,3.6052736094646756e-9,4.878190069059782e-9 +ValueContains/1984/0,1.028113410885211e-6,1.0264860640528122e-6,1.0299098148342446e-6,5.708548209151425e-9,4.846825563787354e-9,6.6643375433313495e-9 +ValueContains/669/0,1.0340962808791444e-6,1.0331827678966246e-6,1.0349730868212269e-6,3.198917212067823e-9,2.5490816717548552e-9,4.2735002989324484e-9 +ValueContains/1102/0,1.0338843106790005e-6,1.0329366960275205e-6,1.034779667427811e-6,2.974443401399401e-9,2.4879159364585146e-9,3.675720676958192e-9 +ValueContains/1590/0,1.0294794078386331e-6,1.028630671679175e-6,1.0303046191250964e-6,2.7596801914996854e-9,2.346187497938868e-9,3.233817443336391e-9 +ValueContains/99/0,1.0284287385143561e-6,1.0266979624823682e-6,1.0303039467910547e-6,5.969208006371639e-9,4.915741151362058e-9,7.477451147799291e-9 +ValueContains/423/0,1.0300993452466852e-6,1.0289844779056522e-6,1.0312866565200198e-6,3.718189127811978e-9,3.011102755182195e-9,5.4128946691379035e-9 +ValueContains/193/0,1.031390775521728e-6,1.0298985162193364e-6,1.0328307112171867e-6,4.853466157538045e-9,4.158356785477645e-9,5.5830633952021645e-9 +ValueContains/1957/0,1.0401361939962572e-6,1.039396072249332e-6,1.0409030272416313e-6,2.413855772123666e-9,1.9143540859664146e-9,3.169442953554663e-9 +ValueContains/293/0,1.0350257347253016e-6,1.0337035842484375e-6,1.0367231966163863e-6,5.0742533975307494e-9,4.105744558214825e-9,6.677882352515618e-9 +ValueContains/1711/0,1.0324667286547402e-6,1.0309139176554205e-6,1.0337603497485791e-6,4.5925002505575475e-9,3.5410363216237602e-9,6.255657953845805e-9 +ValueContains/647/0,1.0322096521536468e-6,1.030463227084045e-6,1.0340986207959736e-6,6.165677997901483e-9,5.0033891134584645e-9,8.19183423649204e-9 +ValueContains/313/0,1.0372158007684301e-6,1.0360143695978234e-6,1.0382816144315289e-6,3.834586194106013e-9,3.326299072926265e-9,4.562952711459421e-9 +ValueContains/1636/0,1.0367986323574438e-6,1.035712437781131e-6,1.0378357200293078e-6,3.5090542608755702e-9,2.9070523619955608e-9,4.273691450318376e-9 +ValueContains/448/0,1.0391905857140236e-6,1.0381687843081225e-6,1.0401536894425915e-6,3.3913517569840634e-9,2.836626510647566e-9,4.172292870919356e-9 +ValueContains/1260/0,1.0284489768956748e-6,1.026805884893024e-6,1.030180652863061e-6,5.421037948348187e-9,3.6837042186168016e-9,8.909389705369903e-9 +ValueContains/568/0,1.0297453580482521e-6,1.0282538437625392e-6,1.0311632598880666e-6,4.861962857519071e-9,3.8536494120384384e-9,5.891240903576745e-9 +ValueContains/50/0,1.03784414097314e-6,1.036480390594479e-6,1.039079941505552e-6,4.417360076270122e-9,3.690109990813249e-9,5.352797810777771e-9 +ValueContains/1761/0,1.0329948059865941e-6,1.0316547268239406e-6,1.034927551366189e-6,5.294194610203924e-9,4.113263092438888e-9,6.68644420365378e-9 +ValueContains/1499/0,1.035041848317274e-6,1.0332078172893973e-6,1.0375387857034041e-6,7.135902285025929e-9,6.267642472768021e-9,8.28132773156414e-9 +ValueContains/729/0,1.0358017939806733e-6,1.0340828231374197e-6,1.0375130545725226e-6,5.582454270040397e-9,4.885214352739172e-9,6.565322360842006e-9 +ValueContains/1671/0,1.03421937151362e-6,1.0330889707333147e-6,1.0352856224988946e-6,3.604243391531333e-9,2.9904394463279543e-9,4.544453657128622e-9 +ValueContains/780/0,1.0321349874004e-6,1.031478585210874e-6,1.032724739023848e-6,2.181958076157916e-9,1.7281644207901732e-9,2.9642243631047574e-9 +ValueContains/1090/0,1.0339962626675104e-6,1.032873624711856e-6,1.0349052998346714e-6,3.525924357376471e-9,2.7773011206960774e-9,4.674650797551434e-9 +ValueContains/1948/0,1.0352134666503138e-6,1.0334550498635988e-6,1.036728257291102e-6,5.250930165288056e-9,4.335100854807073e-9,6.180366578156374e-9 +ValueContains/884/0,1.0303579257464584e-6,1.0290462492539398e-6,1.0316998229769883e-6,4.454752117181406e-9,3.911289823495434e-9,5.136639951957465e-9 +ValueContains/212/0,1.0323683566859146e-6,1.0317399242672812e-6,1.033097341334856e-6,2.3801616889705275e-9,1.9886956233024114e-9,2.9525324799731748e-9 +ValueContains/1734/0,1.0387601918939035e-6,1.0376603572173882e-6,1.0397063074644166e-6,3.4132350071723286e-9,2.803362704130945e-9,4.410217626866615e-9 +ValueContains/1432/0,1.031244694594474e-6,1.0296942770458606e-6,1.032751257628825e-6,5.1008530591588415e-9,4.468666131213822e-9,5.900340335328896e-9 +ValueContains/1026/0,1.0326530061105472e-6,1.0314747406559193e-6,1.0341190420802081e-6,4.3595639057941344e-9,3.465003035257553e-9,5.686398756148966e-9 +ValueContains/268/0,1.0365548477374105e-6,1.0352619794566402e-6,1.0381530897222977e-6,4.852289469628966e-9,4.03820356306166e-9,5.7308966541108464e-9 +ValueContains/294/0,1.0297861493215372e-6,1.0289888274072617e-6,1.0306681873830758e-6,2.889533534663054e-9,2.440290637170621e-9,3.451774661471921e-9 +ValueContains/179/0,1.0313423436031545e-6,1.030034311273145e-6,1.0327244782632449e-6,4.2138097608022834e-9,3.5200582739923127e-9,5.3666590036130015e-9 +ValueContains/817/0,1.0376092352028544e-6,1.0367621284306299e-6,1.0384861703235144e-6,2.866913031512006e-9,2.412425892458141e-9,3.4400379740669897e-9 +ValueContains/857/0,1.0403683904362801e-6,1.0391352430856647e-6,1.0413099916775512e-6,3.576929121184069e-9,2.728284034891952e-9,4.608781937145978e-9 +ValueContains/61/0,1.0281692225937836e-6,1.0264201082725256e-6,1.029844847133887e-6,5.7363530803220764e-9,5.107755227342514e-9,6.584467977903479e-9 +ValueContains/500/0,1.0359667984976142e-6,1.0345097210403042e-6,1.0373336448524324e-6,4.7679219736635735e-9,3.862722508313676e-9,5.810005931691734e-9 +ValueContains/1138/0,1.0319355389850023e-6,1.030840682959532e-6,1.0330256479056708e-6,3.6846740353838744e-9,3.0699066910589907e-9,4.396926386181389e-9 +ValueContains/569/0,1.0258057501347023e-6,1.0250082797054677e-6,1.0270118422135517e-6,3.2977688397356063e-9,2.521261764602551e-9,4.495000455621684e-9 +ValueContains/829/0,1.0334615371625688e-6,1.032783719018781e-6,1.0342556059899147e-6,2.582715750630929e-9,2.1830974873246057e-9,3.187960352692512e-9 +ValueContains/1895/0,1.0333375535256732e-6,1.0320574879280496e-6,1.034786255340413e-6,4.467869279077104e-9,3.8151563695767975e-9,5.332189450986526e-9 +ValueContains/147/0,1.035017690027508e-6,1.0337829905375666e-6,1.0364016339265706e-6,4.298249700805319e-9,3.772599456691544e-9,5.087290321705312e-9 +ValueContains/694/0,1.0369009139699031e-6,1.0355496499814476e-6,1.0381859294380973e-6,4.342176626655082e-9,3.4154988473345516e-9,5.984567048351332e-9 +ValueContains/1251/0,1.0353092636395324e-6,1.0335833474884157e-6,1.0372990439081246e-6,6.091976415400514e-9,4.95643018928792e-9,7.083298935923365e-9 +ValueContains/1135/0,1.0354127123251889e-6,1.0340914111554943e-6,1.0364176382748475e-6,3.762388930727781e-9,2.8661650053151374e-9,5.1860063530909444e-9 +ValueContains/934/0,1.0316621524799316e-6,1.0305355577862861e-6,1.0329235170180913e-6,4.0627102115650735e-9,3.3019164464170306e-9,5.263765988840884e-9 +ValueContains/392/0,1.0292258353292299e-6,1.0282157069752898e-6,1.03047133355062e-6,3.9340202000457775e-9,2.9479884290776317e-9,5.415721761665777e-9 +ValueContains/402/0,1.0352639166612367e-6,1.033360907307131e-6,1.036943811117385e-6,5.975358707830939e-9,5.2397638493052494e-9,7.016999871013709e-9 +ValueContains/1759/0,1.0299042246171666e-6,1.029115205127161e-6,1.0307557190366985e-6,2.738858080643268e-9,2.2363025456099074e-9,3.4203499393537062e-9 +ValueContains/854/0,1.0354362890400527e-6,1.0340823086016756e-6,1.0368340901513667e-6,4.718212356512183e-9,4.285512180535764e-9,5.3372915793635316e-9 +ValueContains/1374/0,1.0264366463831676e-6,1.0247413437926903e-6,1.0286437591469712e-6,6.491231297121427e-9,5.694680908730278e-9,7.65474603635969e-9 +ValueContains/283/0,1.0348986826355353e-6,1.0336986128162537e-6,1.0362325440978071e-6,4.151492625924201e-9,3.4352526814925647e-9,5.205258255513803e-9 +ValueContains/1432/0,1.030596427428761e-6,1.0293114500951443e-6,1.0338315194135444e-6,6.451675697611216e-9,3.01929425911696e-9,1.1370621483519228e-8 +ValueContains/100/0,1.0404227453016547e-6,1.038894762872916e-6,1.0421448968680177e-6,5.560446869328269e-9,4.810463661368125e-9,6.750813643059653e-9 +ValueContains/1863/0,1.0305023817652e-6,1.0292446251093266e-6,1.0319959833102474e-6,4.630689367154495e-9,3.805746282021505e-9,5.683025487195141e-9 +ValueContains/440/418,5.124608265110343e-5,5.121662498658187e-5,5.1313432092545874e-5,1.456975160027558e-7,8.078090278772361e-8,2.874893215241633e-7 +ValueContains/959/241,3.2187985144643e-5,3.215953788773676e-5,3.2225901626593526e-5,1.1233521488047495e-7,9.194681822905348e-8,1.4298544715655645e-7 +ValueContains/62/45,4.397472460714193e-6,4.393633987668054e-6,4.401971139388549e-6,1.3843320495833797e-8,1.1662740603971567e-8,1.6431695748073883e-8 +ValueContains/532/334,4.132596474873808e-5,4.126977054780335e-5,4.139240395789289e-5,2.0705666543231704e-7,1.6245164063573684e-7,2.7136213782863834e-7 +ValueContains/277/265,2.9922198103675184e-5,2.9840954113281517e-5,3.0005270518255418e-5,2.7829721612984116e-7,2.485425733401445e-7,3.1146930860966186e-7 +ValueContains/779/499,6.435905100932346e-5,6.431697836436892e-5,6.441829506867272e-5,1.7446946675420912e-7,1.3730187662202605e-7,2.3611089540901877e-7 +ValueContains/147/75,8.094158609388426e-6,8.068494494439661e-6,8.106740760057515e-6,5.7144385277007864e-8,2.6920762367325814e-8,9.843102469282254e-8 +ValueContains/200/129,1.3403010190797982e-5,1.330449133420971e-5,1.3479255606649119e-5,2.809259741349398e-7,2.642424454037957e-7,2.9861269385582555e-7 +ValueContains/644/255,3.2239379639922364e-5,3.222390798105524e-5,3.225244528001604e-5,4.77210502513209e-8,3.92327522693193e-8,6.104427118196171e-8 +ValueContains/525/326,3.98243922096496e-5,3.9723263959152e-5,3.990580687000382e-5,3.096047387659666e-7,2.4949772782114314e-7,3.7511259148706e-7 +ValueContains/663/609,7.683179991120193e-5,7.670031655630136e-5,7.697826638508496e-5,4.5732275624304214e-7,3.7534991578423603e-7,5.975642415811019e-7 +ValueContains/98/7,1.6641666082416323e-6,1.6614701189414336e-6,1.6669461667037015e-6,8.674081600127239e-9,7.573022745769889e-9,1.0023597904583236e-8 +ValueContains/593/75,9.773163407330848e-6,9.749955911810395e-6,9.79832056595724e-6,8.234181871325186e-8,6.822238405172775e-8,1.0503492677994891e-7 +ValueContains/445/388,4.6225284652733546e-5,4.616790846501289e-5,4.627747176965855e-5,1.8243279318318453e-7,1.611386153182902e-7,2.1232906791027298e-7 +ValueContains/376/7,1.665285771232663e-6,1.6632885744422406e-6,1.6675532186531774e-6,7.555966727300541e-9,5.9447156342109584e-9,9.35955331937163e-9 +ValueContains/348/273,3.20293238850694e-5,3.185657688216304e-5,3.2154085152491995e-5,4.904776590377994e-7,3.6877012202359e-7,6.624543272418776e-7 +ValueContains/240/237,2.659231221148835e-5,2.6576195492906654e-5,2.660850379749961e-5,5.383677167204428e-8,4.5207037125225765e-8,6.668856000158431e-8 +ValueContains/858/724,9.233357016874159e-5,9.228918203602922e-5,9.24221922732988e-5,2.099542158701349e-7,1.0121101162781136e-7,4.0539444489246285e-7 +ValueContains/984/212,2.8015644999088575e-5,2.7986444274700856e-5,2.8048123682805462e-5,1.0964644326570426e-7,9.423895857863667e-8,1.3102079726665507e-7 +ValueContains/198/153,1.670027589554966e-5,1.6621620692137128e-5,1.6786012100481266e-5,2.839358323036496e-7,2.6521423910193036e-7,3.032599778637793e-7 +ValueContains/471/217,2.6373940437595213e-5,2.6348802580465075e-5,2.6400677968886287e-5,8.282260378832942e-8,6.569708326542025e-8,1.0104453068648504e-7 +ValueContains/56/13,1.9470219364727644e-6,1.9376770065708476e-6,1.9575160555741213e-6,3.352702963201879e-8,2.8263997777512146e-8,3.768871669303985e-8 +ValueContains/180/106,1.1518349400132193e-5,1.1504657398179447e-5,1.152992394021699e-5,4.354404826278933e-8,3.69387926123169e-8,5.429891723990847e-8 +ValueContains/46/1,1.1498489338043937e-6,1.1475025280850195e-6,1.1517576893534225e-6,7.062211906633986e-9,5.708747934945928e-9,8.6601132742011e-9 +ValueContains/640/347,4.179714667455943e-5,4.162857277708983e-5,4.1940547575002724e-5,5.558910854664858e-7,4.3644924229607986e-7,6.566270797906303e-7 +ValueContains/663/619,7.766289176536591e-5,7.756396824653455e-5,7.77911067330175e-5,3.8282945280389045e-7,2.938179063431946e-7,5.337306978952537e-7 +ValueContains/628/452,5.760172067041644e-5,5.751249113310829e-5,5.7701165420770955e-5,2.969874045794228e-7,2.542258102171147e-7,3.7595972968457167e-7 +ValueContains/57/48,4.640701091541787e-6,4.626116205011191e-6,4.65709266684345e-6,5.055878793430391e-8,4.4553695011967916e-8,5.7486668783030645e-8 +ValueContains/62/3,1.2709231135757182e-6,1.2689513824500562e-6,1.2724232631781227e-6,6.086560045658361e-9,4.559192201324222e-9,8.295184357941476e-9 +ValueContains/616/575,7.065101797578831e-5,7.056256753395007e-5,7.0736711470661e-5,2.965767279404794e-7,2.542819336078616e-7,3.4247667309009697e-7 +ValueContains/535/218,2.6254756392837704e-5,2.623006087125447e-5,2.6277736550695326e-5,8.065254372603139e-8,6.425857921113082e-8,1.0012826878856774e-7 +ValueContains/189/120,1.307312733600133e-5,1.3045997169902028e-5,1.3098256175711892e-5,8.941677465974236e-8,7.892368696724477e-8,1.017185698938515e-7 +ValueContains/110/105,1.0726285949584158e-5,1.0704426190700767e-5,1.0746550069460222e-5,7.136744782786834e-8,6.027118636300212e-8,8.269681974498756e-8 +ValueContains/613/479,6.176426111771538e-5,6.168489031810921e-5,6.185972314295496e-5,2.879602626725993e-7,2.1394620581655512e-7,4.320360350324086e-7 +ValueContains/340/78,9.927949222621944e-6,9.880793465300907e-6,9.9717710086523e-6,1.478856993882774e-7,1.1953062762875524e-7,1.848643341053891e-7 +ValueContains/22/20,2.3269560254860596e-6,2.321446775354728e-6,2.3324744330336048e-6,1.8799317568933045e-8,1.4172131265454375e-8,2.6036415067759217e-8 +ValueContains/88/36,3.7488502130868153e-6,3.737437958796251e-6,3.75995589632989e-6,3.778369779875885e-8,3.298253876691661e-8,4.266036218822141e-8 +ValueContains/135/29,3.5326348268392294e-6,3.5132672798256757e-6,3.5522965842051443e-6,6.289931111020898e-8,5.853813559887553e-8,6.860859887431776e-8 +ValueContains/505/361,4.345603055961267e-5,4.343083482661398e-5,4.3487835546788766e-5,9.596491986021481e-8,7.544486078455384e-8,1.2620989733433728e-7 +ValueContains/325/146,1.667534579517876e-5,1.6648722599066402e-5,1.6701390699118696e-5,9.009112087666133e-8,7.610849627669902e-8,1.0723640489569779e-7 +ValueContains/58/19,2.394105205911338e-6,2.3865705433051637e-6,2.4018048544896884e-6,2.5675714510366523e-8,2.2516843811376078e-8,3.024470511916364e-8 +ValueContains/746/32,4.556589219915828e-6,4.5363636951626325e-6,4.572668262350572e-6,6.059120332595823e-8,5.0210337086344715e-8,6.843071530046053e-8 +ValueContains/461/88,1.0329881717742086e-5,1.0281985547519271e-5,1.0370620887148102e-5,1.6041888558534014e-7,1.4384593538862362e-7,1.7922131752418615e-7 +ValueContains/632/48,6.05615333458462e-6,6.034195929090784e-6,6.078838165182399e-6,7.534388153749073e-8,6.156518850868723e-8,9.223725629105318e-8 +ValueContains/415/267,3.168645453400354e-5,3.165910456203491e-5,3.171751747667835e-5,9.730443523969321e-8,7.917883855073748e-8,1.3037077466259313e-7 +ValueContains/751/701,8.828639820688662e-5,8.805814402625668e-5,8.848831860680732e-5,6.90229521102344e-7,5.359407691502286e-7,9.295812923134455e-7 +ValueContains/343/108,1.2904300405021329e-5,1.2854368820845497e-5,1.2947343281198909e-5,1.605102422090976e-7,1.288258518185277e-7,1.8209378409935133e-7 +ValueContains/881/153,1.904709419702563e-5,1.896059233580226e-5,1.9138676865802236e-5,3.0988216798105637e-7,2.9230973710165587e-7,3.3072831600173147e-7 +ValueContains/961/658,8.362953590878233e-5,8.357049200167402e-5,8.367878481897651e-5,1.8815331656658752e-7,1.4388108623144213e-7,2.904144111161857e-7 +ValueContains/977/709,9.404334617177954e-5,9.382226029613604e-5,9.421330610109971e-5,6.498999661193747e-7,4.634390052860451e-7,9.696858966173425e-7 +ValueContains/404/280,3.2970636711696745e-5,3.2920169747105474e-5,3.303788859068598e-5,1.8155011882650774e-7,1.6108231079083424e-7,2.1771086103060773e-7 +ValueContains/269/147,1.626384356023769e-5,1.6196384597296893e-5,1.634765494076439e-5,2.4209134799741733e-7,1.930562630365899e-7,2.7952664081281615e-7 +ValueContains/503/424,5.250812892141422e-5,5.2412997514942757e-5,5.259235994196065e-5,3.0666040920124616e-7,1.363089575171616e-7,5.129020445892907e-7 +ValueContains/45/36,3.5902009026251396e-6,3.573411203190271e-6,3.603857224251136e-6,5.183956740123203e-8,4.5833459432726635e-8,5.8632807490500396e-8 +ValueContains/626/95,1.2115972940765067e-5,1.2102711094561373e-5,1.2130357538369148e-5,4.709765386438067e-8,4.189245102794501e-8,5.515913045489671e-8 +ValueContains/539/324,3.881013598683207e-5,3.876057662876274e-5,3.88565966500303e-5,1.5843611538269388e-7,1.394020498600433e-7,1.8611825091442583e-7 +ValueContains/723/4,1.469078053869706e-6,1.4675275231368764e-6,1.4705654265505366e-6,5.009419349987209e-9,4.258564738868786e-9,5.946000214129372e-9 +ValueContains/640/263,3.230361062995116e-5,3.213230064902143e-5,3.244343391921223e-5,5.211385269713293e-7,4.620783367957119e-7,5.794487548422854e-7 +ValueContains/420/18,2.8562401395581446e-6,2.852533472765334e-6,2.859868773954692e-6,1.2088659913158624e-8,1.006262123538761e-8,1.4839511079474936e-8 +ValueContains/675/425,5.409538032322959e-5,5.400657690839997e-5,5.417690574013157e-5,2.906706754712937e-7,2.5755676828323624e-7,3.243980482526096e-7 +ValueContains/500/177,2.1556589912292336e-5,2.14516992596497e-5,2.1651564160457852e-5,3.2752354499681855e-7,3.021019595259423e-7,3.4658304293974133e-7 +ValueContains/656/285,3.7258371624306585e-5,3.713589003513762e-5,3.733276487892977e-5,3.1395082113867575e-7,1.5004802228418778e-7,4.867929749139233e-7 +ValueContains/334/84,9.740648719885037e-6,9.7309997748127e-6,9.748600295022906e-6,3.1086898515740686e-8,2.5466430323732835e-8,3.8311052333484066e-8 +ValueContains/522/7,1.7593464994838185e-6,1.7565003115153804e-6,1.7625828981876795e-6,9.861467037181346e-9,8.940954205770626e-9,1.0954256525794419e-8 +ValueContains/68/41,4.337923028018763e-6,4.333884533414323e-6,4.342803932740207e-6,1.4408640156273755e-8,1.2112196458216799e-8,1.8107776025033116e-8 +ValueContains/979/624,8.01667450214178e-5,8.012286253451011e-5,8.020912507937899e-5,1.4416720573029487e-7,1.1367816928109606e-7,1.8206462934435496e-7 +ValueContains/872/719,9.318072330139519e-5,9.30460160189607e-5,9.331551821690305e-5,4.500996097767212e-7,4.0728164669556717e-7,5.136015225024845e-7 +ValueContains/894/143,1.801960960430182e-5,1.7954435844278038e-5,1.810826558948233e-5,2.419092487669504e-7,1.902164618443748e-7,3.069338479190731e-7 +ValueContains/102/15,2.1533858710065875e-6,2.1512227637525565e-6,2.1555349794209363e-6,7.427654886101584e-9,6.372496590313962e-9,8.698096342071278e-9 +ValueContains/887/25,3.801113437087085e-6,3.796782937867285e-6,3.8047528200347067e-6,1.344948675680006e-8,1.1348735645545828e-8,1.7828105920419547e-8 +ValueContains/730/45,5.8041302856016734e-6,5.786168235100013e-6,5.821324298073e-6,5.928442318207484e-8,5.124043255302579e-8,6.79630773539541e-8 +ValueContains/97/2,1.2167564796783545e-6,1.2150873177858804e-6,1.2184805419345076e-6,5.854643170931838e-9,5.2242863973636534e-9,6.5907997096195455e-9 +ValueContains/622/469,5.616906662306131e-5,5.601489654019036e-5,5.631263698667347e-5,5.23718638963392e-7,4.5038890385408777e-7,6.351506654167996e-7 +ValueContains/879/336,4.5089545277124656e-5,4.5016085892387153e-5,4.516076631858751e-5,2.4612732846163125e-7,2.23058976854204e-7,2.7524866680426367e-7 +ValueContains/45/38,3.762153254239151e-6,3.740981743131284e-6,3.7819645758289804e-6,6.837028092683635e-8,5.92566549779139e-8,7.992203373848832e-8 +ValueContains/129/37,4.0895105911816e-6,4.086733233028257e-6,4.091896306818116e-6,8.819939851060042e-9,7.308558173504844e-9,1.0942180156550078e-8 +ValueContains/963/26,3.795728090447244e-6,3.7921524977805585e-6,3.798847846113129e-6,1.1300956124669286e-8,9.748755272662963e-9,1.3806407626370543e-8 +ValueContains/597/323,4.114772600930412e-5,4.109649148265672e-5,4.120388056570997e-5,1.7748424640460474e-7,1.568800990868221e-7,2.0057932266186854e-7 +ValueContains/552/55,6.735782062588792e-6,6.727701933538449e-6,6.750640074816127e-6,3.3679433121776546e-8,2.2407556947388493e-8,5.88170933991135e-8 +ValueContains/105/74,7.364805824148798e-6,7.339158074056447e-6,7.398221465227015e-6,1.0175977313905928e-7,8.44272478619285e-8,1.1966662826995597e-7 +ValueContains/31/14,1.9994704441838307e-6,1.9928449521320734e-6,2.003905494107058e-6,1.7570810235538655e-8,1.3375409436675271e-8,2.2466336504267865e-8 +ValueContains/385/64,7.74805466417789e-6,7.721763284499517e-6,7.763966815744695e-6,6.777801251717017e-8,4.08171188026541e-8,9.882293596321499e-8 +ValueContains/673/353,4.6341838686586165e-5,4.6311212895047536e-5,4.637183492077027e-5,1.0506475600062532e-7,8.957734767280987e-8,1.2802278643185456e-7 +ValueContains/511/198,2.390855733761964e-5,2.38814495343931e-5,2.3948650874484645e-5,1.0946030684877236e-7,8.908085565499514e-8,1.4821892213027432e-7 +ValueContains/6/1,1.1317010161349713e-6,1.1309473551038157e-6,1.1326926646764181e-6,2.9719045155959497e-9,2.330364579245457e-9,4.155935093861412e-9 +ValueContains/822/771,9.768371059009083e-5,9.743452437032719e-5,9.788744456205933e-5,7.652001393400152e-7,6.300867238839192e-7,9.038849091147273e-7 +ValueContains/729/570,7.144081551631113e-5,7.136014757813718e-5,7.151969808320976e-5,2.7549152332783416e-7,2.402000682376105e-7,3.3906110415291587e-7 +ValueContains/39/11,1.7361726836287664e-6,1.7343794483442224e-6,1.737786568303321e-6,5.499572742184475e-9,4.581780266867155e-9,6.799201170053838e-9 +ValueContains/877/439,5.666896791063339e-5,5.656355691545918e-5,5.678011953960242e-5,3.690237325356119e-7,3.318919295959164e-7,4.3506485375326265e-7 +ValueContains/357/71,8.330962629694244e-6,8.302447542626354e-6,8.358270349621359e-6,9.032096341048718e-8,8.309040100225848e-8,1.031342953359206e-7 +ValueContains/339/68,8.116018986523433e-6,8.10523404400158e-6,8.125076079686777e-6,3.269468669415582e-8,2.615635577482908e-8,4.3638567661550455e-8 +ValueContains/715/340,4.176190505473497e-5,4.1708387255655204e-5,4.180405695636191e-5,1.5892239440176096e-7,1.1161723277904274e-7,2.0858682785502914e-7 +ValueContains/490/308,3.8197328872024964e-5,3.8168497880147454e-5,3.824387604303053e-5,1.231828395974745e-7,8.786983384532117e-8,1.8776318814002678e-7 +ValueContains/621/36,5.086173751509124e-6,5.067248383169797e-6,5.099064227905385e-6,5.0254896231555695e-8,3.491560361041745e-8,6.60132315763994e-8 +ValueContains/559/264,3.263061196347133e-5,3.258382583569215e-5,3.2698636619521704e-5,1.8501918747272185e-7,1.3868482559679668e-7,2.4541904337471965e-7 +ValueContains/830/742,9.49405056504984e-5,9.486552838808328e-5,9.504761681114998e-5,3.009106782028557e-7,2.2317349216305558e-7,3.7849006769252993e-7 +ValueContains/769/45,6.1834744887079476e-6,6.164280262236448e-6,6.198405423915789e-6,5.961556003014913e-8,4.610712304856478e-8,7.579600109532886e-8 +ValueContains/33/0,1.0338072487795843e-6,1.0327222018869905e-6,1.0347649874238654e-6,3.4609890218167838e-9,3.032977845929285e-9,4.047644936976311e-9 +ValueContains/546/409,4.92097780317542e-5,4.898356245425396e-5,4.934018771230623e-5,5.331126914550046e-7,3.6217613825586954e-7,7.60369503016606e-7 +ValueContains/107/71,7.676310738268547e-6,7.666508036223132e-6,7.687719636008446e-6,3.520546673996791e-8,2.6465024289759334e-8,5.093839436347889e-8 +ValueData/1941,8.387752262173192e-7,8.376686255838258e-7,8.400073735002663e-7,4.020454385764875e-9,3.470606263468371e-9,4.6752041166309065e-9 +ValueData/2000,8.322540195518193e-7,8.305743435611061e-7,8.338440124536787e-7,5.404071172923588e-9,4.306863735910936e-9,6.685655745878495e-9 +ValueData/0,8.31573393837921e-7,8.305671564639147e-7,8.329280726144281e-7,4.009153770714728e-9,3.3218857641415508e-9,4.789713248833575e-9 +ValueData/6885,8.29514842393769e-7,8.285383856877524e-7,8.306173625072766e-7,3.4743167183842895e-9,2.993824943684947e-9,4.1748381231296986e-9 +ValueData/8844,8.331476195088214e-7,8.324051165636244e-7,8.338341186226231e-7,2.438191546807027e-9,1.941849764379044e-9,2.9951261601870036e-9 +ValueData/8650,8.366578036420693e-7,8.35550800887162e-7,8.376391842048003e-7,3.338267136918771e-9,2.8949823719768726e-9,4.0143461508323256e-9 +ValueData/4664,8.418122696891194e-7,8.40700613296458e-7,8.426704575855601e-7,3.3930644835116215e-9,2.2932076888010547e-9,4.767064706463744e-9 +ValueData/6305,8.32492304460721e-7,8.313846767488099e-7,8.335616396811857e-7,3.7995765260849544e-9,3.207103155106856e-9,4.4528119843906335e-9 +ValueData/4254,8.350319411885833e-7,8.340854139054343e-7,8.357514429319573e-7,2.727464824562741e-9,2.230461192439293e-9,3.760810744245565e-9 +ValueData/6622,8.350405425148522e-7,8.338761271531292e-7,8.361803594194376e-7,3.9536164005531484e-9,3.178812800090736e-9,5.194382485302705e-9 +ValueData/6540,8.34332794282262e-7,8.333116001217547e-7,8.352917150961382e-7,3.2836096074058877e-9,2.7698266335726123e-9,3.9986996150825906e-9 +ValueData/1270,8.365463724163216e-7,8.359620443598711e-7,8.37225655405291e-7,2.1708725980955994e-9,1.741275617890801e-9,3.0723358950244392e-9 +ValueData/8540,8.409815364580344e-7,8.396697918376053e-7,8.424745205703655e-7,4.5515930054198356e-9,3.864155536239068e-9,5.390591453601316e-9 +ValueData/6510,8.392716815496086e-7,8.378374550756429e-7,8.406303065788314e-7,4.579801306484254e-9,3.759920711302845e-9,5.548214652049327e-9 +ValueData/5536,8.423654989235727e-7,8.408693850168714e-7,8.433620636504498e-7,3.938675709887304e-9,2.8070376211287653e-9,5.1897843673063815e-9 +ValueData/1635,8.385893749754568e-7,8.374280751825027e-7,8.398617220820674e-7,3.785805413815959e-9,3.253408379375065e-9,4.579918632882875e-9 +ValueData/1753,8.409021120843092e-7,8.393805110411337e-7,8.421971456346483e-7,4.8032077313522935e-9,3.755056666093694e-9,6.622344120588143e-9 +ValueData/5019,8.335625134669134e-7,8.32407353074573e-7,8.347710607133375e-7,4.018083860674284e-9,3.517263807477489e-9,4.647793376085316e-9 +ValueData/2134,8.401122036017365e-7,8.383608700143568e-7,8.416471977149004e-7,5.528733190366616e-9,4.51483061617216e-9,6.980519090018202e-9 +ValueData/4194,8.33292241623575e-7,8.321282013565772e-7,8.3456401864188e-7,4.107488449226073e-9,3.4630965240138083e-9,5.0850059435575865e-9 +ValueData/9084,8.356139951464328e-7,8.346254801235196e-7,8.366052021268458e-7,3.4498181857075116e-9,2.975555013127329e-9,4.048483887162339e-9 +ValueData/8364,8.375175382011173e-7,8.367279330852438e-7,8.381127388871311e-7,2.4332355878444734e-9,1.9991773636650093e-9,3.020278336783247e-9 +ValueData/9954,8.373226411796403e-7,8.361024817567919e-7,8.386233929091458e-7,4.44069868276324e-9,3.85771829896204e-9,5.116021442678933e-9 +ValueData/8310,8.388047039077717e-7,8.375584944535449e-7,8.398229796955824e-7,3.9169228322598055e-9,3.252727724712321e-9,5.0867510890898785e-9 +ValueData/7384,8.39841993411221e-7,8.379546196613622e-7,8.412325558373902e-7,5.456162725810785e-9,4.3541469710001696e-9,7.462510369440222e-9 +ValueData/4386,8.301009904872918e-7,8.294562414819147e-7,8.308735521056946e-7,2.3111670011305605e-9,1.94143246529015e-9,2.7954140063618506e-9 +ValueData/9576,8.3667925272833e-7,8.358636799563891e-7,8.374470539262934e-7,2.6926890900601303e-9,2.2720211887637413e-9,3.2621259284214814e-9 +ValueData/1615,8.364218240795162e-7,8.352173807837971e-7,8.374431689807868e-7,3.5234121483467313e-9,2.681563298451633e-9,4.6946047721539116e-9 +ValueData/1875,8.352023014420669e-7,8.342853656087835e-7,8.361405240348041e-7,3.1101227132521614e-9,2.4072751555360205e-9,4.5068970227212614e-9 +ValueData/2098,8.388958444663236e-7,8.376681717051945e-7,8.401282315340499e-7,4.113696626399191e-9,3.658549931706673e-9,4.742350771644683e-9 +ValueData/7744,8.398266499360501e-7,8.386029672759127e-7,8.41109848911013e-7,4.21864404056369e-9,3.5761151444053862e-9,5.104340611901284e-9 +ValueData/3984,8.419157577957931e-7,8.41304210462777e-7,8.425022896365757e-7,2.120647482361822e-9,1.6647273733427055e-9,2.8470709443673356e-9 +ValueData/3822,8.358104581912816e-7,8.347139639053743e-7,8.369173748677629e-7,3.780469750413172e-9,3.3698296242027956e-9,4.388236019750637e-9 +ValueData/9900,8.378043758320432e-7,8.370874075094684e-7,8.385563775974238e-7,2.446081799733024e-9,1.896867953109357e-9,3.266658948999801e-9 +ValueData/3634,8.344762388197288e-7,8.333884176581674e-7,8.354885395908894e-7,3.522452710390855e-9,2.5437556823120402e-9,5.3510925281183795e-9 +ValueData/4176,8.415502200051467e-7,8.405700337004257e-7,8.424037753511901e-7,3.220023157803172e-9,2.7757516631232756e-9,3.7130215644474817e-9 +ValueData/8976,8.324601172507377e-7,8.314184311338586e-7,8.336025764102034e-7,3.750395460724587e-9,3.0077318389983098e-9,4.997606953497009e-9 +ValueData/5195,8.324532554754436e-7,8.315343193196015e-7,8.334226112545619e-7,3.0463058908939722e-9,2.5848948386127766e-9,3.766680584328569e-9 +ValueData/5997,8.365567725045184e-7,8.353939195210685e-7,8.375233208849925e-7,3.829083435768043e-9,3.1480680888722656e-9,4.825609716608673e-9 +ValueData/5673,8.424262030743452e-7,8.411981112308312e-7,8.435268708809851e-7,4.117262552354002e-9,3.429719021938191e-9,5.025514315124536e-9 +ValueData/2870,8.366278539527911e-7,8.353542095371855e-7,8.376704537060956e-7,4.0912042751821355e-9,3.2945986510002754e-9,5.382870126171436e-9 +ValueData/5480,8.392537677420053e-7,8.380840451981039e-7,8.405808501846953e-7,4.3344666748576335e-9,3.81816194417312e-9,4.899004883640096e-9 +ValueData/2864,8.348026388901912e-7,8.338353878325827e-7,8.356921706417601e-7,2.9877535567747168e-9,2.419844138773851e-9,4.0486220967338086e-9 +ValueData/700,8.404414778321529e-7,8.39497280471034e-7,8.413703924312429e-7,3.093701967901761e-9,2.5779828745070615e-9,3.739522901298385e-9 +ValueData/9375,8.370834463044272e-7,8.358418508706125e-7,8.380123466730037e-7,3.7220681847226143e-9,3.0685992276164977e-9,4.6420747089375386e-9 +ValueData/5830,8.38780017135666e-7,8.370267017098541e-7,8.404221717245874e-7,5.967311311748044e-9,4.9882472201377384e-9,7.252755778135929e-9 +ValueData/7990,8.338220947350692e-7,8.324232287265252e-7,8.350276199234528e-7,4.291233338424656e-9,3.6991112472179096e-9,5.2369167046409795e-9 +ValueData/9480,8.329439245099394e-7,8.317173665699352e-7,8.342813001251117e-7,4.374561693486165e-9,3.777680316896052e-9,5.098191936338214e-9 +ValueData/4070,8.34373930668038e-7,8.323351633549734e-7,8.360623368587632e-7,6.253473554854086e-9,5.401920762979302e-9,8.171949426734792e-9 +ValueData/7936,8.351047831823975e-7,8.345660183335185e-7,8.357312913877325e-7,1.9897674473323784e-9,1.6273133964700012e-9,2.518573829226464e-9 +ValueData/5352,8.351668119052894e-7,8.343281559667683e-7,8.362960894154265e-7,3.3490874760544233e-9,2.7230079552229427e-9,4.3859056308964615e-9 +ValueData/5510,8.377285748061361e-7,8.36948773788004e-7,8.387137695082959e-7,2.7876188073474483e-9,2.2099531740589857e-9,3.404014390886362e-9 +ValueData/7950,8.328740324787229e-7,8.315784799218212e-7,8.341896767184285e-7,4.2688565605961065e-9,3.573447518123807e-9,5.221559814082403e-9 +ValueData/594,8.381000382748028e-7,8.373873992419389e-7,8.388585107443581e-7,2.5150159596132567e-9,2.124686313262623e-9,3.1219506021078784e-9 +ValueData/1692,8.376725040269819e-7,8.365737546841149e-7,8.385372680814671e-7,3.201457196798607e-9,2.5842218640780455e-9,4.522075895654974e-9 +ValueData/2316,8.383448166141738e-7,8.372885742115963e-7,8.394697354649611e-7,3.753779166872338e-9,3.2126295526346085e-9,4.3699063795463045e-9 +ValueData/5871,8.371559992685962e-7,8.362011171199473e-7,8.381197055090797e-7,3.386683759937313e-9,2.687476576372051e-9,4.219179793109144e-9 +ValueData/4981,8.377418995882392e-7,8.364121292539217e-7,8.387475403975099e-7,3.770172591089419e-9,3.306613201770207e-9,4.388658987507912e-9 +ValueData/1711,8.326619851790449e-7,8.31584480559957e-7,8.340143025074426e-7,4.068832408213994e-9,3.3483009758729117e-9,5.047294683033139e-9 +ValueData/1941,8.34420654982373e-7,8.33296536028821e-7,8.365066109085264e-7,4.703537367430274e-9,3.076495008910303e-9,8.07414991552736e-9 +ValueData/7199,8.325854020948367e-7,8.308856498644506e-7,8.347451269188973e-7,6.2757408369399914e-9,5.029059627224423e-9,9.093103431559232e-9 +ValueData/6544,8.395143237223777e-7,8.388009223150784e-7,8.400591071526046e-7,2.1928427190413032e-9,1.6772280987728755e-9,2.7416711433989424e-9 +ValueData/8960,8.357252383066144e-7,8.337595990205464e-7,8.378002793806224e-7,7.0971646222460524e-9,6.173896946948765e-9,8.585334198457132e-9 +ValueData/8820,8.382582274604227e-7,8.370296958284523e-7,8.391900469548001e-7,3.304747031660648e-9,2.5082513849019437e-9,4.472685382654789e-9 +ValueData/5112,8.359538965469061e-7,8.340256074730793e-7,8.375218938635833e-7,5.634474458083705e-9,4.207745573796549e-9,7.520509415030913e-9 +ValueData/2400,8.406256463414971e-7,8.399135612088387e-7,8.413697124033191e-7,2.408366999935758e-9,2.0373988195212507e-9,2.9388726084622506e-9 +ValueData/3522,8.423525034085027e-7,8.417620179138558e-7,8.438579085375574e-7,2.9799893770795812e-9,1.3514173911562318e-9,5.752330895015203e-9 +ValueData/7495,8.416950572881169e-7,8.412277412197716e-7,8.42175013977484e-7,1.6601823987704058e-9,1.3633579394695858e-9,2.2294025196325265e-9 +ValueData/729,8.386848923985363e-7,8.372054638681145e-7,8.401518798364648e-7,4.723894707305233e-9,4.035285656725761e-9,5.983409245379266e-9 +ValueData/8355,8.433896499502169e-7,8.421845735380779e-7,8.442691936033377e-7,3.581560019120775e-9,2.7069065063395356e-9,4.34612314907716e-9 +ValueData/1560,8.325979813593434e-7,8.317735269484078e-7,8.332711680206804e-7,2.5336042895971067e-9,1.9642864882029463e-9,3.321366905269596e-9 +ValueData/9810,8.382607731070009e-7,8.37402693374031e-7,8.389349214230364e-7,2.620427614756948e-9,2.0139474989398623e-9,3.5605109193646948e-9 +ValueData/7792,8.386520919083992e-7,8.375785006331599e-7,8.399311422119077e-7,3.8335408108746935e-9,3.197788323642262e-9,4.509474485836322e-9 +ValueData/1768,8.37177034800015e-7,8.355200143658817e-7,8.385781951493179e-7,5.696059148448666e-9,4.944666725932653e-9,6.435786359033507e-9 +ValueData/8904,8.37561944754926e-7,8.358270903349553e-7,8.391227184328719e-7,5.734927722091681e-9,5.125705496012834e-9,6.5508645430592855e-9 +ValueData/5202,8.3884293186121e-7,8.376477955599056e-7,8.402992019363483e-7,4.481004399037952e-9,3.5873648067622646e-9,5.420102259022315e-9 +ValueData/2864,8.40807004743901e-7,8.398791171715837e-7,8.416920670848748e-7,3.0275542319834136e-9,2.4545506709474107e-9,3.780340457296787e-9 +ValueData/7182,8.369635335017396e-7,8.360299799213076e-7,8.378068854603287e-7,2.9869973933931754e-9,2.5611399543153348e-9,3.496732958365708e-9 +ValueData/7504,8.356224995372052e-7,8.34468006785183e-7,8.368345168327047e-7,4.2318932533542994e-9,3.4529268784708976e-9,5.1218370440289145e-9 +ValueData/8232,8.367310527121842e-7,8.354750742589766e-7,8.381825868430217e-7,4.502714393308228e-9,3.907530364548524e-9,5.213586145565488e-9 +ValueData/4117,8.329982103466795e-7,8.312891431120254e-7,8.344881946662451e-7,5.388682825972106e-9,4.596259057024854e-9,6.2857283079668985e-9 +ValueData/9804,8.320745740627178e-7,8.30549311744676e-7,8.332566524130799e-7,4.522624601862358e-9,3.505739441552438e-9,5.9028544664321545e-9 +ValueData/6856,8.406889551780186e-7,8.394190297526501e-7,8.418911384286505e-7,4.207763430544847e-9,3.6494541844959566e-9,4.907526724459514e-9 +ValueData/3660,8.351936340212622e-7,8.34416030572947e-7,8.358269980294925e-7,2.4935077036615e-9,1.7741364739057732e-9,3.729635705740102e-9 +ValueData/2000,8.409432284106983e-7,8.40417934972006e-7,8.414756878735404e-7,1.8062092738947183e-9,1.4503154062496423e-9,2.2297719227522914e-9 +ValueData/2276,8.360939172543648e-7,8.354818464050811e-7,8.366954552444591e-7,2.051197288227619e-9,1.650130275824902e-9,2.701629763594077e-9 +ValueData/6828,8.381476742374998e-7,8.373071884940311e-7,8.398144469590848e-7,3.787382485161911e-9,2.5008391649244827e-9,6.832654612270623e-9 +ValueData/2487,8.38208535156962e-7,8.372724043665353e-7,8.389757242876525e-7,2.8177395190889856e-9,2.272123498120574e-9,3.7078569845391026e-9 +ValueData/9475,8.413053588094756e-7,8.403418208016074e-7,8.422703191277657e-7,3.2071357987514714e-9,2.809217927142389e-9,3.856421519957299e-9 +ValueData/2499,8.370817111893778e-7,8.36076146943979e-7,8.380402138977979e-7,3.2955457149092334e-9,2.6854298497797775e-9,4.085080597511424e-9 +ValueData/4164,8.344288899488048e-7,8.338899463176719e-7,8.350177795686771e-7,1.8947226063671535e-9,1.5461681416835568e-9,2.4002180161987975e-9 +ValueData/1251,8.36351867693371e-7,8.352962048254115e-7,8.374958825720117e-7,3.972930848865848e-9,3.331460145885729e-9,5.174365866694995e-9 +ValueData/7945,8.368397645610792e-7,8.353202405825947e-7,8.382007276500436e-7,4.926855468639106e-9,4.250448494055312e-9,6.196316804995193e-9 +ValueData/1868,8.408454076609571e-7,8.396328474578161e-7,8.418492609746534e-7,3.703854599156288e-9,3.0605480258118053e-9,5.19967315509138e-9 +ValueData/1960,8.361057748327629e-7,8.35131160229261e-7,8.368536603642068e-7,2.8544724109148102e-9,2.135551075078309e-9,4.285767796982552e-9 +ValueData/5226,8.343183036041265e-7,8.32770149992052e-7,8.354898921556298e-7,4.492661842348072e-9,3.73670007266658e-9,5.5591174232754295e-9 +ValueData/3518,8.393781858382187e-7,8.383410042630874e-7,8.402695949107576e-7,3.2619700141869255e-9,2.8677663582665026e-9,3.770802078364234e-9 +ValueData/2562,8.370777515311767e-7,8.357240976106221e-7,8.38179350989685e-7,4.113977216035361e-9,3.3791429619017117e-9,5.251695159806253e-9 +ValueData/5496,8.382060782117956e-7,8.375323802162929e-7,8.38959264848197e-7,2.4090355145714073e-9,1.973936795723988e-9,3.391919039493966e-9 +ValueData/9339,8.34795044054002e-7,8.329299730423787e-7,8.364161999822072e-7,5.7763398579437784e-9,4.766022675259715e-9,6.9076581153198704e-9 +ValueData/2864,8.328964421348432e-7,8.314239677537237e-7,8.343189980639102e-7,5.0833557275178795e-9,4.274086305451904e-9,6.142112513069321e-9 +ValueData/1900,8.384278803266784e-7,8.369656200876953e-7,8.396308925938925e-7,4.126903818689325e-9,3.527244027197584e-9,4.932001047959768e-9 +ValueData/5589,8.377079046450717e-7,8.368594324523834e-7,8.383722623705767e-7,2.402563226423986e-9,1.9881881780153043e-9,3.11428090915238e-9 +UnValueData/22376,7.421200426754996e-4,7.416428056441595e-4,7.426275637261736e-4,1.618470727857722e-6,1.119154973936534e-6,2.2284151150612583e-6 +UnValueData/44004,9.752194991341577e-4,9.70242781020241e-4,9.88550720820054e-4,2.5562929233020568e-5,1.0172235253595569e-5,5.009686495907773e-5 +UnValueData/4,9.031880206532238e-7,9.024867066813983e-7,9.038512964783734e-7,2.2779415805598512e-9,1.9330658475996908e-9,2.823701837893953e-9 +UnValueData/99148,1.7372247273557187e-3,1.7236489032043454e-3,1.7473127603126722e-3,4.0709483178223295e-5,2.7443070692718858e-5,6.032531559827614e-5 +UnValueData/120872,2.1971704192794454e-3,2.1846033356544042e-3,2.209549962189362e-3,4.2887572549396306e-5,3.131459331505633e-5,6.341872205189448e-5 +UnValueData/108994,1.9968452458145347e-3,1.982218501404123e-3,2.0086924659643733e-3,4.344312899503325e-5,3.417864044001072e-5,5.909021943843239e-5 +UnValueData/58516,8.869363453352061e-4,8.818005803758033e-4,8.938265298498102e-4,1.8646987297631373e-5,1.3513862177297127e-5,2.6258428695496557e-5 +UnValueData/94579,1.5253829399388672e-3,1.5148647962795006e-3,1.5350643147316037e-3,3.380509925896022e-5,2.517743742587705e-5,4.499318549827737e-5 +UnValueData/56724,8.61190047595927e-4,8.573303735309086e-4,8.677646498079696e-4,1.5711098237619346e-5,1.1126188128454506e-5,2.4111849467603484e-5 +UnValueData/84198,1.4340395042022227e-3,1.4252777458105134e-3,1.441588827566473e-3,2.817282049227448e-5,2.077888593909089e-5,3.690069943674093e-5 +UnValueData/96469,1.7644357560926119e-3,1.7541672060520435e-3,1.7709464762463785e-3,2.7221600004773705e-5,1.8710355230176758e-5,4.631674441883908e-5 +UnValueData/20959,3.520130937805805e-4,3.518225285954121e-4,3.5222303605062297e-4,7.044144969363906e-7,5.857626946070411e-7,8.446906572804479e-7 +UnValueData/102484,2.0494570089101692e-3,2.0344610045422563e-3,2.062304780978206e-3,4.853352510204659e-5,3.736280004697441e-5,6.491178967871481e-5 +UnValueData/74218,1.5027578985805348e-3,1.4919247192157513e-3,1.5126586152322515e-3,3.485103126831253e-5,2.7829014401653502e-5,4.330864718301447e-5 +UnValueData/83044,1.4012482311208223e-3,1.3907994192033063e-3,1.4090565624794672e-3,3.0372730747729505e-5,2.309532849479042e-5,3.982256405607541e-5 +UnValueData/40879,7.63421038808352e-4,7.629229569211526e-4,7.639476900210501e-4,1.7529906456607992e-6,1.3506111852265198e-6,2.4080358073165134e-6 +UnValueData/40323,8.114560809851225e-4,8.102655286971506e-4,8.126367898164435e-4,4.150915145980708e-6,3.451407406930695e-6,4.923278915085261e-6 +UnValueData/68836,1.0176991337375368e-3,1.010822483610499e-3,1.0239097150976566e-3,2.2580457346042606e-5,1.8755418111238122e-5,2.8198572126160436e-5 +UnValueData/38416,6.230754570381371e-4,6.224494732616555e-4,6.252314734080496e-4,3.3666779399156104e-6,1.0956346916332748e-6,7.463803269612873e-6 +UnValueData/57322,8.342361632782373e-4,8.304598524395692e-4,8.397063994572915e-4,1.5128542915078105e-5,1.0804816364731625e-5,2.150996132931944e-5 +UnValueData/118096,2.2774391188435943e-3,2.2660369190164328e-3,2.289655714688053e-3,3.8840218100442357e-5,3.1138130274196154e-5,5.287919464167745e-5 +UnValueData/98896,1.8965505545082042e-3,1.883947908063852e-3,1.9059572471519374e-3,3.5670782836814364e-5,2.4848071851520478e-5,5.0943520894313e-5 +UnValueData/140782,2.4357013059088765e-3,2.418772849821058e-3,2.4484485010813047e-3,5.1500639790243616e-5,3.611692039107798e-5,7.5902785702779e-5 +UnValueData/95314,3.0404083478266218e-3,3.0235195380633162e-3,3.0545759472912814e-3,5.034938132231567e-5,3.722883309564973e-5,6.676438132959915e-5 +UnValueData/105226,2.0413316652818565e-3,2.0299954004261555e-3,2.0500597451644496e-3,3.3793251154029966e-5,2.4907835447547755e-5,5.154585227965111e-5 +UnValueData/54442,8.166557945972146e-4,8.140728449658061e-4,8.213029717174296e-4,1.1200704150352004e-5,7.922837212571557e-6,1.6420827716887007e-5 +UnValueData/115980,2.24432280514845e-3,2.2269472947579715e-3,2.2560857447788004e-3,4.690382651785491e-5,3.034123217425462e-5,7.053597723180721e-5 +UnValueData/40379,7.490679421292859e-4,7.48465872530782e-4,7.496409448816867e-4,2.0119614616521805e-6,1.6761439003368673e-6,2.5363903594886133e-6 +UnValueData/22204,3.507515280974552e-4,3.5053583113833764e-4,3.509871498207404e-4,7.691591868089543e-7,6.161234217644561e-7,1.1683559653931458e-6 +UnValueData/38817,6.123660306627727e-4,6.119872891857597e-4,6.127745121042849e-4,1.3486683732646652e-6,1.1876462650053216e-6,1.5630619906889284e-6 +UnValueData/110356,2.147046947879692e-3,2.137758760089643e-3,2.1668853908749014e-3,4.141095353389672e-5,2.6401162161912093e-5,6.983819474110691e-5 +UnValueData/59764,8.995106566583074e-4,8.961217475105262e-4,9.048792635628581e-4,1.4978628506703936e-5,1.159638971105037e-5,2.1388399973923345e-5 +UnValueData/66889,1.2554281647708817e-3,1.2486984108848e-3,1.2617795286541651e-3,2.2561352337852067e-5,1.843106095472025e-5,2.8106029313220262e-5 +UnValueData/122929,2.294232093512359e-3,2.2797197465982836e-3,2.304078586424263e-3,3.8573309208602175e-5,2.8169336148969128e-5,6.404016421537466e-5 +UnValueData/58148,1.1865973544485811e-3,1.1812025004291475e-3,1.1920236964037259e-3,1.8252574505657322e-5,1.5202792816545517e-5,2.2484837641806886e-5 +UnValueData/64036,1.104272031821415e-3,1.099907540642945e-3,1.110400038583784e-3,1.7138929972241082e-5,1.3445811943447424e-5,2.3596734808493165e-5 +UnValueData/106660,2.1842916013874837e-3,2.1715566552376656e-3,2.193153535734978e-3,3.533307722326201e-5,2.393995862586544e-5,5.4029244496444345e-5 +UnValueData/72734,1.1831440558100871e-3,1.177289258479852e-3,1.188136182257833e-3,1.7838094698077584e-5,1.3376075820507552e-5,2.463584511422848e-5 +UnValueData/95956,1.7919572072156457e-3,1.7852120384147956e-3,1.7980060233204211e-3,2.205070352133155e-5,1.8711316601519274e-5,2.6377364106137857e-5 +UnValueData/85099,1.6688221461376605e-3,1.6611900462708412e-3,1.6751161023579745e-3,2.3005426976461482e-5,1.7382069343962102e-5,3.3593241912824694e-5 +UnValueData/33952,5.698903839261548e-4,5.696797720261617e-4,5.701359864876958e-4,7.639939829081379e-7,5.748044462372407e-7,1.265399491502595e-6 +UnValueData/78094,1.3687549337281165e-3,1.3636018099444252e-3,1.3719665834781092e-3,1.4578068228108124e-5,1.0652989478358822e-5,2.121345967759404e-5 +UnValueData/41532,5.989097329589173e-4,5.984493191244412e-4,5.99601898998502e-4,1.793088290035404e-6,1.2103399803641419e-6,2.8109706946325956e-6 +UnValueData/16104,2.8889670869707284e-4,2.8872510325033817e-4,2.891472737840334e-4,6.372416658547042e-7,4.870666207369253e-7,9.499970339329436e-7 +UnValueData/135004,2.4623369569698812e-3,2.4481355923715855e-3,2.4710581758255845e-3,3.573333001335653e-5,2.5115204726074637e-5,5.688717781195078e-5 +UnValueData/70494,1.1721062890500313e-3,1.1677861149947033e-3,1.1757952364250337e-3,1.3439445311404506e-5,1.0077305740048964e-5,1.8624385303226868e-5 +UnValueData/93334,2.0263289846573843e-3,2.0189810955473747e-3,2.0334266698568693e-3,2.4069742899737522e-5,1.8944699565378286e-5,3.393083467763085e-5 +UnValueData/127984,2.228479247756745e-3,2.2199068225701494e-3,2.2381643711436466e-3,2.952773653892638e-5,2.4159957252215307e-5,3.769328846784343e-5 +UnValueData/58612,8.527413573793342e-4,8.49843157022476e-4,8.566529853102303e-4,1.0652623263133475e-5,8.17263626328061e-6,1.4389544992830078e-5 +UnValueData/113092,2.2205466636673085e-3,2.2133237335796646e-3,2.2276326297637926e-3,2.359033382196869e-5,1.8623158039168372e-5,3.059724018514214e-5 +UnValueData/70249,1.0662874483376406e-3,1.061674687599265e-3,1.0699330540558014e-3,1.3446724058680388e-5,1.0272851586948794e-5,1.7332033060865378e-5 +UnValueData/71634,1.2563214360483182e-3,1.2514306140931828e-3,1.2600223756423707e-3,1.3715305184048985e-5,1.004529646745738e-5,2.0456459494044575e-5 +UnValueData/119254,2.042838442022639e-3,2.034923002946453e-3,2.049692031783017e-3,2.4595452815850463e-5,2.0087523364163428e-5,3.0713053843093845e-5 +UnValueData/8122,1.0379285529081011e-4,1.0374224820538768e-4,1.0387012001140512e-4,2.0902447372235444e-7,1.572780712960494e-7,3.213969891093161e-7 +UnValueData/24961,3.4220775007220375e-4,3.419925858033342e-4,3.4246121538051097e-4,8.110718448242615e-7,5.936537080088324e-7,1.2484623255378587e-6 +UnValueData/27796,4.0739491080275185e-4,4.073038803230466e-4,4.075800047058383e-4,4.1466310029379703e-7,2.787530663091774e-7,7.348478822221948e-7 +UnValueData/91983,1.7489118893666022e-3,1.7430414332084488e-3,1.7571101107013605e-3,2.3059812724674927e-5,1.778387720885101e-5,3.203240830843041e-5 +UnValueData/60655,9.685841422408741e-4,9.65481439386459e-4,9.715963782838009e-4,1.0163172469568118e-5,7.854985865605189e-6,1.2594377322956898e-5 +UnValueData/39357,8.046673998549543e-4,8.03902338859006e-4,8.055739846338962e-4,2.7924414350489803e-6,2.1333416495816166e-6,3.703898622015749e-6 +UnValueData/31060,4.446328455282845e-4,4.44324893373553e-4,4.4495290629429583e-4,1.0838910174016887e-6,9.036188905420614e-7,1.258592828792615e-6 +UnValueData/86705,1.6030445099572662e-3,1.5975630381518163e-3,1.6090392492385107e-3,1.8537210014705837e-5,1.4476201063547588e-5,2.362336519050719e-5 +UnValueData/88348,1.756177678199867e-3,1.7485827542328882e-3,1.7624776067164895e-3,2.3521131714108994e-5,1.8221357789583324e-5,3.0048529285579724e-5 +UnValueData/108868,2.061057230148077e-3,2.052324924927711e-3,2.0674276070116585e-3,2.4313680890602197e-5,1.8180253287420174e-5,3.156219421617869e-5 +UnValueData/112144,2.1605554006690637e-3,2.1508506459343465e-3,2.167211514233533e-3,2.6871849928505086e-5,2.0069787755797843e-5,3.4642208957669565e-5 +UnValueData/63620,1.0050758761524974e-3,1.0016816092430268e-3,1.0083899330844278e-3,1.162636073266794e-5,8.994263419285178e-6,1.5338343984582956e-5 +UnValueData/27892,5.084278272769121e-4,5.081971404042432e-4,5.087179650206601e-4,8.7548579173851e-7,6.747468191836457e-7,1.105530677260429e-6 +UnValueData/58117,1.1174491246473926e-3,1.1141944619096449e-3,1.1202415595773039e-3,1.010350449973907e-5,7.816014443637864e-6,1.3635807860975118e-5 +UnValueData/103435,1.9574159168085034e-3,1.9507918194217116e-3,1.9628592176852066e-3,2.0312661411672896e-5,1.550577784730252e-5,2.894567958091448e-5 +UnValueData/16771,3.035635794947129e-4,3.032293223274021e-4,3.0392799224594476e-4,1.2017444582390632e-6,9.693930235493743e-7,1.7643896527857206e-6 +UnValueData/113632,2.2001086638832328e-3,2.192318228201149e-3,2.206766063561452e-3,2.3261475915320868e-5,1.6351386604141966e-5,3.214750328465441e-5 +UnValueData/28084,4.3082841087667726e-4,4.3056110919328043e-4,4.312014890638698e-4,1.0250562718360542e-6,8.223657970805335e-7,1.2643459272646728e-6 +UnValueData/124264,2.319359186968365e-3,2.311460672824423e-3,2.3254929300151168e-3,2.3763994467921226e-5,1.4873701294956682e-5,3.460158888652846e-5 +UnValueData/111040,2.1723500127761976e-3,2.1665219893006985e-3,2.177716049148003e-3,1.8723300033436836e-5,1.5370482843544153e-5,2.282930974578789e-5 +UnValueData/31828,4.937808104197363e-4,4.936266030279008e-4,4.939314223810301e-4,5.079386710089089e-7,4.0200058590000033e-7,6.195883005782201e-7 +UnValueData/103884,2.2406914436354252e-3,2.2331722322211783e-3,2.2469939361080718e-3,2.2870443822392903e-5,1.4581450278541387e-5,3.194751684620029e-5 +UnValueData/86704,1.4820821123708225e-3,1.478094930140025e-3,1.4857154916289121e-3,1.273593030560464e-5,9.485220643678573e-6,1.8211719396232393e-5 +UnValueData/48692,8.641241877896636e-4,8.625444041434758e-4,8.665207747690758e-4,6.379899725768069e-6,5.222078212017671e-6,8.228668183472541e-6 +UnValueData/94396,1.6881749290128963e-3,1.6830457889124518e-3,1.6929035394773453e-3,1.623966964006329e-5,1.3462828904696957e-5,2.3383446370323743e-5 +UnValueData/89784,1.7633192585197837e-3,1.7572198082323365e-3,1.7681446756613785e-3,1.8907228488513917e-5,1.4752010112136147e-5,2.6128397541920794e-5 +UnValueData/101728,1.9975089978388908e-3,1.9909021647065432e-3,2.0021480675309726e-3,1.771749850261029e-5,1.3404069495326329e-5,2.5418378124500674e-5 +UnValueData/49945,7.849266669143169e-4,7.834139627434871e-4,7.872348246164918e-4,6.323988998414543e-6,4.693561849181013e-6,9.042513472221054e-6 +UnValueData/116835,2.240307989065085e-3,2.233667225272249e-3,2.24557012387922e-3,2.0272416550369263e-5,1.600981412761065e-5,2.691641925552508e-5 +UnValueData/91703,1.5098907339468675e-3,1.5061483048317665e-3,1.5129747515131916e-3,1.1236990000337902e-5,8.715996108608375e-6,1.4064251549736004e-5 +UnValueData/42948,8.191806715903273e-4,8.184278896789901e-4,8.200623868809728e-4,2.7209890521151274e-6,2.20424491530947e-6,3.977643874849939e-6 +UnValueData/30004,4.0692431345782574e-4,4.065352991557556e-4,4.0793855424249353e-4,2.0405998059481094e-6,8.935181414233344e-7,4.0062397413738955e-6 +UnValueData/39834,6.59799011546327e-4,6.591005960279854e-4,6.61611146355662e-4,3.5256912929599506e-6,1.5171470525948529e-6,6.828864255823176e-6 +UnValueData/85354,1.4609374864189167e-3,1.457525090547844e-3,1.4643260827067323e-3,1.1109623387606443e-5,9.349837333336709e-6,1.3461010779292271e-5 +UnValueData/36480,5.862064376762051e-4,5.859379888657056e-4,5.864809828006501e-4,9.18968848061483e-7,7.415774059952647e-7,1.1700154941372756e-6 +UnValueData/126969,2.5025949834716803e-3,2.4980775765802445e-3,2.5072968721243103e-3,1.5069763463696404e-5,1.200853670156037e-5,1.861281499029153e-5 +UnValueData/29551,4.4896543710844076e-4,4.4876775810096024e-4,4.4915843428038066e-4,6.840072121168805e-7,5.925785281280248e-7,8.277218096237322e-7 +UnValueData/52054,8.351957246086397e-4,8.334351952327325e-4,8.369956540229882e-4,6.036937323460686e-6,4.655346797125849e-6,7.861242204547471e-6 +UnValueData/30028,5.614428429098794e-4,5.611714324911451e-4,5.617050968172946e-4,8.938636446274248e-7,7.238539642303035e-7,1.1281691685925724e-6 +UnValueData/104424,1.9792933211745566e-3,1.975939263329213e-3,1.9827172959429877e-3,1.1082815616029916e-5,8.972843198234064e-6,1.387967675831269e-5 +UnValueData/30826,5.282847063918238e-4,5.280683128649347e-4,5.284834249109084e-4,7.094847574592376e-7,6.017332120300611e-7,8.731640271230725e-7 +UnValueData/27052,3.771485865539376e-4,3.769194976000054e-4,3.7746476934006143e-4,9.156609792885425e-7,6.156285985631137e-7,1.4670632566508142e-6 +UnValueData/65932,1.0362293976383628e-3,1.0336976553321116e-3,1.038560109151179e-3,8.106524723052931e-6,6.605223083302124e-6,1.0217846256777914e-5 +UnValueData/59810,1.1336749801983102e-3,1.1315389807677473e-3,1.138024098113717e-3,9.929216060299778e-6,6.0768071762777275e-6,1.722352340194988e-5 +UnValueData/39288,6.032866557910206e-4,6.030522983141428e-4,6.035128667876988e-4,7.895483612989754e-7,6.316918807245071e-7,1.0433404956330073e-6 +UnValueData/76948,1.3996576254802408e-3,1.397369416992624e-3,1.4016926848061705e-3,7.46309320159105e-6,5.752289158405515e-6,1.0601798536501387e-5 +UnValueData/108110,2.32499218060711e-3,2.320607776305041e-3,2.3286617681278748e-3,1.3622710453752738e-5,9.98280093707463e-6,1.974862114092385e-5 +UnValueData/50124,8.712359758511514e-4,8.698616843356624e-4,8.729368161369402e-4,4.92330567016813e-6,3.4569482176385953e-6,6.892058974536296e-6 +UnValueData/23104,3.4557003758125393e-4,3.4533296501842157e-4,3.457951999251937e-4,7.598629949436389e-7,6.159348054605403e-7,9.683799591585357e-7 +UnValueData/87565,1.6645047913005804e-3,1.66032055907469e-3,1.6679725030468316e-3,1.3415704838469695e-5,1.040132563403983e-5,1.777423352672436e-5 From 5b60cfc6e148845de311c4baf6ff501f0af8ec91 Mon Sep 17 00:00:00 2001 From: Yura Lazaryev Date: Tue, 30 Sep 2025 12:15:48 +0200 Subject: [PATCH 08/12] feat(cost-model): apply statistical models from updated Value benchmarks Update cost parameters for Value builtin functions based on newly generated statistical models from benchmark data: - lookupCoin: Reduced base cost from 284421 to 272043 CPU units - valueContains: Dramatically reduced from 42125119 to 6684283 CPU units - valueData: Slight increase from 164963 to 167190 CPU units - unValueData: Reduced base cost from 10532326261 to 1000 CPU units These updates replace placeholder costs with parameter-driven models derived from benchmarking, making Value operations significantly more efficient on-chain while maintaining conservative safety margins. --- plutus-core/cost-model/data/builtinCostModelA.json | 14 +++++++------- plutus-core/cost-model/data/builtinCostModelB.json | 14 +++++++------- plutus-core/cost-model/data/builtinCostModelC.json | 14 +++++++------- 3 files changed, 21 insertions(+), 21 deletions(-) diff --git a/plutus-core/cost-model/data/builtinCostModelA.json b/plutus-core/cost-model/data/builtinCostModelA.json index cc018476137..ab348fa63d0 100644 --- a/plutus-core/cost-model/data/builtinCostModelA.json +++ b/plutus-core/cost-model/data/builtinCostModelA.json @@ -1209,8 +1209,8 @@ "lookupCoin": { "cpu": { "arguments": { - "intercept": 284421, - "slope": 1 + "intercept": 272043, + "slope": 16 }, "type": "linear_in_z" }, @@ -1222,8 +1222,8 @@ "valueContains": { "cpu": { "arguments": { - "intercept": 42125119, - "slope": 30 + "intercept": 6684283, + "slope": 1000 }, "type": "added_sizes" }, @@ -1234,7 +1234,7 @@ }, "valueData": { "cpu": { - "arguments": 164963, + "arguments": 167190, "type": "constant_cost" }, "memory": { @@ -1245,8 +1245,8 @@ "unValueData": { "cpu": { "arguments": { - "intercept": 10532326261, - "slope": 431 + "intercept": 1000, + "slope": 19835 }, "type": "linear_in_x" }, diff --git a/plutus-core/cost-model/data/builtinCostModelB.json b/plutus-core/cost-model/data/builtinCostModelB.json index f0bb76c2c88..1f6f57ac420 100644 --- a/plutus-core/cost-model/data/builtinCostModelB.json +++ b/plutus-core/cost-model/data/builtinCostModelB.json @@ -1209,8 +1209,8 @@ "lookupCoin": { "cpu": { "arguments": { - "intercept": 284421, - "slope": 1 + "intercept": 272043, + "slope": 16 }, "type": "linear_in_z" }, @@ -1222,8 +1222,8 @@ "valueContains": { "cpu": { "arguments": { - "intercept": 42125119, - "slope": 30 + "intercept": 6684283, + "slope": 1000 }, "type": "added_sizes" }, @@ -1234,7 +1234,7 @@ }, "valueData": { "cpu": { - "arguments": 164963, + "arguments": 167190, "type": "constant_cost" }, "memory": { @@ -1245,8 +1245,8 @@ "unValueData": { "cpu": { "arguments": { - "intercept": 10532326261, - "slope": 431 + "intercept": 1000, + "slope": 19835 }, "type": "linear_in_x" }, diff --git a/plutus-core/cost-model/data/builtinCostModelC.json b/plutus-core/cost-model/data/builtinCostModelC.json index 738b3047b8d..2d637ecabbf 100644 --- a/plutus-core/cost-model/data/builtinCostModelC.json +++ b/plutus-core/cost-model/data/builtinCostModelC.json @@ -1227,8 +1227,8 @@ "lookupCoin": { "cpu": { "arguments": { - "intercept": 284421, - "slope": 1 + "intercept": 272043, + "slope": 16 }, "type": "linear_in_z" }, @@ -1240,8 +1240,8 @@ "valueContains": { "cpu": { "arguments": { - "intercept": 42125119, - "slope": 30 + "intercept": 6684283, + "slope": 1000 }, "type": "added_sizes" }, @@ -1252,7 +1252,7 @@ }, "valueData": { "cpu": { - "arguments": 164963, + "arguments": 167190, "type": "constant_cost" }, "memory": { @@ -1263,8 +1263,8 @@ "unValueData": { "cpu": { "arguments": { - "intercept": 10532326261, - "slope": 431 + "intercept": 1000, + "slope": 19835 }, "type": "linear_in_x" }, From 7b43a412c0b285abcf54442f6000d2a2ec1e2952 Mon Sep 17 00:00:00 2001 From: Ziyang Liu Date: Tue, 30 Sep 2025 06:53:22 -0700 Subject: [PATCH 09/12] Enforce currency and token lengths in insertCoin and unValueData (#7372) --- .../src/PlutusCore/Default/Builtins.hs | 2 +- .../plutus-core/src/PlutusCore/Value.hs | 47 ++++++------ .../DefaultFun/InsertCoin.golden.sig | 2 +- plutus-core/plutus-core/test/Value/Spec.hs | 72 ++++++++++++++++--- plutus-tx/src/PlutusTx/Builtins/Internal.hs | 9 ++- 5 files changed, 96 insertions(+), 36 deletions(-) diff --git a/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs b/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs index 6b1b20c5178..453439c829e 100644 --- a/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs +++ b/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs @@ -2047,7 +2047,7 @@ instance uni ~ DefaultUni => ToBuiltinMeaning uni DefaultFun where (runCostingFunTwoArguments . paramBls12_381_G2_multiScalarMul) toBuiltinMeaning _semvar InsertCoin = - let insertCoinDenotation :: ByteString -> ByteString -> Integer -> Value -> Value + let insertCoinDenotation :: ByteString -> ByteString -> Integer -> Value -> BuiltinResult Value insertCoinDenotation = Value.insertCoin {-# INLINE insertCoinDenotation #-} in makeBuiltinMeaning diff --git a/plutus-core/plutus-core/src/PlutusCore/Value.hs b/plutus-core/plutus-core/src/PlutusCore/Value.hs index 57dd5326cb0..7b8f84dd013 100644 --- a/plutus-core/plutus-core/src/PlutusCore/Value.hs +++ b/plutus-core/plutus-core/src/PlutusCore/Value.hs @@ -188,28 +188,31 @@ instance Pretty Value where {-| \(O(\log \max(m, k))\), where \(m\) is the size of the outer map, and \(k\) is the size of the largest inner map. -} -insertCoin :: ByteString -> ByteString -> Integer -> Value -> Value +insertCoin :: ByteString -> ByteString -> Integer -> Value -> BuiltinResult Value insertCoin currency token amt v@(Value outer sizes size) - | amt == 0 = deleteCoin currency token v - | otherwise = - let (mold, outer') = Map.alterF f (UnsafeK currency) outer - (sizes', size') = case mold of - Just old -> (updateSizes old (old + 1) sizes, size + 1) - Nothing -> (sizes, size) - in Value outer' sizes' size' - where - f - :: Maybe (Map K Integer) - -> ( -- Just (old size of inner map) if the total size grows by 1, otherwise Nothing - Maybe Int - , Maybe (Map K Integer) - ) - f = \case - Nothing -> (Just 0, Just (Map.singleton (UnsafeK token) amt)) - Just inner -> - let (isJust -> exists, inner') = - Map.insertLookupWithKey (\_ _ _ -> amt) (UnsafeK token) amt inner - in (if exists then Nothing else Just (Map.size inner), Just inner') + | amt == 0 = pure $ deleteCoin currency token v + | otherwise = case (k currency, k token) of + (Nothing, _) -> fail $ "insertCoin: invalid currency: " <> show (B.unpack currency) + (_, Nothing) -> fail $ "insertCoin: invalid token: " <> show (B.unpack token) + (Just ck, Just tk) -> + let f + :: Maybe (Map K Integer) + -> ( -- Just (old size of inner map) if the total size grows by 1, + -- otherwise Nothing + Maybe Int + , Maybe (Map K Integer) + ) + f = \case + Nothing -> (Just 0, Just (Map.singleton tk amt)) + Just inner -> + let (isJust -> exists, inner') = + Map.insertLookupWithKey (\_ _ _ -> amt) tk amt inner + in (if exists then Nothing else Just (Map.size inner), Just inner') + (mold, outer') = Map.alterF f ck outer + (sizes', size') = case mold of + Just old -> (updateSizes old (old + 1) sizes, size + 1) + Nothing -> (sizes, size) + in pure $ Value outer' sizes' size' {-# INLINEABLE insertCoin #-} -- | \(O(\log \max(m, k))\) @@ -312,7 +315,7 @@ unValueData = where unB :: Data -> BuiltinResult K unB = \case - B b -> pure (UnsafeK b) + B b -> maybe (fail $ "unValueData: invalid key: " <> show (B.unpack b)) pure (k b) _ -> fail "unValueData: non-B constructor" unI :: Data -> BuiltinResult Integer diff --git a/plutus-core/plutus-core/test/TypeSynthesis/Golden/Signatures/DefaultFun/InsertCoin.golden.sig b/plutus-core/plutus-core/test/TypeSynthesis/Golden/Signatures/DefaultFun/InsertCoin.golden.sig index 37125388fe0..3b124c8ec28 100644 --- a/plutus-core/plutus-core/test/TypeSynthesis/Golden/Signatures/DefaultFun/InsertCoin.golden.sig +++ b/plutus-core/plutus-core/test/TypeSynthesis/Golden/Signatures/DefaultFun/InsertCoin.golden.sig @@ -1 +1 @@ -ByteString -> ByteString -> Integer -> Value -> Value \ No newline at end of file +ByteString -> ByteString -> Integer -> Value -> BuiltinResult Value \ No newline at end of file diff --git a/plutus-core/plutus-core/test/Value/Spec.hs b/plutus-core/plutus-core/test/Value/Spec.hs index ce216c83e91..19259169ad1 100644 --- a/plutus-core/plutus-core/test/Value/Spec.hs +++ b/plutus-core/plutus-core/test/Value/Spec.hs @@ -1,6 +1,7 @@ {-# LANGUAGE OverloadedStrings #-} {-# LANGUAGE TypeApplications #-} {-# LANGUAGE ViewPatterns #-} +{-# OPTIONS_GHC -Wno-incomplete-uni-patterns #-} {-# OPTIONS_GHC -Wno-orphans #-} module Value.Spec (tests) where @@ -11,15 +12,18 @@ import Data.Either import Data.Foldable qualified as F import Data.Map.Strict qualified as Map import Data.Maybe -import PlutusCore.Flat qualified as Flat -import PlutusCore.Generators.QuickCheck.Builtin (ValueAmount (..), genShortHex) -import PlutusCore.Value (Value) -import PlutusCore.Value qualified as V import Safe.Foldable (maximumMay) import Test.QuickCheck import Test.Tasty import Test.Tasty.QuickCheck +import PlutusCore.Builtin (BuiltinResult (..)) +import PlutusCore.Data (Data (..)) +import PlutusCore.Flat qualified as Flat +import PlutusCore.Generators.QuickCheck.Builtin (ValueAmount (..), genShortHex) +import PlutusCore.Value (Value) +import PlutusCore.Value qualified as V + prop_packUnpackRoundtrip :: Value -> Property prop_packUnpackRoundtrip v = v === V.pack (V.unpack v) @@ -38,7 +42,7 @@ prop_insertCoinBookkeeping :: Value -> ValueAmount -> Property prop_insertCoinBookkeeping v (ValueAmount amt) = forAll (genShortHex (V.totalSize v)) $ \currency -> forAll (genShortHex (V.totalSize v)) $ \token -> - let v' = V.insertCoin (V.unK currency) (V.unK token) amt v + let BuiltinSuccess v' = V.insertCoin (V.unK currency) (V.unK token) amt v in checkSizes v' -- | Verifies that @insertCoin@ preserves @Value@ invariants @@ -46,7 +50,7 @@ prop_insertCoinPreservesInvariants :: Value -> ValueAmount -> Property prop_insertCoinPreservesInvariants v (ValueAmount amt) = forAll (genShortHex (V.totalSize v)) $ \currency -> forAll (genShortHex (V.totalSize v)) $ \token -> - let v' = V.insertCoin (V.unK currency) (V.unK token) amt v + let BuiltinSuccess v' = V.insertCoin (V.unK currency) (V.unK token) amt v in checkInvariants v' prop_unionCommutative :: Value -> Value -> Property @@ -60,15 +64,33 @@ prop_insertCoinIdempotent :: Value -> Property prop_insertCoinIdempotent v = v === F.foldl' - (\acc (c, t, a) -> let v' = V.insertCoin (V.unK c) (V.unK t) a acc in v') + (\acc (c, t, a) -> let BuiltinSuccess v' = V.insertCoin (V.unK c) (V.unK t) a acc in v') v (V.toFlatList v) +prop_insertCoinValidatesCurrency :: Value -> Property +prop_insertCoinValidatesCurrency v = + forAll gen33Bytes $ \c -> + forAll gen32BytesOrFewer $ \t -> + forAll (arbitrary `suchThat` (/= 0)) $ \amt -> + case V.insertCoin c t amt v of + BuiltinFailure{} -> property True + _ -> property False + +prop_insertCoinValidatesToken :: Value -> Property +prop_insertCoinValidatesToken v = + forAll gen32BytesOrFewer $ \c -> + forAll gen33Bytes $ \t -> + forAll (arbitrary `suchThat` (/= 0)) $ \amt -> + case V.insertCoin c t amt v of + BuiltinFailure{} -> property True + _ -> property False + prop_lookupAfterInsertion :: Value -> ValueAmount -> Property prop_lookupAfterInsertion v (ValueAmount amt) = forAll (genShortHex (V.totalSize v)) $ \currency -> forAll (genShortHex (V.totalSize v)) $ \token -> - let v' = V.insertCoin (V.unK currency) (V.unK token) amt v + let BuiltinSuccess v' = V.insertCoin (V.unK currency) (V.unK token) amt v in V.lookupCoin (V.unK currency) (V.unK token) v' === amt prop_lookupAfterDeletion :: Value -> Property @@ -84,7 +106,7 @@ prop_deleteCoinIdempotent v0 = let v' = V.deleteCoin c t v in v' === V.deleteCoin c t v' where - v = if V.totalSize v0 > 0 then v0 else V.insertCoin "c" "t" 1 v0 + BuiltinSuccess v = if V.totalSize v0 > 0 then pure v0 else V.insertCoin "c" "t" 1 v0 fl = V.toFlatList v prop_containsReflexive :: Value -> Property @@ -113,7 +135,7 @@ prop_flatDecodeSuccess = forAll (arbitrary `suchThat` (/= 0)) $ \amt -> forAll gen32BytesOrFewer $ \c -> forAll gen32BytesOrFewer $ \t -> let flat = Flat.flat $ Map.singleton c (Map.singleton t amt) - v = V.insertCoin c t amt V.empty + BuiltinSuccess v = V.insertCoin c t amt V.empty in Flat.unflat flat === Right v prop_flatDecodeInvalidCurrency :: Property @@ -145,6 +167,24 @@ checkInvariants (V.unpack -> v) = property ((not . any Map.null) v) .&&. property ((not . any (elem 0)) v) +prop_unValueDataValidatesCurrency :: ValueAmount -> Property +prop_unValueDataValidatesCurrency (ValueAmount amt) = + forAll gen33Bytes $ \c -> + forAll gen32BytesOrFewer $ \t -> + let d = Map [(B c, Map [(B t, I amt)])] + in case V.unValueData d of + BuiltinFailure{} -> property True + _ -> property False + +prop_unValueDataValidatesToken :: ValueAmount -> Property +prop_unValueDataValidatesToken (ValueAmount amt) = + forAll gen32BytesOrFewer $ \c -> + forAll gen33Bytes $ \t -> + let d = Map [(B c, Map [(B t, I amt)])] + in case V.unValueData d of + BuiltinFailure{} -> property True + _ -> property False + tests :: TestTree tests = testGroup @@ -173,6 +213,12 @@ tests = , testProperty "insertCoinIdempotent" prop_insertCoinIdempotent + , testProperty + "insertCoinValidatesCurrency" + prop_insertCoinValidatesCurrency + , testProperty + "insertCoinValidatesToken" + prop_insertCoinValidatesToken , testProperty "lookupAfterInsertion" prop_lookupAfterInsertion @@ -188,6 +234,12 @@ tests = , testProperty "containsAfterDeletion" prop_containsAfterDeletion + , testProperty + "unValueDataValidatesCurrency" + prop_unValueDataValidatesCurrency + , testProperty + "unValueDataValidatesToken" + prop_unValueDataValidatesToken , testProperty "flatRoundtrip" prop_flatRoundtrip diff --git a/plutus-tx/src/PlutusTx/Builtins/Internal.hs b/plutus-tx/src/PlutusTx/Builtins/Internal.hs index cc4d3840830..2ed53229c79 100644 --- a/plutus-tx/src/PlutusTx/Builtins/Internal.hs +++ b/plutus-tx/src/PlutusTx/Builtins/Internal.hs @@ -1084,8 +1084,13 @@ insertCoin -> BuiltinInteger -> BuiltinValue -> BuiltinValue -insertCoin (BuiltinByteString c) (BuiltinByteString t) amt (BuiltinValue v) = - BuiltinValue $ Value.insertCoin c t amt v +insertCoin (BuiltinByteString c) (BuiltinByteString t) amt (BuiltinValue v0) = + case Value.insertCoin c t amt v0 of + BuiltinSuccess v -> BuiltinValue v + BuiltinSuccessWithLogs logs v -> traceAll logs (BuiltinValue v) + BuiltinFailure logs err -> + traceAll (logs <> pure (display err)) $ + Haskell.error "insertCoin errored." {-# OPAQUE insertCoin #-} lookupCoin From 2385117cb086a1530baefcdc9e8f1a601adb9381 Mon Sep 17 00:00:00 2001 From: Kenneth MacKenzie Date: Wed, 1 Oct 2025 07:55:08 +0100 Subject: [PATCH 10/12] Cover some missing cases in the connformance tests for wrteiBits (#7374) --- .../builtin/semantics/writeBits/case-41/case-41.uplc | 8 ++++++++ .../writeBits/case-41/case-41.uplc.budget.expected | 2 ++ .../semantics/writeBits/case-41/case-41.uplc.expected | 7 +++++++ .../builtin/semantics/writeBits/case-42/case-42.uplc | 8 ++++++++ .../writeBits/case-42/case-42.uplc.budget.expected | 2 ++ .../semantics/writeBits/case-42/case-42.uplc.expected | 7 +++++++ .../builtin/semantics/writeBits/case-43/case-43.uplc | 8 ++++++++ .../writeBits/case-43/case-43.uplc.budget.expected | 2 ++ .../semantics/writeBits/case-43/case-43.uplc.expected | 7 +++++++ .../builtin/semantics/writeBits/case-44/case-44.uplc | 8 ++++++++ .../writeBits/case-44/case-44.uplc.budget.expected | 2 ++ .../semantics/writeBits/case-44/case-44.uplc.expected | 7 +++++++ .../builtin/semantics/writeBits/case-45/case-45.uplc | 8 ++++++++ .../writeBits/case-45/case-45.uplc.budget.expected | 2 ++ .../semantics/writeBits/case-45/case-45.uplc.expected | 1 + .../builtin/semantics/writeBits/case-46/case-46.uplc | 8 ++++++++ .../writeBits/case-46/case-46.uplc.budget.expected | 2 ++ .../semantics/writeBits/case-46/case-46.uplc.expected | 1 + .../builtin/semantics/writeBits/case-47/case-47.uplc | 8 ++++++++ .../writeBits/case-47/case-47.uplc.budget.expected | 1 + .../semantics/writeBits/case-47/case-47.uplc.expected | 1 + .../builtin/semantics/writeBits/case-48/case-48.uplc | 8 ++++++++ .../writeBits/case-48/case-48.uplc.budget.expected | 1 + .../semantics/writeBits/case-48/case-48.uplc.expected | 1 + 24 files changed, 110 insertions(+) create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc.budget.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc.budget.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc.budget.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc.budget.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc.budget.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc.budget.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc.budget.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc.budget.expected create mode 100644 plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc.expected diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc new file mode 100644 index 00000000000..a430b022ad5 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc @@ -0,0 +1,8 @@ +-- An empty list of updates doesn't change anything. +(program 1.0.0 +[ (builtin writeBits) + (con bytestring #00000000000000000000000000000000000000000000000000000000000000000000000000000000) + (con (list integer) []) + (con bool False) + ] +) diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc.budget.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc.budget.expected new file mode 100644 index 00000000000..5614475a274 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc.budget.expected @@ -0,0 +1,2 @@ +({cpu: 393245 +| mem: 805}) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc.expected new file mode 100644 index 00000000000..a11cb37af77 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-41/case-41.uplc.expected @@ -0,0 +1,7 @@ +(program + 1.0.0 + (con + bytestring + #00000000000000000000000000000000000000000000000000000000000000000000000000000000 + ) +) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc new file mode 100644 index 00000000000..38d2a1d074a --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc @@ -0,0 +1,8 @@ +-- An empty list of updates doesn't change anything. +(program 1.0.0 +[ (builtin writeBits) + (con bytestring #00000000000000000000000000000000000000000000000000000000000000000000000000000000) + (con (list integer) []) + (con bool True) + ] +) diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc.budget.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc.budget.expected new file mode 100644 index 00000000000..5614475a274 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc.budget.expected @@ -0,0 +1,2 @@ +({cpu: 393245 +| mem: 805}) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc.expected new file mode 100644 index 00000000000..a11cb37af77 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-42/case-42.uplc.expected @@ -0,0 +1,7 @@ +(program + 1.0.0 + (con + bytestring + #00000000000000000000000000000000000000000000000000000000000000000000000000000000 + ) +) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc new file mode 100644 index 00000000000..30cfc6b2f1d --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc @@ -0,0 +1,8 @@ +-- An empty list of updates doesn't change anything. +(program 1.0.0 +[ (builtin writeBits) + (con bytestring #FFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFF) + (con (list integer) []) + (con bool False) + ] +) diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc.budget.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc.budget.expected new file mode 100644 index 00000000000..5614475a274 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc.budget.expected @@ -0,0 +1,2 @@ +({cpu: 393245 +| mem: 805}) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc.expected new file mode 100644 index 00000000000..db983ee7428 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-43/case-43.uplc.expected @@ -0,0 +1,7 @@ +(program + 1.0.0 + (con + bytestring + #ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff + ) +) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc new file mode 100644 index 00000000000..d94833ee1da --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc @@ -0,0 +1,8 @@ +-- An empty list of updates doesn't change anything. +(program 1.0.0 +[ (builtin writeBits) + (con bytestring #FFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFFF) + (con (list integer) []) + (con bool True) + ] +) diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc.budget.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc.budget.expected new file mode 100644 index 00000000000..5614475a274 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc.budget.expected @@ -0,0 +1,2 @@ +({cpu: 393245 +| mem: 805}) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc.expected new file mode 100644 index 00000000000..db983ee7428 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-44/case-44.uplc.expected @@ -0,0 +1,7 @@ +(program + 1.0.0 + (con + bytestring + #ffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffffff + ) +) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc new file mode 100644 index 00000000000..d794e1deb21 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc @@ -0,0 +1,8 @@ +-- We can apply an empty list of updates to the empty bytestring +(program 1.0.0 +[ (builtin writeBits) + (con bytestring #) + (con (list integer) []) + (con bool False) + ] +) diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc.budget.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc.budget.expected new file mode 100644 index 00000000000..f04a5c855cc --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc.budget.expected @@ -0,0 +1,2 @@ +({cpu: 393245 +| mem: 801}) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc.expected new file mode 100644 index 00000000000..5dbd4047403 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-45/case-45.uplc.expected @@ -0,0 +1 @@ +(program 1.0.0 (con bytestring #)) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc new file mode 100644 index 00000000000..c459ded2a04 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc @@ -0,0 +1,8 @@ +-- We can apply an empty list of updates to the empty bytestring +(program 1.0.0 +[ (builtin writeBits) + (con bytestring #) + (con (list integer) []) + (con bool True) + ] +) diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc.budget.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc.budget.expected new file mode 100644 index 00000000000..f04a5c855cc --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc.budget.expected @@ -0,0 +1,2 @@ +({cpu: 393245 +| mem: 801}) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc.expected new file mode 100644 index 00000000000..5dbd4047403 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-46/case-46.uplc.expected @@ -0,0 +1 @@ +(program 1.0.0 (con bytestring #)) \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc new file mode 100644 index 00000000000..61c08ce3cb6 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc @@ -0,0 +1,8 @@ +-- Attempting to write to a negative position in the empty bytestring causes an error +(program 1.0.0 +[ (builtin writeBits) + (con bytestring #) + (con (list integer) [-1]) + (con bool False) + ] +) diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc.budget.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc.budget.expected new file mode 100644 index 00000000000..ccc477ffed6 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc.budget.expected @@ -0,0 +1 @@ +evaluation failure \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc.expected new file mode 100644 index 00000000000..ccc477ffed6 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-47/case-47.uplc.expected @@ -0,0 +1 @@ +evaluation failure \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc new file mode 100644 index 00000000000..28628c6b699 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc @@ -0,0 +1,8 @@ +-- Attempting to write to a negative position in the empty bytestring causes an error +(program 1.0.0 +[ (builtin writeBits) + (con bytestring #) + (con (list integer) [-1]) + (con bool True) + ] +) diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc.budget.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc.budget.expected new file mode 100644 index 00000000000..ccc477ffed6 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc.budget.expected @@ -0,0 +1 @@ +evaluation failure \ No newline at end of file diff --git a/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc.expected b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc.expected new file mode 100644 index 00000000000..ccc477ffed6 --- /dev/null +++ b/plutus-conformance/test-cases/uplc/evaluation/builtin/semantics/writeBits/case-48/case-48.uplc.expected @@ -0,0 +1 @@ +evaluation failure \ No newline at end of file From 9e221ddd7b3509e92b3ec248250a6f154118ce49 Mon Sep 17 00:00:00 2001 From: Kenneth MacKenzie Date: Wed, 1 Oct 2025 11:56:17 +0100 Subject: [PATCH 11/12] Enable the Agda conformance tests for the array builtins. (#7375) * Enable the conformance tests for the array builtins. --- plutus-conformance/agda/Spec.hs | 36 ++++----------------------------- 1 file changed, 4 insertions(+), 32 deletions(-) diff --git a/plutus-conformance/agda/Spec.hs b/plutus-conformance/agda/Spec.hs index 797864dc3e9..e204df6afc9 100644 --- a/plutus-conformance/agda/Spec.hs +++ b/plutus-conformance/agda/Spec.hs @@ -124,23 +124,10 @@ agdaEvalUplcProg WithoutCosting = -} failingEvaluationTests :: [FilePath] failingEvaluationTests = - [ -- These "array" tests fail because the Agda code doesn't know about arrays yet - -- TODO: remove these tests once "Add new array type and builtins to Agda - -- metatheory" is done https://github.com/IntersectMBO/plutus-private/issues/1465 - "test-cases/uplc/evaluation/builtin/constant/array/emptyArray" - , "test-cases/uplc/evaluation/builtin/constant/array/simpleArray" - , "test-cases/uplc/evaluation/builtin/constant/array/unitArray" - , "test-cases/uplc/evaluation/builtin/semantics/listToArray/listToArray-01" - , "test-cases/uplc/evaluation/builtin/semantics/listToArray/listToArray-02" - , "test-cases/uplc/evaluation/builtin/semantics/lengthOfArray/lengthOfArray-01" - , "test-cases/uplc/evaluation/builtin/semantics/lengthOfArray/lengthOfArray-02" - , "test-cases/uplc/evaluation/builtin/semantics/indexArray/indexArray-01" - , "test-cases/uplc/evaluation/builtin/semantics/indexArray/indexArray-02" - , "test-cases/uplc/evaluation/builtin/semantics/indexArray/indexArray-03" - -- These "constant casing" tests fail because Agda metatheory does not yet - -- implement casing on constant values. - -- TODO: remove these tests once casing on constant is added to Agda metatheory. - , "test-cases/uplc/evaluation/term/constant-case/bool/bool-01" + [ -- These "constant casing" tests fail because Agda metatheory does not yet + -- implement casing on constant values. + -- TODO: remove these tests once casing on constant is added to Agda metatheory. + "test-cases/uplc/evaluation/term/constant-case/bool/bool-01" , "test-cases/uplc/evaluation/term/constant-case/bool/bool-02" , "test-cases/uplc/evaluation/term/constant-case/bool/bool-03" , "test-cases/uplc/evaluation/term/constant-case/bool/bool-04" @@ -196,21 +183,6 @@ failingBudgetTests = , "test-cases/uplc/evaluation/builtin/semantics/dropList/dropList-14" , "test-cases/uplc/evaluation/builtin/semantics/dropList/dropList-15" , "test-cases/uplc/evaluation/builtin/semantics/dropList/dropList-16" - , -- These "array" tests fail because the Agda code doesn't know about arrays yet - -- TODO: remove these tests once "Add new array type and builtins to Agda - -- metatheory" is done https://github.com/IntersectMBO/plutus-private/issues/1465 - "test-cases/uplc/evaluation/builtin/constant/array/emptyArray" - , "test-cases/uplc/evaluation/builtin/constant/array/simpleArray" - , "test-cases/uplc/evaluation/builtin/constant/array/unitArray" - , "test-cases/uplc/evaluation/builtin/constant/array/illTypedArray-01" - , "test-cases/uplc/evaluation/builtin/constant/array/illTypedArray-02" - , "test-cases/uplc/evaluation/builtin/semantics/listToArray/listToArray-01" - , "test-cases/uplc/evaluation/builtin/semantics/listToArray/listToArray-02" - , "test-cases/uplc/evaluation/builtin/semantics/lengthOfArray/lengthOfArray-01" - , "test-cases/uplc/evaluation/builtin/semantics/lengthOfArray/lengthOfArray-02" - , "test-cases/uplc/evaluation/builtin/semantics/indexArray/indexArray-01" - , "test-cases/uplc/evaluation/builtin/semantics/indexArray/indexArray-02" - , "test-cases/uplc/evaluation/builtin/semantics/indexArray/indexArray-03" -- These "constant casing" tests fail because Agda metatheory does not yet -- implement casing on constant values. -- TODO: remove these tests once casing on constant is added to Agda metatheory. From 0d420fea9bb8bb582d1339b584f069a0dcebb230 Mon Sep 17 00:00:00 2001 From: Ana Pantilie Date: Tue, 16 Sep 2025 18:40:30 +0300 Subject: [PATCH 12/12] Add insertCoin and unionValue costing skeleton --- .../create-cost-model/BuiltinMemoryModels.hs | 2 ++ .../CreateBuiltinCostModel.hs | 12 +++++++++++ .../cost-model/data/builtinCostModelA.json | 20 +++++++++++++++++++ .../cost-model/data/builtinCostModelB.json | 20 +++++++++++++++++++ .../cost-model/data/builtinCostModelC.json | 20 +++++++++++++++++++ .../src/PlutusCore/Default/Builtins.hs | 4 ++-- .../Evaluation/Machine/BuiltinCostModel.hs | 2 ++ .../Evaluation/Machine/ExBudgetingDefaults.hs | 5 +++++ 8 files changed, 83 insertions(+), 2 deletions(-) diff --git a/plutus-core/cost-model/create-cost-model/BuiltinMemoryModels.hs b/plutus-core/cost-model/create-cost-model/BuiltinMemoryModels.hs index a138a9bbf1b..cb664c87936 100644 --- a/plutus-core/cost-model/create-cost-model/BuiltinMemoryModels.hs +++ b/plutus-core/cost-model/create-cost-model/BuiltinMemoryModels.hs @@ -181,5 +181,7 @@ builtinMemoryModels = BuiltinCostModelBase , paramValueContains = Id $ ModelTwoArgumentsConstantCost 1 , paramValueData = Id $ ModelOneArgumentConstantCost 1 , paramUnValueData = Id $ ModelOneArgumentConstantCost 1 + , paramInsertCoin = Id $ ModelFourArgumentsConstantCost 1 + , paramUnionValue = Id $ ModelTwoArgumentsConstantCost 1 } where identityFunction = OneVariableLinearFunction 0 1 diff --git a/plutus-core/cost-model/create-cost-model/CreateBuiltinCostModel.hs b/plutus-core/cost-model/create-cost-model/CreateBuiltinCostModel.hs index 9d138865dde..fff87c349a5 100644 --- a/plutus-core/cost-model/create-cost-model/CreateBuiltinCostModel.hs +++ b/plutus-core/cost-model/create-cost-model/CreateBuiltinCostModel.hs @@ -136,6 +136,8 @@ builtinCostModelNames = BuiltinCostModelBase , paramValueContains = "valueContainsModel" , paramValueData = "valueDataModel" , paramUnValueData = "unValueDataModel" + , paramInsertCoin = "insertCoinModel" + , paramUnionValue = "unionValueModel" } @@ -289,6 +291,9 @@ createBuiltinCostModel bmfile rfile = do paramValueContains <- getParams readCF2 paramValueContains paramValueData <- getParams readCF1 paramValueData paramUnValueData <- getParams readCF1 paramUnValueData + -- Values + paramInsertCoin <- getParams readCF4 paramInsertCoin + paramUnionValue <- getParams readCF2 paramUnionValue pure $ BuiltinCostModelBase {..} @@ -452,6 +457,13 @@ readCF3 e = do "exp_mod_cost" -> ModelThreeArgumentsExpModCost <$> readExpModCostingFunction "y_mem" "z_mem" e _ -> error $ "Unknown three-variable model type: " ++ ty +readCF4 :: MonadR m => SomeSEXP (Region m) -> m ModelFourArguments +readCF4 e = do + ty <- getType e + case ty of + "constant_cost" -> ModelFourArgumentsConstantCost <$> getConstant e + _ -> error $ "Unknown four-variable model type: " ++ ty + readCF6 :: MonadR m => SomeSEXP (Region m) -> m ModelSixArguments readCF6 e = do ty <- getType e diff --git a/plutus-core/cost-model/data/builtinCostModelA.json b/plutus-core/cost-model/data/builtinCostModelA.json index ab348fa63d0..b12f9426a38 100644 --- a/plutus-core/cost-model/data/builtinCostModelA.json +++ b/plutus-core/cost-model/data/builtinCostModelA.json @@ -1255,4 +1255,24 @@ "type": "constant_cost" } } + , "insertCoin": { + "cpu": { + "arguments": 1000, + "type": "constant_cost" + }, + "memory": { + "arguments": 10, + "type": "constant_cost" + } + } + , "unionValue": { + "cpu": { + "arguments": 1000, + "type": "constant_cost" + }, + "memory": { + "arguments": 10, + "type": "constant_cost" + } + } } diff --git a/plutus-core/cost-model/data/builtinCostModelB.json b/plutus-core/cost-model/data/builtinCostModelB.json index 1f6f57ac420..42acb99433b 100644 --- a/plutus-core/cost-model/data/builtinCostModelB.json +++ b/plutus-core/cost-model/data/builtinCostModelB.json @@ -1255,4 +1255,24 @@ "type": "constant_cost" } } + , "insertCoin": { + "cpu": { + "arguments": 1000, + "type": "constant_cost" + }, + "memory": { + "arguments": 10, + "type": "constant_cost" + } + } + , "unionValue": { + "cpu": { + "arguments": 1000, + "type": "constant_cost" + }, + "memory": { + "arguments": 10, + "type": "constant_cost" + } + } } diff --git a/plutus-core/cost-model/data/builtinCostModelC.json b/plutus-core/cost-model/data/builtinCostModelC.json index 2d637ecabbf..fbd3546a94a 100644 --- a/plutus-core/cost-model/data/builtinCostModelC.json +++ b/plutus-core/cost-model/data/builtinCostModelC.json @@ -1273,4 +1273,24 @@ "type": "constant_cost" } } + , "insertCoin": { + "cpu": { + "arguments": 1000, + "type": "constant_cost" + }, + "memory": { + "arguments": 10, + "type": "constant_cost" + } + } + , "unionValue": { + "cpu": { + "arguments": 1000, + "type": "constant_cost" + }, + "memory": { + "arguments": 10, + "type": "constant_cost" + } + } } diff --git a/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs b/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs index 453439c829e..2436e299e5c 100644 --- a/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs +++ b/plutus-core/plutus-core/src/PlutusCore/Default/Builtins.hs @@ -2052,7 +2052,7 @@ instance uni ~ DefaultUni => ToBuiltinMeaning uni DefaultFun where {-# INLINE insertCoinDenotation #-} in makeBuiltinMeaning insertCoinDenotation - (runCostingFunFourArguments . unimplementedCostingFun) + (runCostingFunFourArguments . paramInsertCoin) toBuiltinMeaning _semvar LookupCoin = let lookupCoinDenotation :: ByteString -> ByteString -> Value -> Integer @@ -2068,7 +2068,7 @@ instance uni ~ DefaultUni => ToBuiltinMeaning uni DefaultFun where {-# INLINE unionValueDenotation #-} in makeBuiltinMeaning unionValueDenotation - (runCostingFunTwoArguments . unimplementedCostingFun) + (runCostingFunTwoArguments . paramUnionValue) toBuiltinMeaning _semvar ValueContains = let valueContainsDenotation :: Value -> Value -> Bool diff --git a/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/BuiltinCostModel.hs b/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/BuiltinCostModel.hs index 35ff0ee0e74..87cd1809d53 100644 --- a/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/BuiltinCostModel.hs +++ b/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/BuiltinCostModel.hs @@ -198,6 +198,8 @@ data BuiltinCostModelBase f = , paramValueContains :: f ModelTwoArguments , paramValueData :: f ModelOneArgument , paramUnValueData :: f ModelOneArgument + , paramInsertCoin :: f ModelFourArguments + , paramUnionValue :: f ModelTwoArguments } deriving stock (Generic) deriving anyclass (FunctorB, TraversableB, ConstraintsB) diff --git a/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/ExBudgetingDefaults.hs b/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/ExBudgetingDefaults.hs index a5a1a2e97c9..626457c2b40 100644 --- a/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/ExBudgetingDefaults.hs +++ b/plutus-core/plutus-core/src/PlutusCore/Evaluation/Machine/ExBudgetingDefaults.hs @@ -238,6 +238,9 @@ unitCostTwoArguments = CostingFun (ModelTwoArgumentsConstantCost 1) (ModelTwo unitCostThreeArguments :: CostingFun ModelThreeArguments unitCostThreeArguments = CostingFun (ModelThreeArgumentsConstantCost 1) (ModelThreeArgumentsConstantCost 0) +unitCostFourArguments :: CostingFun ModelFourArguments +unitCostFourArguments = CostingFun (ModelFourArgumentsConstantCost 1) (ModelFourArgumentsConstantCost 0) + unitCostSixArguments :: CostingFun ModelSixArguments unitCostSixArguments = CostingFun (ModelSixArgumentsConstantCost 1) (ModelSixArgumentsConstantCost 0) @@ -360,6 +363,8 @@ unitCostBuiltinCostModel = BuiltinCostModelBase , paramValueContains = unitCostTwoArguments , paramValueData = unitCostOneArgument , paramUnValueData = unitCostOneArgument + , paramInsertCoin = unitCostFourArguments + , paramUnionValue = unitCostTwoArguments } unitCekParameters :: Typeable ann => MachineParameters CekMachineCosts DefaultFun (CekValue DefaultUni DefaultFun ann)